Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- wrapWith :: (Member e (Derivs m), Carrier m, Coercible unwrappedE e) => (unwrappedE z x -> e z x) -> WrapC unwrappedE e m a -> m a
- class EffNewtype (e :: Effect) where
- type UnwrappedEff e :: Effect
- unwrapped :: e z x -> UnwrappedEff e z x
- data WrapperOf (e :: Effect) (e' :: Effect) m a
- unwrap :: forall e m a. (Carrier m, Member (UnwrappedEff e) (Derivs m), EffNewtype e) => UnwrapC e m a -> m a
- unwrapTop :: forall e m a. (HeadEff (UnwrappedEff e) m, EffNewtype e, Carrier m) => UnwrapTopC e m a -> m a
- data WrapC (e :: Effect) (e' :: Effect) m (a :: *)
- data UnwrapC (e :: Effect) m (a :: *)
- data UnwrapTopC (e :: Effect) m (a :: *)
Wrapping
wrapWith :: (Member e (Derivs m), Carrier m, Coercible unwrappedE e) => (unwrappedE z x -> e z x) -> WrapC unwrappedE e m a -> m a Source #
Wrap uses of an effect, injecting them into a newtype of that effect. The first argument is ignored.
This is useful for creating actions of effect newtypes. For example:
newtype Counter m a = Counter (State
Int m) probe :: Eff Counter m => m Int probe =wrapWith
Counter $state'
@Int (s -> (s + 1, s))
Unwrapping
class EffNewtype (e :: Effect) where Source #
Nothing
type UnwrappedEff e :: Effect Source #
unwrapped :: e z x -> UnwrappedEff e z x Source #
unwrapped :: Coercible e (UnwrappedEff e) => e z x -> UnwrappedEff e z x Source #
Instances
EffNewtype Conc Source # | |
Defined in Control.Effect.Conc type UnwrappedEff Conc :: Effect Source # | |
Coercible e e' => EffNewtype (WrapperOf e e') Source # | |
Defined in Control.Effect.Internal.Newtype type UnwrappedEff (WrapperOf e e') :: Effect Source # |
data WrapperOf (e :: Effect) (e' :: Effect) m a Source #
Useful for deriving instances of EffNewtype
.
newtype SomeWrapper m a = SomeWrapper (SomeEffect m a) derivingEffNewtype
via SomeWrapper `WrapperOf'
SomeEffect
Instances
Coercible e e' => EffNewtype (WrapperOf e e') Source # | |
Defined in Control.Effect.Internal.Newtype type UnwrappedEff (WrapperOf e e') :: Effect Source # | |
type UnwrappedEff (WrapperOf e e') Source # | |
Defined in Control.Effect.Internal.Newtype |
unwrap :: forall e m a. (Carrier m, Member (UnwrappedEff e) (Derivs m), EffNewtype e) => UnwrapC e m a -> m a Source #
Unwrap uses of an effect
unwrapTop :: forall e m a. (HeadEff (UnwrappedEff e) m, EffNewtype e, Carrier m) => UnwrapTopC e m a -> m a Source #
Unwrap uses of an effect, placing its unwrapped version on top of the effect stack.
Carriers
data WrapC (e :: Effect) (e' :: Effect) m (a :: *) Source #
Instances
data UnwrapC (e :: Effect) m (a :: *) Source #
Instances
data UnwrapTopC (e :: Effect) m (a :: *) Source #