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

Test.Tasty.Hedgehogx

Synopsis

Documentation

class Show1 (f :: TYPE LiftedRep -> TYPE LiftedRep) #

Lifting of the Show class to unary type constructors.

Since: base-4.9.0.0

Minimal complete definition

liftShowsPrec

Instances

Instances details
Show1 Complex
>>> showsPrec1 0 (2 :+ 3) ""
"2 :+ 3"

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Complex a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Complex a] -> ShowS #

Show1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Identity a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Identity a] -> ShowS #

Show1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Down a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Down a] -> ShowS #

Show1 SCC

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> SCC a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [SCC a] -> ShowS #

Show1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> IntMap a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [IntMap a] -> ShowS #

Show1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Seq a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Seq a] -> ShowS #

Show1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Set a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Set a] -> ShowS #

Show1 Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Concrete a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Concrete a] -> ShowS #

Show1 Symbolic 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Symbolic a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Symbolic a] -> ShowS #

Show1 Hashed 
Instance details

Defined in Data.Hashable.Class

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Hashed a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Hashed a] -> ShowS #

Show1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashSet a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashSet a] -> ShowS #

Show1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> NonEmpty a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [NonEmpty a] -> ShowS #

Show1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Maybe a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Maybe a] -> ShowS #

Show1 Solo

Since: base-4.15

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Solo a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Solo a] -> ShowS #

Show1 []

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> [a] -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [[a]] -> ShowS #

Show a => Show1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Either a a0 -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Either a a0] -> ShowS #

Show1 (Proxy :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Proxy a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Proxy a] -> ShowS #

Show k => Show1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Map k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Map k a] -> ShowS #

Show1 m => Show1 (NodeT m) 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> NodeT m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [NodeT m a] -> ShowS #

Show1 m => Show1 (TreeT m) 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> TreeT m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [TreeT m a] -> ShowS #

Show k => Show1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashMap k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashMap k a] -> ShowS #

Show1 m => Show1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> MaybeT m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [MaybeT m a] -> ShowS #

Show a => Show1 ((,) a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> (a, a0) -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [(a, a0)] -> ShowS #

Show a => Show1 (Const a :: TYPE LiftedRep -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Const a a0 -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Const a a0] -> ShowS #

Show1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Tagged s a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Tagged s a] -> ShowS #

