capnp-0.7.0.0: Cap'n Proto for Haskell

Safe HaskellNone
LanguageHaskell2010

Capnp.Gen.Capnp.Stream

Documentation

newtype StreamResult msg Source #

Constructors

StreamResult'newtype_ (Struct msg) 
Instances
TraverseMsg StreamResult Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> StreamResult msgA -> m (StreamResult msgB) Source #

ToStruct msg (StreamResult msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Methods

toStruct :: StreamResult msg -> Struct msg Source #

FromStruct msg (StreamResult msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (StreamResult msg) Source #

ToPtr s (StreamResult (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Methods

toPtr :: WriteCtx m s => MutMsg s -> StreamResult (MutMsg s) -> m (Maybe (Ptr (MutMsg s))) Source #

FromPtr msg (StreamResult msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (StreamResult msg) Source #

Allocate s (StreamResult (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Methods

new :: WriteCtx m s => MutMsg s -> m (StreamResult (MutMsg s)) Source #

MutListElem s (StreamResult (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Methods

setIndex :: RWCtx m s => StreamResult (MutMsg s) -> Int -> List (MutMsg s) (StreamResult (MutMsg s)) -> m () Source #

newList :: WriteCtx m s => MutMsg s -> Int -> m (List (MutMsg s) (StreamResult (MutMsg s))) Source #

ListElem msg (StreamResult msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Associated Types

data List msg (StreamResult msg) :: Type Source #

Methods

listFromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (List msg (StreamResult msg)) Source #

toUntypedList :: List msg (StreamResult msg) -> List msg Source #

length :: List msg (StreamResult msg) -> Int Source #

index :: ReadCtx m msg => Int -> List msg (StreamResult msg) -> m (StreamResult msg) Source #

MessageDefault (StreamResult msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

HasMessage (StreamResult msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

Associated Types

type InMessage (StreamResult msg) :: Type Source #

newtype List msg (StreamResult msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

newtype List msg (StreamResult msg) = StreamResult'List_ (ListOf msg (Struct msg))
type InMessage (StreamResult msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Stream

type InMessage (StreamResult msg) = msg