Safe Haskell | None |
---|---|
Language | Haskell2010 |
Control.Monad.Stack.Select
Documentation
class Monad m => SelectStack (m :: Type -> Type) where Source #
Methods
liftSelect :: PopSelect m a -> m a Source #
Instances
type SelectDepth (n :: Nat) (m :: Type -> Type) = IteratePop n SelectT m Source #
type SelectConstraints (n :: Nat) (m :: Type -> Type) = (KnownNat n, StackConstraints n SelectT SelectStack m) Source #
depthSelect :: forall (n :: Nat) m a. SelectConstraints n m => SelectDepth n m a -> m a Source #