basement-0.0.16: Foundation scrap box of array & string
LicenseBSD-style
MaintainerFoundation
Safe HaskellSafe-Inferred
LanguageHaskell2010

Basement.Compat.C.Types

Description

Literal support for Integral and Fractional {-# LANGUAGE TypeSynonymInstances #-} {-# LANGUAGE FlexibleInstances #-}

Synopsis

Documentation

newtype CChar #

Haskell type representing the C char type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CChar Int8 

Instances

Instances details
HasNegation CChar # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CChar -> CChar #

Integral CChar # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> CChar #

NormalForm CChar # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CChar -> () #

Additive CChar # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CChar #

(+) :: CChar -> CChar -> CChar #

scale :: IsNatural n => n -> CChar -> CChar #

IDivisible CChar # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CChar -> CChar -> CChar #

mod :: CChar -> CChar -> CChar #

divMod :: CChar -> CChar -> (CChar, CChar) #

Multiplicative CChar # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CChar #

(*) :: CChar -> CChar -> CChar #

(^) :: (IsNatural n, Enum n, IDivisible n) => CChar -> n -> CChar #

IsIntegral CChar # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CChar -> Integer #

Subtractive CChar # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CChar 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: CChar -> CChar -> Difference CChar #

PrimMemoryComparable CChar # 
Instance details

Defined in Basement.PrimType

PrimType CChar # 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize CChar 
Instance details

Defined in Basement.PrimType

type PrimSize CChar = 1
Bits CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

sizeOf :: CChar -> Int #

alignment :: CChar -> Int #

peekElemOff :: Ptr CChar -> Int -> IO CChar #

pokeElemOff :: Ptr CChar -> Int -> CChar -> IO () #

peekByteOff :: Ptr b -> Int -> IO CChar #

pokeByteOff :: Ptr b -> Int -> CChar -> IO () #

peek :: Ptr CChar -> IO CChar #

poke :: Ptr CChar -> CChar -> IO () #

Ix CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

toRational :: CChar -> Rational #

Show CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CChar -> ShowS #

show :: CChar -> String #

showList :: [CChar] -> ShowS #

Eq CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CChar -> CChar -> Bool #

(/=) :: CChar -> CChar -> Bool #

Ord CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

compare :: CChar -> CChar -> Ordering #

(<) :: CChar -> CChar -> Bool #

(<=) :: CChar -> CChar -> Bool #

(>) :: CChar -> CChar -> Bool #

(>=) :: CChar -> CChar -> Bool #

max :: CChar -> CChar -> CChar #

min :: CChar -> CChar -> CChar #

type Difference CChar # 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize CChar # 
Instance details

Defined in Basement.PrimType

type PrimSize CChar = 1

newtype CSChar #

Haskell type representing the C signed char type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CSChar Int8 

Instances

Instances details
HasNegation CSChar # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CSChar -> CSChar #

Integral CSChar # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CSChar # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CSChar -> () #

Additive CSChar # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CSChar #

(+) :: CSChar -> CSChar -> CSChar #

scale :: IsNatural n => n -> CSChar -> CSChar #

IDivisible CSChar # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CSChar -> CSChar -> CSChar #

mod :: CSChar -> CSChar -> CSChar #

divMod :: CSChar -> CSChar -> (CSChar, CSChar) #

Multiplicative CSChar # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CSChar #

(*) :: CSChar -> CSChar -> CSChar #

(^) :: (IsNatural n, Enum n, IDivisible n) => CSChar -> n -> CSChar #

IsIntegral CSChar # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CSChar -> Integer #

Subtractive CSChar # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CSChar 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CSChar -> CSChar -> Bool #

(/=) :: CSChar -> CSChar -> Bool #

Ord CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CSChar # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CUChar #

Haskell type representing the C unsigned char type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CUChar Word8 

Instances

Instances details
Integral CUChar # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CUChar # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CUChar -> () #

Additive CUChar # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CUChar #

(+) :: CUChar -> CUChar -> CUChar #

scale :: IsNatural n => n -> CUChar -> CUChar #

IDivisible CUChar # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CUChar -> CUChar -> CUChar #

mod :: CUChar -> CUChar -> CUChar #

divMod :: CUChar -> CUChar -> (CUChar, CUChar) #

Multiplicative CUChar # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CUChar #

(*) :: CUChar -> CUChar -> CUChar #

(^) :: (IsNatural n, Enum n, IDivisible n) => CUChar -> n -> CUChar #

IsIntegral CUChar # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CUChar -> Integer #

IsNatural CUChar # 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: CUChar -> Natural #

Subtractive CUChar # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUChar 
Instance details

Defined in Basement.Numerical.Subtractive

PrimMemoryComparable CUChar # 
Instance details

Defined in Basement.PrimType

PrimType CUChar # 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize CUChar 
Instance details

Defined in Basement.PrimType

type PrimSize CUChar = 1
Bits CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CUChar -> CUChar -> Bool #

(/=) :: CUChar -> CUChar -> Bool #

Ord CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CUChar # 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize CUChar # 
Instance details

Defined in Basement.PrimType

type PrimSize CUChar = 1

newtype CShort #

Haskell type representing the C short type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CShort Int16 

Instances

Instances details
HasNegation CShort # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CShort -> CShort #

Integral CShort # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CShort # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CShort -> () #

Additive CShort # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CShort #

(+) :: CShort -> CShort -> CShort #

scale :: IsNatural n => n -> CShort -> CShort #

IDivisible CShort # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CShort -> CShort -> CShort #

mod :: CShort -> CShort -> CShort #

divMod :: CShort -> CShort -> (CShort, CShort) #

Multiplicative CShort # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CShort #

(*) :: CShort -> CShort -> CShort #

(^) :: (IsNatural n, Enum n, IDivisible n) => CShort -> n -> CShort #

IsIntegral CShort # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CShort -> Integer #

Subtractive CShort # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CShort 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CShort -> CShort -> Bool #

(/=) :: CShort -> CShort -> Bool #

Ord CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CShort # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CUShort #

Haskell type representing the C unsigned short type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CUShort Word16 

Instances

Instances details
Integral CUShort # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CUShort # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CUShort -> () #

Additive CUShort # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CUShort #

(+) :: CUShort -> CUShort -> CUShort #

scale :: IsNatural n => n -> CUShort -> CUShort #

IDivisible CUShort # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CUShort # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CUShort # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CUShort -> Integer #

IsNatural CUShort # 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: CUShort -> Natural #

Subtractive CUShort # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUShort 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CUShort -> CUShort -> Bool #

(/=) :: CUShort -> CUShort -> Bool #

Ord CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CUShort # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CInt #

Haskell type representing the C int type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CInt Int32 

Instances

Instances details
HasNegation CInt # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CInt -> CInt #

Integral CInt # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> CInt #

NormalForm CInt # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CInt -> () #

Additive CInt # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CInt #

(+) :: CInt -> CInt -> CInt #

scale :: IsNatural n => n -> CInt -> CInt #

IDivisible CInt # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CInt -> CInt -> CInt #

mod :: CInt -> CInt -> CInt #

divMod :: CInt -> CInt -> (CInt, CInt) #

Multiplicative CInt # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CInt #

(*) :: CInt -> CInt -> CInt #

(^) :: (IsNatural n, Enum n, IDivisible n) => CInt -> n -> CInt #

IsIntegral CInt # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CInt -> Integer #

Subtractive CInt # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CInt 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: CInt -> CInt -> Difference CInt #

Bits CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

succ :: CInt -> CInt #

pred :: CInt -> CInt #

toEnum :: Int -> CInt #

fromEnum :: CInt -> Int #

enumFrom :: CInt -> [CInt] #

enumFromThen :: CInt -> CInt -> [CInt] #

enumFromTo :: CInt -> CInt -> [CInt] #

enumFromThenTo :: CInt -> CInt -> CInt -> [CInt] #

Storable CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

sizeOf :: CInt -> Int #

alignment :: CInt -> Int #

peekElemOff :: Ptr CInt -> Int -> IO CInt #

pokeElemOff :: Ptr CInt -> Int -> CInt -> IO () #

peekByteOff :: Ptr b -> Int -> IO CInt #

pokeByteOff :: Ptr b -> Int -> CInt -> IO () #

peek :: Ptr CInt -> IO CInt #

poke :: Ptr CInt -> CInt -> IO () #

Ix CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

range :: (CInt, CInt) -> [CInt] #

index :: (CInt, CInt) -> CInt -> Int #

unsafeIndex :: (CInt, CInt) -> CInt -> Int #

inRange :: (CInt, CInt) -> CInt -> Bool #

rangeSize :: (CInt, CInt) -> Int #

unsafeRangeSize :: (CInt, CInt) -> Int #

Num CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(+) :: CInt -> CInt -> CInt #

(-) :: CInt -> CInt -> CInt #

(*) :: CInt -> CInt -> CInt #

negate :: CInt -> CInt #

abs :: CInt -> CInt #

signum :: CInt -> CInt #

fromInteger :: Integer -> CInt #

Read CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

quot :: CInt -> CInt -> CInt #

rem :: CInt -> CInt -> CInt #

div :: CInt -> CInt -> CInt #

mod :: CInt -> CInt -> CInt #

quotRem :: CInt -> CInt -> (CInt, CInt) #

divMod :: CInt -> CInt -> (CInt, CInt) #

toInteger :: CInt -> Integer #

Real CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

toRational :: CInt -> Rational #

Show CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CInt -> ShowS #

show :: CInt -> String #

showList :: [CInt] -> ShowS #

Eq CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CInt -> CInt -> Bool #

(/=) :: CInt -> CInt -> Bool #

Ord CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

compare :: CInt -> CInt -> Ordering #

(<) :: CInt -> CInt -> Bool #

(<=) :: CInt -> CInt -> Bool #

(>) :: CInt -> CInt -> Bool #

(>=) :: CInt -> CInt -> Bool #

max :: CInt -> CInt -> CInt #

min :: CInt -> CInt -> CInt #

type Difference CInt # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CUInt #

Haskell type representing the C unsigned int type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CUInt Word32 

Instances

Instances details
Integral CUInt # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> CUInt #

NormalForm CUInt # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CUInt -> () #

Additive CUInt # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CUInt #

(+) :: CUInt -> CUInt -> CUInt #

scale :: IsNatural n => n -> CUInt -> CUInt #

IDivisible CUInt # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CUInt -> CUInt -> CUInt #

mod :: CUInt -> CUInt -> CUInt #

divMod :: CUInt -> CUInt -> (CUInt, CUInt) #

Multiplicative CUInt # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CUInt #

(*) :: CUInt -> CUInt -> CUInt #

(^) :: (IsNatural n, Enum n, IDivisible n) => CUInt -> n -> CUInt #

IsIntegral CUInt # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CUInt -> Integer #

IsNatural CUInt # 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: CUInt -> Natural #

Subtractive CUInt # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUInt 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: CUInt -> CUInt -> Difference CUInt #

Bits CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

sizeOf :: CUInt -> Int #

alignment :: CUInt -> Int #

peekElemOff :: Ptr CUInt -> Int -> IO CUInt #

pokeElemOff :: Ptr CUInt -> Int -> CUInt -> IO () #

peekByteOff :: Ptr b -> Int -> IO CUInt #

pokeByteOff :: Ptr b -> Int -> CUInt -> IO () #

peek :: Ptr CUInt -> IO CUInt #

poke :: Ptr CUInt -> CUInt -> IO () #

Ix CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

toRational :: CUInt -> Rational #

Show CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CUInt -> ShowS #

show :: CUInt -> String #

showList :: [CUInt] -> ShowS #

Eq CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CUInt -> CUInt -> Bool #

(/=) :: CUInt -> CUInt -> Bool #

Ord CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

compare :: CUInt -> CUInt -> Ordering #

(<) :: CUInt -> CUInt -> Bool #

(<=) :: CUInt -> CUInt -> Bool #

(>) :: CUInt -> CUInt -> Bool #

(>=) :: CUInt -> CUInt -> Bool #

max :: CUInt -> CUInt -> CUInt #

min :: CUInt -> CUInt -> CUInt #

type Difference CUInt # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CLong #

Haskell type representing the C long type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CLong Int64 

Instances

Instances details
HasNegation CLong # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CLong -> CLong #

Integral CLong # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> CLong #

NormalForm CLong # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CLong -> () #

Additive CLong # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CLong #

(+) :: CLong -> CLong -> CLong #

scale :: IsNatural n => n -> CLong -> CLong #

IDivisible CLong # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CLong -> CLong -> CLong #

mod :: CLong -> CLong -> CLong #

divMod :: CLong -> CLong -> (CLong, CLong) #

Multiplicative CLong # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CLong #

(*) :: CLong -> CLong -> CLong #

(^) :: (IsNatural n, Enum n, IDivisible n) => CLong -> n -> CLong #

IsIntegral CLong # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CLong -> Integer #

Subtractive CLong # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CLong 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: CLong -> CLong -> Difference CLong #

Bits CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

sizeOf :: CLong -> Int #

alignment :: CLong -> Int #

peekElemOff :: Ptr CLong -> Int -> IO CLong #

pokeElemOff :: Ptr CLong -> Int -> CLong -> IO () #

peekByteOff :: Ptr b -> Int -> IO CLong #

pokeByteOff :: Ptr b -> Int -> CLong -> IO () #

peek :: Ptr CLong -> IO CLong #

poke :: Ptr CLong -> CLong -> IO () #

Ix CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

toRational :: CLong -> Rational #

Show CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CLong -> ShowS #

show :: CLong -> String #

showList :: [CLong] -> ShowS #

Eq CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CLong -> CLong -> Bool #

(/=) :: CLong -> CLong -> Bool #

Ord CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

compare :: CLong -> CLong -> Ordering #

(<) :: CLong -> CLong -> Bool #

(<=) :: CLong -> CLong -> Bool #

(>) :: CLong -> CLong -> Bool #

(>=) :: CLong -> CLong -> Bool #

max :: CLong -> CLong -> CLong #

min :: CLong -> CLong -> CLong #

type Difference CLong # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CULong #

Haskell type representing the C unsigned long type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CULong Word64 

Instances

Instances details
Integral CULong # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CULong # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CULong -> () #

Additive CULong # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CULong #

(+) :: CULong -> CULong -> CULong #

scale :: IsNatural n => n -> CULong -> CULong #

IDivisible CULong # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CULong -> CULong -> CULong #

mod :: CULong -> CULong -> CULong #

divMod :: CULong -> CULong -> (CULong, CULong) #

Multiplicative CULong # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CULong #

(*) :: CULong -> CULong -> CULong #

(^) :: (IsNatural n, Enum n, IDivisible n) => CULong -> n -> CULong #

IsIntegral CULong # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CULong -> Integer #

IsNatural CULong # 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: CULong -> Natural #

Subtractive CULong # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CULong 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CULong -> CULong -> Bool #

(/=) :: CULong -> CULong -> Bool #

Ord CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CULong # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CPtrdiff #

Haskell type representing the C ptrdiff_t type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CPtrdiff Int64 

Instances

Instances details
HasNegation CPtrdiff # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CPtrdiff -> CPtrdiff #

Integral CPtrdiff # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CPtrdiff # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CPtrdiff # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CPtrdiff # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CPtrdiff # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CPtrdiff # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CPtrdiff 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ord CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CPtrdiff # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CSize #

Haskell type representing the C size_t type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CSize Word64 

Instances

Instances details
Integral CSize # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> CSize #

Additive CSize # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CSize #

(+) :: CSize -> CSize -> CSize #

scale :: IsNatural n => n -> CSize -> CSize #

IDivisible CSize # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CSize -> CSize -> CSize #

mod :: CSize -> CSize -> CSize #

divMod :: CSize -> CSize -> (CSize, CSize) #

Multiplicative CSize # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CSize #

(*) :: CSize -> CSize -> CSize #

(^) :: (IsNatural n, Enum n, IDivisible n) => CSize -> n -> CSize #

IsIntegral CSize # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CSize -> Integer #

IsNatural CSize # 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: CSize -> Natural #

Subtractive CSize # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CSize 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: CSize -> CSize -> Difference CSize #

Bits CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

sizeOf :: CSize -> Int #

alignment :: CSize -> Int #

peekElemOff :: Ptr CSize -> Int -> IO CSize #

pokeElemOff :: Ptr CSize -> Int -> CSize -> IO () #

peekByteOff :: Ptr b -> Int -> IO CSize #

pokeByteOff :: Ptr b -> Int -> CSize -> IO () #

peek :: Ptr CSize -> IO CSize #

poke :: Ptr CSize -> CSize -> IO () #

Ix CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

toRational :: CSize -> Rational #

Show CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CSize -> ShowS #

show :: CSize -> String #

showList :: [CSize] -> ShowS #

Eq CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CSize -> CSize -> Bool #

(/=) :: CSize -> CSize -> Bool #

Ord CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

compare :: CSize -> CSize -> Ordering #

(<) :: CSize -> CSize -> Bool #

(<=) :: CSize -> CSize -> Bool #

(>) :: CSize -> CSize -> Bool #

(>=) :: CSize -> CSize -> Bool #

max :: CSize -> CSize -> CSize #

min :: CSize -> CSize -> CSize #

type Difference CSize # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CWchar #

Haskell type representing the C wchar_t type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CWchar Int32 

Instances

Instances details
HasNegation CWchar # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CWchar -> CWchar #

Integral CWchar # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CWchar # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CWchar #

(+) :: CWchar -> CWchar -> CWchar #

scale :: IsNatural n => n -> CWchar -> CWchar #

IDivisible CWchar # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CWchar -> CWchar -> CWchar #

mod :: CWchar -> CWchar -> CWchar #

divMod :: CWchar -> CWchar -> (CWchar, CWchar) #

Multiplicative CWchar # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CWchar #

(*) :: CWchar -> CWchar -> CWchar #

(^) :: (IsNatural n, Enum n, IDivisible n) => CWchar -> n -> CWchar #

IsIntegral CWchar # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CWchar -> Integer #

Subtractive CWchar # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CWchar 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CWchar -> CWchar -> Bool #

(/=) :: CWchar -> CWchar -> Bool #

Ord CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CWchar # 
Instance details

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

Instances details
Integral CSigAtomic # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CSigAtomic # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CSigAtomic # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CSigAtomic # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CSigAtomic # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CSigAtomic # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CSigAtomic 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ord CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CSigAtomic # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CLLong #

Haskell type representing the C long long type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CLLong Int64 

Instances

Instances details
HasNegation CLLong # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CLLong -> CLLong #

Integral CLLong # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CLLong # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CLLong -> () #

Additive CLLong # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CLLong #

(+) :: CLLong -> CLLong -> CLLong #

scale :: IsNatural n => n -> CLLong -> CLLong #

IDivisible CLLong # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CLLong -> CLLong -> CLLong #

mod :: CLLong -> CLLong -> CLLong #

divMod :: CLLong -> CLLong -> (CLLong, CLLong) #

Multiplicative CLLong # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CLLong #

(*) :: CLLong -> CLLong -> CLLong #

(^) :: (IsNatural n, Enum n, IDivisible n) => CLLong -> n -> CLLong #

IsIntegral CLLong # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CLLong -> Integer #

Subtractive CLLong # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CLLong 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CLLong -> CLLong -> Bool #

(/=) :: CLLong -> CLLong -> Bool #

Ord CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CLLong # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CULLong #

Haskell type representing the C unsigned long long type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CULLong Word64 

Instances

Instances details
Integral CULLong # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CULLong # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CULLong -> () #

Additive CULLong # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CULLong #

(+) :: CULLong -> CULLong -> CULLong #

scale :: IsNatural n => n -> CULLong -> CULLong #

IDivisible CULLong # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CULLong # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CULLong # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CULLong -> Integer #

IsNatural CULLong # 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: CULLong -> Natural #

Subtractive CULLong # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CULLong 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CULLong -> CULLong -> Bool #

(/=) :: CULLong -> CULLong -> Bool #

Ord CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CULLong # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CBool #

Haskell type representing the C bool type. (The concrete types of Foreign.C.Types are platform-specific.)

@since base-4.10.0.0

Constructors

CBool Word8 

Instances

Instances details
Integral CBool # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> CBool #

IsIntegral CBool # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CBool -> Integer #

Subtractive CBool # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CBool 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: CBool -> CBool -> Difference CBool #

Bits CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

sizeOf :: CBool -> Int #

alignment :: CBool -> Int #

peekElemOff :: Ptr CBool -> Int -> IO CBool #

pokeElemOff :: Ptr CBool -> Int -> CBool -> IO () #

peekByteOff :: Ptr b -> Int -> IO CBool #

pokeByteOff :: Ptr b -> Int -> CBool -> IO () #

peek :: Ptr CBool -> IO CBool #

poke :: Ptr CBool -> CBool -> IO () #

Ix CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

toRational :: CBool -> Rational #

Show CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CBool -> ShowS #

show :: CBool -> String #

showList :: [CBool] -> ShowS #

Eq CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CBool -> CBool -> Bool #

(/=) :: CBool -> CBool -> Bool #

Ord CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

compare :: CBool -> CBool -> Ordering #

(<) :: CBool -> CBool -> Bool #

(<=) :: CBool -> CBool -> Bool #

(>) :: CBool -> CBool -> Bool #

(>=) :: CBool -> CBool -> Bool #

max :: CBool -> CBool -> CBool #

min :: CBool -> CBool -> CBool #

type Difference CBool # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CIntPtr #

Constructors

CIntPtr Int64 

Instances

Instances details
Integral CIntPtr # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CIntPtr # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CIntPtr #

(+) :: CIntPtr -> CIntPtr -> CIntPtr #

scale :: IsNatural n => n -> CIntPtr -> CIntPtr #

IDivisible CIntPtr # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CIntPtr # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CIntPtr # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CIntPtr -> Integer #

Subtractive CIntPtr # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CIntPtr 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CIntPtr -> CIntPtr -> Bool #

(/=) :: CIntPtr -> CIntPtr -> Bool #

Ord CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CIntPtr # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CUIntPtr #

Constructors

CUIntPtr Word64 

Instances

Instances details
Integral CUIntPtr # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CUIntPtr # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CUIntPtr # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CUIntPtr # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CUIntPtr # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CUIntPtr # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CUIntPtr # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUIntPtr 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ord CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CUIntPtr # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CIntMax #

Constructors

CIntMax Int64 

Instances

Instances details
HasNegation CIntMax # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CIntMax -> CIntMax #

Integral CIntMax # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CIntMax # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CIntMax #

(+) :: CIntMax -> CIntMax -> CIntMax #

scale :: IsNatural n => n -> CIntMax -> CIntMax #

IDivisible CIntMax # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CIntMax # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CIntMax # 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: CIntMax -> Integer #

Subtractive CIntMax # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CIntMax 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CIntMax -> CIntMax -> Bool #

(/=) :: CIntMax -> CIntMax -> Bool #

Ord CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CIntMax # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CUIntMax #

Constructors

CUIntMax Word64 

Instances

Instances details
Integral CUIntMax # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CUIntMax # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CUIntMax # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CUIntMax # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CUIntMax # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CUIntMax # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CUIntMax # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUIntMax 
Instance details

Defined in Basement.Numerical.Subtractive

Bits CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

FiniteBits CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Bounded CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ix CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Integral CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ord CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CUIntMax # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CClock #

Haskell type representing the C clock_t type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CClock Word32 

Instances

Instances details
Integral CClock # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CClock # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CClock #

(+) :: CClock -> CClock -> CClock #

scale :: IsNatural n => n -> CClock -> CClock #

Multiplicative CClock # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CClock #

(*) :: CClock -> CClock -> CClock #

(^) :: (IsNatural n, Enum n, IDivisible n) => CClock -> n -> CClock #

Subtractive CClock # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CClock 
Instance details

Defined in Basement.Numerical.Subtractive

Enum CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CClock -> CClock -> Bool #

(/=) :: CClock -> CClock -> Bool #

Ord CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CClock # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CTime #

Haskell type representing the C time_t type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CTime Int64 

Instances

Instances details
Integral CTime # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> CTime #

Additive CTime # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CTime #

(+) :: CTime -> CTime -> CTime #

scale :: IsNatural n => n -> CTime -> CTime #

Multiplicative CTime # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CTime #

(*) :: CTime -> CTime -> CTime #

(^) :: (IsNatural n, Enum n, IDivisible n) => CTime -> n -> CTime #

Subtractive CTime # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CTime 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: CTime -> CTime -> Difference CTime #

Enum CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

sizeOf :: CTime -> Int #

alignment :: CTime -> Int #

peekElemOff :: Ptr CTime -> Int -> IO CTime #

pokeElemOff :: Ptr CTime -> Int -> CTime -> IO () #

peekByteOff :: Ptr b -> Int -> IO CTime #

pokeByteOff :: Ptr b -> Int -> CTime -> IO () #

peek :: Ptr CTime -> IO CTime #

poke :: Ptr CTime -> CTime -> IO () #

Num CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

toRational :: CTime -> Rational #

Show CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CTime -> ShowS #

show :: CTime -> String #

showList :: [CTime] -> ShowS #

Eq CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CTime -> CTime -> Bool #

(/=) :: CTime -> CTime -> Bool #

Ord CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

compare :: CTime -> CTime -> Ordering #

(<) :: CTime -> CTime -> Bool #

(<=) :: CTime -> CTime -> Bool #

(>) :: CTime -> CTime -> Bool #

(>=) :: CTime -> CTime -> Bool #

max :: CTime -> CTime -> CTime #

min :: CTime -> CTime -> CTime #

type Difference CTime # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CUSeconds #

Haskell type representing the C useconds_t type. (The concrete types of Foreign.C.Types are platform-specific.)

@since base-4.4.0.0

Constructors

CUSeconds Word32 

Instances

Instances details
Integral CUSeconds # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CUSeconds # 
Instance details

Defined in Basement.Numerical.Additive

Multiplicative CUSeconds # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CUSeconds # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUSeconds 
Instance details

Defined in Basement.Numerical.Subtractive

Enum CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ord CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CUSeconds # 
Instance details

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

Instances details
Integral CSUSeconds # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CSUSeconds # 
Instance details

Defined in Basement.Numerical.Additive

Multiplicative CSUSeconds # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CSUSeconds # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CSUSeconds 
Instance details

Defined in Basement.Numerical.Subtractive

Enum CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Ord CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CSUSeconds # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CFloat #

Haskell type representing the C float type. (The concrete types of Foreign.C.Types are platform-specific.)

Constructors

CFloat Float 

Instances

Instances details
Fractional CFloat # 
Instance details

Defined in Basement.Compat.NumLiteral

HasNegation CFloat # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CFloat -> CFloat #

Integral CFloat # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CFloat # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CFloat -> () #

Additive CFloat # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CFloat #

(+) :: CFloat -> CFloat -> CFloat #

scale :: IsNatural n => n -> CFloat -> CFloat #

Divisible CFloat # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

(/) :: CFloat -> CFloat -> CFloat #

Multiplicative CFloat # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CFloat #

(*) :: CFloat -> CFloat -> CFloat #

(^) :: (IsNatural n, Enum n, IDivisible n) => CFloat -> n -> CFloat #

Subtractive CFloat # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CFloat 
Instance details

Defined in Basement.Numerical.Subtractive

Enum CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Floating CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

RealFloat CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Fractional CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

RealFrac CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

properFraction :: Integral b => CFloat -> (b, CFloat) #

truncate :: Integral b => CFloat -> b #

round :: Integral b => CFloat -> b #

ceiling :: Integral b => CFloat -> b #

floor :: Integral b => CFloat -> b #

Show CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CFloat -> CFloat -> Bool #

(/=) :: CFloat -> CFloat -> Bool #

Ord CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CFloat # 
Instance details

Defined in Basement.Numerical.Subtractive

data CDouble #

Haskell type representing the C double type. (The concrete types of Foreign.C.Types are platform-specific.)

Instances

Instances details
Fractional CDouble # 
Instance details

Defined in Basement.Compat.NumLiteral

HasNegation CDouble # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CDouble -> CDouble #

Integral CDouble # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CDouble # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CDouble -> () #

Additive CDouble # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CDouble #

(+) :: CDouble -> CDouble -> CDouble #

scale :: IsNatural n => n -> CDouble -> CDouble #

Divisible CDouble # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

(/) :: CDouble -> CDouble -> CDouble #

Multiplicative CDouble # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CDouble # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CDouble 
Instance details

Defined in Basement.Numerical.Subtractive

Enum CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Floating CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

RealFloat CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Storable CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Fractional CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Real CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

RealFrac CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

properFraction :: Integral b => CDouble -> (b, CDouble) #

truncate :: Integral b => CDouble -> b #

round :: Integral b => CDouble -> b #

ceiling :: Integral b => CDouble -> b #

floor :: Integral b => CDouble -> b #

Show CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CDouble -> CDouble -> Bool #

(/=) :: CDouble -> CDouble -> Bool #

Ord CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

type Difference CDouble # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype COff #

Constructors

COff Int64 

Instances

Instances details
Integral COff # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> COff #

Additive COff # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: COff #

(+) :: COff -> COff -> COff #

scale :: IsNatural n => n -> COff -> COff #

Multiplicative COff # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: COff #

(*) :: COff -> COff -> COff #

(^) :: (IsNatural n, Enum n, IDivisible n) => COff -> n -> COff #

Subtractive COff # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference COff 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: COff -> COff -> Difference COff #

Bits COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

FiniteBits COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Bounded COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: COff -> COff #

pred :: COff -> COff #

toEnum :: Int -> COff #

fromEnum :: COff -> Int #

enumFrom :: COff -> [COff] #

enumFromThen :: COff -> COff -> [COff] #

enumFromTo :: COff -> COff -> [COff] #

enumFromThenTo :: COff -> COff -> COff -> [COff] #

Storable COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

sizeOf :: COff -> Int #

alignment :: COff -> Int #

peekElemOff :: Ptr COff -> Int -> IO COff #

pokeElemOff :: Ptr COff -> Int -> COff -> IO () #

peekByteOff :: Ptr b -> Int -> IO COff #

pokeByteOff :: Ptr b -> Int -> COff -> IO () #

peek :: Ptr COff -> IO COff #

poke :: Ptr COff -> COff -> IO () #

Ix COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

range :: (COff, COff) -> [COff] #

index :: (COff, COff) -> COff -> Int #

unsafeIndex :: (COff, COff) -> COff -> Int #

inRange :: (COff, COff) -> COff -> Bool #

rangeSize :: (COff, COff) -> Int #

unsafeRangeSize :: (COff, COff) -> Int #

Num COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: COff -> COff -> COff #

(-) :: COff -> COff -> COff #

(*) :: COff -> COff -> COff #

negate :: COff -> COff #

abs :: COff -> COff #

signum :: COff -> COff #

fromInteger :: Integer -> COff #

Read COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Integral COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

quot :: COff -> COff -> COff #

rem :: COff -> COff -> COff #

div :: COff -> COff -> COff #

mod :: COff -> COff -> COff #

quotRem :: COff -> COff -> (COff, COff) #

divMod :: COff -> COff -> (COff, COff) #

toInteger :: COff -> Integer #

Real COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

toRational :: COff -> Rational #

Show COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> COff -> ShowS #

show :: COff -> String #

showList :: [COff] -> ShowS #

Eq COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: COff -> COff -> Bool #

(/=) :: COff -> COff -> Bool #

Ord COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

compare :: COff -> COff -> Ordering #

(<) :: COff -> COff -> Bool #

(<=) :: COff -> COff -> Bool #

(>) :: COff -> COff -> Bool #

(>=) :: COff -> COff -> Bool #

max :: COff -> COff -> COff #

min :: COff -> COff -> COff #

type Difference COff # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CMode #

Constructors

CMode Word32 

Instances

Instances details
Bits CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

FiniteBits CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Bounded CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Storable CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

sizeOf :: CMode -> Int #

alignment :: CMode -> Int #

peekElemOff :: Ptr CMode -> Int -> IO CMode #

pokeElemOff :: Ptr CMode -> Int -> CMode -> IO () #

peekByteOff :: Ptr b -> Int -> IO CMode #

pokeByteOff :: Ptr b -> Int -> CMode -> IO () #

peek :: Ptr CMode -> IO CMode #

poke :: Ptr CMode -> CMode -> IO () #

Ix CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Integral CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Real CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

toRational :: CMode -> Rational #

Show CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CMode -> ShowS #

show :: CMode -> String #

showList :: [CMode] -> ShowS #

Eq CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CMode -> CMode -> Bool #

(/=) :: CMode -> CMode -> Bool #

Ord CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

compare :: CMode -> CMode -> Ordering #

(<) :: CMode -> CMode -> Bool #

(<=) :: CMode -> CMode -> Bool #

(>) :: CMode -> CMode -> Bool #

(>=) :: CMode -> CMode -> Bool #

max :: CMode -> CMode -> CMode #

min :: CMode -> CMode -> CMode #