Maintainer | Ralf Laemmel, Joost Visser |
---|---|
Stability | experimental |
Portability | portable |
Safe Haskell | None |
Language | Haskell98 |
This module is part of StrategyLib
, a library of functional strategy
combinators, including combinators for generic traversal. This is the
top-level module of the library. One only needs to import this module to
use the entire library. Some base modules are exported as well because
they are commonly used.
- module Control.Monad
- module Control.Monad.Fix
- module Control.Monad.Trans
- newtype Identity a :: * -> * = Identity {
- runIdentity :: a
- type State s = StateT s Identity
- newtype StateT s m a :: * -> (* -> *) -> * -> * = StateT {
- runStateT :: s -> m (a, s)
- module Data.Monoid
- module Data.Generics.Strafunski.StrategyLib.MoreMonoids
- module Data.Generics.Strafunski.StrategyLib.StrategyPrelude
- module Data.Generics.Strafunski.StrategyLib.StrategyInfix
- module Data.Generics.Strafunski.StrategyLib.OverloadingTheme
- module Data.Generics.Strafunski.StrategyLib.TraversalTheme
- module Data.Generics.Strafunski.StrategyLib.FlowTheme
- module Data.Generics.Strafunski.StrategyLib.FixpointTheme
- module Data.Generics.Strafunski.StrategyLib.KeyholeTheme
- module Data.Generics.Strafunski.StrategyLib.NameTheme
- module Data.Generics.Strafunski.StrategyLib.PathTheme
- module Data.Generics.Strafunski.StrategyLib.EffectTheme
- module Data.Generics.Strafunski.StrategyLib.ContainerTheme
- module Data.Generics.Strafunski.StrategyLib.RefactoringTheme
- module Data.Generics.Strafunski.StrategyLib.MetricsTheme
- module Data.Generics.Strafunski.StrategyLib.ChaseImports
Documentation
module Control.Monad
module Control.Monad.Fix
module Control.Monad.Trans
newtype Identity a :: * -> *
Identity functor and monad. (a non-strict monad)
Identity | |
|
Monad Identity | |
Functor Identity | |
MonadFix Identity | |
Applicative Identity | |
Foldable Identity | |
Traversable Identity | |
Eq1 Identity | |
Ord1 Identity | |
Read1 Identity | |
Show1 Identity | |
MonadRun (->) Identity | Running the |
Eq a => Eq (Identity a) | |
Ord a => Ord (Identity a) | |
Read a => Read (Identity a) | |
Show a => Show (Identity a) | |
MonadRun (StateAlg s) (State s) | Running the |
type State s = StateT s Identity
A state monad parameterized by the type s
of the state to carry.
The return
function leaves the state unchanged, while >>=
uses
the final state of the first computation as the initial state of
the second.
newtype StateT s m a :: * -> (* -> *) -> * -> *
A state transformer monad parameterized by:
s
- The state.m
- The inner monad.
The return
function leaves the state unchanged, while >>=
uses
the final state of the first computation as the initial state of
the second.
MonadTrans (StateT s) | |
MonadUnTrans (StateAlg s) (StateT s) | Unlifting the state monad transformer |
MonadRun (StateAlg s) (State s) | Running the |
(Functor m, MonadPlus m) => Alternative (StateT s m) | |
Monad m => Monad (StateT s m) | |
Functor m => Functor (StateT s m) | |
MonadFix m => MonadFix (StateT s m) | |
MonadPlus m => MonadPlus (StateT s m) | |
(Functor m, Monad m) => Applicative (StateT s m) | |
MonadIO m => MonadIO (StateT s m) |
module Data.Monoid