Capnp.Gen.Capnp.Stream.New
data StreamResult Source #
Defined in Capnp.Gen.Capnp.Stream.New
Methods
numStructWords :: Word16 Source #
numStructPtrs :: Word16 Source #
Associated Types
type ListAllocHint StreamResult Source #
newList :: RWCtx m s => ListAllocHint StreamResult -> Message ('Mut s) -> m (Raw ('Mut s) (List StreamResult)) Source #
type AllocHint StreamResult Source #
new :: RWCtx m s => AllocHint StreamResult -> Message ('Mut s) -> m (Raw ('Mut s) StreamResult) Source #
estimateListAlloc :: Vector (Parsed StreamResult) -> AllocHint (List StreamResult) Source #
marshalInto :: RWCtx m s => Raw ('Mut s) StreamResult -> Parsed StreamResult -> m () Source #
estimateAlloc :: Parsed StreamResult -> AllocHint StreamResult Source #
parse :: ReadCtx m 'Const => Raw 'Const StreamResult -> m (Parsed StreamResult) Source #
encode :: RWCtx m s => Message ('Mut s) -> Parsed StreamResult -> m (Raw ('Mut s) StreamResult) Source #
(==) :: Parsed StreamResult -> Parsed StreamResult -> Bool #
(/=) :: Parsed StreamResult -> Parsed StreamResult -> Bool #
showsPrec :: Int -> Parsed StreamResult -> ShowS #
show :: Parsed StreamResult -> String #
showList :: [Parsed StreamResult] -> ShowS #
type Rep (Parsed StreamResult) :: Type -> Type #
from :: Parsed StreamResult -> Rep (Parsed StreamResult) x #
to :: Rep (Parsed StreamResult) x -> Parsed StreamResult #