Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- view :: forall r (sig :: (Type -> Type) -> Type -> Type) m a. Has (Reader r) sig m => Getter r a -> m a
- views :: forall r (sig :: (Type -> Type) -> Type -> Type) m a b. Has (Reader r) sig m => Getter r a -> (a -> b) -> m b
- use :: forall s (sig :: (Type -> Type) -> Type -> Type) m a. Has (State s) sig m => Getter s a -> m a
- uses :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Getter s a -> (a -> b) -> m b
- assign :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> b -> m ()
- modifying :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> (a -> b) -> m ()
- (.=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> b -> m ()
- (%=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> (a -> b) -> m ()
- (?=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a (Maybe b) -> b -> m ()
- (<~) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> m b -> m ()
- (+=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a. (Has (State s) sig m, Num a) => Setter s s a a -> a -> m ()
- (-=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a. (Has (State s) sig m, Num a) => Setter s s a a -> a -> m ()
- (*=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a. (Has (State s) sig m, Num a) => Setter s s a a -> a -> m ()
- (//=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a. (Has (State s) sig m, Fractional a) => Setter s s a a -> a -> m ()
Access
Reader
view :: forall r (sig :: (Type -> Type) -> Type -> Type) m a. Has (Reader r) sig m => Getter r a -> m a Source #
views :: forall r (sig :: (Type -> Type) -> Type -> Type) m a b. Has (Reader r) sig m => Getter r a -> (a -> b) -> m b Source #
State
use :: forall s (sig :: (Type -> Type) -> Type -> Type) m a. Has (State s) sig m => Getter s a -> m a Source #
uses :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Getter s a -> (a -> b) -> m b Source #
Assignment
assign :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> b -> m () Source #
modifying :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> (a -> b) -> m () Source #
(.=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> b -> m () infix 4 Source #
(%=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> (a -> b) -> m () infix 4 Source #
(?=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a (Maybe b) -> b -> m () infix 4 Source #
(<~) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a b. Has (State s) sig m => Setter s s a b -> m b -> m () infixr 2 Source #
Arithmetical
(+=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a. (Has (State s) sig m, Num a) => Setter s s a a -> a -> m () infix 4 Source #
(-=) :: forall s (sig :: (Type -> Type) -> Type -> Type) m a. (Has (State s) sig m, Num a) => Setter s s a a -> a -> m () infix 4 Source #