(Monad f, Monad g) => Monad (Product (TYPE Lifted) f g) | |
|
(Functor f, Functor g) => Functor (Product (TYPE Lifted) f g) | |
|
(MonadFix f, MonadFix g) => MonadFix (Product (TYPE Lifted) f g) | |
|
(Applicative f, Applicative g) => Applicative (Product (TYPE Lifted) f g) | |
|
(Foldable f, Foldable g) => Foldable (Product (TYPE Lifted) f g) | |
|
(Traversable f, Traversable g) => Traversable (Product (TYPE Lifted) f g) | |
|
Generic1 (Product (TYPE Lifted) f g) | |
|
(MonadPlus f, MonadPlus g) => MonadPlus (Product (TYPE Lifted) f g) | |
|
(Alternative f, Alternative g) => Alternative (Product (TYPE Lifted) f g) | |
|
(MonadZip f, MonadZip g) => MonadZip (Product (TYPE Lifted) f g) | |
|
(Show1 f, Show1 g) => Show1 (Product (TYPE Lifted) f g) | |
|
(Read1 f, Read1 g) => Read1 (Product (TYPE Lifted) f g) | |
|
(Ord1 f, Ord1 g) => Ord1 (Product (TYPE Lifted) f g) | |
|
(Eq1 f, Eq1 g) => Eq1 (Product (TYPE Lifted) f g) | |
|
(Eq1 f, Eq1 g, Eq a) => Eq (Product (TYPE Lifted) f g a) | |
|
(Data (f a), Data (g a), Typeable k a, Typeable (TYPE Lifted) k, Typeable (k -> TYPE Lifted) f, Typeable (k -> TYPE Lifted) g) => Data (Product k f g a) | |
|
(Ord1 f, Ord1 g, Ord a) => Ord (Product (TYPE Lifted) f g a) | |
|
(Read1 f, Read1 g, Read a) => Read (Product (TYPE Lifted) f g a) | |
|
(Show1 f, Show1 g, Show a) => Show (Product (TYPE Lifted) f g a) | |
|
Generic (Product k f g a) | |
|
type Rep1 (Product k 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))))) | |