|
|
|
|
|
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 |
| Methods | | | Instances | |
|
|
class ListAssertable t where |
| Methods | | | Instances | |
|
|
type AssertionPredicate = IO Bool |
|
class AssertionPredicable t where |
| Methods | | | Instances | |
|
|
(@?) :: AssertionPredicable t => t -> String -> Assertion |
|
(@=?) :: (Eq a, Show a) => a -> a -> Assertion |
|
(@?=) :: (Eq a, Show a) => a -> a -> Assertion |
|
data Test |
Constructors | | Instances | |
|
|
data Node |
Constructors | | Instances | |
|
|
type Path = [Node] |
|
testCaseCount :: Test -> Int |
|
class Testable t where |
| Methods | | | Instances | |
|
|
(~?) :: 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 |
Constructors | Counts | | cases, tried, errors, failures :: Int | |
|
| Instances | |
|
|
data State |
Constructors | | Instances | |
|
|
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 0.8 |