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
Storable CChar 
Instance details

Defined in 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 () #

Bits CChar 
Instance details

Defined in Foreign.C.Types

FiniteBits CChar 
Instance details

Defined in Foreign.C.Types

Bounded CChar 
Instance details

Defined in Foreign.C.Types

Enum CChar 
Instance details

Defined in Foreign.C.Types

Ix CChar 
Instance details

Defined in Foreign.C.Types

Num CChar 
Instance details

Defined in Foreign.C.Types

Read CChar 
Instance details

Defined in Foreign.C.Types

Integral CChar 
Instance details

Defined in Foreign.C.Types

Real CChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CChar -> Rational #

Show CChar 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CChar -> ShowS #

show :: CChar -> String #

showList :: [CChar] -> ShowS #

HasNegation CChar Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CChar -> CChar Source #

Integral CChar Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CChar Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CChar -> () Source #

Additive CChar Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CChar Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CChar Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CChar Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CChar Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CChar Source #

PrimMemoryComparable CChar Source # 
Instance details

Defined in Basement.PrimType

PrimType CChar Source # 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize CChar :: Nat Source #

Eq CChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CChar 
Instance details

Defined in 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 Source # 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize CChar Source # 
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
Storable CSChar 
Instance details

Defined in Foreign.C.Types

Bits CSChar 
Instance details

Defined in Foreign.C.Types

FiniteBits CSChar 
Instance details

Defined in Foreign.C.Types

Bounded CSChar 
Instance details

Defined in Foreign.C.Types

Enum CSChar 
Instance details

Defined in Foreign.C.Types

Ix CSChar 
Instance details

Defined in Foreign.C.Types

Num CSChar 
Instance details

Defined in Foreign.C.Types

Read CSChar 
Instance details

Defined in Foreign.C.Types

Integral CSChar 
Instance details

Defined in Foreign.C.Types

Real CSChar 
Instance details

Defined in Foreign.C.Types

Show CSChar 
Instance details

Defined in Foreign.C.Types

HasNegation CSChar Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CSChar -> CSChar Source #

Integral CSChar Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CSChar Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CSChar -> () Source #

Additive CSChar Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CSChar Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CSChar Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CSChar Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CSChar Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CSChar Source #

Eq CSChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CSChar 
Instance details

Defined in Foreign.C.Types

type Difference CSChar Source # 
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
Storable CUChar 
Instance details

Defined in Foreign.C.Types

Bits CUChar 
Instance details

Defined in Foreign.C.Types

FiniteBits CUChar 
Instance details

Defined in Foreign.C.Types

Bounded CUChar 
Instance details

Defined in Foreign.C.Types

Enum CUChar 
Instance details

Defined in Foreign.C.Types

Ix CUChar 
Instance details

Defined in Foreign.C.Types

Num CUChar 
Instance details

Defined in Foreign.C.Types

Read CUChar 
Instance details

Defined in Foreign.C.Types

Integral CUChar 
Instance details

Defined in Foreign.C.Types

Real CUChar 
Instance details

Defined in Foreign.C.Types

Show CUChar 
Instance details

Defined in Foreign.C.Types

Integral CUChar Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CUChar Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CUChar -> () Source #

Additive CUChar Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CUChar Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CUChar Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CUChar Source # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CUChar Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CUChar Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUChar Source #

PrimMemoryComparable CUChar Source # 
Instance details

Defined in Basement.PrimType

PrimType CUChar Source # 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize CUChar :: Nat Source #

Eq CUChar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CUChar 
Instance details

Defined in Foreign.C.Types

type Difference CUChar Source # 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize CUChar Source # 
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
Storable CShort 
Instance details

Defined in Foreign.C.Types

Bits CShort 
Instance details

Defined in Foreign.C.Types

FiniteBits CShort 
Instance details

Defined in Foreign.C.Types

Bounded CShort 
Instance details

Defined in Foreign.C.Types

Enum CShort 
Instance details

Defined in Foreign.C.Types

Ix CShort 
Instance details

Defined in Foreign.C.Types

Num CShort 
Instance details

Defined in Foreign.C.Types

Read CShort 
Instance details

Defined in Foreign.C.Types

Integral CShort 
Instance details

Defined in Foreign.C.Types

Real CShort 
Instance details

Defined in Foreign.C.Types

Show CShort 
Instance details

Defined in Foreign.C.Types

