capnp-0.7.0.0: Cap'n Proto for Haskell

Safe HaskellNone
LanguageHaskell2010

Capnp.Gen.Capnp.Schema

Documentation

newtype Node msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Node msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node msg -> Struct msg Source #

FromStruct msg (Node msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Node msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Node msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Node msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

messageDefault :: InMessage (Node msg) -> Node msg Source #

HasMessage (Node msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node msg) :: Type Source #

Methods

message :: Node msg -> InMessage (Node msg) Source #

newtype List msg (Node msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node msg) = msg

get_Node'id :: ReadCtx m msg => Node msg -> m Word64 Source #

set_Node'id :: RWCtx m s => Node (MutMsg s) -> Word64 -> m () Source #

get_Node'displayName :: ReadCtx m msg => Node msg -> m (Text msg) Source #

set_Node'displayName :: RWCtx m s => Node (MutMsg s) -> Text (MutMsg s) -> m () Source #

set_Node'scopeId :: RWCtx m s => Node (MutMsg s) -> Word64 -> m () Source #

get_Node'nestedNodes :: ReadCtx m msg => Node msg -> m (List msg (Node'NestedNode msg)) Source #

get_Node'annotations :: ReadCtx m msg => Node msg -> m (List msg (Annotation msg)) Source #

get_Node'parameters :: ReadCtx m msg => Node msg -> m (List msg (Node'Parameter msg)) Source #

set_Node'isGeneric :: RWCtx m s => Node (MutMsg s) -> Bool -> m () Source #

data Node' msg Source #

Instances
FromStruct msg (Node' msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

get_Node' :: ReadCtx m msg => Node msg -> m (Node' msg) Source #

set_Node'file :: RWCtx m s => Node (MutMsg s) -> m () Source #

set_Node'unknown' :: RWCtx m s => Node (MutMsg s) -> Word16 -> m () Source #

