freer-simple/tests/Tests.hs
ElvishJerricco a7f7be7973 Fixed nonDetEffTests
The problem was the definition of `ifte`. It reported `el` if `th` was
`const mzero`.
2016-03-03 10:29:13 -05:00

109 lines
4.2 KiB
Haskell

module Main where
import Control.Monad.Freer
import Test.Tasty
import Test.Tasty.HUnit
import Test.Tasty.QuickCheck
import Tests.Exception
import Tests.Fresh
import Tests.NonDetEff
import Tests.Reader
import Tests.State
import Tests.StateRW
--------------------------------------------------------------------------------
-- Pure Tests --
--------------------------------------------------------------------------------
addInEff :: Int -> Int -> Int
addInEff x y = run ((+) <$> pure x <*> pure y)
pureTests :: TestTree
pureTests = testGroup "Pure Eff tests"
[ testProperty "Pure run just works: (+)"
(\x y -> addInEff x y == x + y)
]
--------------------------------------------------------------------------------
-- Exception Tests --
--------------------------------------------------------------------------------
exceptionTests :: TestTree
exceptionTests = testGroup "Exception Eff tests"
[ testProperty "Exc takes precedence" (\x y -> testExceptionTakesPriority x y == Left y)
, testCase "uncaught: runState (runError t)" $
ter1 @?= (Left "exc", 2)
, testCase "uncaught: runError (runState t)" $
ter2 @?= Left "exc"
, testCase "caught: runState (runError t)" $
ter3 @?= (Right "exc", 2)
, testCase "caught: runError (runState t)" $
ter4 @?= Right ("exc", 2)
, testCase "success: runReader (runErrBig t)" (ex2rr @?= Right 5)
, testCase "uncaught: runReader (runErrBig t)" $
ex2rr1 @?= Left (TooBig 7)
, testCase "uncaught: runErrBig (runReader t)" $
ex2rr2 @?= Left (TooBig 7)
]
--------------------------------------------------------------------------------
-- Fresh Effect Tests --
--------------------------------------------------------------------------------
freshTests :: TestTree
freshTests = testGroup "Fresh tests"
[ testCase "Start at 0, refresh twice, yields 1" (testFresh 10 @?= 9)
, testProperty "Freshening n times yields (n-1)" (\n -> n > 0 ==> testFresh n == (n-1))
]
--------------------------------------------------------------------------------
-- Nondeterministic Effect Tests --
--------------------------------------------------------------------------------
nonDetEffTests :: TestTree
nonDetEffTests = testGroup "NonDetEff tests"
[ testCase "[2,3,5] are primes generated by ifte" (testIfte [2..6] @?= [2,3,5])
]
--------------------------------------------------------------------------------
-- Reader Effect Tests --
--------------------------------------------------------------------------------
readerTests :: TestTree
readerTests = testGroup "Reader tests"
[ testProperty "Reader passes along environment: n + x"
(\n x -> testReader n x == n + x)
, testProperty "Multiple readers work"
(\f n -> testMultiReader f n == ((f + 2.0) + fromIntegral (n + 1)))
, testProperty "Local injects into env"
(\env inc -> testLocal env inc == 2*(env+1) + inc)
]
--------------------------------------------------------------------------------
-- State[RW] Effect Tests --
--------------------------------------------------------------------------------
stateTests :: TestTree
stateTests = testGroup "State tests"
[ testProperty "get after put n yields (n,n)" (\n -> testPutGet n 0 == (n,n))
, testProperty "Final put determines stored state" $
\p1 p2 start -> testPutGetPutGetPlus p1 p2 start == (p1+p2, p2)
, testProperty "If only getting, start state determines outcome" $
\start -> testGetStart start == (start,start)
, testProperty "testPutGet: State == StateRW" $
\n -> testPutGet n 0 == testPutGetRW n 0
, testProperty "testPutGetPutGetPlus: State == StateRW" $
\p1 p2 start -> testPutGetPutGetPlus p1 p2 start == testPutGetPutGetPlusRW p1 p2 start
, testProperty "testGetStart: State == StateRW" $
\n -> testGetStart n == testGetStartRW n
]
--------------------------------------------------------------------------------
-- Runner --
--------------------------------------------------------------------------------
main :: IO ()
main = defaultMain $ testGroup "Tests"
[ pureTests
, exceptionTests
, freshTests
, nonDetEffTests
, readerTests
, stateTests
]