HasNegation CShort Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CShort -> CShort Source #

Integral CShort Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CShort Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CShort -> () Source #

Additive CShort Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CShort Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CShort Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CShort Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CShort Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CShort Source #

Eq CShort 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CShort 
Instance details

Defined in Foreign.C.Types

type Difference CShort Source # 
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
Storable CUShort 
Instance details

Defined in Foreign.C.Types

Bits CUShort 
Instance details

Defined in Foreign.C.Types

FiniteBits CUShort 
Instance details

Defined in Foreign.C.Types

Bounded CUShort 
Instance details

Defined in Foreign.C.Types

Enum CUShort 
Instance details

Defined in Foreign.C.Types

Ix CUShort 
Instance details

Defined in Foreign.C.Types

Num CUShort 
Instance details

Defined in Foreign.C.Types

Read CUShort 
Instance details

Defined in Foreign.C.Types

Integral CUShort 
Instance details

Defined in Foreign.C.Types

Real CUShort 
Instance details

Defined in Foreign.C.Types

Show CUShort 
Instance details

Defined in Foreign.C.Types

Integral CUShort Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CUShort Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CUShort -> () Source #

Additive CUShort Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CUShort Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CUShort Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CUShort Source # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CUShort Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CUShort Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUShort Source #

Eq CUShort 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CUShort 
Instance details

Defined in Foreign.C.Types

type Difference CUShort Source # 
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
Storable CInt 
Instance details

Defined in 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 () #

Bits CInt 
Instance details

Defined in Foreign.C.Types

FiniteBits CInt 
Instance details

Defined in Foreign.C.Types

Bounded CInt 
Instance details

Defined in Foreign.C.Types

Enum CInt 
Instance details

Defined in 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] #

Ix CInt 
Instance details

Defined in 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 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 Foreign.C.Types

Integral CInt 
Instance details

Defined in 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 Foreign.C.Types

Methods

toRational :: CInt -> Rational #

Show CInt 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CInt -> ShowS #

show :: CInt -> String #

showList :: [CInt] -> ShowS #

HasNegation CInt Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CInt -> CInt Source #

Integral CInt Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CInt Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CInt -> () Source #

Additive CInt Source # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: CInt Source #

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

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

IDivisible CInt Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: CInt -> CInt -> CInt Source #

mod :: CInt -> CInt -> CInt Source #

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

Multiplicative CInt Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: CInt Source #

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

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

IsIntegral CInt Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CInt Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CInt Source #

Methods

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

Eq CInt 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CInt 
Instance details

Defined in 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 Source # 
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
Storable CUInt 
Instance details

Defined in 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 () #

Bits CUInt 
Instance details

Defined in Foreign.C.Types

FiniteBits CUInt 
Instance details

Defined in Foreign.C.Types

Bounded CUInt 
Instance details

Defined in Foreign.C.Types

Enum CUInt 
Instance details

Defined in Foreign.C.Types

Ix CUInt 
Instance details

Defined in Foreign.C.Types

Num CUInt 
Instance details

Defined in Foreign.C.Types

Read CUInt 
Instance details

Defined in Foreign.C.Types

Integral CUInt 
Instance details

Defined in Foreign.C.Types

Real CUInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUInt -> Rational #

Show CUInt 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUInt -> ShowS #

show :: CUInt -> String #

showList :: [CUInt] -> ShowS #

Integral CUInt Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CUInt Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CUInt -> () Source #

Additive CUInt Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CUInt Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CUInt Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CUInt Source # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CUInt Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CUInt Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUInt Source #

Eq CUInt 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CUInt 
Instance details

Defined in 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 Source # 
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
Storable CLong 
Instance details

Defined in 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 () #

Bits CLong 
Instance details

Defined in Foreign.C.Types

FiniteBits CLong 
Instance details

Defined in Foreign.C.Types

Bounded CLong 
Instance details

Defined in Foreign.C.Types

Enum CLong 
Instance details

Defined in Foreign.C.Types

Ix CLong 
Instance details

Defined in Foreign.C.Types

Num CLong 
Instance details

Defined in Foreign.C.Types

Read CLong 
Instance details

Defined in Foreign.C.Types

Integral CLong 
Instance details

Defined in Foreign.C.Types

Real CLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CLong -> Rational #

Show CLong 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CLong -> ShowS #

show :: CLong -> String #

showList :: [CLong] -> ShowS #

