functor-monad-0.1.1.0: FFunctor: functors on (the usual) Functors
Safe HaskellSafe-Inferred
LanguageHaskell2010

Data.Functor.Day.Extra

Synopsis

Documentation

uncurried :: forall f g h c. (Functor f, Functor g) => Curried f (Curried g h) c -> Curried (Day f g) h c Source #

curried :: forall f g h c. (Functor f, Functor g) => Curried (Day f g) h c -> Curried f (Curried g h) c Source #

unitCurried :: Functor g => Identity ~> Curried g g Source #

Internal identity of natural transformation.

 unitCurried = toCurried elim2

composeCurried :: (Functor f, Functor g, Functor h) => Day (Curried f g) (Curried g h) ~> Curried f h Source #

Internal composition of natural transformations.

 composeCurried = toCurried (applied . trans1 applied . assoc)

Conversions to Monad/Comonad transformers

dayToEnv :: Functor f => Day ((,) s0) f ~> EnvT s0 f Source #

envToDay :: EnvT s0 f ~> Day ((,) s0) f Source #

dayToTraced :: Functor f => Day ((->) s1) f ~> TracedT s1 f Source #

tracedToDay :: TracedT s1 f ~> Day ((->) s1) f Source #

writerToCurried :: Functor f => WriterT s1 f ~> Curried ((->) s1) f Source #