Safe Haskell | Safe-Inferred |
---|---|
Language | GHC2021 |
Effectful.Zoo.Hedgehog.Dynamic
Contents
Documentation
data Hedgehog :: Effect where Source #
Constructors
CatchAssertion :: HasCallStack => m a -> (Failure -> m a) -> Hedgehog m a | |
LiftTest :: HasCallStack => Test a -> Hedgehog m a | |
ThrowAssertion :: HasCallStack => Failure -> Hedgehog m a |
Instances
type DispatchOf Hedgehog Source # | |
Defined in Effectful.Zoo.Hedgehog.Dynamic |
class Monad m => MonadTest (m :: Type -> Type) where #
Instances
runHedgehogIO :: forall a. Eff [Hedgehog, Error Failure, Writer Journal, IOE] a -> IO (Either Failure a, Journal) Source #
runHedgehog :: forall a r. r <: Error Failure => r <: Writer Journal => Eff (Hedgehog : r) a -> Eff r a Source #