| License | BSD-style |
|---|---|
| Maintainer | Foundation |
| Safe Haskell | Safe-Inferred |
| Language | Haskell2010 |
Basement.Compat.C.Types
Description
Literal support for Integral and Fractional {-# LANGUAGE TypeSynonymInstances #-} {-# LANGUAGE FlexibleInstances #-}
Synopsis
- newtype CChar = CChar Word8
- 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 Word32
- newtype CTime = CTime Int64
- newtype CUSeconds = CUSeconds Word32
- newtype CSUSeconds = CSUSeconds Int32
- newtype CFloat = CFloat Float
- data CDouble
- newtype COff = COff Int64
- newtype CMode = CMode Word32
Documentation
Haskell type representing the C char type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
Haskell type representing the C signed char type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| HasNegation CSChar # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CSChar # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CSChar # | |||||
| NormalForm CSChar # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CSChar -> () # | |||||
| Additive CSChar # | |||||
| IDivisible CSChar # | |||||
| Multiplicative CSChar # | |||||
| IsIntegral CSChar # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CSChar # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CSChar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CSChar -> CSChar -> CSChar # (.|.) :: CSChar -> CSChar -> CSChar # xor :: CSChar -> CSChar -> CSChar # complement :: CSChar -> CSChar # shift :: CSChar -> Int -> CSChar # rotate :: CSChar -> Int -> CSChar # setBit :: CSChar -> Int -> CSChar # clearBit :: CSChar -> Int -> CSChar # complementBit :: CSChar -> Int -> CSChar # testBit :: CSChar -> Int -> Bool # bitSizeMaybe :: CSChar -> Maybe Int # shiftL :: CSChar -> Int -> CSChar # unsafeShiftL :: CSChar -> Int -> CSChar # shiftR :: CSChar -> Int -> CSChar # unsafeShiftR :: CSChar -> Int -> CSChar # rotateL :: CSChar -> Int -> CSChar # | |||||
| FiniteBits CSChar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CSChar -> Int # countLeadingZeros :: CSChar -> Int # countTrailingZeros :: CSChar -> Int # | |||||
| Bounded CSChar | |||||
| Enum CSChar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CSChar | |||||
| Ix CSChar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CSChar | |||||
| Read CSChar | |||||
| Integral CSChar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CSChar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CSChar -> Rational # | |||||
| Show CSChar | |||||
| Eq CSChar | |||||
| Ord CSChar | |||||
| type Difference CSChar # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C unsigned char type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Integral CUChar # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CUChar # | |||||
| NormalForm CUChar # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CUChar -> () # | |||||
| Additive CUChar # | |||||
| IDivisible CUChar # | |||||
| Multiplicative CUChar # | |||||
| IsIntegral CUChar # | |||||
Defined in Basement.Numerical.Number | |||||
| IsNatural CUChar # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CUChar # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| PrimMemoryComparable CUChar # | |||||
Defined in Basement.PrimType | |||||
| PrimType CUChar # | |||||
Defined in Basement.PrimType Associated Types
Methods primSizeInBytes :: Proxy CUChar -> CountOf Word8 # primShiftToBytes :: Proxy CUChar -> Int # primBaUIndex :: ByteArray# -> Offset CUChar -> CUChar # primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset CUChar -> prim CUChar # primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset CUChar -> CUChar -> prim () # primAddrIndex :: Addr# -> Offset CUChar -> CUChar # primAddrRead :: PrimMonad prim => Addr# -> Offset CUChar -> prim CUChar # primAddrWrite :: PrimMonad prim => Addr# -> Offset CUChar -> CUChar -> prim () # | |||||
| Bits CUChar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUChar -> CUChar -> CUChar # (.|.) :: CUChar -> CUChar -> CUChar # xor :: CUChar -> CUChar -> CUChar # complement :: CUChar -> CUChar # shift :: CUChar -> Int -> CUChar # rotate :: CUChar -> Int -> CUChar # setBit :: CUChar -> Int -> CUChar # clearBit :: CUChar -> Int -> CUChar # complementBit :: CUChar -> Int -> CUChar # testBit :: CUChar -> Int -> Bool # bitSizeMaybe :: CUChar -> Maybe Int # shiftL :: CUChar -> Int -> CUChar # unsafeShiftL :: CUChar -> Int -> CUChar # shiftR :: CUChar -> Int -> CUChar # unsafeShiftR :: CUChar -> Int -> CUChar # rotateL :: CUChar -> Int -> CUChar # | |||||
| FiniteBits CUChar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUChar -> Int # countLeadingZeros :: CUChar -> Int # countTrailingZeros :: CUChar -> Int # | |||||
| Bounded CUChar | |||||
| Enum CUChar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CUChar | |||||
| Ix CUChar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CUChar | |||||
| Read CUChar | |||||
| Integral CUChar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CUChar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUChar -> Rational # | |||||
| Show CUChar | |||||
| Eq CUChar | |||||
| Ord CUChar | |||||
| type Difference CUChar # | |||||
Defined in Basement.Numerical.Subtractive | |||||
| type PrimSize CUChar # | |||||
Defined in Basement.PrimType | |||||
Haskell type representing the C short type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| HasNegation CShort # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CShort # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CShort # | |||||
| NormalForm CShort # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CShort -> () # | |||||
| Additive CShort # | |||||
| IDivisible CShort # | |||||
| Multiplicative CShort # | |||||
| IsIntegral CShort # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CShort # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CShort | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CShort -> CShort -> CShort # (.|.) :: CShort -> CShort -> CShort # xor :: CShort -> CShort -> CShort # complement :: CShort -> CShort # shift :: CShort -> Int -> CShort # rotate :: CShort -> Int -> CShort # setBit :: CShort -> Int -> CShort # clearBit :: CShort -> Int -> CShort # complementBit :: CShort -> Int -> CShort # testBit :: CShort -> Int -> Bool # bitSizeMaybe :: CShort -> Maybe Int # shiftL :: CShort -> Int -> CShort # unsafeShiftL :: CShort -> Int -> CShort # shiftR :: CShort -> Int -> CShort # unsafeShiftR :: CShort -> Int -> CShort # rotateL :: CShort -> Int -> CShort # | |||||
| FiniteBits CShort | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CShort -> Int # countLeadingZeros :: CShort -> Int # countTrailingZeros :: CShort -> Int # | |||||
| Bounded CShort | |||||
| Enum CShort | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CShort | |||||
| Ix CShort | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CShort | |||||
| Read CShort | |||||
| Integral CShort | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CShort | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CShort -> Rational # | |||||
| Show CShort | |||||
| Eq CShort | |||||
| Ord CShort | |||||
| type Difference CShort # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C unsigned short type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Integral CUShort # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CUShort # | |||||
| NormalForm CUShort # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CUShort -> () # | |||||
| Additive CUShort # | |||||
| IDivisible CUShort # | |||||
| Multiplicative CUShort # | |||||
| IsIntegral CUShort # | |||||
Defined in Basement.Numerical.Number | |||||
| IsNatural CUShort # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CUShort # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CUShort | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUShort -> CUShort -> CUShort # (.|.) :: CUShort -> CUShort -> CUShort # xor :: CUShort -> CUShort -> CUShort # complement :: CUShort -> CUShort # shift :: CUShort -> Int -> CUShort # rotate :: CUShort -> Int -> CUShort # setBit :: CUShort -> Int -> CUShort # clearBit :: CUShort -> Int -> CUShort # complementBit :: CUShort -> Int -> CUShort # testBit :: CUShort -> Int -> Bool # bitSizeMaybe :: CUShort -> Maybe Int # shiftL :: CUShort -> Int -> CUShort # unsafeShiftL :: CUShort -> Int -> CUShort # shiftR :: CUShort -> Int -> CUShort # unsafeShiftR :: CUShort -> Int -> CUShort # rotateL :: CUShort -> Int -> CUShort # | |||||
| FiniteBits CUShort | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUShort -> Int # countLeadingZeros :: CUShort -> Int # countTrailingZeros :: CUShort -> Int # | |||||
| Bounded CUShort | |||||
| Enum CUShort | |||||
| Storable CUShort | |||||
| Ix CUShort | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CUShort | |||||
| Read CUShort | |||||
| Integral CUShort | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CUShort | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUShort -> Rational # | |||||
| Show CUShort | |||||
| Eq CUShort | |||||
| Ord CUShort | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| type Difference CUShort # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C int type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| HasNegation CInt # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CInt # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CInt # | |||||
| NormalForm CInt # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CInt -> () # | |||||
| Additive CInt # | |||||
| IDivisible CInt # | |||||
| Multiplicative CInt # | |||||
| IsIntegral CInt # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CInt # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CInt | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: 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 | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CInt -> Int # countLeadingZeros :: CInt -> Int # countTrailingZeros :: CInt -> Int # | |||||
| Bounded CInt | |||||
| Enum CInt | |||||
| Storable CInt | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Ix CInt | |||||
| Num CInt | |||||
| Read CInt | |||||
| Integral CInt | |||||
| Real CInt | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CInt -> Rational # | |||||
| Show CInt | |||||
| Eq CInt | |||||
| Ord CInt | |||||
| type Difference CInt # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C unsigned int type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Integral CUInt # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CUInt # | |||||
| NormalForm CUInt # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CUInt -> () # | |||||
| Additive CUInt # | |||||
| IDivisible CUInt # | |||||
| Multiplicative CUInt # | |||||
| IsIntegral CUInt # | |||||
Defined in Basement.Numerical.Number | |||||
| IsNatural CUInt # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CUInt # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CUInt | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUInt -> CUInt -> CUInt # (.|.) :: CUInt -> CUInt -> CUInt # xor :: CUInt -> CUInt -> CUInt # complement :: CUInt -> CUInt # shift :: CUInt -> Int -> CUInt # rotate :: CUInt -> Int -> CUInt # setBit :: CUInt -> Int -> CUInt # clearBit :: CUInt -> Int -> CUInt # complementBit :: CUInt -> Int -> CUInt # testBit :: CUInt -> Int -> Bool # bitSizeMaybe :: CUInt -> Maybe Int # shiftL :: CUInt -> Int -> CUInt # unsafeShiftL :: CUInt -> Int -> CUInt # shiftR :: CUInt -> Int -> CUInt # unsafeShiftR :: CUInt -> Int -> CUInt # rotateL :: CUInt -> Int -> CUInt # | |||||
| FiniteBits CUInt | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUInt -> Int # countLeadingZeros :: CUInt -> Int # countTrailingZeros :: CUInt -> Int # | |||||
| Bounded CUInt | |||||
| Enum CUInt | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CUInt | |||||
| Ix CUInt | |||||
| Num CUInt | |||||
| Read CUInt | |||||
| Integral CUInt | |||||
| Real CUInt | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUInt -> Rational # | |||||
| Show CUInt | |||||
| Eq CUInt | |||||
| Ord CUInt | |||||
| type Difference CUInt # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C long type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| HasNegation CLong # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CLong # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CLong # | |||||
| NormalForm CLong # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CLong -> () # | |||||
| Additive CLong # | |||||
| IDivisible CLong # | |||||
| Multiplicative CLong # | |||||
| IsIntegral CLong # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CLong # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CLong -> CLong -> CLong # (.|.) :: CLong -> CLong -> CLong # xor :: CLong -> CLong -> CLong # complement :: CLong -> CLong # shift :: CLong -> Int -> CLong # rotate :: CLong -> Int -> CLong # setBit :: CLong -> Int -> CLong # clearBit :: CLong -> Int -> CLong # complementBit :: CLong -> Int -> CLong # testBit :: CLong -> Int -> Bool # bitSizeMaybe :: CLong -> Maybe Int # shiftL :: CLong -> Int -> CLong # unsafeShiftL :: CLong -> Int -> CLong # shiftR :: CLong -> Int -> CLong # unsafeShiftR :: CLong -> Int -> CLong # rotateL :: CLong -> Int -> CLong # | |||||
| FiniteBits CLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CLong -> Int # countLeadingZeros :: CLong -> Int # countTrailingZeros :: CLong -> Int # | |||||
| Bounded CLong | |||||
| Enum CLong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CLong | |||||
| Ix CLong | |||||
| Num CLong | |||||
| Read CLong | |||||
| Integral CLong | |||||
| Real CLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CLong -> Rational # | |||||
| Show CLong | |||||
| Eq CLong | |||||
| Ord CLong | |||||
| type Difference CLong # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C unsigned long type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Integral CULong # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CULong # | |||||
| NormalForm CULong # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CULong -> () # | |||||
| Additive CULong # | |||||
| IDivisible CULong # | |||||
| Multiplicative CULong # | |||||
| IsIntegral CULong # | |||||
Defined in Basement.Numerical.Number | |||||
| IsNatural CULong # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CULong # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CULong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CULong -> CULong -> CULong # (.|.) :: CULong -> CULong -> CULong # xor :: CULong -> CULong -> CULong # complement :: CULong -> CULong # shift :: CULong -> Int -> CULong # rotate :: CULong -> Int -> CULong # setBit :: CULong -> Int -> CULong # clearBit :: CULong -> Int -> CULong # complementBit :: CULong -> Int -> CULong # testBit :: CULong -> Int -> Bool # bitSizeMaybe :: CULong -> Maybe Int # shiftL :: CULong -> Int -> CULong # unsafeShiftL :: CULong -> Int -> CULong # shiftR :: CULong -> Int -> CULong # unsafeShiftR :: CULong -> Int -> CULong # rotateL :: CULong -> Int -> CULong # | |||||
| FiniteBits CULong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CULong -> Int # countLeadingZeros :: CULong -> Int # countTrailingZeros :: CULong -> Int # | |||||
| Bounded CULong | |||||
| Enum CULong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CULong | |||||
| Ix CULong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CULong | |||||
| Read CULong | |||||
| Integral CULong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CULong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CULong -> Rational # | |||||
| Show CULong | |||||
| Eq CULong | |||||
| Ord CULong | |||||
| type Difference CULong # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C ptrdiff_t type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| HasNegation CPtrdiff # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CPtrdiff # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CPtrdiff # | |||||
| Additive CPtrdiff # | |||||
| IDivisible CPtrdiff # | |||||
| Multiplicative CPtrdiff # | |||||
| IsIntegral CPtrdiff # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CPtrdiff # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CPtrdiff | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CPtrdiff -> CPtrdiff -> CPtrdiff # (.|.) :: CPtrdiff -> CPtrdiff -> CPtrdiff # xor :: CPtrdiff -> CPtrdiff -> CPtrdiff # complement :: CPtrdiff -> CPtrdiff # shift :: CPtrdiff -> Int -> CPtrdiff # rotate :: CPtrdiff -> Int -> CPtrdiff # setBit :: CPtrdiff -> Int -> CPtrdiff # clearBit :: CPtrdiff -> Int -> CPtrdiff # complementBit :: CPtrdiff -> Int -> CPtrdiff # testBit :: CPtrdiff -> Int -> Bool # bitSizeMaybe :: CPtrdiff -> Maybe Int # isSigned :: CPtrdiff -> Bool # shiftL :: CPtrdiff -> Int -> CPtrdiff # unsafeShiftL :: CPtrdiff -> Int -> CPtrdiff # shiftR :: CPtrdiff -> Int -> CPtrdiff # unsafeShiftR :: CPtrdiff -> Int -> CPtrdiff # rotateL :: CPtrdiff -> Int -> CPtrdiff # | |||||
| FiniteBits CPtrdiff | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CPtrdiff -> Int # countLeadingZeros :: CPtrdiff -> Int # countTrailingZeros :: CPtrdiff -> Int # | |||||
| Bounded CPtrdiff | |||||
| Enum CPtrdiff | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CPtrdiff | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Ix CPtrdiff | |||||
Defined in GHC.Internal.Foreign.C.Types Methods range :: (CPtrdiff, CPtrdiff) -> [CPtrdiff] # index :: (CPtrdiff, CPtrdiff) -> CPtrdiff -> Int # unsafeIndex :: (CPtrdiff, CPtrdiff) -> CPtrdiff -> Int # inRange :: (CPtrdiff, CPtrdiff) -> CPtrdiff -> Bool # rangeSize :: (CPtrdiff, CPtrdiff) -> Int # unsafeRangeSize :: (CPtrdiff, CPtrdiff) -> Int # | |||||
| Num CPtrdiff | |||||
| Read CPtrdiff | |||||
| Integral CPtrdiff | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CPtrdiff | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CPtrdiff -> Rational # | |||||
| Show CPtrdiff | |||||
| Eq CPtrdiff | |||||
| Ord CPtrdiff | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| type Difference CPtrdiff # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C size_t type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Integral CSize # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CSize # | |||||
| Additive CSize # | |||||
| IDivisible CSize # | |||||
| Multiplicative CSize # | |||||
| IsIntegral CSize # | |||||
Defined in Basement.Numerical.Number | |||||
| IsNatural CSize # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CSize # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CSize | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CSize -> CSize -> CSize # (.|.) :: CSize -> CSize -> CSize # xor :: CSize -> CSize -> CSize # complement :: CSize -> CSize # shift :: CSize -> Int -> CSize # rotate :: CSize -> Int -> CSize # setBit :: CSize -> Int -> CSize # clearBit :: CSize -> Int -> CSize # complementBit :: CSize -> Int -> CSize # testBit :: CSize -> Int -> Bool # bitSizeMaybe :: CSize -> Maybe Int # shiftL :: CSize -> Int -> CSize # unsafeShiftL :: CSize -> Int -> CSize # shiftR :: CSize -> Int -> CSize # unsafeShiftR :: CSize -> Int -> CSize # rotateL :: CSize -> Int -> CSize # | |||||
| FiniteBits CSize | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CSize -> Int # countLeadingZeros :: CSize -> Int # countTrailingZeros :: CSize -> Int # | |||||
| Bounded CSize | |||||
| Enum CSize | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CSize | |||||
| Ix CSize | |||||
| Num CSize | |||||
| Read CSize | |||||
| Integral CSize | |||||
| Real CSize | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CSize -> Rational # | |||||
| Show CSize | |||||
| Eq CSize | |||||
| Ord CSize | |||||
| type Difference CSize # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C wchar_t type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| HasNegation CWchar # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CWchar # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CWchar # | |||||
| Additive CWchar # | |||||
| IDivisible CWchar # | |||||
| Multiplicative CWchar # | |||||
| IsIntegral CWchar # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CWchar # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CWchar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CWchar -> CWchar -> CWchar # (.|.) :: CWchar -> CWchar -> CWchar # xor :: CWchar -> CWchar -> CWchar # complement :: CWchar -> CWchar # shift :: CWchar -> Int -> CWchar # rotate :: CWchar -> Int -> CWchar # setBit :: CWchar -> Int -> CWchar # clearBit :: CWchar -> Int -> CWchar # complementBit :: CWchar -> Int -> CWchar # testBit :: CWchar -> Int -> Bool # bitSizeMaybe :: CWchar -> Maybe Int # shiftL :: CWchar -> Int -> CWchar # unsafeShiftL :: CWchar -> Int -> CWchar # shiftR :: CWchar -> Int -> CWchar # unsafeShiftR :: CWchar -> Int -> CWchar # rotateL :: CWchar -> Int -> CWchar # | |||||
| FiniteBits CWchar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CWchar -> Int # countLeadingZeros :: CWchar -> Int # countTrailingZeros :: CWchar -> Int # | |||||
| Bounded CWchar | |||||
| Enum CWchar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CWchar | |||||
| Ix CWchar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CWchar | |||||
| Read CWchar | |||||
| Integral CWchar | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CWchar | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CWchar -> Rational # | |||||
| Show CWchar | |||||
| Eq CWchar | |||||
| Ord CWchar | |||||
| type Difference CWchar # | |||||
Defined in Basement.Numerical.Subtractive | |||||
newtype CSigAtomic #
Haskell type representing the C sig_atomic_t type.
(The concrete types of Foreign.C.Types are platform-specific.)
See Note [Lack of signals on wasm32-wasi].
Constructors
| CSigAtomic Int32 |
Instances
| Integral CSigAtomic # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CSigAtomic # | |||||
| Additive CSigAtomic # | |||||
Defined in Basement.Numerical.Additive Methods azero :: CSigAtomic # (+) :: CSigAtomic -> CSigAtomic -> CSigAtomic # scale :: IsNatural n => n -> CSigAtomic -> CSigAtomic # | |||||
| IDivisible CSigAtomic # | |||||
Defined in Basement.Numerical.Multiplicative Methods div :: CSigAtomic -> CSigAtomic -> CSigAtomic # mod :: CSigAtomic -> CSigAtomic -> CSigAtomic # divMod :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) # | |||||
| Multiplicative CSigAtomic # | |||||
Defined in Basement.Numerical.Multiplicative Methods midentity :: CSigAtomic # (*) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (^) :: (IsNatural n, Enum n, IDivisible n) => CSigAtomic -> n -> CSigAtomic # | |||||
| IsIntegral CSigAtomic # | |||||
Defined in Basement.Numerical.Number Methods toInteger :: CSigAtomic -> Integer # | |||||
| Subtractive CSigAtomic # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
Methods (-) :: CSigAtomic -> CSigAtomic -> Difference CSigAtomic # | |||||
| Bits CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (.|.) :: CSigAtomic -> CSigAtomic -> CSigAtomic # xor :: CSigAtomic -> CSigAtomic -> CSigAtomic # complement :: CSigAtomic -> CSigAtomic # shift :: CSigAtomic -> Int -> CSigAtomic # rotate :: CSigAtomic -> Int -> CSigAtomic # zeroBits :: CSigAtomic # bit :: Int -> CSigAtomic # setBit :: CSigAtomic -> Int -> CSigAtomic # clearBit :: CSigAtomic -> Int -> CSigAtomic # complementBit :: CSigAtomic -> Int -> CSigAtomic # testBit :: CSigAtomic -> Int -> Bool # bitSizeMaybe :: CSigAtomic -> Maybe Int # bitSize :: CSigAtomic -> Int # isSigned :: CSigAtomic -> Bool # shiftL :: CSigAtomic -> Int -> CSigAtomic # unsafeShiftL :: CSigAtomic -> Int -> CSigAtomic # shiftR :: CSigAtomic -> Int -> CSigAtomic # unsafeShiftR :: CSigAtomic -> Int -> CSigAtomic # rotateL :: CSigAtomic -> Int -> CSigAtomic # rotateR :: CSigAtomic -> Int -> CSigAtomic # popCount :: CSigAtomic -> Int # | |||||
| FiniteBits CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CSigAtomic -> Int # countLeadingZeros :: CSigAtomic -> Int # countTrailingZeros :: CSigAtomic -> Int # | |||||
| Bounded CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Enum CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods succ :: CSigAtomic -> CSigAtomic # pred :: CSigAtomic -> CSigAtomic # toEnum :: Int -> CSigAtomic # fromEnum :: CSigAtomic -> Int # enumFrom :: CSigAtomic -> [CSigAtomic] # enumFromThen :: CSigAtomic -> CSigAtomic -> [CSigAtomic] # enumFromTo :: CSigAtomic -> CSigAtomic -> [CSigAtomic] # enumFromThenTo :: CSigAtomic -> CSigAtomic -> CSigAtomic -> [CSigAtomic] # | |||||
| Storable CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods sizeOf :: CSigAtomic -> Int # alignment :: CSigAtomic -> Int # peekElemOff :: Ptr CSigAtomic -> Int -> IO CSigAtomic # pokeElemOff :: Ptr CSigAtomic -> Int -> CSigAtomic -> IO () # peekByteOff :: Ptr b -> Int -> IO CSigAtomic # pokeByteOff :: Ptr b -> Int -> CSigAtomic -> IO () # peek :: Ptr CSigAtomic -> IO CSigAtomic # poke :: Ptr CSigAtomic -> CSigAtomic -> IO () # | |||||
| Ix CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods range :: (CSigAtomic, CSigAtomic) -> [CSigAtomic] # index :: (CSigAtomic, CSigAtomic) -> CSigAtomic -> Int # unsafeIndex :: (CSigAtomic, CSigAtomic) -> CSigAtomic -> Int # inRange :: (CSigAtomic, CSigAtomic) -> CSigAtomic -> Bool # rangeSize :: (CSigAtomic, CSigAtomic) -> Int # unsafeRangeSize :: (CSigAtomic, CSigAtomic) -> Int # | |||||
| Num CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (+) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (-) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (*) :: CSigAtomic -> CSigAtomic -> CSigAtomic # negate :: CSigAtomic -> CSigAtomic # abs :: CSigAtomic -> CSigAtomic # signum :: CSigAtomic -> CSigAtomic # fromInteger :: Integer -> CSigAtomic # | |||||
| Read CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods readsPrec :: Int -> ReadS CSigAtomic # readList :: ReadS [CSigAtomic] # readPrec :: ReadPrec CSigAtomic # readListPrec :: ReadPrec [CSigAtomic] # | |||||
| Integral CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods quot :: CSigAtomic -> CSigAtomic -> CSigAtomic # rem :: CSigAtomic -> CSigAtomic -> CSigAtomic # div :: CSigAtomic -> CSigAtomic -> CSigAtomic # mod :: CSigAtomic -> CSigAtomic -> CSigAtomic # quotRem :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) # divMod :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) # toInteger :: CSigAtomic -> Integer # | |||||
| Real CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CSigAtomic -> Rational # | |||||
| Show CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods showsPrec :: Int -> CSigAtomic -> ShowS # show :: CSigAtomic -> String # showList :: [CSigAtomic] -> ShowS # | |||||
| Eq CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Ord CSigAtomic | |||||
Defined in GHC.Internal.Foreign.C.Types Methods compare :: CSigAtomic -> CSigAtomic -> Ordering # (<) :: CSigAtomic -> CSigAtomic -> Bool # (<=) :: CSigAtomic -> CSigAtomic -> Bool # (>) :: CSigAtomic -> CSigAtomic -> Bool # (>=) :: CSigAtomic -> CSigAtomic -> Bool # max :: CSigAtomic -> CSigAtomic -> CSigAtomic # min :: CSigAtomic -> CSigAtomic -> CSigAtomic # | |||||
| type Difference CSigAtomic # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C long long type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| HasNegation CLLong # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CLLong # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CLLong # | |||||
| NormalForm CLLong # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CLLong -> () # | |||||
| Additive CLLong # | |||||
| IDivisible CLLong # | |||||
| Multiplicative CLLong # | |||||
| IsIntegral CLLong # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CLLong # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CLLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CLLong -> CLLong -> CLLong # (.|.) :: CLLong -> CLLong -> CLLong # xor :: CLLong -> CLLong -> CLLong # complement :: CLLong -> CLLong # shift :: CLLong -> Int -> CLLong # rotate :: CLLong -> Int -> CLLong # setBit :: CLLong -> Int -> CLLong # clearBit :: CLLong -> Int -> CLLong # complementBit :: CLLong -> Int -> CLLong # testBit :: CLLong -> Int -> Bool # bitSizeMaybe :: CLLong -> Maybe Int # shiftL :: CLLong -> Int -> CLLong # unsafeShiftL :: CLLong -> Int -> CLLong # shiftR :: CLLong -> Int -> CLLong # unsafeShiftR :: CLLong -> Int -> CLLong # rotateL :: CLLong -> Int -> CLLong # | |||||
| FiniteBits CLLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CLLong -> Int # countLeadingZeros :: CLLong -> Int # countTrailingZeros :: CLLong -> Int # | |||||
| Bounded CLLong | |||||
| Enum CLLong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CLLong | |||||
| Ix CLLong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CLLong | |||||
| Read CLLong | |||||
| Integral CLLong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CLLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CLLong -> Rational # | |||||
| Show CLLong | |||||
| Eq CLLong | |||||
| Ord CLLong | |||||
| type Difference CLLong # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C unsigned long long type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Integral CULLong # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CULLong # | |||||
| NormalForm CULLong # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CULLong -> () # | |||||
| Additive CULLong # | |||||
| IDivisible CULLong # | |||||
| Multiplicative CULLong # | |||||
| IsIntegral CULLong # | |||||
Defined in Basement.Numerical.Number | |||||
| IsNatural CULLong # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CULLong # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CULLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CULLong -> CULLong -> CULLong # (.|.) :: CULLong -> CULLong -> CULLong # xor :: CULLong -> CULLong -> CULLong # complement :: CULLong -> CULLong # shift :: CULLong -> Int -> CULLong # rotate :: CULLong -> Int -> CULLong # setBit :: CULLong -> Int -> CULLong # clearBit :: CULLong -> Int -> CULLong # complementBit :: CULLong -> Int -> CULLong # testBit :: CULLong -> Int -> Bool # bitSizeMaybe :: CULLong -> Maybe Int # shiftL :: CULLong -> Int -> CULLong # unsafeShiftL :: CULLong -> Int -> CULLong # shiftR :: CULLong -> Int -> CULLong # unsafeShiftR :: CULLong -> Int -> CULLong # rotateL :: CULLong -> Int -> CULLong # | |||||
| FiniteBits CULLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CULLong -> Int # countLeadingZeros :: CULLong -> Int # countTrailingZeros :: CULLong -> Int # | |||||
| Bounded CULLong | |||||
| Enum CULLong | |||||
| Storable CULLong | |||||
| Ix CULLong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CULLong | |||||
| Read CULLong | |||||
| Integral CULLong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CULLong | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CULLong -> Rational # | |||||
| Show CULLong | |||||
| Eq CULLong | |||||
| Ord CULLong | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| type Difference CULLong # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C bool type.
(The concrete types of Foreign.C.Types are platform-specific.)
@since base-4.10.0.0
Instances
| Integral CBool # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CBool # | |||||
| IsIntegral CBool # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CBool # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CBool | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: 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 | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CBool -> Int # countLeadingZeros :: CBool -> Int # countTrailingZeros :: CBool -> Int # | |||||
| Bounded CBool | |||||
| Enum CBool | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CBool | |||||
| Ix CBool | |||||
| Num CBool | |||||
| Read CBool | |||||
| Integral CBool | |||||
| Real CBool | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CBool -> Rational # | |||||
| Show CBool | |||||
| Eq CBool | |||||
| Ord CBool | |||||
| type Difference CBool # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Instances
| Integral CIntPtr # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CIntPtr # | |||||
| Additive CIntPtr # | |||||
| IDivisible CIntPtr # | |||||
| Multiplicative CIntPtr # | |||||
| IsIntegral CIntPtr # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CIntPtr # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CIntPtr -> CIntPtr -> CIntPtr # (.|.) :: CIntPtr -> CIntPtr -> CIntPtr # xor :: CIntPtr -> CIntPtr -> CIntPtr # complement :: CIntPtr -> CIntPtr # shift :: CIntPtr -> Int -> CIntPtr # rotate :: CIntPtr -> Int -> CIntPtr # setBit :: CIntPtr -> Int -> CIntPtr # clearBit :: CIntPtr -> Int -> CIntPtr # complementBit :: CIntPtr -> Int -> CIntPtr # testBit :: CIntPtr -> Int -> Bool # bitSizeMaybe :: CIntPtr -> Maybe Int # shiftL :: CIntPtr -> Int -> CIntPtr # unsafeShiftL :: CIntPtr -> Int -> CIntPtr # shiftR :: CIntPtr -> Int -> CIntPtr # unsafeShiftR :: CIntPtr -> Int -> CIntPtr # rotateL :: CIntPtr -> Int -> CIntPtr # | |||||
| FiniteBits CIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CIntPtr -> Int # countLeadingZeros :: CIntPtr -> Int # countTrailingZeros :: CIntPtr -> Int # | |||||
| Bounded CIntPtr | |||||
| Enum CIntPtr | |||||
| Storable CIntPtr | |||||
| Ix CIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CIntPtr | |||||
| Read CIntPtr | |||||
| Integral CIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CIntPtr -> Rational # | |||||
| Show CIntPtr | |||||
| Eq CIntPtr | |||||
| Ord CIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| type Difference CIntPtr # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Instances
| Integral CUIntPtr # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CUIntPtr # | |||||
| Additive CUIntPtr # | |||||
| IDivisible CUIntPtr # | |||||
| Multiplicative CUIntPtr # | |||||
| IsIntegral CUIntPtr # | |||||
Defined in Basement.Numerical.Number | |||||
| IsNatural CUIntPtr # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CUIntPtr # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CUIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUIntPtr -> CUIntPtr -> CUIntPtr # (.|.) :: CUIntPtr -> CUIntPtr -> CUIntPtr # xor :: CUIntPtr -> CUIntPtr -> CUIntPtr # complement :: CUIntPtr -> CUIntPtr # shift :: CUIntPtr -> Int -> CUIntPtr # rotate :: CUIntPtr -> Int -> CUIntPtr # setBit :: CUIntPtr -> Int -> CUIntPtr # clearBit :: CUIntPtr -> Int -> CUIntPtr # complementBit :: CUIntPtr -> Int -> CUIntPtr # testBit :: CUIntPtr -> Int -> Bool # bitSizeMaybe :: CUIntPtr -> Maybe Int # isSigned :: CUIntPtr -> Bool # shiftL :: CUIntPtr -> Int -> CUIntPtr # unsafeShiftL :: CUIntPtr -> Int -> CUIntPtr # shiftR :: CUIntPtr -> Int -> CUIntPtr # unsafeShiftR :: CUIntPtr -> Int -> CUIntPtr # rotateL :: CUIntPtr -> Int -> CUIntPtr # | |||||
| FiniteBits CUIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUIntPtr -> Int # countLeadingZeros :: CUIntPtr -> Int # countTrailingZeros :: CUIntPtr -> Int # | |||||
| Bounded CUIntPtr | |||||
| Enum CUIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CUIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Ix CUIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types Methods range :: (CUIntPtr, CUIntPtr) -> [CUIntPtr] # index :: (CUIntPtr, CUIntPtr) -> CUIntPtr -> Int # unsafeIndex :: (CUIntPtr, CUIntPtr) -> CUIntPtr -> Int # inRange :: (CUIntPtr, CUIntPtr) -> CUIntPtr -> Bool # rangeSize :: (CUIntPtr, CUIntPtr) -> Int # unsafeRangeSize :: (CUIntPtr, CUIntPtr) -> Int # | |||||
| Num CUIntPtr | |||||
| Read CUIntPtr | |||||
| Integral CUIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CUIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUIntPtr -> Rational # | |||||
| Show CUIntPtr | |||||
| Eq CUIntPtr | |||||
| Ord CUIntPtr | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| type Difference CUIntPtr # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Instances
| HasNegation CIntMax # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CIntMax # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CIntMax # | |||||
| Additive CIntMax # | |||||
| IDivisible CIntMax # | |||||
| Multiplicative CIntMax # | |||||
| IsIntegral CIntMax # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CIntMax # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CIntMax -> CIntMax -> CIntMax # (.|.) :: CIntMax -> CIntMax -> CIntMax # xor :: CIntMax -> CIntMax -> CIntMax # complement :: CIntMax -> CIntMax # shift :: CIntMax -> Int -> CIntMax # rotate :: CIntMax -> Int -> CIntMax # setBit :: CIntMax -> Int -> CIntMax # clearBit :: CIntMax -> Int -> CIntMax # complementBit :: CIntMax -> Int -> CIntMax # testBit :: CIntMax -> Int -> Bool # bitSizeMaybe :: CIntMax -> Maybe Int # shiftL :: CIntMax -> Int -> CIntMax # unsafeShiftL :: CIntMax -> Int -> CIntMax # shiftR :: CIntMax -> Int -> CIntMax # unsafeShiftR :: CIntMax -> Int -> CIntMax # rotateL :: CIntMax -> Int -> CIntMax # | |||||
| FiniteBits CIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CIntMax -> Int # countLeadingZeros :: CIntMax -> Int # countTrailingZeros :: CIntMax -> Int # | |||||
| Bounded CIntMax | |||||
| Enum CIntMax | |||||
| Storable CIntMax | |||||
| Ix CIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CIntMax | |||||
| Read CIntMax | |||||
| Integral CIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CIntMax -> Rational # | |||||
| Show CIntMax | |||||
| Eq CIntMax | |||||
| Ord CIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| type Difference CIntMax # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Instances
| Integral CUIntMax # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CUIntMax # | |||||
| Additive CUIntMax # | |||||
| IDivisible CUIntMax # | |||||
| Multiplicative CUIntMax # | |||||
| IsIntegral CUIntMax # | |||||
Defined in Basement.Numerical.Number | |||||
| IsNatural CUIntMax # | |||||
Defined in Basement.Numerical.Number | |||||
| Subtractive CUIntMax # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits CUIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUIntMax -> CUIntMax -> CUIntMax # (.|.) :: CUIntMax -> CUIntMax -> CUIntMax # xor :: CUIntMax -> CUIntMax -> CUIntMax # complement :: CUIntMax -> CUIntMax # shift :: CUIntMax -> Int -> CUIntMax # rotate :: CUIntMax -> Int -> CUIntMax # setBit :: CUIntMax -> Int -> CUIntMax # clearBit :: CUIntMax -> Int -> CUIntMax # complementBit :: CUIntMax -> Int -> CUIntMax # testBit :: CUIntMax -> Int -> Bool # bitSizeMaybe :: CUIntMax -> Maybe Int # isSigned :: CUIntMax -> Bool # shiftL :: CUIntMax -> Int -> CUIntMax # unsafeShiftL :: CUIntMax -> Int -> CUIntMax # shiftR :: CUIntMax -> Int -> CUIntMax # unsafeShiftR :: CUIntMax -> Int -> CUIntMax # rotateL :: CUIntMax -> Int -> CUIntMax # | |||||
| FiniteBits CUIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUIntMax -> Int # countLeadingZeros :: CUIntMax -> Int # countTrailingZeros :: CUIntMax -> Int # | |||||
| Bounded CUIntMax | |||||
| Enum CUIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CUIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Ix CUIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types Methods range :: (CUIntMax, CUIntMax) -> [CUIntMax] # index :: (CUIntMax, CUIntMax) -> CUIntMax -> Int # unsafeIndex :: (CUIntMax, CUIntMax) -> CUIntMax -> Int # inRange :: (CUIntMax, CUIntMax) -> CUIntMax -> Bool # rangeSize :: (CUIntMax, CUIntMax) -> Int # unsafeRangeSize :: (CUIntMax, CUIntMax) -> Int # | |||||
| Num CUIntMax | |||||
| Read CUIntMax | |||||
| Integral CUIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Real CUIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUIntMax -> Rational # | |||||
| Show CUIntMax | |||||
| Eq CUIntMax | |||||
| Ord CUIntMax | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| type Difference CUIntMax # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C clock_t type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Integral CClock # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CClock # | |||||
| Additive CClock # | |||||
| Multiplicative CClock # | |||||
| Subtractive CClock # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Enum CClock | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CClock | |||||
| Num CClock | |||||
| Read CClock | |||||
| Real CClock | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CClock -> Rational # | |||||
| Show CClock | |||||
| Eq CClock | |||||
| Ord CClock | |||||
| type Difference CClock # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C time_t type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Integral CTime # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CTime # | |||||
| Additive CTime # | |||||
| Multiplicative CTime # | |||||
| Subtractive CTime # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Enum CTime | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Storable CTime | |||||
| Num CTime | |||||
| Read CTime | |||||
| Real CTime | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CTime -> Rational # | |||||
| Show CTime | |||||
| Eq CTime | |||||
| Ord CTime | |||||
| type Difference CTime # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C useconds_t type.
(The concrete types of Foreign.C.Types are platform-specific.)
@since base-4.4.0.0
Instances
| Integral CUSeconds # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CUSeconds # | |||||
| Additive CUSeconds # | |||||
| Multiplicative CUSeconds # | |||||
| Subtractive CUSeconds # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Enum CUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods 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] # | |||||
| Storable CUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Num CUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Read CUSeconds | |||||
| Real CUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUSeconds -> Rational # | |||||
| Show CUSeconds | |||||
| Eq CUSeconds | |||||
| Ord CUSeconds | |||||
| type Difference CUSeconds # | |||||
Defined in Basement.Numerical.Subtractive | |||||
newtype CSUSeconds #
Haskell type representing the C suseconds_t type.
(The concrete types of Foreign.C.Types are platform-specific.)
@since base-4.4.0.0
Constructors
| CSUSeconds Int32 |
Instances
| Integral CSUSeconds # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CSUSeconds # | |||||
| Additive CSUSeconds # | |||||
Defined in Basement.Numerical.Additive Methods azero :: CSUSeconds # (+) :: CSUSeconds -> CSUSeconds -> CSUSeconds # scale :: IsNatural n => n -> CSUSeconds -> CSUSeconds # | |||||
| Multiplicative CSUSeconds # | |||||
Defined in Basement.Numerical.Multiplicative Methods midentity :: CSUSeconds # (*) :: CSUSeconds -> CSUSeconds -> CSUSeconds # (^) :: (IsNatural n, Enum n, IDivisible n) => CSUSeconds -> n -> CSUSeconds # | |||||
| Subtractive CSUSeconds # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
Methods (-) :: CSUSeconds -> CSUSeconds -> Difference CSUSeconds # | |||||
| Enum CSUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods succ :: CSUSeconds -> CSUSeconds # pred :: CSUSeconds -> CSUSeconds # toEnum :: Int -> CSUSeconds # fromEnum :: CSUSeconds -> Int # enumFrom :: CSUSeconds -> [CSUSeconds] # enumFromThen :: CSUSeconds -> CSUSeconds -> [CSUSeconds] # enumFromTo :: CSUSeconds -> CSUSeconds -> [CSUSeconds] # enumFromThenTo :: CSUSeconds -> CSUSeconds -> CSUSeconds -> [CSUSeconds] # | |||||
| Storable CSUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods sizeOf :: CSUSeconds -> Int # alignment :: CSUSeconds -> Int # peekElemOff :: Ptr CSUSeconds -> Int -> IO CSUSeconds # pokeElemOff :: Ptr CSUSeconds -> Int -> CSUSeconds -> IO () # peekByteOff :: Ptr b -> Int -> IO CSUSeconds # pokeByteOff :: Ptr b -> Int -> CSUSeconds -> IO () # peek :: Ptr CSUSeconds -> IO CSUSeconds # poke :: Ptr CSUSeconds -> CSUSeconds -> IO () # | |||||
| Num CSUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods (+) :: CSUSeconds -> CSUSeconds -> CSUSeconds # (-) :: CSUSeconds -> CSUSeconds -> CSUSeconds # (*) :: CSUSeconds -> CSUSeconds -> CSUSeconds # negate :: CSUSeconds -> CSUSeconds # abs :: CSUSeconds -> CSUSeconds # signum :: CSUSeconds -> CSUSeconds # fromInteger :: Integer -> CSUSeconds # | |||||
| Read CSUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods readsPrec :: Int -> ReadS CSUSeconds # readList :: ReadS [CSUSeconds] # readPrec :: ReadPrec CSUSeconds # readListPrec :: ReadPrec [CSUSeconds] # | |||||
| Real CSUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CSUSeconds -> Rational # | |||||
| Show CSUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods showsPrec :: Int -> CSUSeconds -> ShowS # show :: CSUSeconds -> String # showList :: [CSUSeconds] -> ShowS # | |||||
| Eq CSUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Ord CSUSeconds | |||||
Defined in GHC.Internal.Foreign.C.Types Methods compare :: CSUSeconds -> CSUSeconds -> Ordering # (<) :: CSUSeconds -> CSUSeconds -> Bool # (<=) :: CSUSeconds -> CSUSeconds -> Bool # (>) :: CSUSeconds -> CSUSeconds -> Bool # (>=) :: CSUSeconds -> CSUSeconds -> Bool # max :: CSUSeconds -> CSUSeconds -> CSUSeconds # min :: CSUSeconds -> CSUSeconds -> CSUSeconds # | |||||
| type Difference CSUSeconds # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C float type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Fractional CFloat # | |||||
Defined in Basement.Compat.NumLiteral Methods fromRational :: Rational -> CFloat # | |||||
| HasNegation CFloat # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CFloat # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CFloat # | |||||
| NormalForm CFloat # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CFloat -> () # | |||||
| Additive CFloat # | |||||
| Divisible CFloat # | |||||
| Multiplicative CFloat # | |||||
| Subtractive CFloat # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Enum CFloat | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| Floating CFloat | |||||
| RealFloat CFloat | |||||
Defined in GHC.Internal.Foreign.C.Types Methods 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 # | |||||
| Storable CFloat | |||||
| Num CFloat | |||||
| Read CFloat | |||||
| Fractional CFloat | |||||
| Real CFloat | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CFloat -> Rational # | |||||
| RealFrac CFloat | |||||
| Show CFloat | |||||
| Eq CFloat | |||||
| Ord CFloat | |||||
| type Difference CFloat # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Haskell type representing the C double type.
(The concrete types of Foreign.C.Types are platform-specific.)
Instances
| Fractional CDouble # | |||||
Defined in Basement.Compat.NumLiteral Methods fromRational :: Rational -> CDouble # | |||||
| HasNegation CDouble # | |||||
Defined in Basement.Compat.NumLiteral | |||||
| Integral CDouble # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> CDouble # | |||||
| NormalForm CDouble # | |||||
Defined in Basement.NormalForm Methods toNormalForm :: CDouble -> () # | |||||
| Additive CDouble # | |||||
| Divisible CDouble # | |||||
| Multiplicative CDouble # | |||||
| Subtractive CDouble # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Enum CDouble | |||||
| Floating CDouble | |||||
| RealFloat CDouble | |||||
Defined in GHC.Internal.Foreign.C.Types Methods 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 # | |||||
| Storable CDouble | |||||
| Num CDouble | |||||
| Read CDouble | |||||
| Fractional CDouble | |||||
| Real CDouble | |||||
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CDouble -> Rational # | |||||
| RealFrac CDouble | |||||
| Show CDouble | |||||
| Eq CDouble | |||||
| Ord CDouble | |||||
Defined in GHC.Internal.Foreign.C.Types | |||||
| type Difference CDouble # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Instances
| Integral COff # | |||||
Defined in Basement.Compat.NumLiteral Methods fromInteger :: Integer -> COff # | |||||
| Additive COff # | |||||
| Multiplicative COff # | |||||
| Subtractive COff # | |||||
Defined in Basement.Numerical.Subtractive Associated Types
| |||||
| Bits COff | |||||
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: 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 | |||||
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: COff -> Int # countLeadingZeros :: COff -> Int # countTrailingZeros :: COff -> Int # | |||||
| Bounded COff | |||||
| Enum COff | |||||
| Storable COff | |||||
Defined in GHC.Internal.System.Posix.Types | |||||
| Ix COff | |||||
| Num COff | |||||
| Read COff | |||||
| Integral COff | |||||
| Real COff | |||||
Defined in GHC.Internal.System.Posix.Types Methods toRational :: COff -> Rational # | |||||
| Show COff | |||||
| Eq COff | |||||
| Ord COff | |||||
| type Difference COff # | |||||
Defined in Basement.Numerical.Subtractive | |||||
Instances
| Bits CMode | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: 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 | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CMode -> Int # countLeadingZeros :: CMode -> Int # countTrailingZeros :: CMode -> Int # | |
| Bounded CMode | |
| Enum CMode | |
Defined in GHC.Internal.System.Posix.Types | |
| Storable CMode | |
| Ix CMode | |
| Num CMode | |
| Read CMode | |
| Integral CMode | |
| Real CMode | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CMode -> Rational # | |
| Show CMode | |
| Eq CMode | |
| Ord CMode | |