HasNegation CLong Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CLong -> CLong Source #

Integral CLong Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CLong Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CLong -> () Source #

Additive CLong Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CLong Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CLong Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CLong Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CLong Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CLong Source #

Eq CLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CLong 
Instance details

Defined in 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 Source # 
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
Storable CULong 
Instance details

Defined in Foreign.C.Types

Bits CULong 
Instance details

Defined in Foreign.C.Types

FiniteBits CULong 
Instance details

Defined in Foreign.C.Types

Bounded CULong 
Instance details

Defined in Foreign.C.Types

Enum CULong 
Instance details

Defined in Foreign.C.Types

Ix CULong 
Instance details

Defined in Foreign.C.Types

Num CULong 
Instance details

Defined in Foreign.C.Types

Read CULong 
Instance details

Defined in Foreign.C.Types

Integral CULong 
Instance details

Defined in Foreign.C.Types

Real CULong 
Instance details

Defined in Foreign.C.Types

Show CULong 
Instance details

Defined in Foreign.C.Types

Integral CULong Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CULong Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CULong -> () Source #

Additive CULong Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CULong Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CULong Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CULong Source # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CULong Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CULong Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CULong Source #

Eq CULong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CULong 
Instance details

Defined in Foreign.C.Types

type Difference CULong Source # 
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
Storable CPtrdiff 
Instance details

Defined in Foreign.C.Types

Bits CPtrdiff 
Instance details

Defined in Foreign.C.Types

FiniteBits CPtrdiff 
Instance details

Defined in Foreign.C.Types

Bounded CPtrdiff 
Instance details

Defined in Foreign.C.Types

Enum CPtrdiff 
Instance details

Defined in Foreign.C.Types

Ix CPtrdiff 
Instance details

Defined in Foreign.C.Types

Num CPtrdiff 
Instance details

Defined in Foreign.C.Types

Read CPtrdiff 
Instance details

Defined in Foreign.C.Types

Integral CPtrdiff 
Instance details

Defined in Foreign.C.Types

Real CPtrdiff 
Instance details

Defined in Foreign.C.Types

Show CPtrdiff 
Instance details

Defined in Foreign.C.Types

HasNegation CPtrdiff Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Integral CPtrdiff Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CPtrdiff Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CPtrdiff Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CPtrdiff Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CPtrdiff Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CPtrdiff Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CPtrdiff Source #

Eq CPtrdiff 
Instance details

Defined in Foreign.C.Types

Ord CPtrdiff 
Instance details

Defined in Foreign.C.Types

type Difference CPtrdiff Source # 
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
Storable CSize 
Instance details

Defined in 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 () #

Bits CSize 
Instance details

Defined in Foreign.C.Types

FiniteBits CSize 
Instance details

Defined in Foreign.C.Types

Bounded CSize 
Instance details

Defined in Foreign.C.Types

Enum CSize 
Instance details

Defined in Foreign.C.Types

Ix CSize 
Instance details

Defined in Foreign.C.Types

Num CSize 
Instance details

Defined in Foreign.C.Types

Read CSize 
Instance details

Defined in Foreign.C.Types

Integral CSize 
Instance details

Defined in Foreign.C.Types

Real CSize 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSize -> Rational #

Show CSize 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CSize -> ShowS #

show :: CSize -> String #

showList :: [CSize] -> ShowS #

Integral CSize Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CSize Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CSize Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CSize Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CSize Source # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CSize Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CSize Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CSize Source #

Eq CSize 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CSize 
Instance details

Defined in 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 Source # 
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
Storable CWchar 
Instance details

Defined in Foreign.C.Types

Bits CWchar 
Instance details

Defined in Foreign.C.Types

FiniteBits CWchar 
Instance details

Defined in Foreign.C.Types

Bounded CWchar 
Instance details

Defined in Foreign.C.Types

Enum CWchar 
Instance details

Defined in Foreign.C.Types

Ix CWchar 
Instance details

Defined in Foreign.C.Types

Num CWchar 
Instance details

Defined in Foreign.C.Types

Read CWchar 
Instance details

Defined in Foreign.C.Types

Integral CWchar 
Instance details

Defined in Foreign.C.Types

Real CWchar 
Instance details

Defined in Foreign.C.Types

Show CWchar 
Instance details

Defined in Foreign.C.Types

HasNegation CWchar Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CWchar -> CWchar Source #

Integral CWchar Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CWchar Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CWchar Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CWchar Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CWchar Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CWchar Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CWchar Source #

