capnp-0.2.0.0: Cap'n Proto for Haskell

Safe HaskellNone
LanguageHaskell2010

Capnp.Capnp.Json

Description

This module is the generated code for capnp/json.capnp, for the low-level api.

Documentation

newtype JsonValue msg Source #

Constructors

JsonValue_newtype_ (Struct msg) 
Instances
ToStruct msg (JsonValue msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

toStruct :: JsonValue msg -> Struct msg Source #

FromStruct msg (JsonValue msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

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

IsPtr msg (JsonValue msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

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

toPtr :: JsonValue msg -> Maybe (Ptr msg) Source #

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

Defined in Capnp.Capnp.Json

Methods

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

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

Defined in Capnp.Capnp.Json

Methods

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

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

ListElem msg (JsonValue msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Associated Types

data List msg (JsonValue msg) :: * Source #

Methods

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

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

IsPtr msg (List msg (JsonValue msg)) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

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

toPtr :: List msg (JsonValue msg) -> Maybe (Ptr msg) Source #

MessageDefault (JsonValue msg) msg Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

messageDefault :: msg -> JsonValue msg Source #

HasMessage (JsonValue msg) msg Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

message :: JsonValue msg -> msg Source #

data List msg (JsonValue msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

data List msg (JsonValue msg) = List_JsonValue (ListOf msg (Struct msg))

get_JsonValue' :: ReadCtx m msg => JsonValue msg -> m (JsonValue' msg) Source #

newtype JsonValue'Call msg Source #

Constructors

JsonValue'Call_newtype_ (Struct msg) 
Instances
ToStruct msg (JsonValue'Call msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

toStruct :: JsonValue'Call msg -> Struct msg Source #

FromStruct msg (JsonValue'Call msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

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

IsPtr msg (JsonValue'Call msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (JsonValue'Call msg) Source #

toPtr :: JsonValue'Call msg -> Maybe (Ptr msg) Source #

Allocate s (JsonValue'Call (MutMsg s)) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

new :: WriteCtx m s => MutMsg s -> m (JsonValue'Call (MutMsg s)) Source #

MutListElem s (JsonValue'Call (MutMsg s)) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

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

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

ListElem msg (JsonValue'Call msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Associated Types

data List msg (JsonValue'Call msg) :: * Source #

Methods

length :: List msg (JsonValue'Call msg) -> Int Source #

index :: ReadCtx m msg => Int -> List msg (JsonValue'Call msg) -> m (JsonValue'Call msg) Source #

IsPtr msg (List msg (JsonValue'Call msg)) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

fromPtr :: ReadCtx m msg => msg -> Maybe (Ptr msg) -> m (List msg (JsonValue'Call msg)) Source #

toPtr :: List msg (JsonValue'Call msg) -> Maybe (Ptr msg) Source #

MessageDefault (JsonValue'Call msg) msg Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

messageDefault :: msg -> JsonValue'Call msg Source #

HasMessage (JsonValue'Call msg) msg Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

message :: JsonValue'Call msg -> msg Source #

data List msg (JsonValue'Call msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

data List msg (JsonValue'Call msg) = List_JsonValue'Call (ListOf msg (Struct msg))

newtype JsonValue'Field msg Source #

Constructors

JsonValue'Field_newtype_ (Struct msg) 
Instances
ToStruct msg (JsonValue'Field msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

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

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

Defined in Capnp.Capnp.Json

Methods

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

IsPtr msg (JsonValue'Field msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

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

toPtr :: JsonValue'Field msg -> Maybe (Ptr msg) Source #

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

Defined in Capnp.Capnp.Json

Methods

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

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

Defined in Capnp.Capnp.Json

Methods

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

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

ListElem msg (JsonValue'Field msg) Source # 
Instance details

Defined in Capnp.Capnp.Json

Associated Types

data List msg (JsonValue'Field msg) :: * Source #

Methods

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

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

IsPtr msg (List msg (JsonValue'Field msg)) Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

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

toPtr :: List msg (JsonValue'Field msg) -> Maybe (Ptr msg) Source #

MessageDefault (JsonValue'Field msg) msg Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

messageDefault :: msg -> JsonValue'Field msg Source #

HasMessage (JsonValue'Field msg) msg Source # 
Instance details

Defined in Capnp.Capnp.Json

Methods

message :: JsonValue'Field msg -> msg Source #

data List msg (JsonValue'Field msg) Source # 
Instance details

Defined in Capnp.Capnp.Json