Copyright | Conor McBride and Ross Paterson 2005 |
---|---|
License | BSD-style (see the LICENSE file in the distribution) |
Maintainer | libraries@haskell.org |
Stability | experimental |
Portability | portable |
Safe Haskell | Trustworthy |
Language | Haskell2010 |
Data.Functor.Const
Description
Documentation
The Const
functor.
Instances
Methods
liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Const * a b) Source #
liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Const * a b] Source #
liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Const * a b) Source #
liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Const * a b] Source #
Methods
bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const * a b -> f (Const * c d) Source #
Methods
fold :: Monoid m => Const * m m -> m Source #
foldMap :: Monoid m => (a -> m) -> Const * m a -> m Source #
foldr :: (a -> b -> b) -> b -> Const * m a -> b Source #
foldr' :: (a -> b -> b) -> b -> Const * m a -> b Source #
foldl :: (b -> a -> b) -> b -> Const * m a -> b Source #
foldl' :: (b -> a -> b) -> b -> Const * m a -> b Source #
foldr1 :: (a -> a -> a) -> Const * m a -> a Source #
foldl1 :: (a -> a -> a) -> Const * m a -> a Source #
toList :: Const * m a -> [a] Source #
null :: Const * m a -> Bool Source #
length :: Const * m a -> Int Source #
elem :: Eq a => a -> Const * m a -> Bool Source #
maximum :: Ord a => Const * m a -> a Source #
minimum :: Ord a => Const * m a -> a Source #
Methods
traverse :: Applicative f => (a -> f b) -> Const * m a -> f (Const * m b) Source #
sequenceA :: Applicative f => Const * m (f a) -> f (Const * m a) Source #
mapM :: Monad m => (a -> m b) -> Const * m a -> m (Const * m b) Source #
sequence :: Monad m => Const * m (m a) -> m (Const * m a) Source #
Methods
liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Const * a a) Source #
liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Const * a a] Source #
liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Const * a a) Source #
liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Const * a a] Source #
Methods
succ :: Const k a b -> Const k a b Source #
pred :: Const k a b -> Const k a b Source #
toEnum :: Int -> Const k a b Source #
fromEnum :: Const k a b -> Int Source #
enumFrom :: Const k a b -> [Const k a b] Source #
enumFromThen :: Const k a b -> Const k a b -> [Const k a b] Source #
enumFromTo :: Const k a b -> Const k a b -> [Const k a b] Source #
enumFromThenTo :: Const k a b -> Const k a b -> Const k a b -> [Const k a b] Source #
Methods
exp :: Const k a b -> Const k a b Source #
log :: Const k a b -> Const k a b Source #
sqrt :: Const k a b -> Const k a b Source #
(**) :: Const k a b -> Const k a b -> Const k a b Source #
logBase :: Const k a b -> Const k a b -> Const k a b Source #
sin :: Const k a b -> Const k a b Source #
cos :: Const k a b -> Const k a b Source #
tan :: Const k a b -> Const k a b Source #
asin :: Const k a b -> Const k a b Source #
acos :: Const k a b -> Const k a b Source #
atan :: Const k a b -> Const k a b Source #
sinh :: Const k a b -> Const k a b Source #
cosh :: Const k a b -> Const k a b Source #
tanh :: Const k a b -> Const k a b Source #
asinh :: Const k a b -> Const k a b Source #
acosh :: Const k a b -> Const k a b Source #
atanh :: Const k a b -> Const k a b Source #
log1p :: Const k a b -> Const k a b Source #
expm1 :: Const k a b -> Const k a b Source #
Methods
quot :: Const k a b -> Const k a b -> Const k a b Source #
rem :: Const k a b -> Const k a b -> Const k a b Source #
div :: Const k a b -> Const k a b -> Const k a b Source #
mod :: Const k a b -> Const k a b -> Const k a b Source #
quotRem :: Const k a b -> Const k a b -> (Const k a b, Const k a b) Source #
divMod :: Const k a b -> Const k a b -> (Const k a b, Const k a b) Source #
Methods
gfoldl :: (forall d c. Data d => c (d -> c) -> d -> c c) -> (forall g. g -> c g) -> Const k3 a b -> c (Const k3 a b) Source #
gunfold :: (forall c r. Data c => c (c -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const k3 a b) Source #
toConstr :: Const k3 a b -> Constr Source #
dataTypeOf :: Const k3 a b -> DataType Source #
dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Const k3 a b)) Source #
dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const k3 a b)) Source #
gmapT :: (forall c. Data c => c -> c) -> Const k3 a b -> Const k3 a b Source #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const k3 a b -> r Source #
gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const k3 a b -> r Source #
gmapQ :: (forall d. Data d => d -> u) -> Const k3 a b -> [u] Source #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Const k3 a b -> u Source #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const k3 a b -> m (Const k3 a b) Source #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const k3 a b -> m (Const k3 a b) Source #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const k3 a b -> m (Const k3 a b) Source #
Methods
(+) :: Const k a b -> Const k a b -> Const k a b Source #
(-) :: Const k a b -> Const k a b -> Const k a b Source #
(*) :: Const k a b -> Const k a b -> Const k a b Source #
negate :: Const k a b -> Const k a b Source #
abs :: Const k a b -> Const k a b Source #
signum :: Const k a b -> Const k a b Source #
fromInteger :: Integer -> Const k a b Source #
This instance would be equivalent to the derived instances of the
Const
newtype if the runConst
field were removed
Since: 4.8.0.0
Methods
toRational :: Const k a b -> Rational Source #
Methods
floatRadix :: Const k a b -> Integer Source #
floatDigits :: Const k a b -> Int Source #
floatRange :: Const k a b -> (Int, Int) Source #
decodeFloat :: Const k a b -> (Integer, Int) Source #
encodeFloat :: Integer -> Int -> Const k a b Source #
exponent :: Const k a b -> Int Source #
significand :: Const k a b -> Const k a b Source #
scaleFloat :: Int -> Const k a b -> Const k a b Source #
isNaN :: Const k a b -> Bool Source #
isInfinite :: Const k a b -> Bool Source #
isDenormalized :: Const k a b -> Bool Source #
isNegativeZero :: Const k a b -> Bool Source #
This instance would be equivalent to the derived instances of the
Const
newtype if the runConst
field were removed
Since: 4.8.0.0
Methods
range :: (Const k a b, Const k a b) -> [Const k a b] Source #
index :: (Const k a b, Const k a b) -> Const k a b -> Int Source #
unsafeIndex :: (Const k a b, Const k a b) -> Const k a b -> Int
inRange :: (Const k a b, Const k a b) -> Const k a b -> Bool Source #
rangeSize :: (Const k a b, Const k a b) -> Int Source #
unsafeRangeSize :: (Const k a b, Const k a b) -> Int
Methods
finiteBitSize :: Const k a b -> Int Source #
countLeadingZeros :: Const k a b -> Int Source #
countTrailingZeros :: Const k a b -> Int Source #
Methods
(.&.) :: Const k a b -> Const k a b -> Const k a b Source #
(.|.) :: Const k a b -> Const k a b -> Const k a b Source #
xor :: Const k a b -> Const k a b -> Const k a b Source #
complement :: Const k a b -> Const k a b Source #
shift :: Const k a b -> Int -> Const k a b Source #
rotate :: Const k a b -> Int -> Const k a b Source #
zeroBits :: Const k a b Source #
bit :: Int -> Const k a b Source #
setBit :: Const k a b -> Int -> Const k a b Source #
clearBit :: Const k a b -> Int -> Const k a b Source #
complementBit :: Const k a b -> Int -> Const k a b Source #
testBit :: Const k a b -> Int -> Bool Source #
bitSizeMaybe :: Const k a b -> Maybe Int Source #
bitSize :: Const k a b -> Int Source #
isSigned :: Const k a b -> Bool Source #
shiftL :: Const k a b -> Int -> Const k a b Source #
unsafeShiftL :: Const k a b -> Int -> Const k a b Source #
shiftR :: Const k a b -> Int -> Const k a b Source #
unsafeShiftR :: Const k a b -> Int -> Const k a b Source #
rotateL :: Const k a b -> Int -> Const k a b Source #
Methods
sizeOf :: Const k a b -> Int Source #
alignment :: Const k a b -> Int Source #
peekElemOff :: Ptr (Const k a b) -> Int -> IO (Const k a b) Source #
pokeElemOff :: Ptr (Const k a b) -> Int -> Const k a b -> IO () Source #
peekByteOff :: Ptr b -> Int -> IO (Const k a b) Source #
pokeByteOff :: Ptr b -> Int -> Const k a b -> IO () Source #