hedgehog-1.2: Release with confidence.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Hedgehog.Internal.Config

Synopsis

Documentation

data UseColor Source #

Whether to render output using ANSI colors or not.

Constructors

DisableColor

Disable ANSI colors in report output.

EnableColor

Enable ANSI colors in report output.

Instances

Instances details
Show UseColor Source # 
Instance details

Defined in Hedgehog.Internal.Config

Eq UseColor Source # 
Instance details

Defined in Hedgehog.Internal.Config

Ord UseColor Source # 
Instance details

Defined in Hedgehog.Internal.Config

Lift UseColor Source # 
Instance details

Defined in Hedgehog.Internal.Config

Methods

lift :: Quote m => UseColor -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => UseColor -> Code m UseColor #

data Seed Source #

A splittable random number generator.

Constructors

Seed 

Fields

Instances

Instances details
Read Seed Source # 
Instance details

Defined in Hedgehog.Internal.Seed

Show Seed Source # 
Instance details

Defined in Hedgehog.Internal.Seed

Methods

showsPrec :: Int -> Seed -> ShowS #

show :: Seed -> String #

showList :: [Seed] -> ShowS #

Eq Seed Source # 
Instance details

Defined in Hedgehog.Internal.Seed

Methods

(==) :: Seed -> Seed -> Bool #

(/=) :: Seed -> Seed -> Bool #

Ord Seed Source # 
Instance details

Defined in Hedgehog.Internal.Seed

Methods

compare :: Seed -> Seed -> Ordering #

(<) :: Seed -> Seed -> Bool #

(<=) :: Seed -> Seed -> Bool #

(>) :: Seed -> Seed -> Bool #

(>=) :: Seed -> Seed -> Bool #

max :: Seed -> Seed -> Seed #

min :: Seed -> Seed -> Seed #

RandomGen Seed Source # 
Instance details

Defined in Hedgehog.Internal.Seed

Lift Seed Source # 
Instance details

Defined in Hedgehog.Internal.Seed

Methods

lift :: Quote m => Seed -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Seed -> Code m Seed #

data Verbosity Source #

How verbose should the report output be.

Constructors

Quiet

Only display the summary of the test run.

Normal

Display each property as it is running, as well as the summary.

Instances

Instances details
Show Verbosity Source # 
Instance details

Defined in Hedgehog.Internal.Config

Eq Verbosity Source # 
Instance details

Defined in Hedgehog.Internal.Config

Ord Verbosity Source # 
Instance details

Defined in Hedgehog.Internal.Config

Lift Verbosity Source # 
Instance details

Defined in Hedgehog.Internal.Config

Methods

lift :: Quote m => Verbosity -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Verbosity -> Code m Verbosity #

newtype WorkerCount Source #

The number of workers to use when running properties in parallel.

Constructors

WorkerCount Int 

Instances

Instances details
Enum WorkerCount Source # 
Instance details

Defined in Hedgehog.Internal.Config

Num WorkerCount Source # 
Instance details

Defined in Hedgehog.Internal.Config

Integral WorkerCount Source # 
Instance details

Defined in Hedgehog.Internal.Config

Real WorkerCount Source # 
Instance details

Defined in Hedgehog.Internal.Config

Show WorkerCount Source # 
Instance details

Defined in Hedgehog.Internal.Config

Eq WorkerCount Source # 
Instance details

Defined in Hedgehog.Internal.Config

Ord WorkerCount Source # 
Instance details

Defined in Hedgehog.Internal.Config

Lift WorkerCount Source # 
Instance details

Defined in Hedgehog.Internal.Config

Methods

lift :: Quote m => WorkerCount -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => WorkerCount -> Code m WorkerCount #

data Skip Source #

Where to start running a property's tests.

Constructors

SkipNothing

Don't skip anything.

SkipToTest TestCount

Skip to a specific test number. If it fails, shrink as normal. If it passes, move on to the next test. Coverage checks are disabled.

SkipToShrink TestCount ShrinkPath

Skip to a specific test number and shrink state. If it fails, stop without shrinking further. If it passes, the property will pass without running any more tests.

Due to implementation details, all intermediate shrink states - those on the direct path from the original test input to the target state - will be tested too, and their results discarded.

Instances

Instances details
IsString Skip Source #

We use this instance to support usage like

  withSkip "3:aB"

It throws an error if the input is not a valid compressed Skip.

Instance details

Defined in Hedgehog.Internal.Property

Methods

fromString :: String -> Skip #

Show Skip Source # 
Instance details

Defined in Hedgehog.Internal.Property

Methods

showsPrec :: Int -> Skip -> ShowS #

show :: Skip -> String #

showList :: [Skip] -> ShowS #

Eq Skip Source # 
Instance details

Defined in Hedgehog.Internal.Property

Methods

(==) :: Skip -> Skip -> Bool #

(/=) :: Skip -> Skip -> Bool #

Ord Skip Source # 
Instance details

Defined in Hedgehog.Internal.Property

Methods

compare :: Skip -> Skip -> Ordering #

(<) :: Skip -> Skip -> Bool #

(<=) :: Skip -> Skip -> Bool #

(>) :: Skip -> Skip -> Bool #

(>=) :: Skip -> Skip -> Bool #

max :: Skip -> Skip -> Skip #

min :: Skip -> Skip -> Skip #

Lift Skip Source # 
Instance details

Defined in Hedgehog.Internal.Property

Methods

lift :: Quote m => Skip -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Skip -> Code m Skip #