rustls-0.0.1.0: TLS bindings for Rustls
Safe HaskellNone
LanguageHaskell2010

Rustls.Internal.FFI

Description

Internal module, not subject to PVP.

Synopsis

Documentation

newtype ConstPtr a Source #

Constructors

ConstPtr 

Fields

Instances

Instances details
Storable (ConstPtr a) Source # 
Instance details

Defined in Rustls.Internal.FFI

Methods

sizeOf :: ConstPtr a -> Int #

alignment :: ConstPtr a -> Int #

peekElemOff :: Ptr (ConstPtr a) -> Int -> IO (ConstPtr a) #

pokeElemOff :: Ptr (ConstPtr a) -> Int -> ConstPtr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (ConstPtr a) #

pokeByteOff :: Ptr b -> Int -> ConstPtr a -> IO () #

peek :: Ptr (ConstPtr a) -> IO (ConstPtr a) #

poke :: Ptr (ConstPtr a) -> ConstPtr a -> IO () #

Show (ConstPtr a) Source # 
Instance details

Defined in Rustls.Internal.FFI

Methods

showsPrec :: Int -> ConstPtr a -> ShowS #

show :: ConstPtr a -> String #

showList :: [ConstPtr a] -> ShowS #

Eq (ConstPtr a) Source # 
Instance details

Defined in Rustls.Internal.FFI

Methods

(==) :: ConstPtr a -> ConstPtr a -> Bool #

(/=) :: ConstPtr a -> ConstPtr a -> Bool #

Client

Config

Connection

Server

Config

Certificate stuff

Connection

Read/write

Read

Write

Misc

Logging

data LogParams Source #

Instances

Instances details
Generic LogParams Source # 
Instance details

Defined in Rustls.Internal.FFI

Associated Types

type Rep LogParams :: Type -> Type #

GStorable LogParams Source # 
Instance details

Defined in Rustls.Internal.FFI

type Rep LogParams Source # 
Instance details

Defined in Rustls.Internal.FFI

type Rep LogParams = D1 ('MetaData "LogParams" "Rustls.Internal.FFI" "rustls-0.0.1.0-inplace" 'False) (C1 ('MetaCons "LogParams" 'PrefixI 'True) (S1 ('MetaSel ('Just "rustlsLogParamsLevel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 LogLevel) :*: S1 ('MetaSel ('Just "rustlsLogParamsMessage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Str)))

newtype LogLevel Source #

Constructors

LogLevel CSize 

Instances

Instances details
Storable LogLevel Source # 
Instance details

Defined in Rustls.Internal.FFI

Show LogLevel Source # 
Instance details

Defined in Rustls.Internal.FFI

Eq LogLevel Source # 
Instance details

Defined in Rustls.Internal.FFI

Misc

data Str Source #

Constructors

Str CString CSize 

Instances

Instances details
Generic Str Source # 
Instance details

Defined in Rustls.Internal.FFI

Associated Types

type Rep Str :: Type -> Type #

Methods

from :: Str -> Rep Str x #

to :: Rep Str x -> Str #

GStorable Str Source # 
Instance details

Defined in Rustls.Internal.FFI

Methods

gsizeOf :: Str -> Int #

galignment :: Str -> Int #

gpeekByteOff :: Ptr b -> Int -> IO Str #

gpokeByteOff :: Ptr b -> Int -> Str -> IO () #

type Rep Str Source # 
Instance details

Defined in Rustls.Internal.FFI

data SliceBytes Source #

Constructors

SliceBytes (Ptr Word8) CSize 

Instances

Instances details
Generic SliceBytes Source # 
Instance details

Defined in Rustls.Internal.FFI

Associated Types

type Rep SliceBytes :: Type -> Type #

GStorable SliceBytes Source # 
Instance details

Defined in Rustls.Internal.FFI

type Rep SliceBytes Source # 
Instance details

Defined in Rustls.Internal.FFI

data Userdata Source #

(Unused) userdata.

Result

newtype Result Source #

Constructors

Result Word32 

Instances

Instances details
Show Result Source # 
Instance details

Defined in Rustls.Internal.FFI

Eq Result Source # 
Instance details

Defined in Rustls.Internal.FFI

Methods

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

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

Ord Result Source # 
Instance details

Defined in Rustls.Internal.FFI

Some values

IOResult

newtype IOResult Source #

Constructors

IOResult CInt 

Instances

Instances details
Eq IOResult Source # 
Instance details

Defined in Rustls.Internal.FFI

TLS params

newtype TLSVersion Source #

A TLS protocol version supported by Rustls.

Constructors

TLSVersion 

Fields

Root cert store