tfp-1.0.1: Type-level integers, booleans, lists using type families

Safe HaskellSafe
LanguageHaskell2010

Data.SizedInt

Documentation

data SizedInt nT Source #

Instances
Natural nT => Bounded (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

minBound :: SizedInt nT #

maxBound :: SizedInt nT #

Natural nT => Enum (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

succ :: SizedInt nT -> SizedInt nT #

pred :: SizedInt nT -> SizedInt nT #

toEnum :: Int -> SizedInt nT #

fromEnum :: SizedInt nT -> Int #

enumFrom :: SizedInt nT -> [SizedInt nT] #

enumFromThen :: SizedInt nT -> SizedInt nT -> [SizedInt nT] #

enumFromTo :: SizedInt nT -> SizedInt nT -> [SizedInt nT] #

enumFromThenTo :: SizedInt nT -> SizedInt nT -> SizedInt nT -> [SizedInt nT] #

Natural nT => Eq (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

(==) :: SizedInt nT -> SizedInt nT -> Bool #

(/=) :: SizedInt nT -> SizedInt nT -> Bool #

Natural nT => Integral (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

quot :: SizedInt nT -> SizedInt nT -> SizedInt nT #

rem :: SizedInt nT -> SizedInt nT -> SizedInt nT #

div :: SizedInt nT -> SizedInt nT -> SizedInt nT #

mod :: SizedInt nT -> SizedInt nT -> SizedInt nT #

quotRem :: SizedInt nT -> SizedInt nT -> (SizedInt nT, SizedInt nT) #

divMod :: SizedInt nT -> SizedInt nT -> (SizedInt nT, SizedInt nT) #

toInteger :: SizedInt nT -> Integer #

Natural nT => Num (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

(+) :: SizedInt nT -> SizedInt nT -> SizedInt nT #

(-) :: SizedInt nT -> SizedInt nT -> SizedInt nT #

(*) :: SizedInt nT -> SizedInt nT -> SizedInt nT #

negate :: SizedInt nT -> SizedInt nT #

abs :: SizedInt nT -> SizedInt nT #

signum :: SizedInt nT -> SizedInt nT #

fromInteger :: Integer -> SizedInt nT #

Natural nT => Ord (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

compare :: SizedInt nT -> SizedInt nT -> Ordering #

(<) :: SizedInt nT -> SizedInt nT -> Bool #

(<=) :: SizedInt nT -> SizedInt nT -> Bool #

(>) :: SizedInt nT -> SizedInt nT -> Bool #

(>=) :: SizedInt nT -> SizedInt nT -> Bool #

max :: SizedInt nT -> SizedInt nT -> SizedInt nT #

min :: SizedInt nT -> SizedInt nT -> SizedInt nT #

Natural nT => Read (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Natural nT => Real (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

toRational :: SizedInt nT -> Rational #

Natural nT => Show (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

showsPrec :: Int -> SizedInt nT -> ShowS #

show :: SizedInt nT -> String #

showList :: [SizedInt nT] -> ShowS #

Natural nT => Bits (SizedInt nT) Source # 
Instance details

Defined in Data.SizedInt

Methods

(.&.) :: SizedInt nT -> SizedInt nT -> SizedInt nT #

(.|.) :: SizedInt nT -> SizedInt nT -> SizedInt nT #

xor :: SizedInt nT -> SizedInt nT -> SizedInt nT #

complement :: SizedInt nT -> SizedInt nT #

shift :: SizedInt nT -> Int -> SizedInt nT #

rotate :: SizedInt nT -> Int -> SizedInt nT #

zeroBits :: SizedInt nT #

bit :: Int -> SizedInt nT #

setBit :: SizedInt nT -> Int -> SizedInt nT #

clearBit :: SizedInt nT -> Int -> SizedInt nT #

complementBit :: SizedInt nT -> Int -> SizedInt nT #

testBit :: SizedInt nT -> Int -> Bool #

bitSizeMaybe :: SizedInt nT -> Maybe Int #

bitSize :: SizedInt nT -> Int #

isSigned :: SizedInt nT -> Bool #

shiftL :: SizedInt nT -> Int -> SizedInt nT #

unsafeShiftL :: SizedInt nT -> Int -> SizedInt nT #

shiftR :: SizedInt nT -> Int -> SizedInt nT #

unsafeShiftR :: SizedInt nT -> Int -> SizedInt nT #

rotateL :: SizedInt nT -> Int -> SizedInt nT #

rotateR :: SizedInt nT -> Int -> SizedInt nT #

popCount :: SizedInt nT -> Int #