module Main where

import Math.HiddenMarkovModel.Test (tests)

import qualified Test.QuickCheck as QC


main :: IO ()
main =
   mapM_ (\(name,prop) -> putStr (name ++ ": ") >> QC.quickCheck prop) tests