newtype Node'struct msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'struct msgA -> m (Node'struct msgB) Source #

ToStruct msg (Node'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node'struct msg -> Struct msg Source #

FromStruct msg (Node'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'struct msg) Source #

MessageDefault (Node'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'struct msg) :: Type Source #

type InMessage (Node'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'struct msg) = msg

get_Node'struct'fields :: ReadCtx m msg => Node'struct msg -> m (List msg (Field msg)) Source #

newtype Node'enum msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'enum msgA -> m (Node'enum msgB) Source #

ToStruct msg (Node'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node'enum msg -> Struct msg Source #

FromStruct msg (Node'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'enum msg) Source #

MessageDefault (Node'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'enum msg) :: Type Source #

Methods

message :: Node'enum msg -> InMessage (Node'enum msg) Source #

type InMessage (Node'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'enum msg) = msg

newtype Node'interface msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'interface msgA -> m (Node'interface msgB) Source #

ToStruct msg (Node'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node'interface msg -> Struct msg Source #

FromStruct msg (Node'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'interface msg) Source #

MessageDefault (Node'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'interface msg) :: Type Source #

type InMessage (Node'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'interface msg) = msg

newtype Node'const msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'const msgA -> m (Node'const msgB) Source #

ToStruct msg (Node'const msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node'const msg -> Struct msg Source #

FromStruct msg (Node'const msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'const msg) Source #

MessageDefault (Node'const msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'const msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'const msg) :: Type Source #

type InMessage (Node'const msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'const msg) = msg

get_Node'const'type_ :: ReadCtx m msg => Node'const msg -> m (Type msg) Source #

newtype Node'annotation msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'annotation msgA -> m (Node'annotation msgB) Source #

ToStruct msg (Node'annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node'annotation msg -> Struct msg Source #

FromStruct msg (Node'annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'annotation msg) Source #

MessageDefault (Node'annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'annotation msg) :: Type Source #

type InMessage (Node'annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'annotation msg) = msg

newtype Node'Parameter msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'Parameter msgA -> m (Node'Parameter msgB) Source #

ToStruct msg (Node'Parameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node'Parameter msg -> Struct msg Source #

FromStruct msg (Node'Parameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'Parameter msg) Source #

ToPtr s (Node'Parameter (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toPtr :: WriteCtx m s => MutMsg s -> Node'Parameter (MutMsg s) -> m (Maybe (Ptr (MutMsg s))) Source #

FromPtr msg (Node'Parameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (Node'Parameter msg) Source #

Allocate s (Node'Parameter (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

new :: WriteCtx m s => MutMsg s -> m (Node'Parameter (MutMsg s)) Source #

MutListElem s (Node'Parameter (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

setIndex :: RWCtx m s => Node'Parameter (MutMsg s) -> Int -> List (MutMsg s) (Node'Parameter (MutMsg s)) -> m () Source #

newList :: WriteCtx m s => MutMsg s -> Int -> m (List (MutMsg s) (Node'Parameter (MutMsg s))) Source #

ListElem msg (Node'Parameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg (Node'Parameter msg) :: Type Source #

Methods

listFromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (List msg (Node'Parameter msg)) Source #

toUntypedList :: List msg (Node'Parameter msg) -> List msg Source #

length :: List msg (Node'Parameter msg) -> Int Source #

index :: ReadCtx m msg => Int -> List msg (Node'Parameter msg) -> m (Node'Parameter msg) Source #

MessageDefault (Node'Parameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'Parameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'Parameter msg) :: Type Source #

newtype List msg (Node'Parameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'Parameter msg) = msg

newtype Node'NestedNode msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'NestedNode msgA -> m (Node'NestedNode msgB) Source #

ToStruct msg (Node'NestedNode msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node'NestedNode msg -> Struct msg Source #

FromStruct msg (Node'NestedNode msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'NestedNode msg) Source #

ToPtr s (Node'NestedNode (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toPtr :: WriteCtx m s => MutMsg s -> Node'NestedNode (MutMsg s) -> m (Maybe (Ptr (MutMsg s))) Source #

FromPtr msg (Node'NestedNode msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (Node'NestedNode msg) Source #

Allocate s (Node'NestedNode (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

new :: WriteCtx m s => MutMsg s -> m (Node'NestedNode (MutMsg s)) Source #

MutListElem s (Node'NestedNode (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

setIndex :: RWCtx m s => Node'NestedNode (MutMsg s) -> Int -> List (MutMsg s) (Node'NestedNode (MutMsg s)) -> m () Source #

newList :: WriteCtx m s => MutMsg s -> Int -> m (List (MutMsg s) (Node'NestedNode (MutMsg s))) Source #

ListElem msg (Node'NestedNode msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg (Node'NestedNode msg) :: Type Source #

Methods

listFromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (List msg (Node'NestedNode msg)) Source #

toUntypedList :: List msg (Node'NestedNode msg) -> List msg Source #

length :: List msg (Node'NestedNode msg) -> Int Source #

index :: ReadCtx m msg => Int -> List msg (Node'NestedNode msg) -> m (Node'NestedNode msg) Source #

MessageDefault (Node'NestedNode msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'NestedNode msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'NestedNode msg) :: Type Source #

newtype List msg (Node'NestedNode msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'NestedNode msg) = msg

newtype Node'SourceInfo msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'SourceInfo msgA -> m (Node'SourceInfo msgB) Source #

ToStruct msg (Node'SourceInfo msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Node'SourceInfo msg -> Struct msg Source #

FromStruct msg (Node'SourceInfo msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'SourceInfo msg) Source #

ToPtr s (Node'SourceInfo (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toPtr :: WriteCtx m s => MutMsg s -> Node'SourceInfo (MutMsg s) -> m (Maybe (Ptr (MutMsg s))) Source #

FromPtr msg (Node'SourceInfo msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (Node'SourceInfo msg) Source #

Allocate s (Node'SourceInfo (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

new :: WriteCtx m s => MutMsg s -> m (Node'SourceInfo (MutMsg s)) Source #

MutListElem s (Node'SourceInfo (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

setIndex :: RWCtx m s => Node'SourceInfo (MutMsg s) -> Int -> List (MutMsg s) (Node'SourceInfo (MutMsg s)) -> m () Source #

newList :: WriteCtx m s => MutMsg s -> Int -> m (List (MutMsg s) (Node'SourceInfo (MutMsg s))) Source #

ListElem msg (Node'SourceInfo msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg (Node'SourceInfo msg) :: Type Source #

Methods

listFromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (List msg (Node'SourceInfo msg)) Source #

toUntypedList :: List msg (Node'SourceInfo msg) -> List msg Source #

length :: List msg (Node'SourceInfo msg) -> Int Source #

index :: ReadCtx m msg => Int -> List msg (Node'SourceInfo msg) -> m (Node'SourceInfo msg) Source #

MessageDefault (Node'SourceInfo msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'SourceInfo msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'SourceInfo msg) :: Type Source #

newtype List msg (Node'SourceInfo msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'SourceInfo msg) = msg

newtype Node'SourceInfo'Member msg Source #

Instances
TraverseMsg Node'SourceInfo'Member Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Node'SourceInfo'Member msgA -> m (Node'SourceInfo'Member msgB) Source #

ToStruct msg (Node'SourceInfo'Member msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

FromStruct msg (Node'SourceInfo'Member msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Node'SourceInfo'Member msg) Source #

ToPtr s (Node'SourceInfo'Member (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toPtr :: WriteCtx m s => MutMsg s -> Node'SourceInfo'Member (MutMsg s) -> m (Maybe (Ptr (MutMsg s))) Source #

FromPtr msg (Node'SourceInfo'Member msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (Node'SourceInfo'Member msg) Source #

Allocate s (Node'SourceInfo'Member (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

new :: WriteCtx m s => MutMsg s -> m (Node'SourceInfo'Member (MutMsg s)) Source #

MutListElem s (Node'SourceInfo'Member (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

ListElem msg (Node'SourceInfo'Member msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg (Node'SourceInfo'Member msg) :: Type Source #

MessageDefault (Node'SourceInfo'Member msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Node'SourceInfo'Member msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Node'SourceInfo'Member msg) :: Type Source #

newtype List msg (Node'SourceInfo'Member msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Node'SourceInfo'Member msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

newtype Field msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Field msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Field msg -> Struct msg Source #

FromStruct msg (Field msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Field msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Field msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Field msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

messageDefault :: InMessage (Field msg) -> Field msg Source #

HasMessage (Field msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Field msg) :: Type Source #

Methods

message :: Field msg -> InMessage (Field msg) Source #

newtype List msg (Field msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Field msg) = msg

get_Field'name :: ReadCtx m msg => Field msg -> m (Text msg) Source #

set_Field'name :: RWCtx m s => Field (MutMsg s) -> Text (MutMsg s) -> m () Source #

has_Field'name :: ReadCtx m msg => Field msg -> m Bool Source #

new_Field'name :: RWCtx m s => Int -> Field (MutMsg s) -> m (Text (MutMsg s)) Source #

get_Field'annotations :: ReadCtx m msg => Field msg -> m (List msg (Annotation msg)) Source #

data Field' msg Source #

Instances
FromStruct msg (Field' msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

get_Field' :: ReadCtx m msg => Field msg -> m (Field' msg) Source #

newtype Field'slot msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Field'slot msgA -> m (Field'slot msgB) Source #

ToStruct msg (Field'slot msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Field'slot msg -> Struct msg Source #

FromStruct msg (Field'slot msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Field'slot msg) Source #

MessageDefault (Field'slot msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Field'slot msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Field'slot msg) :: Type Source #

type InMessage (Field'slot msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Field'slot msg) = msg

get_Field'slot'type_ :: ReadCtx m msg => Field'slot msg -> m (Type msg) Source #

newtype Field'group msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Field'group msgA -> m (Field'group msgB) Source #

ToStruct msg (Field'group msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Field'group msg -> Struct msg Source #

FromStruct msg (Field'group msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Field'group msg) Source #

MessageDefault (Field'group msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Field'group msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Field'group msg) :: Type Source #

type InMessage (Field'group msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Field'group msg) = msg

newtype Field'ordinal msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Field'ordinal msgA -> m (Field'ordinal msgB) Source #

ToStruct msg (Field'ordinal msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Field'ordinal msg -> Struct msg Source #

FromStruct msg (Field'ordinal msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Field'ordinal msg) Source #

MessageDefault (Field'ordinal msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Field'ordinal msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Field'ordinal msg) :: Type Source #

type InMessage (Field'ordinal msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Field'ordinal msg) = msg

newtype Enumerant msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Enumerant msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Enumerant msg -> Struct msg Source #

FromStruct msg (Enumerant msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Enumerant msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Enumerant msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Enumerant msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Enumerant msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Enumerant msg) :: Type Source #

Methods

message :: Enumerant msg -> InMessage (Enumerant msg) Source #

newtype List msg (Enumerant msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Enumerant msg) = msg

get_Enumerant'name :: ReadCtx m msg => Enumerant msg -> m (Text msg) Source #

newtype Superclass msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Superclass msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Superclass msg -> Struct msg Source #

FromStruct msg (Superclass msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Superclass msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Superclass msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Superclass msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Superclass msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Superclass msg) :: Type Source #

newtype List msg (Superclass msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Superclass msg) = msg

newtype Method msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Method msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Method msg -> Struct msg Source #

FromStruct msg (Method msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Method msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Method msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Method msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

messageDefault :: InMessage (Method msg) -> Method msg Source #

HasMessage (Method msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Method msg) :: Type Source #

Methods

message :: Method msg -> InMessage (Method msg) Source #

newtype List msg (Method msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Method msg) = msg

get_Method'name :: ReadCtx m msg => Method msg -> m (Text msg) Source #

set_Method'name :: RWCtx m s => Method (MutMsg s) -> Text (MutMsg s) -> m () Source #

has_Method'name :: ReadCtx m msg => Method msg -> m Bool Source #

new_Method'name :: RWCtx m s => Int -> Method (MutMsg s) -> m (Text (MutMsg s)) Source #

get_Method'annotations :: ReadCtx m msg => Method msg -> m (List msg (Annotation msg)) Source #

get_Method'paramBrand :: ReadCtx m msg => Method msg -> m (Brand msg) Source #

get_Method'resultBrand :: ReadCtx m msg => Method msg -> m (Brand msg) Source #

newtype Type msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Type msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Type msg -> Struct msg Source #

FromStruct msg (Type msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Type msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Type msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Type msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

messageDefault :: InMessage (Type msg) -> Type msg Source #

HasMessage (Type msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Type msg) :: Type Source #

Methods

message :: Type msg -> InMessage (Type msg) Source #

newtype List msg (Type msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Type msg) = msg

get_Type' :: ReadCtx m msg => Type msg -> m (Type' msg) Source #

set_Type'void :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'bool :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'int8 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'int16 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'int32 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'int64 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'uint8 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'uint16 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'uint32 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'uint64 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'float32 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'float64 :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'text :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'data_ :: RWCtx m s => Type (MutMsg s) -> m () Source #

set_Type'unknown' :: RWCtx m s => Type (MutMsg s) -> Word16 -> m () Source #

newtype Type'list msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Type'list msgA -> m (Type'list msgB) Source #

ToStruct msg (Type'list msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Type'list msg -> Struct msg Source #

FromStruct msg (Type'list msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Type'list msg) Source #

MessageDefault (Type'list msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Type'list msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Type'list msg) :: Type Source #

Methods

message :: Type'list msg -> InMessage (Type'list msg) Source #

type InMessage (Type'list msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Type'list msg) = msg

newtype Type'enum msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Type'enum msgA -> m (Type'enum msgB) Source #

ToStruct msg (Type'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Type'enum msg -> Struct msg Source #

FromStruct msg (Type'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Type'enum msg) Source #

MessageDefault (Type'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Type'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Type'enum msg) :: Type Source #

Methods

message :: Type'enum msg -> InMessage (Type'enum msg) Source #

type InMessage (Type'enum msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Type'enum msg) = msg

get_Type'enum'brand :: ReadCtx m msg => Type'enum msg -> m (Brand msg) Source #

newtype Type'struct msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Type'struct msgA -> m (Type'struct msgB) Source #

ToStruct msg (Type'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Type'struct msg -> Struct msg Source #

FromStruct msg (Type'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Type'struct msg) Source #

MessageDefault (Type'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Type'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Type'struct msg) :: Type Source #

type InMessage (Type'struct msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Type'struct msg) = msg

newtype Type'interface msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Type'interface msgA -> m (Type'interface msgB) Source #

ToStruct msg (Type'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Type'interface msg -> Struct msg Source #

FromStruct msg (Type'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Type'interface msg) Source #

MessageDefault (Type'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Type'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Type'interface msg) :: Type Source #

type InMessage (Type'interface msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Type'interface msg) = msg

newtype Type'anyPointer msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Type'anyPointer msgA -> m (Type'anyPointer msgB) Source #

ToStruct msg (Type'anyPointer msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Type'anyPointer msg -> Struct msg Source #

FromStruct msg (Type'anyPointer msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Type'anyPointer msg) Source #

MessageDefault (Type'anyPointer msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Type'anyPointer msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Type'anyPointer msg) :: Type Source #

type InMessage (Type'anyPointer msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Type'anyPointer msg) = msg

newtype Type'anyPointer'implicitMethodParameter msg Source #

Instances
TraverseMsg Type'anyPointer'implicitMethodParameter Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

ToStruct msg (Type'anyPointer'implicitMethodParameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

FromStruct msg (Type'anyPointer'implicitMethodParameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

MessageDefault (Type'anyPointer'implicitMethodParameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Type'anyPointer'implicitMethodParameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Type'anyPointer'implicitMethodParameter msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

newtype Brand msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Brand msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Brand msg -> Struct msg Source #

FromStruct msg (Brand msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Brand msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Brand msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Brand msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

messageDefault :: InMessage (Brand msg) -> Brand msg Source #

HasMessage (Brand msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Brand msg) :: Type Source #

Methods

message :: Brand msg -> InMessage (Brand msg) Source #

newtype List msg (Brand msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Brand msg) = msg

get_Brand'scopes :: ReadCtx m msg => Brand msg -> m (List msg (Brand'Scope msg)) Source #

set_Brand'scopes :: RWCtx m s => Brand (MutMsg s) -> List (MutMsg s) (Brand'Scope (MutMsg s)) -> m () Source #

has_Brand'scopes :: ReadCtx m msg => Brand msg -> m Bool Source #

newtype Brand'Scope msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Brand'Scope msgA -> m (Brand'Scope msgB) Source #

ToStruct msg (Brand'Scope msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Brand'Scope msg -> Struct msg Source #

FromStruct msg (Brand'Scope msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Brand'Scope msg) Source #

ToPtr s (Brand'Scope (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toPtr :: WriteCtx m s => MutMsg s -> Brand'Scope (MutMsg s) -> m (Maybe (Ptr (MutMsg s))) Source #

FromPtr msg (Brand'Scope msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (Brand'Scope msg) Source #

Allocate s (Brand'Scope (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

new :: WriteCtx m s => MutMsg s -> m (Brand'Scope (MutMsg s)) Source #

MutListElem s (Brand'Scope (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

setIndex :: RWCtx m s => Brand'Scope (MutMsg s) -> Int -> List (MutMsg s) (Brand'Scope (MutMsg s)) -> m () Source #

newList :: WriteCtx m s => MutMsg s -> Int -> m (List (MutMsg s) (Brand'Scope (MutMsg s))) Source #

ListElem msg (Brand'Scope msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg (Brand'Scope msg) :: Type Source #

Methods

listFromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (List msg (Brand'Scope msg)) Source #

toUntypedList :: List msg (Brand'Scope msg) -> List msg Source #

length :: List msg (Brand'Scope msg) -> Int Source #

index :: ReadCtx m msg => Int -> List msg (Brand'Scope msg) -> m (Brand'Scope msg) Source #

MessageDefault (Brand'Scope msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Brand'Scope msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Brand'Scope msg) :: Type Source #

newtype List msg (Brand'Scope msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Brand'Scope msg) = msg

data Brand'Scope' msg Source #

Instances
FromStruct msg (Brand'Scope' msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Brand'Scope' msg) Source #

newtype Brand'Binding msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

tMsg :: Applicative m => (msgA -> m msgB) -> Brand'Binding msgA -> m (Brand'Binding msgB) Source #

ToStruct msg (Brand'Binding msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Brand'Binding msg -> Struct msg Source #

FromStruct msg (Brand'Binding msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Brand'Binding msg) Source #

ToPtr s (Brand'Binding (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toPtr :: WriteCtx m s => MutMsg s -> Brand'Binding (MutMsg s) -> m (Maybe (Ptr (MutMsg s))) Source #

FromPtr msg (Brand'Binding msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (Brand'Binding msg) Source #

Allocate s (Brand'Binding (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

new :: WriteCtx m s => MutMsg s -> m (Brand'Binding (MutMsg s)) Source #

MutListElem s (Brand'Binding (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

setIndex :: RWCtx m s => Brand'Binding (MutMsg s) -> Int -> List (MutMsg s) (Brand'Binding (MutMsg s)) -> m () Source #

newList :: WriteCtx m s => MutMsg s -> Int -> m (List (MutMsg s) (Brand'Binding (MutMsg s))) Source #

ListElem msg (Brand'Binding msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg (Brand'Binding msg) :: Type Source #

Methods

listFromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (List msg (Brand'Binding msg)) Source #

toUntypedList :: List msg (Brand'Binding msg) -> List msg Source #

length :: List msg (Brand'Binding msg) -> Int Source #

index :: ReadCtx m msg => Int -> List msg (Brand'Binding msg) -> m (Brand'Binding msg) Source #

MessageDefault (Brand'Binding msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Brand'Binding msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Brand'Binding msg) :: Type Source #

newtype List msg (Brand'Binding msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Brand'Binding msg) = msg

data Brand'Binding' msg Source #

Instances
FromStruct msg (Brand'Binding' msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromStruct :: ReadCtx m msg => Struct msg -> m (Brand'Binding' msg) Source #

newtype Value msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Value msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Value msg -> Struct msg Source #

FromStruct msg (Value msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Value msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Value msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Value msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

messageDefault :: InMessage (Value msg) -> Value msg Source #

HasMessage (Value msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Value msg) :: Type Source #

Methods

message :: Value msg -> InMessage (Value msg) Source #

newtype List msg (Value msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Value msg) = msg

get_Value' :: ReadCtx m msg => Value msg -> m (Value' msg) Source #

set_Value'void :: RWCtx m s => Value (MutMsg s) -> m () Source #

set_Value'bool :: RWCtx m s => Value (MutMsg s) -> Bool -> m () Source #

set_Value'int8 :: RWCtx m s => Value (MutMsg s) -> Int8 -> m () Source #

set_Value'int16 :: RWCtx m s => Value (MutMsg s) -> Int16 -> m () Source #

set_Value'int32 :: RWCtx m s => Value (MutMsg s) -> Int32 -> m () Source #

set_Value'int64 :: RWCtx m s => Value (MutMsg s) -> Int64 -> m () Source #

set_Value'uint8 :: RWCtx m s => Value (MutMsg s) -> Word8 -> m () Source #

set_Value'uint16 :: RWCtx m s => Value (MutMsg s) -> Word16 -> m () Source #

set_Value'uint32 :: RWCtx m s => Value (MutMsg s) -> Word32 -> m () Source #

set_Value'uint64 :: RWCtx m s => Value (MutMsg s) -> Word64 -> m () Source #

set_Value'float32 :: RWCtx m s => Value (MutMsg s) -> Float -> m () Source #

set_Value'float64 :: RWCtx m s => Value (MutMsg s) -> Double -> m () Source #

set_Value'text :: RWCtx m s => Value (MutMsg s) -> Text (MutMsg s) -> m () Source #

set_Value'data_ :: RWCtx m s => Value (MutMsg s) -> Data (MutMsg s) -> m () Source #

set_Value'list :: RWCtx m s => Value (MutMsg s) -> Maybe (Ptr (MutMsg s)) -> m () Source #

set_Value'enum :: RWCtx m s => Value (MutMsg s) -> Word16 -> m () Source #

set_Value'struct :: RWCtx m s => Value (MutMsg s) -> Maybe (Ptr (MutMsg s)) -> m () Source #

set_Value'anyPointer :: RWCtx m s => Value (MutMsg s) -> Maybe (Ptr (MutMsg s)) -> m () Source #

newtype Annotation msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (Annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: Annotation msg -> Struct msg Source #

FromStruct msg (Annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (Annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (Annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (Annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (Annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (Annotation msg) :: Type Source #

newtype List msg (Annotation msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (Annotation msg) = msg

data ElementSize Source #

Instances
Enum ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Eq ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Read ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Show ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Generic ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type Rep ElementSize :: Type -> Type #

Cerialize ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

Methods

cerialize :: RWCtx m s => MutMsg s -> ElementSize -> m (Cerial (MutMsg s) ElementSize) Source #

Decerialize ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

Associated Types

type Cerial msg ElementSize :: Type Source #

IsWord ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

MutListElem s ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg ElementSize :: Type Source #

Methods

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

toUntypedList :: List msg ElementSize -> List msg Source #

length :: List msg ElementSize -> Int Source #

index :: ReadCtx m msg => Int -> List msg ElementSize -> m ElementSize Source #

Cerialize (Vector (Vector (Vector (Vector (Vector (Vector ElementSize)))))) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

Cerialize (Vector (Vector (Vector (Vector (Vector ElementSize))))) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

Cerialize (Vector (Vector (Vector (Vector ElementSize)))) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

Cerialize (Vector (Vector (Vector ElementSize))) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

Cerialize (Vector (Vector ElementSize)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

Cerialize (Vector ElementSize) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

type Rep ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type Rep ElementSize = D1 (MetaData "ElementSize" "Capnp.Gen.Capnp.Schema" "capnp-0.7.0.0-DntewCAqLo38Y84ZWPtB8i" False) (((C1 (MetaCons "ElementSize'empty" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ElementSize'bit" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ElementSize'byte" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ElementSize'twoBytes" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "ElementSize'fourBytes" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ElementSize'eightBytes" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ElementSize'pointer" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ElementSize'inlineComposite" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ElementSize'unknown'" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Word16))))))
type Cerial msg ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema.Pure

newtype List msg ElementSize Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

newtype CapnpVersion msg Source #

Constructors

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (CapnpVersion msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

toStruct :: CapnpVersion msg -> Struct msg Source #

FromStruct msg (CapnpVersion msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (CapnpVersion msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

ListElem msg (CapnpVersion msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (CapnpVersion msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (CapnpVersion msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (CapnpVersion msg) :: Type Source #

newtype List msg (CapnpVersion msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

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

Defined in Capnp.Gen.Capnp.Schema

type InMessage (CapnpVersion msg) = msg

newtype CodeGeneratorRequest msg Source #

Instances
TraverseMsg CodeGeneratorRequest Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

ToStruct msg (CodeGeneratorRequest msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

FromStruct msg (CodeGeneratorRequest msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

FromPtr msg (CodeGeneratorRequest msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

Methods

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

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

Defined in Capnp.Gen.Capnp.Schema

ListElem msg (CodeGeneratorRequest msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

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

Methods

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

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

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

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

MessageDefault (CodeGeneratorRequest msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (CodeGeneratorRequest msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

type InMessage (CodeGeneratorRequest msg) :: Type Source #

newtype List msg (CodeGeneratorRequest msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (CodeGeneratorRequest msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

newtype CodeGeneratorRequest'RequestedFile msg Source #

Instances
TraverseMsg CodeGeneratorRequest'RequestedFile Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

ToStruct msg (CodeGeneratorRequest'RequestedFile msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

FromStruct msg (CodeGeneratorRequest'RequestedFile msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

ToPtr s (CodeGeneratorRequest'RequestedFile (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

FromPtr msg (CodeGeneratorRequest'RequestedFile msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (CodeGeneratorRequest'RequestedFile msg) Source #

Allocate s (CodeGeneratorRequest'RequestedFile (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

MutListElem s (CodeGeneratorRequest'RequestedFile (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

ListElem msg (CodeGeneratorRequest'RequestedFile msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg (CodeGeneratorRequest'RequestedFile msg) :: Type Source #

MessageDefault (CodeGeneratorRequest'RequestedFile msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (CodeGeneratorRequest'RequestedFile msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

newtype List msg (CodeGeneratorRequest'RequestedFile msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (CodeGeneratorRequest'RequestedFile msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

newtype CodeGeneratorRequest'RequestedFile'Import msg Source #

Instances
TraverseMsg CodeGeneratorRequest'RequestedFile'Import Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

ToStruct msg (CodeGeneratorRequest'RequestedFile'Import msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

FromStruct msg (CodeGeneratorRequest'RequestedFile'Import msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

ToPtr s (CodeGeneratorRequest'RequestedFile'Import (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

FromPtr msg (CodeGeneratorRequest'RequestedFile'Import msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (CodeGeneratorRequest'RequestedFile'Import msg) Source #

Allocate s (CodeGeneratorRequest'RequestedFile'Import (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

MutListElem s (CodeGeneratorRequest'RequestedFile'Import (MutMsg s)) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

ListElem msg (CodeGeneratorRequest'RequestedFile'Import msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

Associated Types

data List msg (CodeGeneratorRequest'RequestedFile'Import msg) :: Type Source #

MessageDefault (CodeGeneratorRequest'RequestedFile'Import msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

HasMessage (CodeGeneratorRequest'RequestedFile'Import msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

newtype List msg (CodeGeneratorRequest'RequestedFile'Import msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema

type InMessage (CodeGeneratorRequest'RequestedFile'Import msg) Source # 
Instance details

Defined in Capnp.Gen.Capnp.Schema