Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- printOutputSpecForest :: Settings -> Timed ResultForest -> IO ()
- renderResultReport :: Settings -> TerminalCapabilities -> Timed ResultForest -> Builder
- outputResultReport :: Settings -> Timed ResultForest -> [[Chunk]]
- outputFailuresHeader :: [[Chunk]]
- outputFailuresWithHeading :: Settings -> ResultForest -> [[Chunk]]
- outputStats :: Timed TestSuiteStats -> [[Chunk]]
- outputProfilingInfo :: Timed ResultForest -> [[Chunk]]
- outputTestsHeader :: [[Chunk]]
- outputHeader :: Text -> [[Chunk]]
- outputSpecForest :: Settings -> Int -> Int -> ResultForest -> [[Chunk]]
- outputSpecTree :: Settings -> Int -> Int -> ResultTree -> [[Chunk]]
- outputDescribeLine :: Text -> [Chunk]
- outputSpecifyLines :: Settings -> Int -> Int -> Text -> TDef (Timed TestRunReport) -> [[Chunk]]
- exampleNrChunk :: Word -> Word -> Chunk
- timeChunkFor :: Word64 -> Chunk
- retriesChunks :: TestRunReport -> [[Chunk]]
- labelsChunks :: Word -> Maybe (Map [String] Int) -> [[Chunk]]
- classesChunks :: Maybe (Map String Int) -> [[Chunk]]
- tablesChunks :: Maybe (Map String (Map String Int)) -> [[Chunk]]
- outputPendingLines :: Text -> Maybe Text -> [[Chunk]]
- outputFailureLabels :: Maybe (Map [String] Int) -> [[Chunk]]
- commaList :: [String] -> String
- outputFailureClasses :: Maybe (Map String Int) -> [[Chunk]]
- outputGoldenCase :: GoldenCase -> [Chunk]
- spacingChunk :: Int -> Text -> Text -> Int -> Chunk
- outputFailures :: Settings -> ResultForest -> [[Chunk]]
- outputSomeException :: SomeException -> [[Chunk]]
- outputAssertion :: Assertion -> [[Chunk]]
- splitChunksIntoLines :: [Chunk] -> [[Chunk]]
- outputEqualityAssertionFailed :: String -> String -> [[Chunk]]
- outputNotEqualAssertionFailed :: String -> String -> [[Chunk]]
- outputPredicateSuccessAssertionFailed :: String -> Maybe String -> [[Chunk]]
- outputPredicateFailAssertionFailed :: String -> Maybe String -> [[Chunk]]
- mContextChunks :: Maybe String -> [[Chunk]]
- stringChunks :: String -> [[Chunk]]
- indexed :: [a] -> (Word -> a -> b) -> [b]
- statusColour :: TestStatus -> Colour
- statusCheckMark :: TestStatus -> Text
- resultForestWidth :: SpecForest a -> Int
- specForestWidth :: SpecDefForest a b c -> Int
- padding :: Chunk
- paddingSize :: Int
- orange :: Colour
- darkRed :: Colour
Documentation
printOutputSpecForest :: Settings -> Timed ResultForest -> IO () Source #
outputResultReport :: Settings -> Timed ResultForest -> [[Chunk]] Source #
outputFailuresHeader :: [[Chunk]] Source #
outputFailuresWithHeading :: Settings -> ResultForest -> [[Chunk]] Source #
outputStats :: Timed TestSuiteStats -> [[Chunk]] Source #
outputProfilingInfo :: Timed ResultForest -> [[Chunk]] Source #
outputTestsHeader :: [[Chunk]] Source #
outputHeader :: Text -> [[Chunk]] Source #
outputSpecForest :: Settings -> Int -> Int -> ResultForest -> [[Chunk]] Source #
outputSpecTree :: Settings -> Int -> Int -> ResultTree -> [[Chunk]] Source #
outputDescribeLine :: Text -> [Chunk] Source #
outputSpecifyLines :: Settings -> Int -> Int -> Text -> TDef (Timed TestRunReport) -> [[Chunk]] Source #
timeChunkFor :: Word64 -> Chunk Source #
retriesChunks :: TestRunReport -> [[Chunk]] Source #
outputGoldenCase :: GoldenCase -> [Chunk] Source #
outputFailures :: Settings -> ResultForest -> [[Chunk]] Source #
outputSomeException :: SomeException -> [[Chunk]] Source #
outputAssertion :: Assertion -> [[Chunk]] Source #
splitChunksIntoLines :: [Chunk] -> [[Chunk]] Source #
Split a list of Chunk
s into lines of [Chunks].
This is rather complicated because chunks may contain newlines, in which case they need to be split into two chunks on separate lines but with the same colour information. However, separate chunks are not necessarily on separate lines because there may not be a newline inbetween.
stringChunks :: String -> [[Chunk]] Source #
statusColour :: TestStatus -> Colour Source #
statusCheckMark :: TestStatus -> Text Source #
resultForestWidth :: SpecForest a -> Int Source #
specForestWidth :: SpecDefForest a b c -> Int Source #
paddingSize :: Int Source #