License | BSD-style |
---|---|
Maintainer | Foundation |
Safe Haskell | Safe |
Language | Haskell2010 |
- newtype CChar :: * = CChar Int8
- newtype CSChar :: * = CSChar Int8
- newtype CUChar :: * = CUChar Word8
- newtype CShort :: * = CShort Int16
- newtype CUShort :: * = CUShort Word16
- newtype CInt :: * = CInt Int32
- newtype CUInt :: * = CUInt Word32
- newtype CLong :: * = CLong Int64
- newtype CULong :: * = CULong Word64
- newtype CPtrdiff :: * = CPtrdiff Int64
- newtype CSize :: * = CSize Word64
- newtype CWchar :: * = CWchar Int32
- newtype CSigAtomic :: * = CSigAtomic Int32
- newtype CLLong :: * = CLLong Int64
- newtype CULLong :: * = CULLong Word64
- newtype CBool :: * = CBool Word8
- newtype CIntPtr :: * = CIntPtr Int64
- newtype CUIntPtr :: * = CUIntPtr Word64
- newtype CIntMax :: * = CIntMax Int64
- newtype CUIntMax :: * = CUIntMax Word64
- newtype CClock :: * = CClock Int64
- newtype CTime :: * = CTime Int64
- newtype CUSeconds :: * = CUSeconds Word32
- newtype CSUSeconds :: * = CSUSeconds Int64
- newtype CFloat :: * = CFloat Float
- data CDouble :: *
- newtype COff :: * = COff Int64
- newtype CMode :: * = CMode Word32
Documentation
Haskell type representing the C char
type.
Haskell type representing the C signed char
type.
Haskell type representing the C unsigned char
type.
Haskell type representing the C short
type.
Haskell type representing the C unsigned short
type.
Haskell type representing the C int
type.
Bounded CInt | |
Enum CInt | |
Eq CInt | |
Integral CInt | |
Num CInt | |
Ord CInt | |
Read CInt | |
Real CInt | |
toRational :: CInt -> Rational # | |
Show CInt | |
Storable CInt | |
Bits CInt | |
(.&.) :: CInt -> CInt -> CInt # (.|.) :: CInt -> CInt -> CInt # complement :: CInt -> CInt # shift :: CInt -> Int -> CInt # rotate :: CInt -> Int -> CInt # setBit :: CInt -> Int -> CInt # clearBit :: CInt -> Int -> CInt # complementBit :: CInt -> Int -> CInt # testBit :: CInt -> Int -> Bool # bitSizeMaybe :: CInt -> Maybe Int # shiftL :: CInt -> Int -> CInt # unsafeShiftL :: CInt -> Int -> CInt # shiftR :: CInt -> Int -> CInt # unsafeShiftR :: CInt -> Int -> CInt # rotateL :: CInt -> Int -> CInt # | |
FiniteBits CInt | |
HasNegation CInt Source # | |
Integral CInt Source # | |
fromInteger :: Integer -> CInt Source # | |
IsIntegral CInt Source # | |
Subtractive CInt Source # | |
Additive CInt Source # | |
IDivisible CInt Source # | |
Multiplicative CInt Source # | |
NormalForm CInt Source # | |
toNormalForm :: CInt -> () Source # | |
type Difference CInt Source # | |
Haskell type representing the C unsigned int
type.
Haskell type representing the C long
type.
Haskell type representing the C unsigned long
type.
Haskell type representing the C ptrdiff_t
type.
Haskell type representing the C size_t
type.
Haskell type representing the C wchar_t
type.
newtype CSigAtomic :: * #
Haskell type representing the C sig_atomic_t
type.
Haskell type representing the C long long
type.
Haskell type representing the C unsigned long long
type.
Haskell type representing the C bool
type.
Since: 4.10.0.0
Bounded CBool | |
Enum CBool | |
Eq CBool | |
Integral CBool | |
Num CBool | |
Ord CBool | |
Read CBool | |
Real CBool | |
toRational :: CBool -> Rational # | |
Show CBool | |
Storable CBool | |
Bits CBool | |
(.&.) :: CBool -> CBool -> CBool # (.|.) :: CBool -> CBool -> CBool # xor :: CBool -> CBool -> CBool # complement :: CBool -> CBool # shift :: CBool -> Int -> CBool # rotate :: CBool -> Int -> CBool # setBit :: CBool -> Int -> CBool # clearBit :: CBool -> Int -> CBool # complementBit :: CBool -> Int -> CBool # testBit :: CBool -> Int -> Bool # bitSizeMaybe :: CBool -> Maybe Int # shiftL :: CBool -> Int -> CBool # unsafeShiftL :: CBool -> Int -> CBool # shiftR :: CBool -> Int -> CBool # unsafeShiftR :: CBool -> Int -> CBool # rotateL :: CBool -> Int -> CBool # | |
FiniteBits CBool | |
finiteBitSize :: CBool -> Int # countLeadingZeros :: CBool -> Int # countTrailingZeros :: CBool -> Int # | |
Integral CBool Source # | |
fromInteger :: Integer -> CBool Source # | |
IsIntegral CBool Source # | |
Subtractive CBool Source # | |
type Difference CBool Source # | |
Haskell type representing the C clock_t
type.
Haskell type representing the C time_t
type.
Enum CTime | |
Eq CTime | |
Num CTime | |
Ord CTime | |
Read CTime | |
Real CTime | |
toRational :: CTime -> Rational # | |
Show CTime | |
Storable CTime | |
Integral CTime Source # | |
fromInteger :: Integer -> CTime Source # | |
Subtractive CTime Source # | |
Additive CTime Source # | |
Multiplicative CTime Source # | |
type Difference CTime Source # | |
Haskell type representing the C useconds_t
type.
Since: 4.4.0.0
Enum CUSeconds | |
succ :: CUSeconds -> CUSeconds # pred :: CUSeconds -> CUSeconds # fromEnum :: CUSeconds -> Int # enumFrom :: CUSeconds -> [CUSeconds] # enumFromThen :: CUSeconds -> CUSeconds -> [CUSeconds] # enumFromTo :: CUSeconds -> CUSeconds -> [CUSeconds] # enumFromThenTo :: CUSeconds -> CUSeconds -> CUSeconds -> [CUSeconds] # | |
Eq CUSeconds | |
Num CUSeconds | |
Ord CUSeconds | |
Read CUSeconds | |
Real CUSeconds | |
toRational :: CUSeconds -> Rational # | |
Show CUSeconds | |
Storable CUSeconds | |
Integral CUSeconds Source # | |
fromInteger :: Integer -> CUSeconds Source # | |
Subtractive CUSeconds Source # | |
Additive CUSeconds Source # | |
Multiplicative CUSeconds Source # | |
type Difference CUSeconds Source # | |
newtype CSUSeconds :: * #
Haskell type representing the C suseconds_t
type.
Since: 4.4.0.0
Haskell type representing the C float
type.
Enum CFloat | |
Eq CFloat | |
Floating CFloat | |
Fractional CFloat | |
Num CFloat | |
Ord CFloat | |
Read CFloat | |
Real CFloat | |
toRational :: CFloat -> Rational # | |
RealFloat CFloat | |
floatRadix :: CFloat -> Integer # floatDigits :: CFloat -> Int # floatRange :: CFloat -> (Int, Int) # decodeFloat :: CFloat -> (Integer, Int) # encodeFloat :: Integer -> Int -> CFloat # significand :: CFloat -> CFloat # scaleFloat :: Int -> CFloat -> CFloat # isInfinite :: CFloat -> Bool # isDenormalized :: CFloat -> Bool # isNegativeZero :: CFloat -> Bool # | |
RealFrac CFloat | |
Show CFloat | |
Storable CFloat | |
HasNegation CFloat Source # | |
Fractional CFloat Source # | |
fromRational :: Rational -> CFloat Source # | |
Integral CFloat Source # | |
fromInteger :: Integer -> CFloat Source # | |
Subtractive CFloat Source # | |
Additive CFloat Source # | |
Divisible CFloat Source # | |
Multiplicative CFloat Source # | |
NormalForm CFloat Source # | |
toNormalForm :: CFloat -> () Source # | |
type Difference CFloat Source # | |
Haskell type representing the C double
type.
Enum CDouble | |
Eq CDouble | |
Floating CDouble | |
Fractional CDouble | |
Num CDouble | |
Ord CDouble | |
Read CDouble | |
Real CDouble | |
toRational :: CDouble -> Rational # | |
RealFloat CDouble | |
floatRadix :: CDouble -> Integer # floatDigits :: CDouble -> Int # floatRange :: CDouble -> (Int, Int) # decodeFloat :: CDouble -> (Integer, Int) # encodeFloat :: Integer -> Int -> CDouble # significand :: CDouble -> CDouble # scaleFloat :: Int -> CDouble -> CDouble # isInfinite :: CDouble -> Bool # isDenormalized :: CDouble -> Bool # isNegativeZero :: CDouble -> Bool # | |
RealFrac CDouble | |
Show CDouble | |
Storable CDouble | |
HasNegation CDouble Source # | |
Fractional CDouble Source # | |
fromRational :: Rational -> CDouble Source # | |
Integral CDouble Source # | |
fromInteger :: Integer -> CDouble Source # | |
Subtractive CDouble Source # | |
Additive CDouble Source # | |
Divisible CDouble Source # | |
Multiplicative CDouble Source # | |
NormalForm CDouble Source # | |
toNormalForm :: CDouble -> () Source # | |
type Difference CDouble Source # | |
Bounded COff | |
Enum COff | |
Eq COff | |
Integral COff | |
Num COff | |
Ord COff | |
Read COff | |
Real COff | |
toRational :: COff -> Rational # | |
Show COff | |
Storable COff | |
Bits COff | |
(.&.) :: COff -> COff -> COff # (.|.) :: COff -> COff -> COff # complement :: COff -> COff # shift :: COff -> Int -> COff # rotate :: COff -> Int -> COff # setBit :: COff -> Int -> COff # clearBit :: COff -> Int -> COff # complementBit :: COff -> Int -> COff # testBit :: COff -> Int -> Bool # bitSizeMaybe :: COff -> Maybe Int # shiftL :: COff -> Int -> COff # unsafeShiftL :: COff -> Int -> COff # shiftR :: COff -> Int -> COff # unsafeShiftR :: COff -> Int -> COff # rotateL :: COff -> Int -> COff # | |
FiniteBits COff | |
Integral COff Source # | |
fromInteger :: Integer -> COff Source # | |
Subtractive COff Source # | |
Additive COff Source # | |
Multiplicative COff Source # | |
type Difference COff Source # | |
Bounded CMode | |
Enum CMode | |
Eq CMode | |
Integral CMode | |
Num CMode | |
Ord CMode | |
Read CMode | |
Real CMode | |
toRational :: CMode -> Rational # | |
Show CMode | |
Storable CMode | |
Bits CMode | |
(.&.) :: CMode -> CMode -> CMode # (.|.) :: CMode -> CMode -> CMode # xor :: CMode -> CMode -> CMode # complement :: CMode -> CMode # shift :: CMode -> Int -> CMode # rotate :: CMode -> Int -> CMode # setBit :: CMode -> Int -> CMode # clearBit :: CMode -> Int -> CMode # complementBit :: CMode -> Int -> CMode # testBit :: CMode -> Int -> Bool # bitSizeMaybe :: CMode -> Maybe Int # shiftL :: CMode -> Int -> CMode # unsafeShiftL :: CMode -> Int -> CMode # shiftR :: CMode -> Int -> CMode # unsafeShiftR :: CMode -> Int -> CMode # rotateL :: CMode -> Int -> CMode # | |
FiniteBits CMode | |
finiteBitSize :: CMode -> Int # countLeadingZeros :: CMode -> Int # countTrailingZeros :: CMode -> Int # |