Data.Int (original) (raw)
Since: 2.1
Instance details
Defined in GHC.Enum
Methods
Since: 2.1
Instance details
Defined in GHC.Enum
Methods
fromEnum :: Int -> Int Source #
enumFrom :: Int -> [Int] Source #
enumFromThen :: Int -> Int -> [Int] Source #
enumFromTo :: Int -> Int -> [Int] Source #
enumFromThenTo :: Int -> Int -> Int -> [Int] Source #
Instance details
Defined in GHC.Classes
Methods
Since: 2.0.1
Instance details
Defined in GHC.Real
Methods
quot :: Int -> Int -> Int Source #
rem :: Int -> Int -> Int Source #
div :: Int -> Int -> Int Source #
mod :: Int -> Int -> Int Source #
quotRem :: Int -> Int -> (Int, Int) Source #
divMod :: Int -> Int -> (Int, Int) Source #
toInteger :: Int -> Integer Source #
Since: 4.0.0.0
Instance details
Defined in Data.Data
Methods
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int Source #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int Source #
toConstr :: Int -> Constr Source #
dataTypeOf :: Int -> DataType Source #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) Source #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) Source #
gmapT :: (forall b. Data b => b -> b) -> Int -> Int Source #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r Source #
gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r Source #
gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] Source #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u Source #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int Source #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int Source #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int Source #
Since: 2.1
Instance details
Defined in GHC.Num
Methods
(+) :: Int -> Int -> Int Source #
(-) :: Int -> Int -> Int Source #
(*) :: Int -> Int -> Int Source #
fromInteger :: Integer -> Int Source #
Instance details
Defined in GHC.Classes
Methods
compare :: Int -> Int -> Ordering #
Since: 2.1
Instance details
Defined in GHC.Read
Methods
readsPrec :: Int -> ReadS Int Source #
readList :: ReadS [Int] Source #
readPrec :: ReadPrec Int Source #
readListPrec :: ReadPrec [Int] Source #
Since: 2.0.1
Instance details
Defined in GHC.Real
Methods
toRational :: Int -> Rational Source #
Since: 2.1
Instance details
Defined in GHC.Show
Methods
showsPrec :: Int -> Int -> ShowS Source #
show :: Int -> String Source #
showList :: [Int] -> ShowS Source #
Since: 2.1
Instance details
Defined in GHC.Arr
Methods
range :: (Int, Int) -> [Int] Source #
index :: (Int, Int) -> Int -> Int Source #
unsafeIndex :: (Int, Int) -> Int -> Int
inRange :: (Int, Int) -> Int -> Bool Source #
rangeSize :: (Int, Int) -> Int Source #
unsafeRangeSize :: (Int, Int) -> Int
Since: 4.6.0.0
Instance details
Defined in Data.Bits
Methods
finiteBitSize :: Int -> Int Source #
countLeadingZeros :: Int -> Int Source #
countTrailingZeros :: Int -> Int Source #
Since: 2.1
Instance details
Defined in Data.Bits
Methods
(.&.) :: Int -> Int -> Int Source #
(.|.) :: Int -> Int -> Int Source #
xor :: Int -> Int -> Int Source #
complement :: Int -> Int Source #
shift :: Int -> Int -> Int Source #
rotate :: Int -> Int -> Int Source #
setBit :: Int -> Int -> Int Source #
clearBit :: Int -> Int -> Int Source #
complementBit :: Int -> Int -> Int Source #
testBit :: Int -> Int -> Bool Source #
bitSizeMaybe :: Int -> Maybe Int Source #
bitSize :: Int -> Int Source #
isSigned :: Int -> Bool Source #
shiftL :: Int -> Int -> Int Source #
unsafeShiftL :: Int -> Int -> Int Source #
shiftR :: Int -> Int -> Int Source #
unsafeShiftR :: Int -> Int -> Int Source #
rotateL :: Int -> Int -> Int Source #
rotateR :: Int -> Int -> Int Source #
popCount :: Int -> Int Source #
Since: 2.1
Instance details
Defined in Foreign.Storable
Methods
alignment :: Int -> Int Source #
peekElemOff :: Ptr Int -> Int -> IO Int Source #
pokeElemOff :: Ptr Int -> Int -> Int -> IO () Source #
peekByteOff :: Ptr b -> Int -> IO Int Source #
pokeByteOff :: Ptr b -> Int -> Int -> IO () Source #
peek :: Ptr Int -> IO Int Source #
poke :: Ptr Int -> Int -> IO () Source #
Since: 2.1
Instance details
Defined in Text.Printf
Methods
formatArg :: Int -> FieldFormatter Source #
parseFormat :: Int -> ModifierParser Source #
Generic1 (URec Int :: k -> Type) Source #
Instance details
Defined in GHC.Generics
Associated Types
type Rep1 (URec Int) :: k -> Type Source #
Methods
from1 :: URec Int a -> Rep1 (URec Int) a Source #
to1 :: Rep1 (URec Int) a -> URec Int a Source #
Functor (URec Int :: Type -> Type) Source #
Since: 4.9.0.0
Instance details
Defined in GHC.Generics
Methods
fmap :: (a -> b) -> URec Int a -> URec Int b Source #
(<$) :: a -> URec Int b -> URec Int a Source #
Foldable (URec Int :: Type -> Type) Source #
Since: 4.9.0.0
Instance details
Defined in Data.Foldable
Methods
fold :: Monoid m => URec Int m -> m Source #
foldMap :: Monoid m => (a -> m) -> URec Int a -> m Source #
foldr :: (a -> b -> b) -> b -> URec Int a -> b Source #
foldr' :: (a -> b -> b) -> b -> URec Int a -> b Source #
foldl :: (b -> a -> b) -> b -> URec Int a -> b Source #
foldl' :: (b -> a -> b) -> b -> URec Int a -> b Source #
foldr1 :: (a -> a -> a) -> URec Int a -> a Source #
foldl1 :: (a -> a -> a) -> URec Int a -> a Source #
toList :: URec Int a -> [a] Source #
null :: URec Int a -> Bool Source #
length :: URec Int a -> Int Source #
elem :: Eq a => a -> URec Int a -> Bool Source #
maximum :: Ord a => URec Int a -> a Source #
minimum :: Ord a => URec Int a -> a Source #
sum :: Num a => URec Int a -> a Source #
product :: Num a => URec Int a -> a Source #
Traversable (URec Int :: Type -> Type) Source #
Since: 4.9.0.0
Instance details
Defined in Data.Traversable
Methods
traverse :: Applicative f => (a -> f b) -> URec Int a -> f (URec Int b) Source #
sequenceA :: Applicative f => URec Int (f a) -> f (URec Int a) Source #
mapM :: Monad m => (a -> m b) -> URec Int a -> m (URec Int b) Source #
sequence :: Monad m => URec Int (m a) -> m (URec Int a) Source #
Since: 4.9.0.0
Instance details
Defined in GHC.Generics
Methods
(==) :: URec Int p -> URec Int p -> Bool #
(/=) :: URec Int p -> URec Int p -> Bool #
Since: 4.9.0.0
Instance details
Defined in GHC.Generics
Methods
compare :: URec Int p -> URec Int p -> Ordering #
(<) :: URec Int p -> URec Int p -> Bool #
(<=) :: URec Int p -> URec Int p -> Bool #
(>) :: URec Int p -> URec Int p -> Bool #
(>=) :: URec Int p -> URec Int p -> Bool #
max :: URec Int p -> URec Int p -> URec Int p #
min :: URec Int p -> URec Int p -> URec Int p #
Since: 4.9.0.0
Instance details
Defined in GHC.Generics
Methods
showsPrec :: Int -> URec Int p -> ShowS Source #
show :: URec Int p -> String Source #
showList :: [URec Int p] -> ShowS Source #
Instance details
Defined in GHC.Generics
Associated Types
type Rep (URec Int p) :: Type -> Type Source #
Methods
from :: URec Int p -> Rep (URec Int p) x Source #
to :: Rep (URec Int p) x -> URec Int p Source #
data URec Int (p :: k) Source #
Used for marking occurrences of [Int#](GHC-Exts.html#t:Int-35- "GHC.Exts")
Since: 4.9.0.0
Instance details
Defined in GHC.Generics
data URec Int (p :: k) = UInt {
- uInt# :: Int#
}
type Rep1 (URec Int :: k -> Type) Source #
Since: 4.9.0.0
Instance details
Defined in GHC.Generics
type Rep1 (URec Int :: k -> Type) = D1 (MetaData "URec" "GHC.Generics" "base" False) (C1 (MetaCons "UInt" PrefixI True) (S1 (MetaSel (Just "uInt#") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (UInt :: k -> Type)))
type Rep (URec Int p) Source #
Since: 4.9.0.0
Instance details
Defined in GHC.Generics
type Rep (URec Int p) = D1 (MetaData "URec" "GHC.Generics" "base" False) (C1 (MetaCons "UInt" PrefixI True) (S1 (MetaSel (Just "uInt#") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (UInt :: Type -> Type)))