Eq CWchar 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CWchar 
Instance details

Defined in Foreign.C.Types

type Difference CWchar Source # 
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.)

Constructors

CSigAtomic Int32 

Instances

Instances details
Storable CSigAtomic 
Instance details

Defined in Foreign.C.Types

Bits CSigAtomic 
Instance details

Defined in Foreign.C.Types

FiniteBits CSigAtomic 
Instance details

Defined in Foreign.C.Types

Bounded CSigAtomic 
Instance details

Defined in Foreign.C.Types

Enum CSigAtomic 
Instance details

Defined in Foreign.C.Types

Ix CSigAtomic 
Instance details

Defined in Foreign.C.Types

Num CSigAtomic 
Instance details

Defined in Foreign.C.Types

Read CSigAtomic 
Instance details

Defined in Foreign.C.Types

Integral CSigAtomic 
Instance details

Defined in Foreign.C.Types

Real CSigAtomic 
Instance details

Defined in Foreign.C.Types

Show CSigAtomic 
Instance details

Defined in Foreign.C.Types

Integral CSigAtomic Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CSigAtomic Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CSigAtomic Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CSigAtomic Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CSigAtomic Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CSigAtomic Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CSigAtomic Source #

Eq CSigAtomic 
Instance details

Defined in Foreign.C.Types

Ord CSigAtomic 
Instance details

Defined in Foreign.C.Types

type Difference CSigAtomic Source # 
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
Storable CLLong 
Instance details

Defined in Foreign.C.Types

Bits CLLong 
Instance details

Defined in Foreign.C.Types

FiniteBits CLLong 
Instance details

Defined in Foreign.C.Types

Bounded CLLong 
Instance details

Defined in Foreign.C.Types

Enum CLLong 
Instance details

Defined in Foreign.C.Types

Ix CLLong 
Instance details

Defined in Foreign.C.Types

Num CLLong 
Instance details

Defined in Foreign.C.Types

Read CLLong 
Instance details

Defined in Foreign.C.Types

Integral CLLong 
Instance details

Defined in Foreign.C.Types

Real CLLong 
Instance details

Defined in Foreign.C.Types

Show CLLong 
Instance details

Defined in Foreign.C.Types

HasNegation CLLong Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CLLong -> CLLong Source #

Integral CLLong Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CLLong Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CLLong -> () Source #

Additive CLLong Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CLLong Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CLLong Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CLLong Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CLLong Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CLLong Source #

Eq CLLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CLLong 
Instance details

Defined in Foreign.C.Types

type Difference CLLong Source # 
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
Storable CULLong 
Instance details

Defined in Foreign.C.Types

Bits CULLong 
Instance details

Defined in Foreign.C.Types

FiniteBits CULLong 
Instance details

Defined in Foreign.C.Types

Bounded CULLong 
Instance details

Defined in Foreign.C.Types

Enum CULLong 
Instance details

Defined in Foreign.C.Types

Ix CULLong 
Instance details

Defined in Foreign.C.Types

Num CULLong 
Instance details

Defined in Foreign.C.Types

Read CULLong 
Instance details

Defined in Foreign.C.Types

Integral CULLong 
Instance details

Defined in Foreign.C.Types

Real CULLong 
Instance details

Defined in Foreign.C.Types

Show CULLong 
Instance details

Defined in Foreign.C.Types

Integral CULLong Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CULLong Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CULLong -> () Source #

Additive CULLong Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CULLong Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CULLong Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CULLong Source # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CULLong Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CULLong Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CULLong Source #

Eq CULLong 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CULLong 
Instance details

Defined in Foreign.C.Types

type Difference CULLong Source # 
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
Storable CBool 
Instance details

Defined in 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 () #

Bits CBool 
Instance details

Defined in Foreign.C.Types

FiniteBits CBool 
Instance details

Defined in Foreign.C.Types

Bounded CBool 
Instance details

Defined in Foreign.C.Types

Enum CBool 
Instance details

Defined in Foreign.C.Types

Ix CBool 
Instance details

Defined in Foreign.C.Types

Num CBool 
Instance details

Defined in Foreign.C.Types

Read CBool 
Instance details

Defined in Foreign.C.Types

Integral CBool 
Instance details

Defined in Foreign.C.Types

Real CBool 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CBool -> Rational #

Show CBool 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CBool -> ShowS #

