ether-0.1.0.0: Monad transformers and classes

Safe HaskellNone
LanguageHaskell2010

Control.Monad.Trans.Ether.Except

Contents

Description

Synopsis

The Except monad

type Except tag e = ExceptT tag e Identity Source

The parameterizable exception monad.

Computations are either exceptions or normal values.

The return function returns a normal value, while >>= exits on the first exception.

except :: Monad m => proxy tag -> Either e a -> ExceptT tag e m a Source

Constructor for computations in the exception monad (the inverse of runExcept).

runExcept :: proxy tag -> Except tag e a -> Either e a Source

Runs an Except and returns either an exception or a normal value.

The ExceptT monad transformer

data ExceptT tag e m a Source

The exception monad transformer.

The return function returns a normal value, while >>= exits on the first exception.

Instances

MonadReader tag r m => MonadReader tag r (ExceptT tag' e m) Source 
MonadState tag s m => MonadState tag s (ExceptT tag' e m) Source 
MonadExcept tag e m => MonadExcept tag e (ExceptT tag' e' m) Source 
Monad m => MonadExcept tag e (ExceptT tag e m) Source 
MonadWriter tag w m => MonadWriter tag w (ExceptT tag' e m) Source 
MonadError e' m => MonadError e' (ExceptT tag e m) Source 
MonadReader r m => MonadReader r (ExceptT tag e m) Source 
MonadState s m => MonadState s (ExceptT tag e m) Source 
MonadWriter w m => MonadWriter w (ExceptT tag e m) Source 
MonadTrans (ExceptT tag e) Source 
Monad m => Monad (ExceptT tag e m) Source 
Functor m => Functor (ExceptT tag e m) Source 
MonadFix m => MonadFix (ExceptT tag e m) Source 
Monad m => Applicative (ExceptT tag e m) Source 
(Monad m, Monoid e) => Alternative (ExceptT tag e m) Source 
(Monad m, Monoid e) => MonadPlus (ExceptT tag e m) Source 
MonadIO m => MonadIO (ExceptT tag e m) Source 
MonadCont m => MonadCont (ExceptT tag e m) Source 
Taggable (ExceptT tag e m) Source 
Tagged (ExceptT tag e m) tag Source 
Generic (ExceptT tag e m a) Source 
Newtype (ExceptT tag e m a) Source 
type Untagged (ExceptT tag e m) = ExceptT e m Source 
type Tag (ExceptT tag e m) = Just * tag Source 
type Inner (ExceptT tag e m) = Just (* -> *) m Source 
type Rep (ExceptT tag e m a) Source 
type O (ExceptT tag e m a) = GO (Rep (ExceptT tag e m a)) 

exceptT :: proxy tag -> m (Either e a) -> ExceptT tag e m a Source

Constructor for computations in the exception monad transformer.

runExceptT :: proxy tag -> ExceptT tag e m a -> m (Either e a) Source

Runs an ExceptT and returns either an exception or a normal value.

mapExceptT :: proxy tag -> (m (Either e a) -> n (Either e' b)) -> ExceptT tag e m a -> ExceptT tag e' n b Source

Transforms the computation inside an ExceptT.

Exception operations

throw :: Monad m => proxy tag -> e -> ExceptT tag e m a Source

Is used within a monadic computation to begin exception processing.

catch :: Monad m => proxy tag -> ExceptT tag e m a -> (e -> ExceptT tag e m a) -> ExceptT tag e m a Source

A handler function to handle previous exceptions and return to normal execution.

Lifting other operations

liftCallCC :: proxy tag -> CallCC m (Either e a) (Either e b) -> CallCC (ExceptT tag e m) a b Source

Lift a callCC operation to the new monad.

liftListen :: Monad m => proxy tag -> Listen w m (Either e a) -> Listen w (ExceptT tag e m) a Source

Lift a listen operation to the new monad.

liftPass :: Monad m => proxy tag -> Pass w m (Either e a) -> Pass w (ExceptT tag e m) a Source

Lift a pass operation to the new monad.

liftCatch :: proxy tag -> Catch e m (Either e' a) -> Catch e (ExceptT tag e' m) a Source

Lift a catchE operation to the new monad.