ghci-8.6.5: The library supporting GHC's interactive interpreter

Safe HaskellSafe
LanguageHaskell2010

GHCi.FFI

Documentation

data FFIType Source #

Instances
Show FFIType Source # 
Instance details

Defined in GHCi.FFI

Generic FFIType Source # 
Instance details

Defined in GHCi.FFI

Associated Types

type Rep FFIType :: Type -> Type #

Methods

from :: FFIType -> Rep FFIType x #

to :: Rep FFIType x -> FFIType #

Binary FFIType Source # 
Instance details

Defined in GHCi.FFI

Methods

put :: FFIType -> Put #

get :: Get FFIType #

putList :: [FFIType] -> Put #

type Rep FFIType Source # 
Instance details

Defined in GHCi.FFI

type Rep FFIType = D1 (MetaData "FFIType" "GHCi.FFI" "ghci-8.6.5-inplace" False) (((C1 (MetaCons "FFIVoid" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FFIPointer" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FFIFloat" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "FFIDouble" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FFISInt8" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FFISInt16" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "FFISInt32" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FFISInt64" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FFIUInt8" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "FFIUInt16" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "FFIUInt32" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FFIUInt64" PrefixI False) (U1 :: Type -> Type)))))

data FFIConv Source #

Constructors

FFICCall 
FFIStdCall 
Instances
Show FFIConv Source # 
Instance details

Defined in GHCi.FFI

Generic FFIConv Source # 
Instance details

Defined in GHCi.FFI

Associated Types

type Rep FFIConv :: Type -> Type #

Methods

from :: FFIConv -> Rep FFIConv x #

to :: Rep FFIConv x -> FFIConv #

Binary FFIConv Source # 
Instance details

Defined in GHCi.FFI

Methods

put :: FFIConv -> Put #

get :: Get FFIConv #

putList :: [FFIConv] -> Put #

type Rep FFIConv Source # 
Instance details

Defined in GHCi.FFI

type Rep FFIConv = D1 (MetaData "FFIConv" "GHCi.FFI" "ghci-8.6.5-inplace" False) (C1 (MetaCons "FFICCall" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FFIStdCall" PrefixI False) (U1 :: Type -> Type))