show :: CBool -> String #

showList :: [CBool] -> ShowS #

Integral CBool Source # 
Instance details

Defined in Basement.Compat.NumLiteral

IsIntegral CBool Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CBool Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CBool Source #

Eq CBool 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CBool 
Instance details

Defined in 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 Source # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CIntPtr #

Constructors

CIntPtr Int64 

Instances

Instances details
Storable CIntPtr 
Instance details

Defined in Foreign.C.Types

Bits CIntPtr 
Instance details

Defined in Foreign.C.Types

FiniteBits CIntPtr 
Instance details

Defined in Foreign.C.Types

Bounded CIntPtr 
Instance details

Defined in Foreign.C.Types

Enum CIntPtr 
Instance details

Defined in Foreign.C.Types

Ix CIntPtr 
Instance details

Defined in Foreign.C.Types

Num CIntPtr 
Instance details

Defined in Foreign.C.Types

Read CIntPtr 
Instance details

Defined in Foreign.C.Types

Integral CIntPtr 
Instance details

Defined in Foreign.C.Types

Real CIntPtr 
Instance details

Defined in Foreign.C.Types

Show CIntPtr 
Instance details

Defined in Foreign.C.Types

Integral CIntPtr Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CIntPtr Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CIntPtr Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CIntPtr Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CIntPtr Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CIntPtr Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CIntPtr Source #

Eq CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CIntPtr 
Instance details

Defined in Foreign.C.Types

type Difference CIntPtr Source # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CUIntPtr #

Constructors

CUIntPtr Word64 

Instances

Instances details
Storable CUIntPtr 
Instance details

Defined in Foreign.C.Types

Bits CUIntPtr 
Instance details

Defined in Foreign.C.Types

FiniteBits CUIntPtr 
Instance details

Defined in Foreign.C.Types

Bounded CUIntPtr 
Instance details

Defined in Foreign.C.Types

Enum CUIntPtr 
Instance details

Defined in Foreign.C.Types

Ix CUIntPtr 
Instance details

Defined in Foreign.C.Types

Num CUIntPtr 
Instance details

Defined in Foreign.C.Types

Read CUIntPtr 
Instance details

Defined in Foreign.C.Types

Integral CUIntPtr 
Instance details

Defined in Foreign.C.Types

Real CUIntPtr 
Instance details

Defined in Foreign.C.Types

Show CUIntPtr 
Instance details

Defined in Foreign.C.Types

Integral CUIntPtr Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CUIntPtr Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CUIntPtr Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CUIntPtr Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CUIntPtr Source # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CUIntPtr Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CUIntPtr Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUIntPtr Source #

Eq CUIntPtr 
Instance details

Defined in Foreign.C.Types

Ord CUIntPtr 
Instance details

Defined in Foreign.C.Types

type Difference CUIntPtr Source # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CIntMax #

Constructors

CIntMax Int64 

Instances

Instances details
Storable CIntMax 
Instance details

Defined in Foreign.C.Types

Bits CIntMax 
Instance details

Defined in Foreign.C.Types

FiniteBits CIntMax 
Instance details

Defined in Foreign.C.Types

Bounded CIntMax 
Instance details

Defined in Foreign.C.Types

Enum CIntMax 
Instance details

Defined in Foreign.C.Types

Ix CIntMax 
Instance details

Defined in Foreign.C.Types

Num CIntMax 
Instance details

Defined in Foreign.C.Types

Read CIntMax 
Instance details

Defined in Foreign.C.Types

Integral CIntMax 
Instance details

Defined in Foreign.C.Types

Real CIntMax 
Instance details

Defined in Foreign.C.Types

Show CIntMax 
Instance details

Defined in Foreign.C.Types

HasNegation CIntMax Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Integral CIntMax Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CIntMax Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CIntMax Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CIntMax Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CIntMax Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CIntMax Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CIntMax Source #

Eq CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CIntMax 
Instance details

Defined in Foreign.C.Types

type Difference CIntMax Source # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CUIntMax #

Constructors

CUIntMax Word64 

Instances

Instances details
Storable CUIntMax 
Instance details

Defined in Foreign.C.Types

Bits CUIntMax 
Instance details

Defined in Foreign.C.Types

FiniteBits CUIntMax 
Instance details

Defined in Foreign.C.Types

Bounded CUIntMax 
Instance details

Defined in Foreign.C.Types

