| ||||||||||||||||
| ||||||||||||||||
Documentation | ||||||||||||||||
type Assertion = IO () | ||||||||||||||||
assertFailure :: String -> Assertion | ||||||||||||||||
assertString :: String -> Assertion | ||||||||||||||||
assertBool :: String -> Bool -> Assertion | ||||||||||||||||
assertEqual :: (Eq a, Show a) => String -> a -> a -> Assertion | ||||||||||||||||
class Assertable t where | ||||||||||||||||
| ||||||||||||||||
class ListAssertable t where | ||||||||||||||||
| ||||||||||||||||
type AssertionPredicate = IO Bool | ||||||||||||||||
class AssertionPredicable t where | ||||||||||||||||
| ||||||||||||||||
(@?) :: AssertionPredicable t => t -> String -> Assertion | ||||||||||||||||
(@=?) :: (Eq a, Show a) => a -> a -> Assertion | ||||||||||||||||
(@?=) :: (Eq a, Show a) => a -> a -> Assertion | ||||||||||||||||
data Test | ||||||||||||||||
| ||||||||||||||||
data Node | ||||||||||||||||
| ||||||||||||||||
type Path = [Node] | ||||||||||||||||
testCaseCount :: Test -> Int | ||||||||||||||||
class Testable t where | ||||||||||||||||
| ||||||||||||||||
(~?) :: AssertionPredicable t => t -> String -> Test | ||||||||||||||||
(~=?) :: (Eq a, Show a) => a -> a -> Test | ||||||||||||||||
(~?=) :: (Eq a, Show a) => a -> a -> Test | ||||||||||||||||
(~:) :: Testable t => String -> t -> Test | ||||||||||||||||
data Counts | ||||||||||||||||
| ||||||||||||||||
data State | ||||||||||||||||
| ||||||||||||||||
type ReportStart us = State -> us -> IO us | ||||||||||||||||
type ReportProblem us = String -> State -> us -> IO us | ||||||||||||||||
testCasePaths :: Test -> [Path] | ||||||||||||||||
performTest :: ReportStart us -> ReportProblem us -> ReportProblem us -> us -> Test -> IO (Counts, us) | ||||||||||||||||
Produced by Haddock version 2.4.2 |