registry-hedgehog-0.8.0.0: utilities to work with Hedgehog generators and `registry`
Safe HaskellSafe-Inferred
LanguageGHC2021

Test.Tasty.HedgehogTest

Description

This redefines the HedgehogTest from tasty-hedgehog to display color during the reporting

Synopsis

Documentation

data HedgehogTest Source #

Hedgehog Property as a Tasty Test

Instances

Instances details
IsTest HedgehogTest Source # 
Instance details

Defined in Test.Tasty.HedgehogTest

Methods

run :: OptionSet -> HedgehogTest -> (Progress -> IO ()) -> IO Result

testOptions :: Tagged HedgehogTest [OptionDescription]

newtype HedgehogDiscardLimit Source #

The number of discarded cases allowed before Hedgehog will fail a test

newtype HedgehogShrinkLimit Source #

The number of shrinks allowed before Hedgehog will fail a test

newtype HedgehogShrinkRetries Source #

The number of times to re-run a test during shrinking

newtype HedgehogReplay Source #

The replay token to use for replaying a previous test run

Constructors

HedgehogReplay (Maybe (Size, Seed)) 

newtype HedgehogShowReplay Source #

If a test case fails, show a replay token for replaying tests

Constructors

HedgehogShowReplay Bool 

newtype ModuleName Source #

Option describing the current module name

Constructors

ModuleName Text 

Instances

Instances details
Show ModuleName Source # 
Instance details

Defined in Test.Tasty.HedgehogTest

Eq ModuleName Source # 
Instance details

Defined in Test.Tasty.HedgehogTest

IsOption ModuleName Source #

This option is not used on the command line, it is just used to annotate test groups

Instance details

Defined in Test.Tasty.HedgehogTest

testProperty :: TestName -> Property -> TestTree Source #

Create a Test from a Hedgehog property

groupByModuleName :: TestTree -> TestTree Source #

This allows the discovery of Hedgehog properties and their grouping by module name in the test report. Extract the ModuleName option value for a given test and group all the tests with that option into the same test group

getModuleName :: HasCallStack => String Source #

Return the module name of the current callstack

Orphan instances

Ord k => Monoid (MultiMap k v) Source # 
Instance details

Methods

mempty :: MultiMap k v #

mappend :: MultiMap k v -> MultiMap k v -> MultiMap k v #

mconcat :: [MultiMap k v] -> MultiMap k v #

Ord k => Semigroup (MultiMap k v) Source # 
Instance details

Methods

(<>) :: MultiMap k v -> MultiMap k v -> MultiMap k v #

sconcat :: NonEmpty (MultiMap k v) -> MultiMap k v #

stimes :: Integral b => b -> MultiMap k v -> MultiMap k v #