proton-0.0.4
Safe HaskellNone
LanguageHaskell2010

Data.Profunctor.Writer

Documentation

newtype WriterT w p a b Source #

Constructors

WriterT (p a (b, w)) 

Instances

Instances details
(Profunctor p, Monoid w) => ProfunctorWriter' w (WriterT w p) Source # 
Instance details

Defined in Data.Profunctor.Writer

Methods

tell' :: WriterT w p a (b, w) -> WriterT w p a b Source #

listen' :: WriterT w p a b -> WriterT w p a (b, w) Source #

pass' :: WriterT w p a (b, w -> w) -> WriterT w p a b Source #

(Monoid w, Category p, Strong p) => Category (WriterT w p :: Type -> Type -> Type) Source # 
Instance details

Defined in Data.Profunctor.Writer

Methods

id :: forall (a :: k). WriterT w p a a #

(.) :: forall (b :: k) (c :: k) (a :: k). WriterT w p b c -> WriterT w p a b -> WriterT w p a c #

Profunctor p => Profunctor (WriterT w p) Source # 
Instance details

Defined in Data.Profunctor.Writer

Methods

dimap :: (a -> b) -> (c -> d) -> WriterT w p b c -> WriterT w p a d #

lmap :: (a -> b) -> WriterT w p b c -> WriterT w p a c #

rmap :: (b -> c) -> WriterT w p a b -> WriterT w p a c #

(#.) :: forall a b c q. Coercible c b => q b c -> WriterT w p a b -> WriterT w p a c #

(.#) :: forall a b c q. Coercible b a => WriterT w p b c -> q a b -> WriterT w p a c #