Enum CUIntMax 
Instance details

Defined in Foreign.C.Types

Ix CUIntMax 
Instance details

Defined in Foreign.C.Types

Num CUIntMax 
Instance details

Defined in Foreign.C.Types

Read CUIntMax 
Instance details

Defined in Foreign.C.Types

Integral CUIntMax 
Instance details

Defined in Foreign.C.Types

Real CUIntMax 
Instance details

Defined in Foreign.C.Types

Show CUIntMax 
Instance details

Defined in Foreign.C.Types

Integral CUIntMax Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CUIntMax Source # 
Instance details

Defined in Basement.Numerical.Additive

IDivisible CUIntMax Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative CUIntMax Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

IsIntegral CUIntMax Source # 
Instance details

Defined in Basement.Numerical.Number

IsNatural CUIntMax Source # 
Instance details

Defined in Basement.Numerical.Number

Subtractive CUIntMax Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUIntMax Source #

Eq CUIntMax 
Instance details

Defined in Foreign.C.Types

Ord CUIntMax 
Instance details

Defined in Foreign.C.Types

type Difference CUIntMax Source # 
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 Int64 

Instances

Instances details
Storable CClock 
Instance details

Defined in Foreign.C.Types

Enum CClock 
Instance details

Defined in Foreign.C.Types

Num CClock 
Instance details

Defined in Foreign.C.Types

Read CClock 
Instance details

Defined in Foreign.C.Types

Real CClock 
Instance details

Defined in Foreign.C.Types

Show CClock 
Instance details

Defined in Foreign.C.Types

Integral CClock Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CClock Source # 
Instance details

Defined in Basement.Numerical.Additive

Multiplicative CClock Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CClock Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CClock Source #

Eq CClock 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CClock 
Instance details

Defined in Foreign.C.Types

type Difference CClock Source # 
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
Storable CTime 
Instance details

Defined in 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 () #

Enum CTime 
Instance details

Defined in Foreign.C.Types

Num CTime 
Instance details

Defined in Foreign.C.Types

Read CTime 
Instance details

Defined in Foreign.C.Types

Real CTime 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CTime -> Rational #

Show CTime 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CTime -> ShowS #

show :: CTime -> String #

showList :: [CTime] -> ShowS #

Integral CTime Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CTime Source # 
Instance details

Defined in Basement.Numerical.Additive

Multiplicative CTime Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CTime Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CTime Source #

Eq CTime 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CTime 
Instance details

Defined in 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 Source # 
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
Storable CUSeconds 
Instance details

Defined in Foreign.C.Types

Enum CUSeconds 
Instance details

Defined in Foreign.C.Types

Num CUSeconds 
Instance details

Defined in Foreign.C.Types

Read CUSeconds 
Instance details

Defined in Foreign.C.Types

Real CUSeconds 
Instance details

Defined in Foreign.C.Types

Show CUSeconds 
Instance details

Defined in Foreign.C.Types

Integral CUSeconds Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CUSeconds Source # 
Instance details

Defined in Basement.Numerical.Additive

Multiplicative CUSeconds Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CUSeconds Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CUSeconds Source #

Eq CUSeconds 
Instance details

Defined in Foreign.C.Types

Ord CUSeconds 
Instance details

Defined in Foreign.C.Types

type Difference CUSeconds Source # 
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 Int64 

Instances

Instances details
Storable CSUSeconds 
Instance details

Defined in Foreign.C.Types

Enum CSUSeconds 
Instance details

Defined in Foreign.C.Types

Num CSUSeconds 
Instance details

Defined in Foreign.C.Types

Read CSUSeconds 
Instance details

Defined in Foreign.C.Types

Real CSUSeconds 
Instance details

Defined in Foreign.C.Types

Show CSUSeconds 
Instance details

Defined in Foreign.C.Types

Integral CSUSeconds Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive CSUSeconds Source # 
Instance details

Defined in Basement.Numerical.Additive

Multiplicative CSUSeconds Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CSUSeconds Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CSUSeconds Source #

Eq CSUSeconds 
Instance details

Defined in Foreign.C.Types

Ord CSUSeconds 
Instance details

Defined in Foreign.C.Types

type Difference CSUSeconds Source # 
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
Storable CFloat 
Instance details

Defined in Foreign.C.Types

Enum CFloat 
Instance details

Defined in Foreign.C.Types

Floating CFloat 
Instance details

