Movatterモバイル変換


[0]ホーム

URL:


base-4.12.0.0: Basic libraries

Copyright(c) Ross Paterson 2010
LicenseBSD-style (see the file LICENSE)
Maintainerlibraries@haskell.org
Stabilityexperimental
Portabilityportable
Safe HaskellSafe
LanguageHaskell2010

Data.Functor.Product

Description

Products, lifted to functors.

Since: 4.9.0.0

Synopsis

Documentation

dataProduct f g aSource#

Lifted product of functors.

Constructors

Pair (f a) (g a) 
Instances
Generic1 (Product f g :: k ->Type)Source# 
Instance details

Defined inData.Functor.Product

Associated Types

typeRep1 (Product f g) :: k ->TypeSource#

Methods

from1 ::Product f g a ->Rep1 (Product f g) aSource#

to1 ::Rep1 (Product f g) a ->Product f g aSource#

(Monad f,Monad g) =>Monad (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

(>>=) ::Product f g a -> (a ->Product f g b) ->Product f g bSource#

(>>) ::Product f g a ->Product f g b ->Product f g bSource#

return :: a ->Product f g aSource#

fail ::String ->Product f g aSource#

(Functor f,Functor g) =>Functor (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

fmap :: (a -> b) ->Product f g a ->Product f g bSource#

(<$) :: a ->Product f g b ->Product f g aSource#

(MonadFix f,MonadFix g) =>MonadFix (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

mfix :: (a ->Product f g a) ->Product f g aSource#

(Applicative f,Applicative g) =>Applicative (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

pure :: a ->Product f g aSource#

(<*>) ::Product f g (a -> b) ->Product f g a ->Product f g bSource#

liftA2 :: (a -> b -> c) ->Product f g a ->Product f g b ->Product f g cSource#

(*>) ::Product f g a ->Product f g b ->Product f g bSource#

(<*) ::Product f g a ->Product f g b ->Product f g aSource#

(Foldable f,Foldable g) =>Foldable (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

fold ::Monoid m =>Product f g m -> mSource#

foldMap ::Monoid m => (a -> m) ->Product f g a -> mSource#

foldr :: (a -> b -> b) -> b ->Product f g a -> bSource#

foldr' :: (a -> b -> b) -> b ->Product f g a -> bSource#

foldl :: (b -> a -> b) -> b ->Product f g a -> bSource#

foldl' :: (b -> a -> b) -> b ->Product f g a -> bSource#

foldr1 :: (a -> a -> a) ->Product f g a -> aSource#

foldl1 :: (a -> a -> a) ->Product f g a -> aSource#

toList ::Product f g a -> [a]Source#

null ::Product f g a ->BoolSource#

length ::Product f g a ->IntSource#

elem ::Eq a => a ->Product f g a ->BoolSource#

maximum ::Ord a =>Product f g a -> aSource#

minimum ::Ord a =>Product f g a -> aSource#

sum ::Num a =>Product f g a -> aSource#

product ::Num a =>Product f g a -> aSource#

(Traversable f,Traversable g) =>Traversable (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

traverse ::Applicative f0 => (a -> f0 b) ->Product f g a -> f0 (Product f g b)Source#

sequenceA ::Applicative f0 =>Product f g (f0 a) -> f0 (Product f g a)Source#

mapM ::Monad m => (a -> m b) ->Product f g a -> m (Product f g b)Source#

sequence ::Monad m =>Product f g (m a) -> m (Product f g a)Source#

(MonadPlus f,MonadPlus g) =>MonadPlus (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

mzero ::Product f g aSource#

mplus ::Product f g a ->Product f g a ->Product f g aSource#

(Alternative f,Alternative g) =>Alternative (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

empty ::Product f g aSource#

(<|>) ::Product f g a ->Product f g a ->Product f g aSource#

some ::Product f g a ->Product f g [a]Source#

many ::Product f g a ->Product f g [a]Source#

(MonadZip f,MonadZip g) =>MonadZip (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

mzip ::Product f g a ->Product f g b ->Product f g (a, b)Source#

mzipWith :: (a -> b -> c) ->Product f g a ->Product f g b ->Product f g cSource#

munzip ::Product f g (a, b) -> (Product f g a,Product f g b)Source#

(Show1 f,Show1 g) =>Show1 (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

liftShowsPrec :: (Int -> a ->ShowS) -> ([a] ->ShowS) ->Int ->Product f g a ->ShowSSource#

liftShowList :: (Int -> a ->ShowS) -> ([a] ->ShowS) -> [Product f g a] ->ShowSSource#

(Read1 f,Read1 g) =>Read1 (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

(Ord1 f,Ord1 g) =>Ord1 (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

liftCompare :: (a -> b ->Ordering) ->Product f g a ->Product f g b ->OrderingSource#

(Eq1 f,Eq1 g) =>Eq1 (Product f g)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

liftEq :: (a -> b ->Bool) ->Product f g a ->Product f g b ->BoolSource#

(Contravariant f,Contravariant g) =>Contravariant (Product f g)Source# 
Instance details

Defined inData.Functor.Contravariant

Methods

contramap :: (a -> b) ->Product f g b ->Product f g aSource#

(>$) :: b ->Product f g b ->Product f g aSource#

(Eq1 f,Eq1 g,Eq a) =>Eq (Product f g a)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

(==) ::Product f g a ->Product f g a ->Bool#

(/=) ::Product f g a ->Product f g a ->Bool#

(Typeable a,Typeable f,Typeable g,Typeable k,Data (f a),Data (g a)) =>Data (Product f g a)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

gfoldl :: (forall d b.Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) ->Product f g a -> c (Product f g a)Source#

gunfold :: (forall b r.Data b => c (b -> r) -> c r) -> (forall r. r -> c r) ->Constr -> c (Product f g a)Source#

toConstr ::Product f g a ->ConstrSource#

dataTypeOf ::Product f g a ->DataTypeSource#

dataCast1 ::Typeable t => (forall d.Data d => c (t d)) ->Maybe (c (Product f g a))Source#

dataCast2 ::Typeable t => (forall d e. (Data d,Data e) => c (t d e)) ->Maybe (c (Product f g a))Source#

gmapT :: (forall b.Data b => b -> b) ->Product f g a ->Product f g aSource#

gmapQl :: (r -> r' -> r) -> r -> (forall d.Data d => d -> r') ->Product f g a -> rSource#

gmapQr :: (r' -> r -> r) -> r -> (forall d.Data d => d -> r') ->Product f g a -> rSource#

gmapQ :: (forall d.Data d => d -> u) ->Product f g a -> [u]Source#

gmapQi ::Int -> (forall d.Data d => d -> u) ->Product f g a -> uSource#

gmapM ::Monad m => (forall d.Data d => d -> m d) ->Product f g a -> m (Product f g a)Source#

gmapMp ::MonadPlus m => (forall d.Data d => d -> m d) ->Product f g a -> m (Product f g a)Source#

gmapMo ::MonadPlus m => (forall d.Data d => d -> m d) ->Product f g a -> m (Product f g a)Source#

(Ord1 f,Ord1 g,Ord a) =>Ord (Product f g a)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Methods

compare ::Product f g a ->Product f g a ->Ordering#

(<) ::Product f g a ->Product f g a ->Bool#

(<=) ::Product f g a ->Product f g a ->Bool#

(>) ::Product f g a ->Product f g a ->Bool#

(>=) ::Product f g a ->Product f g a ->Bool#

max ::Product f g a ->Product f g a ->Product f g a#

min ::Product f g a ->Product f g a ->Product f g a#

(Read1 f,Read1 g,Read a) =>Read (Product f g a)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

(Show1 f,Show1 g,Show a) =>Show (Product f g a)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Generic (Product f g a)Source# 
Instance details

Defined inData.Functor.Product

Associated Types

typeRep (Product f g a) ::Type ->TypeSource#

Methods

from ::Product f g a ->Rep (Product f g a) xSource#

to ::Rep (Product f g a) x ->Product f g aSource#

typeRep1 (Product f g :: k ->Type)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

typeRep (Product f g a)Source#

Since: 4.9.0.0

Instance details

Defined inData.Functor.Product

Produced byHaddock version 2.20.0


[8]ページ先頭

©2009-2025 Movatter.jp