:: Monoid_a _ => _ a -package:pandoc-plot
Look up the previous accumulation
runAccum w look = return (w, w)
runAccum w (look >>= continuation) = runAccum w (continuation w)
Fail the current branch, and prevent backtracking within the nearest
enclosing
call (if any).
Contrast with
empty, which fails the current branch but allows
backtracking.
cutfail >>= k = cutfail
cutfail <|> m = cutfail
Retrieve the environment value.
runReader a (ask >>= k) = runReader a (k a)
Get the current state value.
runState a (get >>= k) = runState a (k a)
A version of
auto that "just works" with type inference, if the
predicate is a type constructor.
Lifted version of
exitFailure.
>>> exitFailure
*** Exception: ExitFailure 1
Lifted version of
exitSuccess.
>>> exitSuccess
*** Exception: ExitSuccess
Lifted version of "System.Exit.exitFailure".
@since 0.1.9.0.
Lifted version of "System.Exit.exitSuccess".
@since 0.1.9.0.
Use this function when the daemon should terminate normally. It logs a
message, and exits with status 0.
Throws a
Pending exception, which will cause the test to be
marked as pending.
base Control.Monad GHC.Base,
pipes Pipes,
base-compat Control.Monad.Compat Control.Monad.Compat,
protolude Protolude.Monad,
relude Relude.Monad.Reexport,
rio RIO.Prelude,
base-prelude BasePrelude,
turtle Turtle,
classy-prelude ClassyPrelude,
Cabal-syntax Distribution.Compat.Prelude,
fused-effects Control.Effect.NonDet,
universum Universum.Monad.Reexport,
ihaskell IHaskellPrelude,
base-compat-batteries Control.Monad.Compat,
Agda Agda.Utils.Monad,
ghc-internal GHC.Internal.Base GHC.Internal.Control.Monad,
rebase Rebase.Prelude,
massiv-test Test.Massiv.Utils,
incipit-base Incipit.Base,
LambdaHack Game.LambdaHack.Core.Prelude,
cabal-install-solver Distribution.Solver.Compat.Prelude,
faktory Faktory.Prelude,
can-i-haz Control.Monad.Except.CoHas Control.Monad.Reader.Has,
yesod-paginator Yesod.Paginator.Prelude,
control-monad-free Control.Monad.Free,
distribution-opensuse OpenSuse.Prelude The identity of
mplus. It should also satisfy the equations
mzero >>= f = mzero
v >> mzero = mzero
The default definition is
mzero = empty
The identity of
<|>
empty <|> a == a
a <|> empty == a
protolude Protolude,
parser-combinators Control.Applicative.Combinators Control.Monad.Combinators,
base-prelude BasePrelude,
turtle Turtle,
classy-prelude ClassyPrelude,
Cabal-syntax Distribution.Compat.Prelude,
effectful-core Effectful.NonDet,
universum Universum.Applicative,
algebraic-graphs Algebra.Graph.HigherKinded.Class,
ihaskell IHaskellPrelude,
rebase Rebase.Prelude,
flatparse FlatParse.Basic FlatParse.Stateful,
threepenny-gui Graphics.UI.Threepenny.Core,
configuration-tools Configuration.Utils.CommandLine,
list-transformer List.Transformer,
fmlist Data.FMList,
incipit-base Incipit.Base,
opt-env-conf OptEnvConf.Parser,
cabal-install-solver Distribution.Solver.Compat.Prelude,
frisby Text.Parsers.Frisby Retrieve the accumulated result so far.
mtl Control.Monad.Reader Control.Monad.Reader.Class,
protolude Protolude,
relude Relude.Monad.Reexport,
rio RIO.Prelude,
adjunctions Control.Monad.Representable.Reader,
classy-prelude ClassyPrelude,
streamly Streamly.Data.Stream.MkType Streamly.Internal.Data.Stream.MkType,
universum Universum.Monad.Reexport,
xmonad XMonad,
rebase Rebase.Prelude,
xmonad-contrib XMonad.Config.Prime,
apecs Apecs,
mtl-prelude MTLPrelude,
nvim-hs Neovim Neovim.Context Retrieves the monad environment.
Return the state from the internals of the monad.