Defined in Foreign.C.Types

RealFloat CFloat 
Instance details

Defined in Foreign.C.Types

Num CFloat 
Instance details

Defined in Foreign.C.Types

Read CFloat 
Instance details

Defined in Foreign.C.Types

Fractional CFloat 
Instance details

Defined in Foreign.C.Types

Real CFloat 
Instance details

Defined in Foreign.C.Types

RealFrac CFloat 
Instance details

Defined in 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 Foreign.C.Types

Fractional CFloat Source # 
Instance details

Defined in Basement.Compat.NumLiteral

HasNegation CFloat Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: CFloat -> CFloat Source #

Integral CFloat Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CFloat Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CFloat -> () Source #

Additive CFloat Source # 
Instance details

Defined in Basement.Numerical.Additive

Divisible CFloat Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

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

Multiplicative CFloat Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CFloat Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CFloat Source #

Eq CFloat 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CFloat 
Instance details

Defined in Foreign.C.Types

type Difference CFloat Source # 
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
Storable CDouble 
Instance details

Defined in Foreign.C.Types

Enum CDouble 
Instance details

Defined in Foreign.C.Types

Floating CDouble 
Instance details

Defined in Foreign.C.Types

RealFloat CDouble 
Instance details

Defined in Foreign.C.Types

Num CDouble 
Instance details

Defined in Foreign.C.Types

Read CDouble 
Instance details

Defined in Foreign.C.Types

Fractional CDouble 
Instance details

Defined in Foreign.C.Types

Real CDouble 
Instance details

Defined in Foreign.C.Types

RealFrac CDouble 
Instance details

Defined in 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 Foreign.C.Types

Fractional CDouble Source # 
Instance details

Defined in Basement.Compat.NumLiteral

HasNegation CDouble Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Integral CDouble Source # 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm CDouble Source # 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: CDouble -> () Source #

Additive CDouble Source # 
Instance details

Defined in Basement.Numerical.Additive

Divisible CDouble Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

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

Multiplicative CDouble Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Subtractive CDouble Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference CDouble Source #

Eq CDouble 
Instance details

Defined in Foreign.C.Types

Methods

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

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

Ord CDouble 
Instance details

Defined in Foreign.C.Types

type Difference CDouble Source # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype COff #

Constructors

COff Int64 

Instances

Instances details
Storable COff 
Instance details

Defined in 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 () #

Bits COff 
Instance details

Defined in System.Posix.Types

FiniteBits COff 
Instance details

Defined in System.Posix.Types

Bounded COff 
Instance details

Defined in System.Posix.Types

Enum COff 
Instance details

Defined in 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] #

Ix COff 
Instance details

Defined in 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 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 System.Posix.Types

Integral COff 
Instance details

Defined in 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 System.Posix.Types

Methods

toRational :: COff -> Rational #

Show COff 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> COff -> ShowS #

show :: COff -> String #

showList :: [COff] -> ShowS #

Integral COff Source # 
Instance details

Defined in Basement.Compat.NumLiteral

Additive COff Source # 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: COff Source #

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

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

Multiplicative COff Source # 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: COff Source #

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

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

Subtractive COff Source # 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference COff Source #

Methods

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

Eq COff 
Instance details

Defined in System.Posix.Types

Methods

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

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

Ord COff 
Instance details

Defined in 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 Source # 
Instance details

Defined in Basement.Numerical.Subtractive

newtype CMode #

Constructors

CMode Word32 

Instances

Instances details
Storable CMode 
Instance details

Defined in 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 () #

Bits CMode 
Instance details

Defined in System.Posix.Types

FiniteBits CMode 
Instance details

Defined in System.Posix.Types

Bounded CMode 
Instance details

Defined in System.Posix.Types

Enum CMode 
Instance details

Defined in System.Posix.Types

Ix CMode 
Instance details

Defined in System.Posix.Types

Num CMode 
Instance details

Defined in System.Posix.Types

Read CMode 
Instance details

Defined in System.Posix.Types

Integral CMode 
Instance details

Defined in System.Posix.Types

Real CMode 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CMode -> Rational #

Show CMode 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CMode -> ShowS #

show :: CMode -> String #

showList :: [CMode] -> ShowS #

Eq CMode 
Instance details

Defined in System.Posix.Types

Methods

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

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

Ord CMode 
Instance details

Defined in 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 #