yi-core-0.19.2: Yi editor core library
Safe HaskellSafe-Inferred
LanguageHaskell2010

Yi.Monad

Synopsis

Documentation

assign :: MonadState s m => ASetter s s a b -> b -> m () Source #

gets :: MonadState s m => (s -> a) -> m a #

Gets specific component of the state, using a projection function supplied.

getsAndModify :: MonadState s m => (s -> (s, a)) -> m a Source #

Combination of the Control.Monad.State modify and gets

maybeM :: Monad m => (x -> m ()) -> Maybe x -> m () Source #

repeatUntilM :: Monad m => m (Bool, a) -> m [a] Source #

Rerun the monad until the boolean result is false, collecting list of results.

uses :: MonadState s m => Getting a s a -> (a -> b) -> m b Source #

whenM :: Monad m => m Bool -> m () -> m () Source #

with :: (MonadReader r m, MonadBase b m) => (r -> a) -> (a -> b c) -> m c Source #