Data.Int (original) (raw)
Since: base-2.1
Instance details
Defined in Text.Printf
Methods
formatArg :: Int -> FieldFormatter Source #
parseFormat :: Int -> ModifierParser Source #
Since: base-2.1
Instance details
Defined in GHC.Internal.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: base-4.6.0.0
Instance details
Defined in GHC.Internal.Bits
Methods
finiteBitSize :: Int -> Int Source #
countLeadingZeros :: Int -> Int Source #
countTrailingZeros :: Int -> Int Source #
Since: base-4.0.0.0
Instance details
Defined in GHC.Internal.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 :: forall r r'. (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: base-2.1
Instance details
Defined in GHC.Internal.Enum
Methods
Since: base-2.1
Instance details
Defined in GHC.Internal.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 #
Since: base-2.1
Instance details
Defined in GHC.Internal.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: base-2.1
Instance details
Defined in GHC.Internal.Ix
Methods
range :: (Int, Int) -> [Int] Source #
index :: (Int, Int) -> Int -> Int Source #
unsafeIndex :: (Int, Int) -> Int -> Int Source #
inRange :: (Int, Int) -> Int -> Bool Source #
rangeSize :: (Int, Int) -> Int Source #
unsafeRangeSize :: (Int, Int) -> Int Source #
Since: base-2.1
Instance details
Defined in GHC.Internal.Num
Methods
(+) :: Int -> Int -> Int Source #
(-) :: Int -> Int -> Int Source #
(*) :: Int -> Int -> Int Source #
fromInteger :: Integer -> Int Source #
Since: base-2.1
Instance details
Defined in GHC.Internal.Read
Methods
readsPrec :: Int -> ReadS Int Source #
readList :: ReadS [Int] Source #
readPrec :: ReadPrec Int Source #
readListPrec :: ReadPrec [Int] Source #
Since: base-2.0.1
Instance details
Defined in GHC.Internal.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: base-2.0.1
Instance details
Defined in GHC.Internal.Real
Methods
toRational :: Int -> Rational Source #
Since: base-2.1
Instance details
Defined in GHC.Internal.Show
Methods
showsPrec :: Int -> Int -> ShowS Source #
show :: Int -> String Source #
showList :: [Int] -> ShowS Source #
Instance details
Defined in GHC.Classes
Methods
(==) :: Int -> Int -> Bool Source #
(/=) :: Int -> Int -> Bool Source #
Instance details
Defined in GHC.Classes
Methods
compare :: Int -> Int -> Ordering Source #
(<) :: Int -> Int -> Bool Source #
(<=) :: Int -> Int -> Bool Source #
(>) :: Int -> Int -> Bool Source #
(>=) :: Int -> Int -> Bool Source #
max :: Int -> Int -> Int Source #
min :: Int -> Int -> Int Source #
Instance details
Defined in GHC.Internal.TH.Lift
Methods
lift :: Quote m => Int -> m Exp Source #
liftTyped :: forall (m :: Type -> Type). Quote m => Int -> Code m Int Source #
Generic1 (URec Int :: k -> Type) Source #
Instance details
Defined in GHC.Internal.Generics
Associated Types
type Rep1 (URec Int :: k -> Type) | Since: base-4.9.0.0 |
---|---|
Instance detailsDefined in GHC.Internal.Generics type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: k -> Type))) |
Methods
from1 :: forall (a :: k). URec Int a -> Rep1 (URec Int :: k -> Type) a Source #
to1 :: forall (a :: k). Rep1 (URec Int :: k -> Type) a -> URec Int a Source #
Eq1 (UInt :: Type -> Type) Source #
Since: base-4.21.0.0
Instance details
Defined in Data.Functor.Classes
Methods
liftEq :: (a -> b -> Bool) -> UInt a -> UInt b -> Bool Source #
Ord1 (UInt :: Type -> Type) Source #
Since: base-4.21.0.0
Instance details
Defined in Data.Functor.Classes
Methods
liftCompare :: (a -> b -> Ordering) -> UInt a -> UInt b -> Ordering Source #
Show1 (UInt :: Type -> Type) Source #
Since: base-4.21.0.0
Instance details
Defined in Data.Functor.Classes
Methods
liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> UInt a -> ShowS Source #
liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [UInt a] -> ShowS Source #
Foldable (UInt :: Type -> Type) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Internal.Data.Foldable
Methods
fold :: Monoid m => UInt m -> m Source #
foldMap :: Monoid m => (a -> m) -> UInt a -> m Source #
foldMap' :: Monoid m => (a -> m) -> UInt a -> m Source #
foldr :: (a -> b -> b) -> b -> UInt a -> b Source #
foldr' :: (a -> b -> b) -> b -> UInt a -> b Source #
foldl :: (b -> a -> b) -> b -> UInt a -> b Source #
foldl' :: (b -> a -> b) -> b -> UInt a -> b Source #
foldr1 :: (a -> a -> a) -> UInt a -> a Source #
foldl1 :: (a -> a -> a) -> UInt a -> a Source #
toList :: UInt a -> [a] Source #
null :: UInt a -> Bool Source #
length :: UInt a -> Int Source #
elem :: Eq a => a -> UInt a -> Bool Source #
maximum :: Ord a => UInt a -> a Source #
minimum :: Ord a => UInt a -> a Source #
sum :: Num a => UInt a -> a Source #
product :: Num a => UInt a -> a Source #
Traversable (UInt :: Type -> Type) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Internal.Data.Traversable
Methods
traverse :: Applicative f => (a -> f b) -> UInt a -> f (UInt b) Source #
sequenceA :: Applicative f => UInt (f a) -> f (UInt a) Source #
mapM :: Monad m => (a -> m b) -> UInt a -> m (UInt b) Source #
sequence :: Monad m => UInt (m a) -> m (UInt a) Source #
Functor (URec Int :: Type -> Type) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Internal.Generics
Methods
fmap :: (a -> b) -> URec Int a -> URec Int b Source #
(<$) :: a -> URec Int b -> URec Int a Source #
Instance details
Defined in GHC.Internal.Generics
Associated Types
type Rep (URec Int p) | Since: base-4.9.0.0 |
---|---|
Instance detailsDefined in GHC.Internal.Generics type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: Type -> Type))) |
Methods
from :: URec Int p -> Rep (URec Int p) x Source #
to :: Rep (URec Int p) x -> URec Int p Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Internal.Generics
Methods
showsPrec :: Int -> URec Int p -> ShowS Source #
show :: URec Int p -> String Source #
showList :: [URec Int p] -> ShowS Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Internal.Generics
Methods
(==) :: URec Int p -> URec Int p -> Bool Source #
(/=) :: URec Int p -> URec Int p -> Bool Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Internal.Generics
Methods
compare :: URec Int p -> URec Int p -> Ordering Source #
(<) :: URec Int p -> URec Int p -> Bool Source #
(<=) :: URec Int p -> URec Int p -> Bool Source #
(>) :: URec Int p -> URec Int p -> Bool Source #
(>=) :: URec Int p -> URec Int p -> Bool Source #
max :: URec Int p -> URec Int p -> URec Int p Source #
min :: URec Int p -> URec Int p -> 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: base-4.9.0.0
Instance details
Defined in GHC.Internal.Generics
data URec Int (p :: k) = UInt {
- uInt# :: Int#
}
type Rep1 (URec Int :: k -> Type) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Internal.Generics
type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: k -> Type)))
type Rep (URec Int p) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Internal.Generics
type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: Type -> Type)))