Stability | deprecated |
---|---|
Safe Haskell | Safe-Inferred |
Language | Haskell2010 |
Deprecated: Use Test.Hspec.Api.Formatters.V1 instead.
This module contains formatters that can be used with
hspecWith
.
Synopsis
- silent :: Formatter
- checks :: Formatter
- specdoc :: Formatter
- progress :: Formatter
- failed_examples :: Formatter
- data Formatter = Formatter {
- headerFormatter :: FormatM ()
- exampleGroupStarted :: [String] -> String -> FormatM ()
- exampleGroupDone :: FormatM ()
- exampleStarted :: Path -> FormatM ()
- exampleProgress :: Path -> Progress -> FormatM ()
- exampleSucceeded :: Path -> String -> FormatM ()
- exampleFailed :: Path -> String -> FailureReason -> FormatM ()
- examplePending :: Path -> String -> Maybe String -> FormatM ()
- failedFormatter :: FormatM ()
- footerFormatter :: FormatM ()
- data FailureReason
- type FormatM = Free FormatF
- formatterToFormat :: Formatter -> FormatConfig -> IO Format
- getSuccessCount :: FormatM Int
- getPendingCount :: FormatM Int
- getFailCount :: FormatM Int
- getTotalCount :: FormatM Int
- data FailureRecord = FailureRecord {}
- getFailMessages :: FormatM [FailureRecord]
- usedSeed :: FormatM Integer
- newtype Seconds = Seconds Double
- getCPUTime :: FormatM (Maybe Seconds)
- getRealTime :: FormatM Seconds
- write :: String -> FormatM ()
- writeLine :: String -> FormatM ()
- writeTransient :: String -> FormatM ()
- withInfoColor :: FormatM a -> FormatM a
- withSuccessColor :: FormatM a -> FormatM a
- withPendingColor :: FormatM a -> FormatM a
- withFailColor :: FormatM a -> FormatM a
- useDiff :: FormatM Bool
- extraChunk :: String -> FormatM ()
- missingChunk :: String -> FormatM ()
- formatException :: SomeException -> String
Formatters
Implementing a custom Formatter
A formatter is a set of actions. Each action is evaluated when a certain situation is encountered during a test run.
Actions live in the FormatM
monad. It provides access to the runner state
and primitives for appending to the generated report.
Formatter | |
|
data FailureReason Source #
NoReason | |
Reason String | |
ExpectedButGot (Maybe String) String String | |
Error (Maybe String) SomeException |
Instances
Show FailureReason Source # | |
Defined in Test.Hspec.Core.Formatters.V1.Monad showsPrec :: Int -> FailureReason -> ShowS # show :: FailureReason -> String # showList :: [FailureReason] -> ShowS # |
formatterToFormat :: Formatter -> FormatConfig -> IO Format Source #
Accessing the runner state
getSuccessCount :: FormatM Int Source #
Get the number of successful examples encountered so far.
getPendingCount :: FormatM Int Source #
Get the number of pending examples encountered so far.
getFailCount :: FormatM Int Source #
Get the number of failed examples encountered so far.
getTotalCount :: FormatM Int Source #
Get the total number of examples encountered so far.
data FailureRecord Source #
getFailMessages :: FormatM [FailureRecord] Source #
Get the list of accumulated failure messages.
getCPUTime :: FormatM (Maybe Seconds) Source #
Get the used CPU time since the test run has been started.
getRealTime :: FormatM Seconds Source #
Get the passed real time since the test run has been started.
Appending to the generated report
writeTransient :: String -> FormatM () Source #
Dealing with colors
withInfoColor :: FormatM a -> FormatM a Source #
Set output color to cyan, run given action, and finally restore the default color.
withSuccessColor :: FormatM a -> FormatM a Source #
Set output color to green, run given action, and finally restore the default color.
withPendingColor :: FormatM a -> FormatM a Source #
Set output color to yellow, run given action, and finally restore the default color.
withFailColor :: FormatM a -> FormatM a Source #
Set output color to red, run given action, and finally restore the default color.
extraChunk :: String -> FormatM () Source #
Output given chunk in red.
missingChunk :: String -> FormatM () Source #
Output given chunk in green.
Helpers
formatException :: SomeException -> String Source #
The function formatException
converts an exception to a string.
This is different from show
. The type of the exception is included, e.g.:
>>>
formatException (toException DivideByZero)
"ArithException\ndivide by zero"
For IOException
s the IOErrorType
is included, as well.
Since: 2.0.0