Safe Haskell | None |
---|---|
Language | GHC2024 |
System.Process.Quick.CallSpec.Verify
Synopsis
- verifyWithActiveMethods :: forall w (m :: Type -> Type) cs. (M m, CallSpec cs, WriterT [FilePath] (CsPerfT m) ~ w) => ArgCollector w -> ArgCollector w -> Set VerificationMethod -> Proxy cs -> Int -> CsPerfT m [CsViolationWithCtx]
- concatM :: Monad m => [a -> m a] -> a -> m a
- formatPerfReportLine :: (TypeRep, CsPerf) -> Doc
- reportFor :: forall (m :: Type -> Type). MonadIO m => VerificationMethod -> CsPerfT m Doc
- consumeViolations :: forall (m :: Type -> Type). MonadIO m => Int -> [CsViolationWithCtx] -> CsPerfT m ()
- discoverAndVerifyCallSpecs :: Set VerificationMethod -> Int -> Q Exp
Documentation
verifyWithActiveMethods :: forall w (m :: Type -> Type) cs. (M m, CallSpec cs, WriterT [FilePath] (CsPerfT m) ~ w) => ArgCollector w -> ArgCollector w -> Set VerificationMethod -> Proxy cs -> Int -> CsPerfT m [CsViolationWithCtx] Source #
concatM :: Monad m => [a -> m a] -> a -> m a Source #
Compose a list of monadic actions into one action. Composes using
(>=>
) - that is, the output of each action is fed to the input of
the one after it in the list.
consumeViolations :: forall (m :: Type -> Type). MonadIO m => Int -> [CsViolationWithCtx] -> CsPerfT m () Source #
discoverAndVerifyCallSpecs :: Set VerificationMethod -> Int -> Q Exp Source #