Safe Haskell | None |
---|---|
Language | GHC2024 |
System.Process.Quick.CallSpec.Verify
Synopsis
- type FailureReport = Doc
- data CallSpecViolation
- data CsViolationWithCtx = CallSpec cs => CsViolationWithCtx {
- csContext :: cs
- csViolation :: CallSpecViolation
- type M (m :: Type -> Type) = (MonadMask m, MonadCatch m, MonadIO m)
- callProcessSilently :: M m => FilePath -> [String] -> m (Maybe Doc)
- verifyWithActiveMethods :: forall w m cs. (M m, CallSpec cs, WriterT [FilePath] m ~ w) => ArgCollector w -> ArgCollector w -> Set VerificationMethod -> Proxy cs -> Int -> m [CsViolationWithCtx]
- concatM :: Monad m => [a -> m a] -> a -> m a
- validateInSandbox :: forall w m cs. (M m, CallSpec cs, WriterT [FilePath] m ~ w) => ArgCollector w -> ArgCollector w -> Proxy cs -> Int -> m (Maybe CsViolationWithCtx)
- verifyTrailingHelp :: (M m, CallSpec cs) => Proxy cs -> Int -> m (Maybe CsViolationWithCtx)
- consumeViolations :: MonadIO m => [CsViolationWithCtx] -> m ()
- discoverAndVerifyCallSpecs :: Set VerificationMethod -> Int -> Q Exp
Documentation
type FailureReport = Doc Source #
data CallSpecViolation Source #
Constructors
HelpKeyIgnored | |
HelpKeyNotSupported FailureReport | |
ProgramNotFound FailureReport [FilePath] | |
HelpKeyExitNonZero FailureReport | |
SandboxLaunchFailed FailureReport | |
UnexpectedCallEffect [CallEffect] |
Instances
Show CallSpecViolation Source # | |
Defined in System.Process.Quick.CallSpec.Verify Methods showsPrec :: Int -> CallSpecViolation -> ShowS # show :: CallSpecViolation -> String # showList :: [CallSpecViolation] -> ShowS # | |
Eq CallSpecViolation Source # | |
Defined in System.Process.Quick.CallSpec.Verify Methods (==) :: CallSpecViolation -> CallSpecViolation -> Bool # (/=) :: CallSpecViolation -> CallSpecViolation -> Bool # |
data CsViolationWithCtx Source #
Constructors
CallSpec cs => CsViolationWithCtx | |
Fields
|
verifyWithActiveMethods :: forall w m cs. (M m, CallSpec cs, WriterT [FilePath] m ~ w) => ArgCollector w -> ArgCollector w -> Set VerificationMethod -> Proxy cs -> Int -> 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.
validateInSandbox :: forall w m cs. (M m, CallSpec cs, WriterT [FilePath] m ~ w) => ArgCollector w -> ArgCollector w -> Proxy cs -> Int -> m (Maybe CsViolationWithCtx) Source #
verifyTrailingHelp :: (M m, CallSpec cs) => Proxy cs -> Int -> m (Maybe CsViolationWithCtx) Source #
consumeViolations :: MonadIO m => [CsViolationWithCtx] -> m () Source #
discoverAndVerifyCallSpecs :: Set VerificationMethod -> Int -> Q Exp Source #