| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Capnp.Capnp.RpcTwoparty
Description
This module is the generated code for capnp/rpc-twoparty.capnp, for the low-level api.
Documentation
newtype JoinKeyPart msg Source #
Constructors
| JoinKeyPart_newtype_ (Struct msg) |
Instances
get_JoinKeyPart'joinId :: ReadCtx m msg => JoinKeyPart msg -> m Word32 Source #
set_JoinKeyPart'joinId :: RWCtx m s => JoinKeyPart (MutMsg s) -> Word32 -> m () Source #
get_JoinKeyPart'partCount :: ReadCtx m msg => JoinKeyPart msg -> m Word16 Source #
set_JoinKeyPart'partCount :: RWCtx m s => JoinKeyPart (MutMsg s) -> Word16 -> m () Source #
get_JoinKeyPart'partNum :: ReadCtx m msg => JoinKeyPart msg -> m Word16 Source #
set_JoinKeyPart'partNum :: RWCtx m s => JoinKeyPart (MutMsg s) -> Word16 -> m () Source #
newtype JoinResult msg Source #
Constructors
| JoinResult_newtype_ (Struct msg) |
Instances
get_JoinResult'joinId :: ReadCtx m msg => JoinResult msg -> m Word32 Source #
set_JoinResult'joinId :: RWCtx m s => JoinResult (MutMsg s) -> Word32 -> m () Source #
get_JoinResult'succeeded :: ReadCtx m msg => JoinResult msg -> m Bool Source #
set_JoinResult'succeeded :: RWCtx m s => JoinResult (MutMsg s) -> Bool -> m () Source #
get_JoinResult'cap :: ReadCtx m msg => JoinResult msg -> m (Maybe (Ptr msg)) Source #
has_JoinResult'cap :: ReadCtx m msg => JoinResult msg -> m Bool Source #
set_JoinResult'cap :: RWCtx m s => JoinResult (MutMsg s) -> Maybe (Ptr (MutMsg s)) -> m () Source #
newtype ProvisionId msg Source #
Constructors
| ProvisionId_newtype_ (Struct msg) |
Instances
get_ProvisionId'joinId :: ReadCtx m msg => ProvisionId msg -> m Word32 Source #
set_ProvisionId'joinId :: RWCtx m s => ProvisionId (MutMsg s) -> Word32 -> m () Source #
Constructors
| Side'server | |
| Side'client | |
| Side'unknown' Word16 |
Instances
| Enum Side Source # | |
| Eq Side Source # | |
| Read Side Source # | |
| Show Side Source # | |
| Generic Side Source # | |
| IsWord Side Source # | |
| MutListElem s Side Source # | |
| ListElem msg Side Source # | |
| IsPtr msg (List msg Side) Source # | |
| type Rep Side Source # | |
Defined in Capnp.Capnp.RpcTwoparty type Rep Side = D1 (MetaData "Side" "Capnp.Capnp.RpcTwoparty" "capnp-0.3.0.0-F9H2afUCP3V65bOrDvsrWT" False) (C1 (MetaCons "Side'server" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "Side'client" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "Side'unknown'" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word16)))) | |
| data List msg Side Source # | |
Constructors
| VatId_newtype_ (Struct msg) |
Instances
| ToStruct msg (VatId msg) Source # | |
| FromStruct msg (VatId msg) Source # | |
Defined in Capnp.Capnp.RpcTwoparty | |
| IsPtr msg (VatId msg) Source # | |
| Allocate s (VatId (MutMsg s)) Source # | |
| MutListElem s (VatId (MutMsg s)) Source # | |
| ListElem msg (VatId msg) Source # | |
| IsPtr msg (List msg (VatId msg)) Source # | |
| MessageDefault (VatId msg) Source # | |
Defined in Capnp.Capnp.RpcTwoparty | |
| HasMessage (VatId msg) Source # | |
| data List msg (VatId msg) Source # | |
Defined in Capnp.Capnp.RpcTwoparty | |
| type InMessage (VatId msg) Source # | |
Defined in Capnp.Capnp.RpcTwoparty | |