(Monad f, Monad g) => Monad (Product * f g) # | |
|
(Functor f, Functor g) => Functor (Product * f g) # | |
|
(MonadFix f, MonadFix g) => MonadFix (Product * f g) # | |
|
(Applicative f, Applicative g) => Applicative (Product * f g) # | |
|
(Foldable f, Foldable g) => Foldable (Product * f g) # | |
|
(Traversable f, Traversable g) => Traversable (Product * f g) # | |
|
Generic1 (Product * f g) # | |
|
(MonadPlus f, MonadPlus g) => MonadPlus (Product * f g) # | |
|
(Alternative f, Alternative g) => Alternative (Product * f g) # | |
|
(MonadZip f, MonadZip g) => MonadZip (Product * f g) # | |
|
(Show1 f, Show1 g) => Show1 (Product * f g) # | |
|
(Read1 f, Read1 g) => Read1 (Product * f g) # | |
|
(Ord1 f, Ord1 g) => Ord1 (Product * f g) # | |
|
(Eq1 f, Eq1 g) => Eq1 (Product * f g) # | |
|
(Eq1 f, Eq1 g, Eq a) => Eq (Product * f g a) # | |
|
(Data (f a), Data (g a), Typeable k a, Typeable * k, Typeable (k -> *) f, Typeable (k -> *) g) => Data (Product k f g a) # | |
|
(Ord1 f, Ord1 g, Ord a) => Ord (Product * f g a) # | |
|
(Read1 f, Read1 g, Read a) => Read (Product * f g a) # | |
|
(Show1 f, Show1 g, Show a) => Show (Product * f g a) # | |
|
Generic (Product k f g a) # | |
|
type Rep1 (Product * f g) = D1 (MetaData "Product" "Data.Functor.Product" "base" False) (C1 (MetaCons "Pair" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 f)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 g)))) # | |
type Rep (Product k f g a) = D1 (MetaData "Product" "Data.Functor.Product" "base" False) (C1 (MetaCons "Pair" PrefixI False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f a))) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (g a))))) # | |