(Show e, Show1 m) => Show1 (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> ErrorT e m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [ErrorT e m a] -> ShowS #

(Show e, Show1 m) => Show1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> ExceptT e m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [ExceptT e m a] -> ShowS #

Show1 f => Show1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> IdentityT f a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [IdentityT f a] -> ShowS #

(Show w, Show1 m) => Show1 (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> WriterT w m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [WriterT w m a] -> ShowS #

(Show w, Show1 m) => Show1 (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> WriterT w m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [WriterT w m a] -> ShowS #

(Show a, Show b) => Show1 ((,,) a b)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> (a, b, a0) -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [(a, b, a0)] -> ShowS #

(Show a, Show b, Show c) => Show1 ((,,,) a b c)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> (a, b, c, a0) -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [(a, b, c, a0)] -> ShowS #

class Eq1 f => Ord1 (f :: Type -> Type) #

Lifting of the Ord class to unary type constructors.

Since: base-4.9.0.0

Minimal complete definition

liftCompare

Instances

Instances details
Ord1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Identity a -> Identity b -> Ordering #

Ord1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Down a -> Down b -> Ordering #

Ord1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> IntMap a -> IntMap b -> Ordering #

Ord1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Seq a -> Seq b -> Ordering #

Ord1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Set a -> Set b -> Ordering #

Ord1 Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftCompare :: (a -> b -> Ordering) -> Concrete a -> Concrete b -> Ordering #

Ord1 Symbolic 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftCompare :: (a -> b -> Ordering) -> Symbolic a -> Symbolic b -> Ordering #

Ord1 Hashed 
Instance details

Defined in Data.Hashable.Class

Methods

liftCompare :: (a -> b -> Ordering) -> Hashed a -> Hashed b -> Ordering #

Ord1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> HashSet a -> HashSet b -> Ordering #

Ord1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> NonEmpty a -> NonEmpty b -> Ordering #

Ord1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Maybe a -> Maybe b -> Ordering #

Ord1 Solo

Since: base-4.15

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Solo a -> Solo b -> Ordering #

Ord1 []

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> [a] -> [b] -> Ordering #

Ord a => Ord1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Either a a0 -> Either a b -> Ordering #

Ord1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Proxy a -> Proxy b -> Ordering #

Ord k => Ord1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Map k a -> Map k b -> Ordering #

Ord k => Ord1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> HashMap k a -> HashMap k b -> Ordering #

Ord1 m => Ord1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftCompare :: (a -> b -> Ordering) -> MaybeT m a -> MaybeT m b -> Ordering #

Ord a => Ord1 ((,) a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> (a, a0) -> (a, b) -> Ordering #

Ord a => Ord1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Const a a0 -> Const a b -> Ordering #

Ord1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftCompare :: (a -> b -> Ordering) -> Tagged s a -> Tagged s b -> Ordering #

(Ord e, Ord1 m) => Ord1 (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

liftCompare :: (a -> b -> Ordering) -> ErrorT e m a -> ErrorT e m b -> Ordering #

(Ord e, Ord1 m) => Ord1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftCompare :: (a -> b -> Ordering) -> ExceptT e m a -> ExceptT e m b -> Ordering #

Ord1 f => Ord1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftCompare :: (a -> b -> Ordering) -> IdentityT f a -> IdentityT f b -> Ordering #

(Ord w, Ord1 m) => Ord1 (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

liftCompare :: (a -> b -> Ordering) -> WriterT w m a -> WriterT w m b -> Ordering #

(Ord w, Ord1 m) => Ord1 (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

liftCompare :: (a -> b -> Ordering) -> WriterT w m a -> WriterT w m b -> Ordering #

(Ord a, Ord b) => Ord1 ((,,) a b)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b0 -> Ordering) -> (a, b, a0) -> (a, b, b0) -> Ordering #

(Ord a, Ord b, Ord c) => Ord1 ((,,,) a b c)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b0 -> Ordering) -> (a, b, c, a0) -> (a, b, c, b0) -> Ordering #

class Eq1 (f :: Type -> Type) #

Lifting of the Eq class to unary type constructors.

Since: base-4.9.0.0

Minimal complete definition

liftEq

Instances

Instances details
Eq1 Complex
>>> eq1 (1 :+ 2) (1 :+ 2)
True
>>> eq1 (1 :+ 2) (1 :+ 3)
False

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Complex a -> Complex b -> Bool #

Eq1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Identity a -> Identity b -> Bool #

Eq1 Down

Since: base-4.12.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Down a -> Down b -> Bool #

Eq1 SCC

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

liftEq :: (a -> b -> Bool) -> SCC a -> SCC b -> Bool #

Eq1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> IntMap a -> IntMap b -> Bool #

Eq1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftEq :: (a -> b -> Bool) -> Seq a -> Seq b -> Bool #

Eq1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftEq :: (a -> b -> Bool) -> Set a -> Set b -> Bool #

Eq1 Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftEq :: (a -> b -> Bool) -> Concrete a -> Concrete b -> Bool #

Eq1 Symbolic 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftEq :: (a -> b -> Bool) -> Symbolic a -> Symbolic b -> Bool #

Eq1 Hashed 
Instance details

Defined in Data.Hashable.Class

Methods

liftEq :: (a -> b -> Bool) -> Hashed a -> Hashed b -> Bool #

Eq1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftEq :: (a -> b -> Bool) -> HashSet a -> HashSet b -> Bool #

Eq1 NonEmpty

Since: base-4.10.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> NonEmpty a -> NonEmpty b -> Bool #

Eq1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Maybe a -> Maybe b -> Bool #

Eq1 Solo

Since: base-4.15

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Solo a -> Solo b -> Bool #

Eq1 []

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> [a] -> [b] -> Bool #

Eq a => Eq1 (Either a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Either a a0 -> Either a b -> Bool #

Eq1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Proxy a -> Proxy b -> Bool #

Eq k => Eq1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq :: (a -> b -> Bool) -> Map k a -> Map k b -> Bool #

Eq k => Eq1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> HashMap k a -> HashMap k b -> Bool #

Eq1 m => Eq1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftEq :: (a -> b -> Bool) -> MaybeT m a -> MaybeT m b -> Bool #

Eq a => Eq1 ((,) a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> (a, a0) -> (a, b) -> Bool #

Eq a => Eq1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Const a a0 -> Const a b -> Bool #

Eq1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftEq :: (a -> b -> Bool) -> Tagged s a -> Tagged s b -> Bool #

(Eq e, Eq1 m) => Eq1 (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

liftEq :: (a -> b -> Bool) -> ErrorT e m a -> ErrorT e m b -> Bool #

(Eq e, Eq1 m) => Eq1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftEq :: (a -> b -> Bool) -> ExceptT e m a -> ExceptT e m b -> Bool #

Eq1 f => Eq1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftEq :: (a -> b -> Bool) -> IdentityT f a -> IdentityT f b -> Bool #

(Eq w, Eq1 m) => Eq1 (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

liftEq :: (a -> b -> Bool) -> WriterT w m a -> WriterT w m b -> Bool #

(Eq w, Eq1 m) => Eq1 (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

liftEq :: (a -> b -> Bool) -> WriterT w m a -> WriterT w m b -> Bool #

(Eq a, Eq b) => Eq1 ((,,) a b)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b0 -> Bool) -> (a, b, a0) -> (a, b, b0) -> Bool #

(Eq a, Eq b, Eq c) => Eq1 ((,,,) a b c)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b0 -> Bool) -> (a, b, c, a0) -> (a, b, c, b0) -> Bool #

showsPrec1 :: (Show1 f, Show a) => Int -> f a -> ShowS #

Lift the standard showsPrec and showList functions through the type constructor.

Since: base-4.9.0.0

eq1 :: (Eq1 f, Eq a) => f a -> f a -> Bool #

Lift the standard (==) function through the type constructor.

Since: base-4.9.0.0

compare1 :: (Ord1 f, Ord a) => f a -> f a -> Ordering #

Lift the standard compare function through the type constructor.

Since: base-4.9.0.0

(/==) :: (MonadTest m, Eq a, Show a, HasCallStack) => a -> a -> m () #

(===) :: (MonadTest m, Eq a, Show a, HasCallStack) => a -> a -> m () #

annotateShow :: (MonadTest m, Show a, HasCallStack) => a -> m () #

assert :: (MonadTest m, HasCallStack) => Bool -> m () #

collect :: (MonadTest m, Show a, HasCallStack) => a -> m () #

cover :: (MonadTest m, HasCallStack) => CoverPercentage -> LabelName -> Bool -> m () #

diff :: (MonadTest m, Show a, Show b, HasCallStack) => a -> (a -> b -> Bool) -> b -> m () #

discard :: forall (m :: Type -> Type) a. Monad m => PropertyT m a #

eval :: (MonadTest m, HasCallStack) => a -> m a #

evalEither :: (MonadTest m, Show x, HasCallStack) => Either x a -> m a #

evalEitherM :: (MonadTest m, Show x, MonadCatch m, HasCallStack) => m (Either x a) -> m a #

evalExceptT :: (MonadTest m, Show x, HasCallStack) => ExceptT x m a -> m a #

evalIO :: (MonadTest m, MonadIO m, HasCallStack) => IO a -> m a #

evalM :: (MonadTest m, MonadCatch m, HasCallStack) => m a -> m a #

evalMaybe :: (MonadTest m, Show a, HasCallStack) => Maybe a -> m a #

evalMaybeM :: (MonadTest m, Show a, MonadCatch m, HasCallStack) => m (Maybe a) -> m a #

evalNF :: (MonadTest m, NFData a, HasCallStack) => a -> m a #

footnote :: MonadTest m => String -> m () #

footnoteShow :: (MonadTest m, Show a) => a -> m () #

forAll :: forall (m :: Type -> Type) a. (Monad m, Show a, HasCallStack) => Gen a -> PropertyT m a #

forAllWith :: forall (m :: Type -> Type) a. (Monad m, HasCallStack) => (a -> String) -> Gen a -> PropertyT m a #

success :: MonadTest m => m () #

check :: MonadIO m => Property -> m Bool #

recheck :: MonadIO m => Size -> Seed -> Property -> m () #

executeParallel :: (MonadTest m, MonadCatch m, MonadBaseControl IO m, HasCallStack) => (forall (v :: Type -> Type). state v) -> Parallel m state -> m () #

executeSequential :: (MonadTest m, MonadCatch m, HasCallStack) => (forall (v :: Type -> Type). state v) -> Sequential m state -> m () #

opaque :: Var (Opaque a) Concrete -> a #

discover :: TExpQ Group #

tripping :: (MonadTest m, Applicative f, Show b, Show (f a), Eq (f a), HasCallStack) => a -> (a -> b) -> (b -> f a) -> m () #

class FunctorB (b :: (k -> Type) -> Type) where #

Minimal complete definition

Nothing

Methods

bmap :: (forall (a :: k). f a -> g a) -> b f -> b g #

Instances

Instances details
FunctorB (Var a :: (Type -> Type) -> Type) 
Instance details

Defined in Hedgehog.Internal.State

Methods

bmap :: (forall (a0 :: k). f a0 -> g a0) -> Var a f -> Var a g #

FunctorB (Proxy :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap :: (forall (a :: k0). f a -> g a) -> Proxy f -> Proxy g #

FunctorB (Const x :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap :: (forall (a :: k0). f a -> g a) -> Const x f -> Const x g #

FunctorB (Constant x :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap :: (forall (a :: k0). f a -> g a) -> Constant x f -> Constant x g #

(FunctorB a, FunctorB b) => FunctorB (Product a b :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap :: (forall (a0 :: k0). f a0 -> g a0) -> Product a b f -> Product a b g #

(FunctorB a, FunctorB b) => FunctorB (Sum a b :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap :: (forall (a0 :: k0). f a0 -> g a0) -> Sum a b f -> Sum a b g #

(Functor f, FunctorB b) => FunctorB (Compose f b :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap :: (forall (a :: k0). f0 a -> g a) -> Compose f b f0 -> Compose f b g #

class FunctorB b => TraversableB (b :: (k -> Type) -> Type) where #

Minimal complete definition

Nothing

Methods

btraverse :: Applicative e => (forall (a :: k). f a -> e (g a)) -> b f -> e (b g) #

Instances

Instances details
TraversableB (Var a :: (Type -> Type) -> Type) 
Instance details

Defined in Hedgehog.Internal.State

Methods

btraverse :: Applicative e => (forall (a0 :: k). f a0 -> e (g a0)) -> Var a f -> e (Var a g) #

TraversableB (Proxy :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverse :: Applicative e => (forall (a :: k0). f a -> e (g a)) -> Proxy f -> e (Proxy g) #

TraversableB (Const a :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverse :: Applicative e => (forall (a0 :: k0). f a0 -> e (g a0)) -> Const a f -> e (Const a g) #

TraversableB (Constant a :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverse :: Applicative e => (forall (a0 :: k0). f a0 -> e (g a0)) -> Constant a f -> e (Constant a g) #

(TraversableB a, TraversableB b) => TraversableB (Product a b :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverse :: Applicative e => (forall (a0 :: k0). f a0 -> e (g a0)) -> Product a b f -> e (Product a b g) #

(TraversableB a, TraversableB b) => TraversableB (Sum a b :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverse :: Applicative e => (forall (a0 :: k0). f a0 -> e (g a0)) -> Sum a b f -> e (Sum a b g) #

(Traversable f, TraversableB b) => TraversableB (Compose f b :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverse :: Applicative e => (forall (a :: k0). f0 a -> e (g a)) -> Compose f b f0 -> e (Compose f b g) #

newtype Rec p a (x :: k) #

Constructors

Rec 

Fields

Instances

Instances details
GConstraints n (c :: k1 -> Constraint) (f :: k2) (Rec a' a :: Type -> TYPE LiftedRep) (Rec b' b :: k3 -> TYPE LiftedRep) (Rec b' b :: k3 -> TYPE LiftedRep) 
Instance details

Defined in Barbies.Generics.Constraints

Methods

gaddDicts :: forall (x :: k20). GAll n c (Rec a' a) => Rec b' b x -> Rec b' b x

GConstraints n (c :: k1 -> Constraint) (f :: k1 -> Type) (Rec (P n (X :: k1 -> Type) a') (X a) :: Type -> TYPE LiftedRep) (Rec (P n f a') (f a) :: k2 -> TYPE LiftedRep) (Rec (P n (Product (Dict c) f) a') (Product (Dict c) f a) :: k2 -> TYPE LiftedRep) 
Instance details

Defined in Barbies.Generics.Constraints

Methods

gaddDicts :: forall (x :: k20). GAll n c (Rec (P n X a') (X a)) => Rec (P n f a') (f a) x -> Rec (P n (Product (Dict c) f) a') (Product (Dict c) f a) x

type GAll n (c :: k -> Constraint) (Rec l r :: Type -> TYPE LiftedRep) 
Instance details

Defined in Barbies.Generics.Constraints

type GAll n (c :: k -> Constraint) (Rec l r :: Type -> TYPE LiftedRep) = GAllRec n c l r

distributeT :: forall f (m :: Type -> Type) a. (MonadTransDistributive g, Transformer f g m) => g (f m) a -> f (g m) a #

data GenT (m :: Type -> Type) a #

Instances

Instances details
MonadTransDistributive GenT 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type Transformer f GenT m

Methods

distributeT :: forall f (m :: Type -> Type) a. Transformer f GenT m => GenT (f m) a -> f (GenT m) a #

MMonad GenT 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

embed :: forall (n :: Type -> Type) m b. Monad n => (forall a. m a -> GenT n a) -> GenT m b -> GenT n b

MonadTrans GenT 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

lift :: Monad m => m a -> GenT m a #

MFunctor GenT 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

hoist :: forall m n (b :: k). Monad m => (forall a. m a -> n a) -> GenT m b -> GenT n b

MonadBaseControl b m => MonadBaseControl b (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type StM (GenT m) a

Methods

liftBaseWith :: (RunInBase (GenT m) b -> b a) -> GenT m a

restoreM :: StM (GenT m) a -> GenT m a

MonadError e m => MonadError e (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

throwError :: e -> GenT m a #

catchError :: GenT m a -> (e -> GenT m a) -> GenT m a #

MonadReader r m => MonadReader r (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

ask :: GenT m r #

local :: (r -> r) -> GenT m a -> GenT m a #

reader :: (r -> a) -> GenT m a #

MonadState s m => MonadState s (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

get :: GenT m s #

put :: s -> GenT m () #

state :: (s -> (a, s)) -> GenT m a #

MonadWriter w m => MonadWriter w (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

writer :: (a, w) -> GenT m a #

tell :: w -> GenT m () #

listen :: GenT m a -> GenT m (a, w) #

pass :: GenT m (a, w -> w) -> GenT m a #

MonadBase b m => MonadBase b (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

liftBase :: b α -> GenT m α

Monad m => MonadFail (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

fail :: String -> GenT m a #

MonadIO m => MonadIO (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

liftIO :: IO a -> GenT m a #

Monad m => Alternative (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

empty :: GenT m a #

(<|>) :: GenT m a -> GenT m a -> GenT m a #

some :: GenT m a -> GenT m [a] #

many :: GenT m a -> GenT m [a] #

Monad m => Applicative (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

pure :: a -> GenT m a #

(<*>) :: GenT m (a -> b) -> GenT m a -> GenT m b #

liftA2 :: (a -> b -> c) -> GenT m a -> GenT m b -> GenT m c #

(*>) :: GenT m a -> GenT m b -> GenT m b #

(<*) :: GenT m a -> GenT m b -> GenT m a #

Functor m => Functor (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

fmap :: (a -> b) -> GenT m a -> GenT m b #

(<$) :: a -> GenT m b -> GenT m a #

Monad m => Monad (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

(>>=) :: GenT m a -> (a -> GenT m b) -> GenT m b #

(>>) :: GenT m a -> GenT m b -> GenT m b #

return :: a -> GenT m a #

Monad m => MonadPlus (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

mzero :: GenT m a #

mplus :: GenT m a -> GenT m a -> GenT m a #

MonadCatch m => MonadCatch (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

catch :: Exception e => GenT m a -> (e -> GenT m a) -> GenT m a #

MonadThrow m => MonadThrow (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

throwM :: Exception e => e -> GenT m a #

Monad m => MonadGen (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (GenT m) :: Type -> Type #

Methods

toGenT :: GenT m a -> GenT (GenBase (GenT m)) a #

fromGenT :: GenT (GenBase (GenT m)) a -> GenT m a #

PrimMonad m => PrimMonad (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type PrimState (GenT m)

Methods

primitive :: (State# (PrimState (GenT m)) -> (# State# (PrimState (GenT m)), a #)) -> GenT m a

MonadResource m => MonadResource (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

liftResourceT :: ResourceT IO a -> GenT m a

(Monad m, Monoid a) => Monoid (GenT m a) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

mempty :: GenT m a #

mappend :: GenT m a -> GenT m a -> GenT m a #

mconcat :: [GenT m a] -> GenT m a #

(Monad m, Semigroup a) => Semigroup (GenT m a) 
Instance details

Defined in Hedgehog.Internal.Gen

Methods

(<>) :: GenT m a -> GenT m a -> GenT m a #

sconcat :: NonEmpty (GenT m a) -> GenT m a #

stimes :: Integral b => b -> GenT m a -> GenT m a #

type Transformer t GenT m 
Instance details

Defined in Hedgehog.Internal.Gen

type Transformer t GenT m = (Monad (t (GenT m)), Transformer t MaybeT m, Transformer t TreeT (MaybeT m))
type GenBase (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (GenT m) = m
type PrimState (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

type PrimState (GenT m) = PrimState m
type StM (GenT m) a 
Instance details

Defined in Hedgehog.Internal.Gen

type StM (GenT m) a = StM (ReaderT Size (ReaderT Seed (TreeT (MaybeT m)))) a

class (Monad m, Monad (GenBase m)) => MonadGen (m :: Type -> Type) where #

Associated Types

type GenBase (m :: Type -> Type) :: Type -> Type #

Methods

toGenT :: m a -> GenT (GenBase m) a #

fromGenT :: GenT (GenBase m) a -> m a #

Instances

Instances details
Monad m => MonadGen (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (GenT m) :: Type -> Type #

Methods

toGenT :: GenT m a -> GenT (GenBase (GenT m)) a #

fromGenT :: GenT (GenBase (GenT m)) a -> GenT m a #

MonadGen m => MonadGen (MaybeT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (MaybeT m) :: Type -> Type #

Methods

toGenT :: MaybeT m a -> GenT (GenBase (MaybeT m)) a #

fromGenT :: GenT (GenBase (MaybeT m)) a -> MaybeT m a #

MonadGen m => MonadGen (ExceptT x m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (ExceptT x m) :: Type -> Type #

Methods

toGenT :: ExceptT x m a -> GenT (GenBase (ExceptT x m)) a #

fromGenT :: GenT (GenBase (ExceptT x m)) a -> ExceptT x m a #

MonadGen m => MonadGen (IdentityT m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (IdentityT m) :: Type -> Type #

Methods

toGenT :: IdentityT m a -> GenT (GenBase (IdentityT m)) a #

fromGenT :: GenT (GenBase (IdentityT m)) a -> IdentityT m a #

MonadGen m => MonadGen (ReaderT r m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (ReaderT r m) :: Type -> Type #

Methods

toGenT :: ReaderT r m a -> GenT (GenBase (ReaderT r m)) a #

fromGenT :: GenT (GenBase (ReaderT r m)) a -> ReaderT r m a #

MonadGen m => MonadGen (StateT r m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (StateT r m) :: Type -> Type #

Methods

toGenT :: StateT r m a -> GenT (GenBase (StateT r m)) a #

fromGenT :: GenT (GenBase (StateT r m)) a -> StateT r m a #

MonadGen m => MonadGen (StateT r m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (StateT r m) :: Type -> Type #

Methods

toGenT :: StateT r m a -> GenT (GenBase (StateT r m)) a #

fromGenT :: GenT (GenBase (StateT r m)) a -> StateT r m a #

(MonadGen m, Monoid w) => MonadGen (WriterT w m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (WriterT w m) :: Type -> Type #

Methods

toGenT :: WriterT w m a -> GenT (GenBase (WriterT w m)) a #

fromGenT :: GenT (GenBase (WriterT w m)) a -> WriterT w m a #

(MonadGen m, Monoid w) => MonadGen (WriterT w m) 
Instance details

Defined in Hedgehog.Internal.Gen

Associated Types

type GenBase (WriterT w m) :: Type -> Type #

Methods

toGenT :: WriterT w m a -> GenT (GenBase (WriterT w m)) a #

fromGenT :: GenT (GenBase (WriterT w m)) a -> WriterT w m a #

type family GenBase (m :: Type -> Type) :: Type -> Type #

Instances

Instances details
type GenBase (GenT m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (GenT m) = m
type GenBase (MaybeT m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (MaybeT m) = MaybeT (GenBase m)
type GenBase (ExceptT x m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (ExceptT x m) = ExceptT x (GenBase m)
type GenBase (IdentityT m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (ReaderT r m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (ReaderT r m) = ReaderT r (GenBase m)
type GenBase (StateT r m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (StateT r m) = StateT r (GenBase m)
type GenBase (StateT r m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (StateT r m) = StateT r (GenBase m)
type GenBase (WriterT w m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (WriterT w m) = WriterT w (GenBase m)
type GenBase (WriterT w m) 
Instance details

Defined in Hedgehog.Internal.Gen

type GenBase (WriterT w m) = WriterT w (GenBase m)

class HTraversable (t :: (Type -> TYPE LiftedRep) -> TYPE LiftedRep) where #

Methods

htraverse :: Applicative f => (forall a. g a -> f (h a)) -> t g -> f (t h) #

newtype Opaque a #

Constructors

Opaque 

Fields

Instances

Instances details
Show (Opaque a) 
Instance details

Defined in Hedgehog.Internal.Opaque

Methods

showsPrec :: Int -> Opaque a -> ShowS #

show :: Opaque a -> String #

showList :: [Opaque a] -> ShowS #

Eq a => Eq (Opaque a) 
Instance details

Defined in Hedgehog.Internal.Opaque

Methods

(==) :: Opaque a -> Opaque a -> Bool #

(/=) :: Opaque a -> Opaque a -> Bool #

Ord a => Ord (Opaque a) 
Instance details

Defined in Hedgehog.Internal.Opaque

Methods

compare :: Opaque a -> Opaque a -> Ordering #

(<) :: Opaque a -> Opaque a -> Bool #

(<=) :: Opaque a -> Opaque a -> Bool #

(>) :: Opaque a -> Opaque a -> Bool #

(>=) :: Opaque a -> Opaque a -> Bool #

max :: Opaque a -> Opaque a -> Opaque a #

min :: Opaque a -> Opaque a -> Opaque a #

data DiscardLimit #

Instances

Instances details
Enum DiscardLimit 
Instance details

Defined in Hedgehog.Internal.Property

Num DiscardLimit 
Instance details

Defined in Hedgehog.Internal.Property

Integral DiscardLimit 
Instance details

Defined in Hedgehog.Internal.Property

Real DiscardLimit 
Instance details

Defined in Hedgehog.Internal.Property

Show DiscardLimit 
Instance details

Defined in Hedgehog.Internal.Property

Eq DiscardLimit 
Instance details

Defined in Hedgehog.Internal.Property

Ord DiscardLimit 
Instance details

Defined in Hedgehog.Internal.Property

Lift DiscardLimit 
Instance details

Defined in Hedgehog.Internal.Property

Methods

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

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

data Group #

Constructors

Group 

data GroupName #

Instances

Instances details
IsString GroupName 
Instance details

Defined in Hedgehog.Internal.Property

Semigroup GroupName 
Instance details

Defined in Hedgehog.Internal.Property

Show GroupName 
Instance details

Defined in Hedgehog.Internal.Property

Eq GroupName 
Instance details

Defined in Hedgehog.Internal.Property

Ord GroupName 
Instance details

Defined in Hedgehog.Internal.Property

Lift GroupName 
Instance details

Defined in Hedgehog.Internal.Property

Methods

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

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

class Monad m => MonadTest (m :: Type -> Type) where #

Methods

liftTest :: Test a -> m a #

Instances

Instances details
Monad m => MonadTest (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> PropertyT m a #

Monad m => MonadTest (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> TestT m a #

MonadTest m => MonadTest (ResourceT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> ResourceT m a #

MonadTest m => MonadTest (MaybeT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> MaybeT m a #

MonadTest m => MonadTest (ExceptT x m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> ExceptT x m a #

MonadTest m => MonadTest (IdentityT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> IdentityT m a #

MonadTest m => MonadTest (ReaderT r m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> ReaderT r m a #

MonadTest m => MonadTest (StateT s m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> StateT s m a #

MonadTest m => MonadTest (StateT s m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> StateT s m a #

(MonadTest m, Monoid w) => MonadTest (WriterT w m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> WriterT w m a #

(MonadTest m, Monoid w) => MonadTest (WriterT w m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> WriterT w m a #

MonadTest m => MonadTest (ContT r m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> ContT r m a #

(MonadTest m, Monoid w) => MonadTest (RWST r w s m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> RWST r w s m a #

(MonadTest m, Monoid w) => MonadTest (RWST r w s m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> RWST r w s m a #

data Property #

data PropertyT (m :: Type -> Type) a #

Instances

Instances details
MonadTransDistributive PropertyT 
Instance details

Defined in Hedgehog.Internal.Property

Associated Types

type Transformer f PropertyT m

Methods

distributeT :: forall f (m :: Type -> Type) a. Transformer f PropertyT m => PropertyT (f m) a -> f (PropertyT m) a #

MonadTrans PropertyT 
Instance details

Defined in Hedgehog.Internal.Property

Methods

lift :: Monad m => m a -> PropertyT m a #

MFunctor PropertyT 
Instance details

Defined in Hedgehog.Internal.Property

Methods

hoist :: forall m n (b :: k). Monad m => (forall a. m a -> n a) -> PropertyT m b -> PropertyT n b

MonadBaseControl b m => MonadBaseControl b (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Associated Types

type StM (PropertyT m) a

Methods

liftBaseWith :: (RunInBase (PropertyT m) b -> b a) -> PropertyT m a

restoreM :: StM (PropertyT m) a -> PropertyT m a

MonadError e m => MonadError e (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

throwError :: e -> PropertyT m a #

catchError :: PropertyT m a -> (e -> PropertyT m a) -> PropertyT m a #

MonadReader r m => MonadReader r (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

ask :: PropertyT m r #

local :: (r -> r) -> PropertyT m a -> PropertyT m a #

reader :: (r -> a) -> PropertyT m a #

MonadState s m => MonadState s (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

get :: PropertyT m s #

put :: s -> PropertyT m () #

state :: (s -> (a, s)) -> PropertyT m a #

MonadBase b m => MonadBase b (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftBase :: b α -> PropertyT m α

Monad m => MonadFail (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

fail :: String -> PropertyT m a #

MonadIO m => MonadIO (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftIO :: IO a -> PropertyT m a #

MonadPlus m => Alternative (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

empty :: PropertyT m a #

(<|>) :: PropertyT m a -> PropertyT m a -> PropertyT m a #

some :: PropertyT m a -> PropertyT m [a] #

many :: PropertyT m a -> PropertyT m [a] #

Monad m => Applicative (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

pure :: a -> PropertyT m a #

(<*>) :: PropertyT m (a -> b) -> PropertyT m a -> PropertyT m b #

liftA2 :: (a -> b -> c) -> PropertyT m a -> PropertyT m b -> PropertyT m c #

(*>) :: PropertyT m a -> PropertyT m b -> PropertyT m b #

(<*) :: PropertyT m a -> PropertyT m b -> PropertyT m a #

Functor m => Functor (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

fmap :: (a -> b) -> PropertyT m a -> PropertyT m b #

(<$) :: a -> PropertyT m b -> PropertyT m a #

Monad m => Monad (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

(>>=) :: PropertyT m a -> (a -> PropertyT m b) -> PropertyT m b #

(>>) :: PropertyT m a -> PropertyT m b -> PropertyT m b #

return :: a -> PropertyT m a #

MonadPlus m => MonadPlus (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

mzero :: PropertyT m a #

mplus :: PropertyT m a -> PropertyT m a -> PropertyT m a #

MonadCatch m => MonadCatch (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

catch :: Exception e => PropertyT m a -> (e -> PropertyT m a) -> PropertyT m a #

MonadThrow m => MonadThrow (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

throwM :: Exception e => e -> PropertyT m a #

Monad m => MonadTest (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> PropertyT m a #

PrimMonad m => PrimMonad (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Associated Types

type PrimState (PropertyT m)

Methods

primitive :: (State# (PrimState (PropertyT m)) -> (# State# (PrimState (PropertyT m)), a #)) -> PropertyT m a

MonadResource m => MonadResource (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftResourceT :: ResourceT IO a -> PropertyT m a

type Transformer t PropertyT m 
Instance details

Defined in Hedgehog.Internal.Property

type Transformer t PropertyT m = (Transformer t GenT m, Transformer t TestT (GenT m))
type PrimState (PropertyT m) 
Instance details

Defined in Hedgehog.Internal.Property

type PrimState (PropertyT m) = PrimState m
type StM (PropertyT m) a 
Instance details

Defined in Hedgehog.Internal.Property

type StM (PropertyT m) a = StM (TestT (GenT m)) a

data ShrinkLimit #

Instances

Instances details
Enum ShrinkLimit 
Instance details

Defined in Hedgehog.Internal.Property

Num ShrinkLimit 
Instance details

Defined in Hedgehog.Internal.Property

Integral ShrinkLimit 
Instance details

Defined in Hedgehog.Internal.Property

Real ShrinkLimit 
Instance details

Defined in Hedgehog.Internal.Property

Show ShrinkLimit 
Instance details

Defined in Hedgehog.Internal.Property

Eq ShrinkLimit 
Instance details

Defined in Hedgehog.Internal.Property

Ord ShrinkLimit 
Instance details

Defined in Hedgehog.Internal.Property

Lift ShrinkLimit 
Instance details

Defined in Hedgehog.Internal.Property

Methods

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

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

data ShrinkRetries #

Instances

Instances details
Enum ShrinkRetries 
Instance details

Defined in Hedgehog.Internal.Property

Num ShrinkRetries 
Instance details

Defined in Hedgehog.Internal.Property

Integral ShrinkRetries 
Instance details

Defined in Hedgehog.Internal.Property

Real ShrinkRetries 
Instance details

Defined in Hedgehog.Internal.Property

Show ShrinkRetries 
Instance details

Defined in Hedgehog.Internal.Property

Eq ShrinkRetries 
Instance details

Defined in Hedgehog.Internal.Property

Ord ShrinkRetries 
Instance details

Defined in Hedgehog.Internal.Property

Lift ShrinkRetries 
Instance details

Defined in Hedgehog.Internal.Property

Methods

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

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

data TestLimit #

Instances

Instances details
Enum TestLimit 
Instance details

Defined in Hedgehog.Internal.Property

Num TestLimit 
Instance details

Defined in Hedgehog.Internal.Property

Integral TestLimit 
Instance details

Defined in Hedgehog.Internal.Property

Real TestLimit 
Instance details

Defined in Hedgehog.Internal.Property

Show TestLimit 
Instance details

Defined in Hedgehog.Internal.Property

Eq TestLimit 
Instance details

Defined in Hedgehog.Internal.Property

Ord TestLimit 
Instance details

Defined in Hedgehog.Internal.Property

Lift TestLimit 
Instance details

Defined in Hedgehog.Internal.Property

Methods

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

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

data TestT (m :: Type -> Type) a #

Instances

Instances details
MonadTransDistributive TestT 
Instance details

Defined in Hedgehog.Internal.Property

Associated Types

type Transformer f TestT m

Methods

distributeT :: forall f (m :: Type -> Type) a. Transformer f TestT m => TestT (f m) a -> f (TestT m) a #

MonadTransControl TestT 
Instance details

Defined in Hedgehog.Internal.Property

Associated Types

type StT TestT a

Methods

liftWith :: Monad m => (Run TestT -> m a) -> TestT m a

restoreT :: Monad m => m (StT TestT a) -> TestT m a

MonadTrans TestT 
Instance details

Defined in Hedgehog.Internal.Property

Methods

lift :: Monad m => m a -> TestT m a #

MFunctor TestT 
Instance details

Defined in Hedgehog.Internal.Property

Methods

hoist :: forall m n (b :: k). Monad m => (forall a. m a -> n a) -> TestT m b -> TestT n b

MonadBaseControl b m => MonadBaseControl b (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Associated Types

type StM (TestT m) a

Methods

liftBaseWith :: (RunInBase (TestT m) b -> b a) -> TestT m a

restoreM :: StM (TestT m) a -> TestT m a

MonadError e m => MonadError e (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

throwError :: e -> TestT m a #

catchError :: TestT m a -> (e -> TestT m a) -> TestT m a #

MonadReader r m => MonadReader r (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

ask :: TestT m r #

local :: (r -> r) -> TestT m a -> TestT m a #

reader :: (r -> a) -> TestT m a #

MonadState s m => MonadState s (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

get :: TestT m s #

put :: s -> TestT m () #

state :: (s -> (a, s)) -> TestT m a #

MonadBase b m => MonadBase b (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftBase :: b α -> TestT m α

Monad m => MonadFail (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

fail :: String -> TestT m a #

MonadIO m => MonadIO (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftIO :: IO a -> TestT m a #

Monad m => Applicative (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

pure :: a -> TestT m a #

(<*>) :: TestT m (a -> b) -> TestT m a -> TestT m b #

liftA2 :: (a -> b -> c) -> TestT m a -> TestT m b -> TestT m c #

(*>) :: TestT m a -> TestT m b -> TestT m b #

(<*) :: TestT m a -> TestT m b -> TestT m a #

Functor m => Functor (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

fmap :: (a -> b) -> TestT m a -> TestT m b #

(<$) :: a -> TestT m b -> TestT m a #

Monad m => Monad (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

(>>=) :: TestT m a -> (a -> TestT m b) -> TestT m b #

(>>) :: TestT m a -> TestT m b -> TestT m b #

return :: a -> TestT m a #

MonadCatch m => MonadCatch (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

catch :: Exception e => TestT m a -> (e -> TestT m a) -> TestT m a #

MonadThrow m => MonadThrow (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

throwM :: Exception e => e -> TestT m a #

Monad m => MonadTest (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftTest :: Test a -> TestT m a #

PrimMonad m => PrimMonad (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Associated Types

type PrimState (TestT m)

Methods

primitive :: (State# (PrimState (TestT m)) -> (# State# (PrimState (TestT m)), a #)) -> TestT m a

MonadResource m => MonadResource (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

Methods

liftResourceT :: ResourceT IO a -> TestT m a

type StT TestT a 
Instance details

Defined in Hedgehog.Internal.Property

type StT TestT a = (Either Failure a, Journal)
type Transformer t TestT m 
Instance details

Defined in Hedgehog.Internal.Property

type Transformer t TestT m = (Transformer t (WriterT Journal) m, Transformer t (ExceptT Failure) (WriterT Journal m))
type PrimState (TestT m) 
Instance details

Defined in Hedgehog.Internal.Property

type PrimState (TestT m) = PrimState m
type StM (TestT m) a 
Instance details

Defined in Hedgehog.Internal.Property

type StM (TestT m) a = ComposeSt TestT m a

data Range a #

Instances

Instances details
Functor Range 
Instance details

Defined in Hedgehog.Internal.Range

Methods

fmap :: (a -> b) -> Range a -> Range b #

(<$) :: a -> Range b -> Range a #

newtype Size #

Constructors

Size 

Fields

Instances

Instances details
Enum Size 
Instance details

Defined in Hedgehog.Internal.Range

Methods

succ :: Size -> Size #

pred :: Size -> Size #

toEnum :: Int -> Size #

fromEnum :: Size -> Int #

enumFrom :: Size -> [Size] #

enumFromThen :: Size -> Size -> [Size] #

enumFromTo :: Size -> Size -> [Size] #

enumFromThenTo :: Size -> Size -> Size -> [Size] #

Num Size 
Instance details

Defined in Hedgehog.Internal.Range

Methods

(+) :: Size -> Size -> Size #

(-) :: Size -> Size -> Size #

(*) :: Size -> Size -> Size #

negate :: Size -> Size #

abs :: Size -> Size #

signum :: Size -> Size #

fromInteger :: Integer -> Size #

Read Size 
Instance details

Defined in Hedgehog.Internal.Range

Integral Size 
Instance details

Defined in Hedgehog.Internal.Range

Methods

quot :: Size -> Size -> Size #

rem :: Size -> Size -> Size #

div :: Size -> Size -> Size #

mod :: Size -> Size -> Size #

quotRem :: Size -> Size -> (Size, Size) #

divMod :: Size -> Size -> (Size, Size) #

toInteger :: Size -> Integer #

Real Size 
Instance details

Defined in Hedgehog.Internal.Range

Methods

toRational :: Size -> Rational #

Show Size 
Instance details

Defined in Hedgehog.Internal.Range

Methods

showsPrec :: Int -> Size -> ShowS #

show :: Size -> String #

showList :: [Size] -> ShowS #

Eq Size 
Instance details

Defined in Hedgehog.Internal.Range

Methods

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

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

Ord Size 
Instance details

Defined in Hedgehog.Internal.Range

Methods

compare :: Size -> Size -> Ordering #

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

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

(>) :: Size -> Size -> Bool #

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

max :: Size -> Size -> Size #

min :: Size -> Size -> Size #

data Seed #

Constructors

Seed 

Fields

Instances

Instances details
Read Seed 
Instance details

Defined in Hedgehog.Internal.Seed

Show Seed 
Instance details

Defined in Hedgehog.Internal.Seed

Methods

showsPrec :: Int -> Seed -> ShowS #

show :: Seed -> String #

showList :: [Seed] -> ShowS #

Eq Seed 
Instance details

Defined in Hedgehog.Internal.Seed

Methods

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

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

Ord Seed 
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 
Instance details

Defined in Hedgehog.Internal.Seed

Lift Seed 
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 Action (m :: TYPE LiftedRep -> Type) (state :: (Type -> Type) -> Type) #

Instances

Instances details
Show (Action m state) 
Instance details

Defined in Hedgehog.Internal.State

Methods

showsPrec :: Int -> Action m state -> ShowS #

show :: Action m state -> String #

showList :: [Action m state] -> ShowS #

data Callback (input :: (Type -> Type) -> Type) output (state :: (Type -> Type) -> Type) #

Constructors

Require (state Symbolic -> input Symbolic -> Bool) 
Update (forall (v :: Type -> Type). Ord1 v => state v -> input v -> Var output v -> state v) 
Ensure (state Concrete -> state Concrete -> input Concrete -> output -> Test ()) 

data Command (gen :: Type -> Type) (m :: TYPE LiftedRep -> Type) (state :: (Type -> Type) -> Type) #

Constructors

(TraversableB input, Show (input Symbolic), Show output, Typeable output) => Command 

Fields

newtype Concrete a where #

Constructors

Concrete :: forall a. a -> Concrete a 

Instances

Instances details
Foldable Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

fold :: Monoid m => Concrete m -> m #

foldMap :: Monoid m => (a -> m) -> Concrete a -> m #

foldMap' :: Monoid m => (a -> m) -> Concrete a -> m #

foldr :: (a -> b -> b) -> b -> Concrete a -> b #

foldr' :: (a -> b -> b) -> b -> Concrete a -> b #

foldl :: (b -> a -> b) -> b -> Concrete a -> b #

foldl' :: (b -> a -> b) -> b -> Concrete a -> b #

foldr1 :: (a -> a -> a) -> Concrete a -> a #

foldl1 :: (a -> a -> a) -> Concrete a -> a #

toList :: Concrete a -> [a] #

null :: Concrete a -> Bool #

length :: Concrete a -> Int #

elem :: Eq a => a -> Concrete a -> Bool #

maximum :: Ord a => Concrete a -> a #

minimum :: Ord a => Concrete a -> a #

sum :: Num a => Concrete a -> a #

product :: Num a => Concrete a -> a #

Eq1 Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftEq :: (a -> b -> Bool) -> Concrete a -> Concrete b -> Bool #

Ord1 Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftCompare :: (a -> b -> Ordering) -> Concrete a -> Concrete b -> Ordering #

Show1 Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Concrete a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Concrete a] -> ShowS #

Traversable Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

traverse :: Applicative f => (a -> f b) -> Concrete a -> f (Concrete b) #

sequenceA :: Applicative f => Concrete (f a) -> f (Concrete a) #

mapM :: Monad m => (a -> m b) -> Concrete a -> m (Concrete b) #

sequence :: Monad m => Concrete (m a) -> m (Concrete a) #

Functor Concrete 
Instance details

Defined in Hedgehog.Internal.State

Methods

fmap :: (a -> b) -> Concrete a -> Concrete b #

(<$) :: a -> Concrete b -> Concrete a #

Show a => Show (Concrete a) 
Instance details

Defined in Hedgehog.Internal.State

Methods

showsPrec :: Int -> Concrete a -> ShowS #

show :: Concrete a -> String #

showList :: [Concrete a] -> ShowS #

Eq a => Eq (Concrete a) 
Instance details

Defined in Hedgehog.Internal.State

Methods

(==) :: Concrete a -> Concrete a -> Bool #

(/=) :: Concrete a -> Concrete a -> Bool #

Ord a => Ord (Concrete a) 
Instance details

Defined in Hedgehog.Internal.State

Methods

compare :: Concrete a -> Concrete a -> Ordering #

(<) :: Concrete a -> Concrete a -> Bool #

(<=) :: Concrete a -> Concrete a -> Bool #

(>) :: Concrete a -> Concrete a -> Bool #

(>=) :: Concrete a -> Concrete a -> Bool #

max :: Concrete a -> Concrete a -> Concrete a #

min :: Concrete a -> Concrete a -> Concrete a #

data Parallel (m :: TYPE LiftedRep -> Type) (state :: (Type -> Type) -> Type) #

Constructors

Parallel 

Fields

Instances

Instances details
Show (Parallel m state) 
Instance details

Defined in Hedgehog.Internal.State

Methods

showsPrec :: Int -> Parallel m state -> ShowS #

show :: Parallel m state -> String #

showList :: [Parallel m state] -> ShowS #

newtype Sequential (m :: TYPE LiftedRep -> Type) (state :: (Type -> Type) -> Type) #

Constructors

Sequential 

Fields

Instances

Instances details
Show (Sequential m state) 
Instance details

Defined in Hedgehog.Internal.State

Methods

showsPrec :: Int -> Sequential m state -> ShowS #

show :: Sequential m state -> String #

showList :: [Sequential m state] -> ShowS #

data Symbolic a #

Instances

Instances details
Eq1 Symbolic 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftEq :: (a -> b -> Bool) -> Symbolic a -> Symbolic b -> Bool #

Ord1 Symbolic 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftCompare :: (a -> b -> Ordering) -> Symbolic a -> Symbolic b -> Ordering #

Show1 Symbolic 
Instance details

Defined in Hedgehog.Internal.State

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Symbolic a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Symbolic a] -> ShowS #

Show (Symbolic a) 
Instance details

Defined in Hedgehog.Internal.State

Methods

showsPrec :: Int -> Symbolic a -> ShowS #

show :: Symbolic a -> String #

showList :: [Symbolic a] -> ShowS #

Eq (Symbolic a) 
Instance details

Defined in Hedgehog.Internal.State

Methods

(==) :: Symbolic a -> Symbolic a -> Bool #

(/=) :: Symbolic a -> Symbolic a -> Bool #

Ord (Symbolic a) 
Instance details

Defined in Hedgehog.Internal.State

Methods

compare :: Symbolic a -> Symbolic a -> Ordering #

(<) :: Symbolic a -> Symbolic a -> Bool #

(<=) :: Symbolic a -> Symbolic a -> Bool #

(>) :: Symbolic a -> Symbolic a -> Bool #

(>=) :: Symbolic a -> Symbolic a -> Bool #

max :: Symbolic a -> Symbolic a -> Symbolic a #

min :: Symbolic a -> Symbolic a -> Symbolic a #

newtype Var a (v :: Type -> Type) #

Constructors

Var (v a) 

Instances

Instances details
FunctorB (Var a :: (Type -> Type) -> Type) 
Instance details

Defined in Hedgehog.Internal.State

Methods

bmap :: (forall (a0 :: k). f a0 -> g a0) -> Var a f -> Var a g #

TraversableB (Var a :: (Type -> Type) -> Type) 
Instance details

Defined in Hedgehog.Internal.State

Methods

btraverse :: Applicative e => (forall (a0 :: k). f a0 -> e (g a0)) -> Var a f -> e (Var a g) #

(Show a, Show1 v) => Show (Var a v) 
Instance details

Defined in Hedgehog.Internal.State

Methods

showsPrec :: Int -> Var a v -> ShowS #

show :: Var a v -> String #

showList :: [Var a v] -> ShowS #

(Eq a, Eq1 v) => Eq (Var a v) 
Instance details

Defined in Hedgehog.Internal.State

Methods

(==) :: Var a v -> Var a v -> Bool #

(/=) :: Var a v -> Var a v -> Bool #

(Ord a, Ord1 v) => Ord (Var a v) 
Instance details

Defined in Hedgehog.Internal.State

Methods

compare :: Var a v -> Var a v -> Ordering #

(<) :: Var a v -> Var a v -> Bool #

(<=) :: Var a v -> Var a v -> Bool #

(>) :: Var a v -> Var a v -> Bool #

(>=) :: Var a v -> Var a v -> Bool #

max :: Var a v -> Var a v -> Var a v #

min :: Var a v -> Var a v -> Var a v #

alpha :: MonadGen m => m Char #

ascii :: MonadGen m => m Char #

binit :: MonadGen m => m Char #

bool :: MonadGen m => m Bool #

bool_ :: MonadGen m => m Bool #

choice :: MonadGen m => [m a] -> m a #

constant :: MonadGen m => a -> m a #

digit :: MonadGen m => m Char #

either :: MonadGen m => m a -> m b -> m (Either a b) #

either_ :: MonadGen m => m a -> m b -> m (Either a b) #

element :: MonadGen m => [a] -> m a #

enum :: (MonadGen m, Enum a) => a -> a -> m a #

enumBounded :: (MonadGen m, Enum a, Bounded a) => m a #

filter :: (MonadGen m, GenBase m ~ Identity) => (a -> Bool) -> m a -> m a #

filterT :: MonadGen m => (a -> Bool) -> m a -> m a #

freeze :: MonadGen m => m a -> m (a, m a) #

frequency :: MonadGen m => [(Int, m a)] -> m a #

hexit :: MonadGen m => m Char #

int :: MonadGen m => Range Int -> m Int #

int8 :: MonadGen m => Range Int8 -> m Int8 #

integral :: (MonadGen m, Integral a) => Range a -> m a #

integral_ :: (MonadGen m, Integral a) => Range a -> m a #

just :: (MonadGen m, GenBase m ~ Identity) => m (Maybe a) -> m a #

justT :: MonadGen m => m (Maybe a) -> m a #

latin1 :: MonadGen m => m Char #

list :: MonadGen m => Range Int -> m a -> m [a] #

lower :: MonadGen m => m Char #

map :: (MonadGen m, Ord k) => Range Int -> m (k, v) -> m (Map k v) #

mapMaybe :: (MonadGen m, GenBase m ~ Identity) => (a -> Maybe b) -> m a -> m b #

mapMaybeT :: MonadGen m => (a -> Maybe b) -> m a -> m b #

maybe :: MonadGen m => m a -> m (Maybe a) #

nonEmpty :: MonadGen m => Range Int -> m a -> m (NonEmpty a) #

octit :: MonadGen m => m Char #

printTree :: (MonadIO m, Show a) => Gen a -> m () #

printTreeWith :: (MonadIO m, Show a) => Size -> Seed -> Gen a -> m () #

printWith :: (MonadIO m, Show a) => Size -> Seed -> Gen a -> m () #

prune :: MonadGen m => m a -> m a #

realFloat :: (MonadGen m, RealFloat a) => Range a -> m a #

realFrac_ :: (MonadGen m, RealFrac a) => Range a -> m a #

recursive :: MonadGen m => ([m a] -> m a) -> [m a] -> [m a] -> m a #

resize :: MonadGen m => Size -> m a -> m a #

sample :: MonadIO m => Gen a -> m a #

scale :: MonadGen m => (Size -> Size) -> m a -> m a #

seq :: MonadGen m => Range Int -> m a -> m (Seq a) #

set :: (MonadGen m, Ord a) => Range Int -> m a -> m (Set a) #

shrink :: MonadGen m => (a -> [a]) -> m a -> m a #

shuffle :: MonadGen m => [a] -> m [a] #

sized :: MonadGen m => (Size -> m a) -> m a #

small :: MonadGen m => m a -> m a #

string :: MonadGen m => Range Int -> m Char -> m String #

subsequence :: MonadGen m => [a] -> m [a] #

subterm :: MonadGen m => m a -> (a -> a) -> m a #

subterm2 :: MonadGen m => m a -> m a -> (a -> a -> a) -> m a #

subterm3 :: MonadGen m => m a -> m a -> m a -> (a -> a -> a -> a) -> m a #

subtermM :: MonadGen m => m a -> (a -> m a) -> m a #

subtermM2 :: MonadGen m => m a -> m a -> (a -> a -> m a) -> m a #

subtermM3 :: MonadGen m => m a -> m a -> m a -> (a -> a -> a -> m a) -> m a #

text :: MonadGen m => Range Int -> m Char -> m Text #

upper :: MonadGen m => m Char #

utf8 :: MonadGen m => Range Int -> m Char -> m ByteString #

word :: MonadGen m => Range Word -> m Word #

parallel :: forall gen (m :: Type -> Type) state. (MonadGen gen, MonadTest m) => Range Int -> Range Int -> (forall (v :: Type -> Type). state v) -> [Command gen m state] -> gen (Parallel m state) #

sequential :: forall gen (m :: Type -> Type) state. (MonadGen gen, MonadTest m) => Range Int -> (forall (v :: Type -> Type). state v) -> [Command gen m state] -> gen (Sequential m state) #

adjustOption :: IsOption v => (v -> v) -> TestTree -> TestTree #

defaultIngredients :: [Ingredient] #

withResource :: IO a -> (a -> IO ()) -> (IO a -> TestTree) -> TestTree #

defaultMainWithIngredients :: [Ingredient] -> TestTree -> IO () #

data DependencyType #

Constructors

AllSucceed 
AllFinish 

Instances

Instances details
Show DependencyType 
Instance details

Defined in Test.Tasty.Core

Eq DependencyType 
Instance details

Defined in Test.Tasty.Core

data Timeout #

Instances

Instances details
Show Timeout 
Instance details

Defined in Test.Tasty.Options.Core

IsOption Timeout 
Instance details

Defined in Test.Tasty.Options.Core

class Typeable v => IsOption v where #

Minimal complete definition

defaultValue, parseValue, optionName, optionHelp

Methods

defaultValue :: v #

parseValue :: String -> Maybe v #

optionName :: Tagged v String #

optionHelp :: Tagged v String #

showDefaultValue :: v -> Maybe String #

optionCLParser :: Parser v #

Instances

Instances details
IsOption HedgehogDiscardLimit Source # 
Instance details

Defined in Test.Tasty.HedgehogTest

IsOption HedgehogReplay Source # 
Instance details

Defined in Test.Tasty.HedgehogTest

IsOption HedgehogShowReplay Source # 
Instance details

Defined in Test.Tasty.HedgehogTest

IsOption HedgehogShrinkLimit Source # 
Instance details

Defined in Test.Tasty.HedgehogTest

IsOption HedgehogShrinkRetries Source # 
Instance details

Defined in Test.Tasty.HedgehogTest

IsOption HedgehogTestLimit 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

IsOption NumThreads 
Instance details

Defined in Test.Tasty.Options.Core

Methods

defaultValue :: NumThreads #

parseValue :: String -> Maybe NumThreads #

optionName :: Tagged NumThreads String #

optionHelp :: Tagged NumThreads String #

showDefaultValue :: NumThreads -> Maybe String #

optionCLParser :: Parser NumThreads #

IsOption Timeout 
Instance details

Defined in Test.Tasty.Options.Core

data OptionSet #

Instances

Instances details
Monoid OptionSet 
Instance details

Defined in Test.Tasty.Options

Semigroup OptionSet 
Instance details

Defined in Test.Tasty.Options

changeOption :: IsOption v => (v -> v) -> OptionSet -> OptionSet #

flagCLParser :: IsOption v => Maybe Char -> v -> Parser v #

mkFlagCLParser :: IsOption v => Mod FlagFields v -> v -> Parser v #

mkOptionCLParser :: IsOption v => Mod OptionFields v -> Parser v #

safeRead :: Read a => String -> Maybe a #

data OptionDescription where #

Constructors

Option :: forall v. IsOption v => Proxy v -> OptionDescription 

singleTest :: IsTest t => TestName -> t -> TestTree #

foldTestTree :: Monoid b => TreeFold b -> OptionSet -> TestTree -> b #

trivialFold :: Monoid b => TreeFold b #

foldSingle :: TreeFold b -> forall t. IsTest t => OptionSet -> TestName -> t -> b #

Tests definition

prop :: HasCallStack => TestName -> PropertyT IO () -> TestTree Source #

Create a Tasty test from a Hedgehog property

test :: HasCallStack => TestName -> PropertyT IO () -> TestTree Source #

Create a Tasty test from a Hedgehog property called only once

Tests settings

minTestsOk :: Int -> TestTree -> TestTree Source #

Set the minimum number of tests which must be successful for a property to pass

noShrink :: TestTree -> TestTree Source #

Do not shrink failures

withSeed :: String -> TestTree -> TestTree Source #

Execute a property with a specific seed

Running tests

run :: Runnable t => t -> IO () Source #

Run either a test tree (a test or a property) whether it is in IO or not

runOnly :: Runnable t => Text -> t -> IO () Source #

Run only some tests by passing a tasty pattern

Assertions

gotException :: forall a. (HasCallStack, Show a) => a -> PropertyT IO () Source #

Assert that an exception is thrown

Display

printDifference :: (MonadIO m, Show a, Show b, HasCallStack) => a -> b -> m () Source #