{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE EmptyDataDeriving #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE UndecidableInstances #-}
{-# LANGUAGE UndecidableSuperClasses #-}
{-# LANGUAGE OverloadedLabels #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# OPTIONS_GHC -Wno-unused-imports #-}
{-# OPTIONS_GHC -Wno-dodgy-exports #-}
{-# OPTIONS_GHC -Wno-unused-matches #-}
{-# OPTIONS_GHC -Wno-orphans #-}
{-# OPTIONS_GHC -Wno-unticked-promoted-constructors #-}
{-# OPTIONS_GHC -Wno-name-shadowing #-}
module Capnp.Gen.Capnp.Schema.New where
import qualified Capnp.Repr as R
import qualified Capnp.Repr.Parsed as RP
import qualified Capnp.New.Basics as Basics
import qualified GHC.OverloadedLabels as OL
import qualified Capnp.GenHelpers.New as GH
import qualified Capnp.New.Classes as C
import qualified GHC.Generics as Generics
import qualified Prelude as Std_
import qualified Data.Word as Std_
import qualified Data.Int as Std_
import Prelude ((<$>), (<*>), (>>=))
data Node 
type instance (R.ReprFor Node) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node) where
    typeId :: Word64
typeId  = Word64
16610026722781537303
instance (C.TypedStruct Node) where
    numStructWords :: Word16
numStructWords  = Word16
5
    numStructPtrs :: Word16
numStructPtrs  = Word16
6
instance (C.Allocate Node) where
    type AllocHint Node = ()
    new :: AllocHint Node -> Message ('Mut s) -> m (Raw Node ('Mut s))
new AllocHint Node
_ = Message ('Mut s) -> m (Raw Node ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node (C.Parsed Node))
instance (C.AllocateList Node) where
    type ListAllocHint Node = Std_.Int
    newList :: ListAllocHint Node
-> Message ('Mut s) -> m (Raw (List Node) ('Mut s))
newList  = ListAllocHint Node
-> Message ('Mut s) -> m (Raw (List Node) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node (C.Parsed Node))
data instance C.Parsed Node
    = Node 
        {Parsed Node -> Parsed Word64
id :: (RP.Parsed Std_.Word64)
        ,Parsed Node -> Parsed Text
displayName :: (RP.Parsed Basics.Text)
        ,Parsed Node -> Parsed Word32
displayNamePrefixLength :: (RP.Parsed Std_.Word32)
        ,Parsed Node -> Parsed Word64
scopeId :: (RP.Parsed Std_.Word64)
        ,Parsed Node -> Parsed (List Node'NestedNode)
nestedNodes :: (RP.Parsed (R.List Node'NestedNode))
        ,Parsed Node -> Parsed (List Annotation)
annotations :: (RP.Parsed (R.List Annotation))
        ,Parsed Node -> Parsed (List Node'Parameter)
parameters :: (RP.Parsed (R.List Node'Parameter))
        ,Parsed Node -> Parsed Bool
isGeneric :: (RP.Parsed Std_.Bool)
        ,Parsed Node -> Parsed (Which Node)
union' :: (C.Parsed (GH.Which Node))}
    deriving((forall x. Parsed Node -> Rep (Parsed Node) x)
-> (forall x. Rep (Parsed Node) x -> Parsed Node)
-> Generic (Parsed Node)
forall x. Rep (Parsed Node) x -> Parsed Node
forall x. Parsed Node -> Rep (Parsed Node) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node) x -> Parsed Node
$cfrom :: forall x. Parsed Node -> Rep (Parsed Node) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node))
deriving instance (Std_.Eq (C.Parsed Node))
instance (C.Parse Node (C.Parsed Node)) where
    parse :: Raw Node 'Const -> m (Parsed Node)
parse Raw Node 'Const
raw_ = (Word64
-> Text
-> Word32
-> Word64
-> Vector (Parsed Node'NestedNode)
-> Vector (Parsed Annotation)
-> Vector (Parsed Node'Parameter)
-> Bool
-> Parsed (Which Node)
-> Parsed Node
Parsed Word64
-> Parsed Text
-> Parsed Word32
-> Parsed Word64
-> Parsed (List Node'NestedNode)
-> Parsed (List Annotation)
-> Parsed (List Node'Parameter)
-> Parsed Bool
-> Parsed (Which Node)
-> Parsed Node
Node (Word64
 -> Text
 -> Word32
 -> Word64
 -> Vector (Parsed Node'NestedNode)
 -> Vector (Parsed Annotation)
 -> Vector (Parsed Node'Parameter)
 -> Bool
 -> Parsed (Which Node)
 -> Parsed Node)
-> m Word64
-> m (Text
      -> Word32
      -> Word64
      -> Vector (Parsed Node'NestedNode)
      -> Vector (Parsed Annotation)
      -> Vector (Parsed Node'Parameter)
      -> Bool
      -> Parsed (Which Node)
      -> Parsed Node)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node Word64 -> Raw Node 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "id" (Field 'Slot Node Word64)
Field 'Slot Node Word64
#id Raw Node 'Const
raw_)
                       m (Text
   -> Word32
   -> Word64
   -> Vector (Parsed Node'NestedNode)
   -> Vector (Parsed Annotation)
   -> Vector (Parsed Node'Parameter)
   -> Bool
   -> Parsed (Which Node)
   -> Parsed Node)
-> m Text
-> m (Word32
      -> Word64
      -> Vector (Parsed Node'NestedNode)
      -> Vector (Parsed Annotation)
      -> Vector (Parsed Node'Parameter)
      -> Bool
      -> Parsed (Which Node)
      -> Parsed Node)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node Text -> Raw Node 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "displayName" (Field 'Slot Node Text)
Field 'Slot Node Text
#displayName Raw Node 'Const
raw_)
                       m (Word32
   -> Word64
   -> Vector (Parsed Node'NestedNode)
   -> Vector (Parsed Annotation)
   -> Vector (Parsed Node'Parameter)
   -> Bool
   -> Parsed (Which Node)
   -> Parsed Node)
-> m Word32
-> m (Word64
      -> Vector (Parsed Node'NestedNode)
      -> Vector (Parsed Annotation)
      -> Vector (Parsed Node'Parameter)
      -> Bool
      -> Parsed (Which Node)
      -> Parsed Node)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node Word32 -> Raw Node 'Const -> m Word32
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "displayNamePrefixLength" (Field 'Slot Node Word32)
Field 'Slot Node Word32
#displayNamePrefixLength Raw Node 'Const
raw_)
                       m (Word64
   -> Vector (Parsed Node'NestedNode)
   -> Vector (Parsed Annotation)
   -> Vector (Parsed Node'Parameter)
   -> Bool
   -> Parsed (Which Node)
   -> Parsed Node)
-> m Word64
-> m (Vector (Parsed Node'NestedNode)
      -> Vector (Parsed Annotation)
      -> Vector (Parsed Node'Parameter)
      -> Bool
      -> Parsed (Which Node)
      -> Parsed Node)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node Word64 -> Raw Node 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "scopeId" (Field 'Slot Node Word64)
Field 'Slot Node Word64
#scopeId Raw Node 'Const
raw_)
                       m (Vector (Parsed Node'NestedNode)
   -> Vector (Parsed Annotation)
   -> Vector (Parsed Node'Parameter)
   -> Bool
   -> Parsed (Which Node)
   -> Parsed Node)
-> m (Vector (Parsed Node'NestedNode))
-> m (Vector (Parsed Annotation)
      -> Vector (Parsed Node'Parameter)
      -> Bool
      -> Parsed (Which Node)
      -> Parsed Node)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node (List Node'NestedNode)
-> Raw Node 'Const -> m (Vector (Parsed Node'NestedNode))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "nestedNodes" (Field 'Slot Node (List Node'NestedNode))
Field 'Slot Node (List Node'NestedNode)
#nestedNodes Raw Node 'Const
raw_)
                       m (Vector (Parsed Annotation)
   -> Vector (Parsed Node'Parameter)
   -> Bool
   -> Parsed (Which Node)
   -> Parsed Node)
-> m (Vector (Parsed Annotation))
-> m (Vector (Parsed Node'Parameter)
      -> Bool -> Parsed (Which Node) -> Parsed Node)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node (List Annotation)
-> Raw Node 'Const -> m (Vector (Parsed Annotation))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "annotations" (Field 'Slot Node (List Annotation))
Field 'Slot Node (List Annotation)
#annotations Raw Node 'Const
raw_)
                       m (Vector (Parsed Node'Parameter)
   -> Bool -> Parsed (Which Node) -> Parsed Node)
-> m (Vector (Parsed Node'Parameter))
-> m (Bool -> Parsed (Which Node) -> Parsed Node)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node (List Node'Parameter)
-> Raw Node 'Const -> m (Vector (Parsed Node'Parameter))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "parameters" (Field 'Slot Node (List Node'Parameter))
Field 'Slot Node (List Node'Parameter)
#parameters Raw Node 'Const
raw_)
                       m (Bool -> Parsed (Which Node) -> Parsed Node)
-> m Bool -> m (Parsed (Which Node) -> Parsed Node)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node Bool -> Raw Node 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "isGeneric" (Field 'Slot Node Bool)
Field 'Slot Node Bool
#isGeneric Raw Node 'Const
raw_)
                       m (Parsed (Which Node) -> Parsed Node)
-> m (Parsed (Which Node)) -> m (Parsed Node)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Raw (Which Node) 'Const -> m (Parsed (Which Node))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Node 'Const -> Raw (Which Node) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Node 'Const
raw_)))
instance (C.Marshal Node (C.Parsed Node)) where
    marshalInto :: Raw Node ('Mut s) -> Parsed Node -> m ()
marshalInto Raw Node ('Mut s)
raw_ Node{..} = (do
        (Field 'Slot Node Word64 -> Word64 -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "id" (Field 'Slot Node Word64)
Field 'Slot Node Word64
#id Word64
Parsed Word64
id Raw Node ('Mut s)
raw_)
        (Field 'Slot Node Text -> Text -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "displayName" (Field 'Slot Node Text)
Field 'Slot Node Text
#displayName Text
Parsed Text
displayName Raw Node ('Mut s)
raw_)
        (Field 'Slot Node Word32 -> Word32 -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "displayNamePrefixLength" (Field 'Slot Node Word32)
Field 'Slot Node Word32
#displayNamePrefixLength Word32
Parsed Word32
displayNamePrefixLength Raw Node ('Mut s)
raw_)
        (Field 'Slot Node Word64 -> Word64 -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "scopeId" (Field 'Slot Node Word64)
Field 'Slot Node Word64
#scopeId Word64
Parsed Word64
scopeId Raw Node ('Mut s)
raw_)
        (Field 'Slot Node (List Node'NestedNode)
-> Vector (Parsed Node'NestedNode) -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "nestedNodes" (Field 'Slot Node (List Node'NestedNode))
Field 'Slot Node (List Node'NestedNode)
#nestedNodes Vector (Parsed Node'NestedNode)
Parsed (List Node'NestedNode)
nestedNodes Raw Node ('Mut s)
raw_)
        (Field 'Slot Node (List Annotation)
-> Vector (Parsed Annotation) -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "annotations" (Field 'Slot Node (List Annotation))
Field 'Slot Node (List Annotation)
#annotations Vector (Parsed Annotation)
Parsed (List Annotation)
annotations Raw Node ('Mut s)
raw_)
        (Field 'Slot Node (List Node'Parameter)
-> Vector (Parsed Node'Parameter) -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "parameters" (Field 'Slot Node (List Node'Parameter))
Field 'Slot Node (List Node'Parameter)
#parameters Vector (Parsed Node'Parameter)
Parsed (List Node'Parameter)
parameters Raw Node ('Mut s)
raw_)
        (Field 'Slot Node Bool -> Bool -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "isGeneric" (Field 'Slot Node Bool)
Field 'Slot Node Bool
#isGeneric Bool
Parsed Bool
isGeneric Raw Node ('Mut s)
raw_)
        (Raw (Which Node) ('Mut s) -> Parsed (Which Node) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Node ('Mut s) -> Raw (Which Node) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Node ('Mut s)
raw_) Parsed (Which Node)
union')
        )
instance (GH.HasUnion Node) where
    unionField :: Field 'Slot Node Word16
unionField  = (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Node Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
32 Word16
1 BitCount
16 Word64
0)
    data RawWhich Node mut_
        = RW_Node'file (R.Raw () mut_)
        | RW_Node'struct (R.Raw Node'struct mut_)
        | RW_Node'enum (R.Raw Node'enum mut_)
        | RW_Node'interface (R.Raw Node'interface mut_)
        | RW_Node'const (R.Raw Node'const mut_)
        | RW_Node'annotation (R.Raw Node'annotation mut_)
        | RW_Node'unknown' Std_.Word16
    internalWhich :: Word16 -> Raw Node mut -> m (RawWhich Node mut)
internalWhich Word16
tag_ Raw Node mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw () mut -> RawWhich Node mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Node mut_
RW_Node'file (Raw () mut -> RawWhich Node mut)
-> m (Raw () mut) -> m (RawWhich Node mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Node () -> Raw Node mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "file" (Variant 'Slot Node ())
Variant 'Slot Node ()
#file Raw Node mut
struct_))
        Word16
1 ->
            (Raw Node'struct mut -> RawWhich Node mut
forall (mut_ :: Mutability).
Raw Node'struct mut_ -> RawWhich Node mut_
RW_Node'struct (Raw Node'struct mut -> RawWhich Node mut)
-> m (Raw Node'struct mut) -> m (RawWhich Node mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Node Node'struct
-> Raw Node mut -> m (Raw Node'struct mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "struct" (Variant 'Group Node Node'struct)
Variant 'Group Node Node'struct
#struct Raw Node mut
struct_))
        Word16
2 ->
            (Raw Node'enum mut -> RawWhich Node mut
forall (mut_ :: Mutability).
Raw Node'enum mut_ -> RawWhich Node mut_
RW_Node'enum (Raw Node'enum mut -> RawWhich Node mut)
-> m (Raw Node'enum mut) -> m (RawWhich Node mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Node Node'enum
-> Raw Node mut -> m (Raw Node'enum mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "enum" (Variant 'Group Node Node'enum)
Variant 'Group Node Node'enum
#enum Raw Node mut
struct_))
        Word16
3 ->
            (Raw Node'interface mut -> RawWhich Node mut
forall (mut_ :: Mutability).
Raw Node'interface mut_ -> RawWhich Node mut_
RW_Node'interface (Raw Node'interface mut -> RawWhich Node mut)
-> m (Raw Node'interface mut) -> m (RawWhich Node mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Node Node'interface
-> Raw Node mut -> m (Raw Node'interface mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "interface" (Variant 'Group Node Node'interface)
Variant 'Group Node Node'interface
#interface Raw Node mut
struct_))
        Word16
4 ->
            (Raw Node'const mut -> RawWhich Node mut
forall (mut_ :: Mutability).
Raw Node'const mut_ -> RawWhich Node mut_
RW_Node'const (Raw Node'const mut -> RawWhich Node mut)
-> m (Raw Node'const mut) -> m (RawWhich Node mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Node Node'const
-> Raw Node mut -> m (Raw Node'const mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "const" (Variant 'Group Node Node'const)
Variant 'Group Node Node'const
#const Raw Node mut
struct_))
        Word16
5 ->
            (Raw Node'annotation mut -> RawWhich Node mut
forall (mut_ :: Mutability).
Raw Node'annotation mut_ -> RawWhich Node mut_
RW_Node'annotation (Raw Node'annotation mut -> RawWhich Node mut)
-> m (Raw Node'annotation mut) -> m (RawWhich Node mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Node Node'annotation
-> Raw Node mut -> m (Raw Node'annotation mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "annotation" (Variant 'Group Node Node'annotation)
Variant 'Group Node Node'annotation
#annotation Raw Node mut
struct_))
        Word16
_ ->
            (RawWhich Node mut -> m (RawWhich Node mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Node mut
forall (mut_ :: Mutability). Word16 -> RawWhich Node mut_
RW_Node'unknown' Word16
tag_))
    data Which Node
instance (GH.HasVariant "file" GH.Slot Node ()) where
    variantByLabel :: Variant 'Slot Node ()
variantByLabel  = (Field 'Slot Node () -> Word16 -> Variant 'Slot Node ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Node ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
0)
instance (GH.HasVariant "struct" GH.Group Node Node'struct) where
    variantByLabel :: Variant 'Group Node Node'struct
variantByLabel  = (Field 'Group Node Node'struct
-> Word16 -> Variant 'Group Node Node'struct
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Node Node'struct
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
1)
instance (GH.HasVariant "enum" GH.Group Node Node'enum) where
    variantByLabel :: Variant 'Group Node Node'enum
variantByLabel  = (Field 'Group Node Node'enum
-> Word16 -> Variant 'Group Node Node'enum
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Node Node'enum
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
2)
instance (GH.HasVariant "interface" GH.Group Node Node'interface) where
    variantByLabel :: Variant 'Group Node Node'interface
variantByLabel  = (Field 'Group Node Node'interface
-> Word16 -> Variant 'Group Node Node'interface
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Node Node'interface
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
3)
instance (GH.HasVariant "const" GH.Group Node Node'const) where
    variantByLabel :: Variant 'Group Node Node'const
variantByLabel  = (Field 'Group Node Node'const
-> Word16 -> Variant 'Group Node Node'const
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Node Node'const
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
4)
instance (GH.HasVariant "annotation" GH.Group Node Node'annotation) where
    variantByLabel :: Variant 'Group Node Node'annotation
variantByLabel  = (Field 'Group Node Node'annotation
-> Word16 -> Variant 'Group Node Node'annotation
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Node Node'annotation
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
5)
data instance C.Parsed (GH.Which Node)
    = Node'file 
    | Node'struct (RP.Parsed Node'struct)
    | Node'enum (RP.Parsed Node'enum)
    | Node'interface (RP.Parsed Node'interface)
    | Node'const (RP.Parsed Node'const)
    | Node'annotation (RP.Parsed Node'annotation)
    | Node'unknown' Std_.Word16
    deriving((forall x. Parsed (Which Node) -> Rep (Parsed (Which Node)) x)
-> (forall x. Rep (Parsed (Which Node)) x -> Parsed (Which Node))
-> Generic (Parsed (Which Node))
forall x. Rep (Parsed (Which Node)) x -> Parsed (Which Node)
forall x. Parsed (Which Node) -> Rep (Parsed (Which Node)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed (Which Node)) x -> Parsed (Which Node)
$cfrom :: forall x. Parsed (Which Node) -> Rep (Parsed (Which Node)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Node)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Node)))
instance (C.Parse (GH.Which Node) (C.Parsed (GH.Which Node))) where
    parse :: Raw (Which Node) 'Const -> m (Parsed (Which Node))
parse Raw (Which Node) 'Const
raw_ = (do
        RawWhich Node 'Const
rawWhich_ <- (Raw (Which Node) 'Const -> m (RawWhich Node 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Node) 'Const
raw_)
        case RawWhich Node 'Const
rawWhich_ of
            (RW_Node'file _) ->
                (Parsed (Which Node) -> m (Parsed (Which Node))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Node)
Node'file)
            (RW_Node'struct rawArg_) ->
                (Parsed Node'struct -> Parsed (Which Node)
Parsed Node'struct -> Parsed (Which Node)
Node'struct (Parsed Node'struct -> Parsed (Which Node))
-> m (Parsed Node'struct) -> m (Parsed (Which Node))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Node'struct 'Const -> m (Parsed Node'struct)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Node'struct 'Const
rawArg_))
            (RW_Node'enum rawArg_) ->
                (Parsed Node'enum -> Parsed (Which Node)
Parsed Node'enum -> Parsed (Which Node)
Node'enum (Parsed Node'enum -> Parsed (Which Node))
-> m (Parsed Node'enum) -> m (Parsed (Which Node))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Node'enum 'Const -> m (Parsed Node'enum)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Node'enum 'Const
rawArg_))
            (RW_Node'interface rawArg_) ->
                (Parsed Node'interface -> Parsed (Which Node)
Parsed Node'interface -> Parsed (Which Node)
Node'interface (Parsed Node'interface -> Parsed (Which Node))
-> m (Parsed Node'interface) -> m (Parsed (Which Node))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Node'interface 'Const -> m (Parsed Node'interface)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Node'interface 'Const
rawArg_))
            (RW_Node'const rawArg_) ->
                (Parsed Node'const -> Parsed (Which Node)
Parsed Node'const -> Parsed (Which Node)
Node'const (Parsed Node'const -> Parsed (Which Node))
-> m (Parsed Node'const) -> m (Parsed (Which Node))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Node'const 'Const -> m (Parsed Node'const)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Node'const 'Const
rawArg_))
            (RW_Node'annotation rawArg_) ->
                (Parsed Node'annotation -> Parsed (Which Node)
Parsed Node'annotation -> Parsed (Which Node)
Node'annotation (Parsed Node'annotation -> Parsed (Which Node))
-> m (Parsed Node'annotation) -> m (Parsed (Which Node))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Node'annotation 'Const -> m (Parsed Node'annotation)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Node'annotation 'Const
rawArg_))
            (RW_Node'unknown' tag_) ->
                (Parsed (Which Node) -> m (Parsed (Which Node))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Node)
Node'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Node) (C.Parsed (GH.Which Node))) where
    marshalInto :: Raw (Which Node) ('Mut s) -> Parsed (Which Node) -> m ()
marshalInto Raw (Which Node) ('Mut s)
raw_ Parsed (Which Node)
parsed_ = case Parsed (Which Node)
parsed_ of
        (Parsed (Which Node)
Node'file) ->
            (Variant 'Slot Node () -> () -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "file" (Variant 'Slot Node ())
Variant 'Slot Node ()
#file () (Raw (Which Node) ('Mut s) -> Raw Node ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Node) ('Mut s)
raw_))
        (Node'struct arg_) ->
            (do
                Raw Node'struct ('Mut s)
rawGroup_ <- (Variant 'Group Node Node'struct
-> Raw Node ('Mut s) -> m (Raw Node'struct ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "struct" (Variant 'Group Node Node'struct)
Variant 'Group Node Node'struct
#struct (Raw (Which Node) ('Mut s) -> Raw Node ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Node) ('Mut s)
raw_))
                (Raw Node'struct ('Mut s) -> Parsed Node'struct -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Node'struct ('Mut s)
rawGroup_ Parsed Node'struct
Parsed Node'struct
arg_)
                )
        (Node'enum arg_) ->
            (do
                Raw Node'enum ('Mut s)
rawGroup_ <- (Variant 'Group Node Node'enum
-> Raw Node ('Mut s) -> m (Raw Node'enum ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "enum" (Variant 'Group Node Node'enum)
Variant 'Group Node Node'enum
#enum (Raw (Which Node) ('Mut s) -> Raw Node ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Node) ('Mut s)
raw_))
                (Raw Node'enum ('Mut s) -> Parsed Node'enum -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Node'enum ('Mut s)
rawGroup_ Parsed Node'enum
Parsed Node'enum
arg_)
                )
        (Node'interface arg_) ->
            (do
                Raw Node'interface ('Mut s)
rawGroup_ <- (Variant 'Group Node Node'interface
-> Raw Node ('Mut s) -> m (Raw Node'interface ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "interface" (Variant 'Group Node Node'interface)
Variant 'Group Node Node'interface
#interface (Raw (Which Node) ('Mut s) -> Raw Node ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Node) ('Mut s)
raw_))
                (Raw Node'interface ('Mut s) -> Parsed Node'interface -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Node'interface ('Mut s)
rawGroup_ Parsed Node'interface
Parsed Node'interface
arg_)
                )
        (Node'const arg_) ->
            (do
                Raw Node'const ('Mut s)
rawGroup_ <- (Variant 'Group Node Node'const
-> Raw Node ('Mut s) -> m (Raw Node'const ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "const" (Variant 'Group Node Node'const)
Variant 'Group Node Node'const
#const (Raw (Which Node) ('Mut s) -> Raw Node ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Node) ('Mut s)
raw_))
                (Raw Node'const ('Mut s) -> Parsed Node'const -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Node'const ('Mut s)
rawGroup_ Parsed Node'const
Parsed Node'const
arg_)
                )
        (Node'annotation arg_) ->
            (do
                Raw Node'annotation ('Mut s)
rawGroup_ <- (Variant 'Group Node Node'annotation
-> Raw Node ('Mut s) -> m (Raw Node'annotation ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "annotation" (Variant 'Group Node Node'annotation)
Variant 'Group Node Node'annotation
#annotation (Raw (Which Node) ('Mut s) -> Raw Node ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Node) ('Mut s)
raw_))
                (Raw Node'annotation ('Mut s) -> Parsed Node'annotation -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Node'annotation ('Mut s)
rawGroup_ Parsed Node'annotation
Parsed Node'annotation
arg_)
                )
        (Node'unknown' tag_) ->
            (Field 'Slot Node Word16 -> Word16 -> Raw Node ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Node Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Node) ('Mut s) -> Raw Node ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Node) ('Mut s)
raw_))
instance (GH.HasField "id" GH.Slot Node Std_.Word64) where
    fieldByLabel :: Field 'Slot Node Word64
fieldByLabel  = (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Node Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
64 Word64
0)
instance (GH.HasField "displayName" GH.Slot Node Basics.Text) where
    fieldByLabel :: Field 'Slot Node Text
fieldByLabel  = (Word16 -> Field 'Slot Node Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "displayNamePrefixLength" GH.Slot Node Std_.Word32) where
    fieldByLabel :: Field 'Slot Node Word32
fieldByLabel  = (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Node Word32
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
32 Word64
0)
instance (GH.HasField "scopeId" GH.Slot Node Std_.Word64) where
    fieldByLabel :: Field 'Slot Node Word64
fieldByLabel  = (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Node Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
2 BitCount
64 Word64
0)
instance (GH.HasField "nestedNodes" GH.Slot Node (R.List Node'NestedNode)) where
    fieldByLabel :: Field 'Slot Node (List Node'NestedNode)
fieldByLabel  = (Word16 -> Field 'Slot Node (List Node'NestedNode)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
1)
instance (GH.HasField "annotations" GH.Slot Node (R.List Annotation)) where
    fieldByLabel :: Field 'Slot Node (List Annotation)
fieldByLabel  = (Word16 -> Field 'Slot Node (List Annotation)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
2)
instance (GH.HasField "parameters" GH.Slot Node (R.List Node'Parameter)) where
    fieldByLabel :: Field 'Slot Node (List Node'Parameter)
fieldByLabel  = (Word16 -> Field 'Slot Node (List Node'Parameter)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
5)
instance (GH.HasField "isGeneric" GH.Slot Node Std_.Bool) where
    fieldByLabel :: Field 'Slot Node Bool
fieldByLabel  = (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Node Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
32 Word16
4 BitCount
1 Word64
0)
data Node'struct 
type instance (R.ReprFor Node'struct) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'struct) where
    typeId :: Word64
typeId  = Word64
11430331134483579957
instance (C.TypedStruct Node'struct) where
    numStructWords :: Word16
numStructWords  = Word16
5
    numStructPtrs :: Word16
numStructPtrs  = Word16
6
instance (C.Allocate Node'struct) where
    type AllocHint Node'struct = ()
    new :: AllocHint Node'struct
-> Message ('Mut s) -> m (Raw Node'struct ('Mut s))
new AllocHint Node'struct
_ = Message ('Mut s) -> m (Raw Node'struct ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'struct (C.Parsed Node'struct))
instance (C.AllocateList Node'struct) where
    type ListAllocHint Node'struct = Std_.Int
    newList :: ListAllocHint Node'struct
-> Message ('Mut s) -> m (Raw (List Node'struct) ('Mut s))
newList  = ListAllocHint Node'struct
-> Message ('Mut s) -> m (Raw (List Node'struct) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'struct (C.Parsed Node'struct))
data instance C.Parsed Node'struct
    = Node'struct' 
        {Parsed Node'struct -> Parsed Word16
dataWordCount :: (RP.Parsed Std_.Word16)
        ,Parsed Node'struct -> Parsed Word16
pointerCount :: (RP.Parsed Std_.Word16)
        ,Parsed Node'struct -> Parsed ElementSize
preferredListEncoding :: (RP.Parsed ElementSize)
        ,Parsed Node'struct -> Parsed Bool
isGroup :: (RP.Parsed Std_.Bool)
        ,Parsed Node'struct -> Parsed Word16
discriminantCount :: (RP.Parsed Std_.Word16)
        ,Parsed Node'struct -> Parsed Word32
discriminantOffset :: (RP.Parsed Std_.Word32)
        ,Parsed Node'struct -> Parsed (List Field)
fields :: (RP.Parsed (R.List Field))}
    deriving((forall x. Parsed Node'struct -> Rep (Parsed Node'struct) x)
-> (forall x. Rep (Parsed Node'struct) x -> Parsed Node'struct)
-> Generic (Parsed Node'struct)
forall x. Rep (Parsed Node'struct) x -> Parsed Node'struct
forall x. Parsed Node'struct -> Rep (Parsed Node'struct) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node'struct) x -> Parsed Node'struct
$cfrom :: forall x. Parsed Node'struct -> Rep (Parsed Node'struct) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'struct))
deriving instance (Std_.Eq (C.Parsed Node'struct))
instance (C.Parse Node'struct (C.Parsed Node'struct)) where
    parse :: Raw Node'struct 'Const -> m (Parsed Node'struct)
parse Raw Node'struct 'Const
raw_ = (Word16
-> Word16
-> ElementSize
-> Bool
-> Word16
-> Word32
-> Vector (Parsed Field)
-> Parsed Node'struct
Parsed Word16
-> Parsed Word16
-> Parsed ElementSize
-> Parsed Bool
-> Parsed Word16
-> Parsed Word32
-> Parsed (List Field)
-> Parsed Node'struct
Node'struct' (Word16
 -> Word16
 -> ElementSize
 -> Bool
 -> Word16
 -> Word32
 -> Vector (Parsed Field)
 -> Parsed Node'struct)
-> m Word16
-> m (Word16
      -> ElementSize
      -> Bool
      -> Word16
      -> Word32
      -> Vector (Parsed Field)
      -> Parsed Node'struct)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'struct Word16
-> Raw Node'struct 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "dataWordCount" (Field 'Slot Node'struct Word16)
Field 'Slot Node'struct Word16
#dataWordCount Raw Node'struct 'Const
raw_)
                               m (Word16
   -> ElementSize
   -> Bool
   -> Word16
   -> Word32
   -> Vector (Parsed Field)
   -> Parsed Node'struct)
-> m Word16
-> m (ElementSize
      -> Bool
      -> Word16
      -> Word32
      -> Vector (Parsed Field)
      -> Parsed Node'struct)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'struct Word16
-> Raw Node'struct 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "pointerCount" (Field 'Slot Node'struct Word16)
Field 'Slot Node'struct Word16
#pointerCount Raw Node'struct 'Const
raw_)
                               m (ElementSize
   -> Bool
   -> Word16
   -> Word32
   -> Vector (Parsed Field)
   -> Parsed Node'struct)
-> m ElementSize
-> m (Bool
      -> Word16 -> Word32 -> Vector (Parsed Field) -> Parsed Node'struct)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'struct ElementSize
-> Raw Node'struct 'Const -> m ElementSize
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "preferredListEncoding" (Field 'Slot Node'struct ElementSize)
Field 'Slot Node'struct ElementSize
#preferredListEncoding Raw Node'struct 'Const
raw_)
                               m (Bool
   -> Word16 -> Word32 -> Vector (Parsed Field) -> Parsed Node'struct)
-> m Bool
-> m (Word16
      -> Word32 -> Vector (Parsed Field) -> Parsed Node'struct)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'struct Bool -> Raw Node'struct 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "isGroup" (Field 'Slot Node'struct Bool)
Field 'Slot Node'struct Bool
#isGroup Raw Node'struct 'Const
raw_)
                               m (Word16 -> Word32 -> Vector (Parsed Field) -> Parsed Node'struct)
-> m Word16
-> m (Word32 -> Vector (Parsed Field) -> Parsed Node'struct)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'struct Word16
-> Raw Node'struct 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "discriminantCount" (Field 'Slot Node'struct Word16)
Field 'Slot Node'struct Word16
#discriminantCount Raw Node'struct 'Const
raw_)
                               m (Word32 -> Vector (Parsed Field) -> Parsed Node'struct)
-> m Word32 -> m (Vector (Parsed Field) -> Parsed Node'struct)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'struct Word32
-> Raw Node'struct 'Const -> m Word32
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "discriminantOffset" (Field 'Slot Node'struct Word32)
Field 'Slot Node'struct Word32
#discriminantOffset Raw Node'struct 'Const
raw_)
                               m (Vector (Parsed Field) -> Parsed Node'struct)
-> m (Vector (Parsed Field)) -> m (Parsed Node'struct)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'struct (List Field)
-> Raw Node'struct 'Const -> m (Vector (Parsed Field))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "fields" (Field 'Slot Node'struct (List Field))
Field 'Slot Node'struct (List Field)
#fields Raw Node'struct 'Const
raw_))
instance (C.Marshal Node'struct (C.Parsed Node'struct)) where
    marshalInto :: Raw Node'struct ('Mut s) -> Parsed Node'struct -> m ()
marshalInto Raw Node'struct ('Mut s)
raw_ Node'struct'{..} = (do
        (Field 'Slot Node'struct Word16
-> Word16 -> Raw Node'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "dataWordCount" (Field 'Slot Node'struct Word16)
Field 'Slot Node'struct Word16
#dataWordCount Word16
Parsed Word16
dataWordCount Raw Node'struct ('Mut s)
raw_)
        (Field 'Slot Node'struct Word16
-> Word16 -> Raw Node'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "pointerCount" (Field 'Slot Node'struct Word16)
Field 'Slot Node'struct Word16
#pointerCount Word16
Parsed Word16
pointerCount Raw Node'struct ('Mut s)
raw_)
        (Field 'Slot Node'struct ElementSize
-> ElementSize -> Raw Node'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "preferredListEncoding" (Field 'Slot Node'struct ElementSize)
Field 'Slot Node'struct ElementSize
#preferredListEncoding Parsed ElementSize
ElementSize
preferredListEncoding Raw Node'struct ('Mut s)
raw_)
        (Field 'Slot Node'struct Bool
-> Bool -> Raw Node'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "isGroup" (Field 'Slot Node'struct Bool)
Field 'Slot Node'struct Bool
#isGroup Bool
Parsed Bool
isGroup Raw Node'struct ('Mut s)
raw_)
        (Field 'Slot Node'struct Word16
-> Word16 -> Raw Node'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "discriminantCount" (Field 'Slot Node'struct Word16)
Field 'Slot Node'struct Word16
#discriminantCount Word16
Parsed Word16
discriminantCount Raw Node'struct ('Mut s)
raw_)
        (Field 'Slot Node'struct Word32
-> Word32 -> Raw Node'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "discriminantOffset" (Field 'Slot Node'struct Word32)
Field 'Slot Node'struct Word32
#discriminantOffset Word32
Parsed Word32
discriminantOffset Raw Node'struct ('Mut s)
raw_)
        (Field 'Slot Node'struct (List Field)
-> Vector (Parsed Field) -> Raw Node'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "fields" (Field 'Slot Node'struct (List Field))
Field 'Slot Node'struct (List Field)
#fields Vector (Parsed Field)
Parsed (List Field)
fields Raw Node'struct ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "dataWordCount" GH.Slot Node'struct Std_.Word16) where
    fieldByLabel :: Field 'Slot Node'struct Word16
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'struct Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
48 Word16
1 BitCount
16 Word64
0)
instance (GH.HasField "pointerCount" GH.Slot Node'struct Std_.Word16) where
    fieldByLabel :: Field 'Slot Node'struct Word16
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'struct Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
3 BitCount
16 Word64
0)
instance (GH.HasField "preferredListEncoding" GH.Slot Node'struct ElementSize) where
    fieldByLabel :: Field 'Slot Node'struct ElementSize
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Node'struct ElementSize
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
3 BitCount
16 Word64
0)
instance (GH.HasField "isGroup" GH.Slot Node'struct Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'struct Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'struct Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
32 Word16
3 BitCount
1 Word64
0)
instance (GH.HasField "discriminantCount" GH.Slot Node'struct Std_.Word16) where
    fieldByLabel :: Field 'Slot Node'struct Word16
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'struct Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
48 Word16
3 BitCount
16 Word64
0)
instance (GH.HasField "discriminantOffset" GH.Slot Node'struct Std_.Word32) where
    fieldByLabel :: Field 'Slot Node'struct Word32
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'struct Word32
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
4 BitCount
32 Word64
0)
instance (GH.HasField "fields" GH.Slot Node'struct (R.List Field)) where
    fieldByLabel :: Field 'Slot Node'struct (List Field)
fieldByLabel  = (Word16 -> Field 'Slot Node'struct (List Field)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
3)
data Node'enum 
type instance (R.ReprFor Node'enum) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'enum) where
    typeId :: Word64
typeId  = Word64
13063450714778629528
instance (C.TypedStruct Node'enum) where
    numStructWords :: Word16
numStructWords  = Word16
5
    numStructPtrs :: Word16
numStructPtrs  = Word16
6
instance (C.Allocate Node'enum) where
    type AllocHint Node'enum = ()
    new :: AllocHint Node'enum
-> Message ('Mut s) -> m (Raw Node'enum ('Mut s))
new AllocHint Node'enum
_ = Message ('Mut s) -> m (Raw Node'enum ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'enum (C.Parsed Node'enum))
instance (C.AllocateList Node'enum) where
    type ListAllocHint Node'enum = Std_.Int
    newList :: ListAllocHint Node'enum
-> Message ('Mut s) -> m (Raw (List Node'enum) ('Mut s))
newList  = ListAllocHint Node'enum
-> Message ('Mut s) -> m (Raw (List Node'enum) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'enum (C.Parsed Node'enum))
data instance C.Parsed Node'enum
    = Node'enum' 
        {Parsed Node'enum -> Parsed (List Enumerant)
enumerants :: (RP.Parsed (R.List Enumerant))}
    deriving((forall x. Parsed Node'enum -> Rep (Parsed Node'enum) x)
-> (forall x. Rep (Parsed Node'enum) x -> Parsed Node'enum)
-> Generic (Parsed Node'enum)
forall x. Rep (Parsed Node'enum) x -> Parsed Node'enum
forall x. Parsed Node'enum -> Rep (Parsed Node'enum) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node'enum) x -> Parsed Node'enum
$cfrom :: forall x. Parsed Node'enum -> Rep (Parsed Node'enum) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'enum))
deriving instance (Std_.Eq (C.Parsed Node'enum))
instance (C.Parse Node'enum (C.Parsed Node'enum)) where
    parse :: Raw Node'enum 'Const -> m (Parsed Node'enum)
parse Raw Node'enum 'Const
raw_ = (Vector (Parsed Enumerant) -> Parsed Node'enum
Parsed (List Enumerant) -> Parsed Node'enum
Node'enum' (Vector (Parsed Enumerant) -> Parsed Node'enum)
-> m (Vector (Parsed Enumerant)) -> m (Parsed Node'enum)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'enum (List Enumerant)
-> Raw Node'enum 'Const -> m (Vector (Parsed Enumerant))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "enumerants" (Field 'Slot Node'enum (List Enumerant))
Field 'Slot Node'enum (List Enumerant)
#enumerants Raw Node'enum 'Const
raw_))
instance (C.Marshal Node'enum (C.Parsed Node'enum)) where
    marshalInto :: Raw Node'enum ('Mut s) -> Parsed Node'enum -> m ()
marshalInto Raw Node'enum ('Mut s)
raw_ Node'enum'{..} = (do
        (Field 'Slot Node'enum (List Enumerant)
-> Vector (Parsed Enumerant) -> Raw Node'enum ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "enumerants" (Field 'Slot Node'enum (List Enumerant))
Field 'Slot Node'enum (List Enumerant)
#enumerants Vector (Parsed Enumerant)
Parsed (List Enumerant)
enumerants Raw Node'enum ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "enumerants" GH.Slot Node'enum (R.List Enumerant)) where
    fieldByLabel :: Field 'Slot Node'enum (List Enumerant)
fieldByLabel  = (Word16 -> Field 'Slot Node'enum (List Enumerant)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
3)
data Node'interface 
type instance (R.ReprFor Node'interface) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'interface) where
    typeId :: Word64
typeId  = Word64
16728431493453586831
instance (C.TypedStruct Node'interface) where
    numStructWords :: Word16
numStructWords  = Word16
5
    numStructPtrs :: Word16
numStructPtrs  = Word16
6
instance (C.Allocate Node'interface) where
    type AllocHint Node'interface = ()
    new :: AllocHint Node'interface
-> Message ('Mut s) -> m (Raw Node'interface ('Mut s))
new AllocHint Node'interface
_ = Message ('Mut s) -> m (Raw Node'interface ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'interface (C.Parsed Node'interface))
instance (C.AllocateList Node'interface) where
    type ListAllocHint Node'interface = Std_.Int
    newList :: ListAllocHint Node'interface
-> Message ('Mut s) -> m (Raw (List Node'interface) ('Mut s))
newList  = ListAllocHint Node'interface
-> Message ('Mut s) -> m (Raw (List Node'interface) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'interface (C.Parsed Node'interface))
data instance C.Parsed Node'interface
    = Node'interface' 
        {Parsed Node'interface -> Parsed (List Method)
methods :: (RP.Parsed (R.List Method))
        ,Parsed Node'interface -> Parsed (List Superclass)
superclasses :: (RP.Parsed (R.List Superclass))}
    deriving((forall x. Parsed Node'interface -> Rep (Parsed Node'interface) x)
-> (forall x.
    Rep (Parsed Node'interface) x -> Parsed Node'interface)
-> Generic (Parsed Node'interface)
forall x. Rep (Parsed Node'interface) x -> Parsed Node'interface
forall x. Parsed Node'interface -> Rep (Parsed Node'interface) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node'interface) x -> Parsed Node'interface
$cfrom :: forall x. Parsed Node'interface -> Rep (Parsed Node'interface) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'interface))
deriving instance (Std_.Eq (C.Parsed Node'interface))
instance (C.Parse Node'interface (C.Parsed Node'interface)) where
    parse :: Raw Node'interface 'Const -> m (Parsed Node'interface)
parse Raw Node'interface 'Const
raw_ = (Vector (Parsed Method)
-> Vector (Parsed Superclass) -> Parsed Node'interface
Parsed (List Method)
-> Parsed (List Superclass) -> Parsed Node'interface
Node'interface' (Vector (Parsed Method)
 -> Vector (Parsed Superclass) -> Parsed Node'interface)
-> m (Vector (Parsed Method))
-> m (Vector (Parsed Superclass) -> Parsed Node'interface)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'interface (List Method)
-> Raw Node'interface 'Const -> m (Vector (Parsed Method))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "methods" (Field 'Slot Node'interface (List Method))
Field 'Slot Node'interface (List Method)
#methods Raw Node'interface 'Const
raw_)
                                  m (Vector (Parsed Superclass) -> Parsed Node'interface)
-> m (Vector (Parsed Superclass)) -> m (Parsed Node'interface)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'interface (List Superclass)
-> Raw Node'interface 'Const -> m (Vector (Parsed Superclass))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "superclasses" (Field 'Slot Node'interface (List Superclass))
Field 'Slot Node'interface (List Superclass)
#superclasses Raw Node'interface 'Const
raw_))
instance (C.Marshal Node'interface (C.Parsed Node'interface)) where
    marshalInto :: Raw Node'interface ('Mut s) -> Parsed Node'interface -> m ()
marshalInto Raw Node'interface ('Mut s)
raw_ Node'interface'{..} = (do
        (Field 'Slot Node'interface (List Method)
-> Vector (Parsed Method) -> Raw Node'interface ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "methods" (Field 'Slot Node'interface (List Method))
Field 'Slot Node'interface (List Method)
#methods Vector (Parsed Method)
Parsed (List Method)
methods Raw Node'interface ('Mut s)
raw_)
        (Field 'Slot Node'interface (List Superclass)
-> Vector (Parsed Superclass)
-> Raw Node'interface ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "superclasses" (Field 'Slot Node'interface (List Superclass))
Field 'Slot Node'interface (List Superclass)
#superclasses Vector (Parsed Superclass)
Parsed (List Superclass)
superclasses Raw Node'interface ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "methods" GH.Slot Node'interface (R.List Method)) where
    fieldByLabel :: Field 'Slot Node'interface (List Method)
fieldByLabel  = (Word16 -> Field 'Slot Node'interface (List Method)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
3)
instance (GH.HasField "superclasses" GH.Slot Node'interface (R.List Superclass)) where
    fieldByLabel :: Field 'Slot Node'interface (List Superclass)
fieldByLabel  = (Word16 -> Field 'Slot Node'interface (List Superclass)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
4)
data Node'const 
type instance (R.ReprFor Node'const) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'const) where
    typeId :: Word64
typeId  = Word64
12793219851699983392
instance (C.TypedStruct Node'const) where
    numStructWords :: Word16
numStructWords  = Word16
5
    numStructPtrs :: Word16
numStructPtrs  = Word16
6
instance (C.Allocate Node'const) where
    type AllocHint Node'const = ()
    new :: AllocHint Node'const
-> Message ('Mut s) -> m (Raw Node'const ('Mut s))
new AllocHint Node'const
_ = Message ('Mut s) -> m (Raw Node'const ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'const (C.Parsed Node'const))
instance (C.AllocateList Node'const) where
    type ListAllocHint Node'const = Std_.Int
    newList :: ListAllocHint Node'const
-> Message ('Mut s) -> m (Raw (List Node'const) ('Mut s))
newList  = ListAllocHint Node'const
-> Message ('Mut s) -> m (Raw (List Node'const) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'const (C.Parsed Node'const))
data instance C.Parsed Node'const
    = Node'const' 
        {Parsed Node'const -> Parsed Type
type_ :: (RP.Parsed Type)
        ,Parsed Node'const -> Parsed Value
value :: (RP.Parsed Value)}
    deriving((forall x. Parsed Node'const -> Rep (Parsed Node'const) x)
-> (forall x. Rep (Parsed Node'const) x -> Parsed Node'const)
-> Generic (Parsed Node'const)
forall x. Rep (Parsed Node'const) x -> Parsed Node'const
forall x. Parsed Node'const -> Rep (Parsed Node'const) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node'const) x -> Parsed Node'const
$cfrom :: forall x. Parsed Node'const -> Rep (Parsed Node'const) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'const))
deriving instance (Std_.Eq (C.Parsed Node'const))
instance (C.Parse Node'const (C.Parsed Node'const)) where
    parse :: Raw Node'const 'Const -> m (Parsed Node'const)
parse Raw Node'const 'Const
raw_ = (Parsed Type -> Parsed Value -> Parsed Node'const
Parsed Type -> Parsed Value -> Parsed Node'const
Node'const' (Parsed Type -> Parsed Value -> Parsed Node'const)
-> m (Parsed Type) -> m (Parsed Value -> Parsed Node'const)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'const Type
-> Raw Node'const 'Const -> m (Parsed Type)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "type_" (Field 'Slot Node'const Type)
Field 'Slot Node'const Type
#type_ Raw Node'const 'Const
raw_)
                              m (Parsed Value -> Parsed Node'const)
-> m (Parsed Value) -> m (Parsed Node'const)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'const Value
-> Raw Node'const 'Const -> m (Parsed Value)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "value" (Field 'Slot Node'const Value)
Field 'Slot Node'const Value
#value Raw Node'const 'Const
raw_))
instance (C.Marshal Node'const (C.Parsed Node'const)) where
    marshalInto :: Raw Node'const ('Mut s) -> Parsed Node'const -> m ()
marshalInto Raw Node'const ('Mut s)
raw_ Node'const'{..} = (do
        (Field 'Slot Node'const Type
-> Parsed Type -> Raw Node'const ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "type_" (Field 'Slot Node'const Type)
Field 'Slot Node'const Type
#type_ Parsed Type
Parsed Type
type_ Raw Node'const ('Mut s)
raw_)
        (Field 'Slot Node'const Value
-> Parsed Value -> Raw Node'const ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "value" (Field 'Slot Node'const Value)
Field 'Slot Node'const Value
#value Parsed Value
Parsed Value
value Raw Node'const ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "type_" GH.Slot Node'const Type) where
    fieldByLabel :: Field 'Slot Node'const Type
fieldByLabel  = (Word16 -> Field 'Slot Node'const Type
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
3)
instance (GH.HasField "value" GH.Slot Node'const Value) where
    fieldByLabel :: Field 'Slot Node'const Value
fieldByLabel  = (Word16 -> Field 'Slot Node'const Value
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
4)
data Node'annotation 
type instance (R.ReprFor Node'annotation) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'annotation) where
    typeId :: Word64
typeId  = Word64
17011813041836786320
instance (C.TypedStruct Node'annotation) where
    numStructWords :: Word16
numStructWords  = Word16
5
    numStructPtrs :: Word16
numStructPtrs  = Word16
6
instance (C.Allocate Node'annotation) where
    type AllocHint Node'annotation = ()
    new :: AllocHint Node'annotation
-> Message ('Mut s) -> m (Raw Node'annotation ('Mut s))
new AllocHint Node'annotation
_ = Message ('Mut s) -> m (Raw Node'annotation ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'annotation (C.Parsed Node'annotation))
instance (C.AllocateList Node'annotation) where
    type ListAllocHint Node'annotation = Std_.Int
    newList :: ListAllocHint Node'annotation
-> Message ('Mut s) -> m (Raw (List Node'annotation) ('Mut s))
newList  = ListAllocHint Node'annotation
-> Message ('Mut s) -> m (Raw (List Node'annotation) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'annotation (C.Parsed Node'annotation))
data instance C.Parsed Node'annotation
    = Node'annotation' 
        {Parsed Node'annotation -> Parsed Type
type_ :: (RP.Parsed Type)
        ,Parsed Node'annotation -> Parsed Bool
targetsFile :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsConst :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsEnum :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsEnumerant :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsStruct :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsField :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsUnion :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsGroup :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsInterface :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsMethod :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsParam :: (RP.Parsed Std_.Bool)
        ,Parsed Node'annotation -> Parsed Bool
targetsAnnotation :: (RP.Parsed Std_.Bool)}
    deriving((forall x.
 Parsed Node'annotation -> Rep (Parsed Node'annotation) x)
-> (forall x.
    Rep (Parsed Node'annotation) x -> Parsed Node'annotation)
-> Generic (Parsed Node'annotation)
forall x. Rep (Parsed Node'annotation) x -> Parsed Node'annotation
forall x. Parsed Node'annotation -> Rep (Parsed Node'annotation) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node'annotation) x -> Parsed Node'annotation
$cfrom :: forall x. Parsed Node'annotation -> Rep (Parsed Node'annotation) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'annotation))
deriving instance (Std_.Eq (C.Parsed Node'annotation))
instance (C.Parse Node'annotation (C.Parsed Node'annotation)) where
    parse :: Raw Node'annotation 'Const -> m (Parsed Node'annotation)
parse Raw Node'annotation 'Const
raw_ = (Parsed Type
-> Bool
-> Bool
-> Bool
-> Bool
-> Bool
-> Bool
-> Bool
-> Bool
-> Bool
-> Bool
-> Bool
-> Bool
-> Parsed Node'annotation
Parsed Type
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Bool
-> Parsed Node'annotation
Node'annotation' (Parsed Type
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Bool
 -> Parsed Node'annotation)
-> m (Parsed Type)
-> m (Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Parsed Node'annotation)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'annotation Type
-> Raw Node'annotation 'Const -> m (Parsed Type)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "type_" (Field 'Slot Node'annotation Type)
Field 'Slot Node'annotation Type
#type_ Raw Node'annotation 'Const
raw_)
                                   m (Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Parsed Node'annotation)
-> m Bool
-> m (Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsFile" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsFile Raw Node'annotation 'Const
raw_)
                                   m (Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Parsed Node'annotation)
-> m Bool
-> m (Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsConst" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsConst Raw Node'annotation 'Const
raw_)
                                   m (Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Parsed Node'annotation)
-> m Bool
-> m (Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsEnum" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsEnum Raw Node'annotation 'Const
raw_)
                                   m (Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Parsed Node'annotation)
-> m Bool
-> m (Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsEnumerant" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsEnumerant Raw Node'annotation 'Const
raw_)
                                   m (Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Parsed Node'annotation)
-> m Bool
-> m (Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Bool
      -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsStruct" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsStruct Raw Node'annotation 'Const
raw_)
                                   m (Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Bool
   -> Parsed Node'annotation)
-> m Bool
-> m (Bool
      -> Bool -> Bool -> Bool -> Bool -> Bool -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsField" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsField Raw Node'annotation 'Const
raw_)
                                   m (Bool
   -> Bool -> Bool -> Bool -> Bool -> Bool -> Parsed Node'annotation)
-> m Bool
-> m (Bool
      -> Bool -> Bool -> Bool -> Bool -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsUnion" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsUnion Raw Node'annotation 'Const
raw_)
                                   m (Bool -> Bool -> Bool -> Bool -> Bool -> Parsed Node'annotation)
-> m Bool
-> m (Bool -> Bool -> Bool -> Bool -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsGroup" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsGroup Raw Node'annotation 'Const
raw_)
                                   m (Bool -> Bool -> Bool -> Bool -> Parsed Node'annotation)
-> m Bool -> m (Bool -> Bool -> Bool -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsInterface" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsInterface Raw Node'annotation 'Const
raw_)
                                   m (Bool -> Bool -> Bool -> Parsed Node'annotation)
-> m Bool -> m (Bool -> Bool -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsMethod" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsMethod Raw Node'annotation 'Const
raw_)
                                   m (Bool -> Bool -> Parsed Node'annotation)
-> m Bool -> m (Bool -> Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsParam" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsParam Raw Node'annotation 'Const
raw_)
                                   m (Bool -> Parsed Node'annotation)
-> m Bool -> m (Parsed Node'annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'annotation Bool
-> Raw Node'annotation 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "targetsAnnotation" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsAnnotation Raw Node'annotation 'Const
raw_))
instance (C.Marshal Node'annotation (C.Parsed Node'annotation)) where
    marshalInto :: Raw Node'annotation ('Mut s) -> Parsed Node'annotation -> m ()
marshalInto Raw Node'annotation ('Mut s)
raw_ Node'annotation'{..} = (do
        (Field 'Slot Node'annotation Type
-> Parsed Type -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "type_" (Field 'Slot Node'annotation Type)
Field 'Slot Node'annotation Type
#type_ Parsed Type
Parsed Type
type_ Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsFile" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsFile Bool
Parsed Bool
targetsFile Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsConst" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsConst Bool
Parsed Bool
targetsConst Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsEnum" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsEnum Bool
Parsed Bool
targetsEnum Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsEnumerant" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsEnumerant Bool
Parsed Bool
targetsEnumerant Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsStruct" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsStruct Bool
Parsed Bool
targetsStruct Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsField" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsField Bool
Parsed Bool
targetsField Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsUnion" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsUnion Bool
Parsed Bool
targetsUnion Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsGroup" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsGroup Bool
Parsed Bool
targetsGroup Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsInterface" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsInterface Bool
Parsed Bool
targetsInterface Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsMethod" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsMethod Bool
Parsed Bool
targetsMethod Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsParam" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsParam Bool
Parsed Bool
targetsParam Raw Node'annotation ('Mut s)
raw_)
        (Field 'Slot Node'annotation Bool
-> Bool -> Raw Node'annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "targetsAnnotation" (Field 'Slot Node'annotation Bool)
Field 'Slot Node'annotation Bool
#targetsAnnotation Bool
Parsed Bool
targetsAnnotation Raw Node'annotation ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "type_" GH.Slot Node'annotation Type) where
    fieldByLabel :: Field 'Slot Node'annotation Type
fieldByLabel  = (Word16 -> Field 'Slot Node'annotation Type
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
3)
instance (GH.HasField "targetsFile" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
48 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsConst" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
49 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsEnum" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
50 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsEnumerant" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
51 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsStruct" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
52 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsField" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
53 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsUnion" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
54 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsGroup" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
55 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsInterface" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
56 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsMethod" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
57 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsParam" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
58 Word16
1 BitCount
1 Word64
0)
instance (GH.HasField "targetsAnnotation" GH.Slot Node'annotation Std_.Bool) where
    fieldByLabel :: Field 'Slot Node'annotation Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Node'annotation Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
59 Word16
1 BitCount
1 Word64
0)
data Node'Parameter 
type instance (R.ReprFor Node'Parameter) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'Parameter) where
    typeId :: Word64
typeId  = Word64
13353766412138554289
instance (C.TypedStruct Node'Parameter) where
    numStructWords :: Word16
numStructWords  = Word16
0
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Node'Parameter) where
    type AllocHint Node'Parameter = ()
    new :: AllocHint Node'Parameter
-> Message ('Mut s) -> m (Raw Node'Parameter ('Mut s))
new AllocHint Node'Parameter
_ = Message ('Mut s) -> m (Raw Node'Parameter ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'Parameter (C.Parsed Node'Parameter))
instance (C.AllocateList Node'Parameter) where
    type ListAllocHint Node'Parameter = Std_.Int
    newList :: ListAllocHint Node'Parameter
-> Message ('Mut s) -> m (Raw (List Node'Parameter) ('Mut s))
newList  = ListAllocHint Node'Parameter
-> Message ('Mut s) -> m (Raw (List Node'Parameter) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'Parameter (C.Parsed Node'Parameter))
data instance C.Parsed Node'Parameter
    = Node'Parameter 
        {Parsed Node'Parameter -> Parsed Text
name :: (RP.Parsed Basics.Text)}
    deriving((forall x. Parsed Node'Parameter -> Rep (Parsed Node'Parameter) x)
-> (forall x.
    Rep (Parsed Node'Parameter) x -> Parsed Node'Parameter)
-> Generic (Parsed Node'Parameter)
forall x. Rep (Parsed Node'Parameter) x -> Parsed Node'Parameter
forall x. Parsed Node'Parameter -> Rep (Parsed Node'Parameter) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node'Parameter) x -> Parsed Node'Parameter
$cfrom :: forall x. Parsed Node'Parameter -> Rep (Parsed Node'Parameter) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'Parameter))
deriving instance (Std_.Eq (C.Parsed Node'Parameter))
instance (C.Parse Node'Parameter (C.Parsed Node'Parameter)) where
    parse :: Raw Node'Parameter 'Const -> m (Parsed Node'Parameter)
parse Raw Node'Parameter 'Const
raw_ = (Text -> Parsed Node'Parameter
Parsed Text -> Parsed Node'Parameter
Node'Parameter (Text -> Parsed Node'Parameter)
-> m Text -> m (Parsed Node'Parameter)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'Parameter Text
-> Raw Node'Parameter 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "name" (Field 'Slot Node'Parameter Text)
Field 'Slot Node'Parameter Text
#name Raw Node'Parameter 'Const
raw_))
instance (C.Marshal Node'Parameter (C.Parsed Node'Parameter)) where
    marshalInto :: Raw Node'Parameter ('Mut s) -> Parsed Node'Parameter -> m ()
marshalInto Raw Node'Parameter ('Mut s)
raw_ Node'Parameter{..} = (do
        (Field 'Slot Node'Parameter Text
-> Text -> Raw Node'Parameter ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "name" (Field 'Slot Node'Parameter Text)
Field 'Slot Node'Parameter Text
#name Text
Parsed Text
name Raw Node'Parameter ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "name" GH.Slot Node'Parameter Basics.Text) where
    fieldByLabel :: Field 'Slot Node'Parameter Text
fieldByLabel  = (Word16 -> Field 'Slot Node'Parameter Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
data Node'NestedNode 
type instance (R.ReprFor Node'NestedNode) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'NestedNode) where
    typeId :: Word64
typeId  = Word64
16050641862814319170
instance (C.TypedStruct Node'NestedNode) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Node'NestedNode) where
    type AllocHint Node'NestedNode = ()
    new :: AllocHint Node'NestedNode
-> Message ('Mut s) -> m (Raw Node'NestedNode ('Mut s))
new AllocHint Node'NestedNode
_ = Message ('Mut s) -> m (Raw Node'NestedNode ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'NestedNode (C.Parsed Node'NestedNode))
instance (C.AllocateList Node'NestedNode) where
    type ListAllocHint Node'NestedNode = Std_.Int
    newList :: ListAllocHint Node'NestedNode
-> Message ('Mut s) -> m (Raw (List Node'NestedNode) ('Mut s))
newList  = ListAllocHint Node'NestedNode
-> Message ('Mut s) -> m (Raw (List Node'NestedNode) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'NestedNode (C.Parsed Node'NestedNode))
data instance C.Parsed Node'NestedNode
    = Node'NestedNode 
        {Parsed Node'NestedNode -> Parsed Text
name :: (RP.Parsed Basics.Text)
        ,Parsed Node'NestedNode -> Parsed Word64
id :: (RP.Parsed Std_.Word64)}
    deriving((forall x.
 Parsed Node'NestedNode -> Rep (Parsed Node'NestedNode) x)
-> (forall x.
    Rep (Parsed Node'NestedNode) x -> Parsed Node'NestedNode)
-> Generic (Parsed Node'NestedNode)
forall x. Rep (Parsed Node'NestedNode) x -> Parsed Node'NestedNode
forall x. Parsed Node'NestedNode -> Rep (Parsed Node'NestedNode) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node'NestedNode) x -> Parsed Node'NestedNode
$cfrom :: forall x. Parsed Node'NestedNode -> Rep (Parsed Node'NestedNode) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'NestedNode))
deriving instance (Std_.Eq (C.Parsed Node'NestedNode))
instance (C.Parse Node'NestedNode (C.Parsed Node'NestedNode)) where
    parse :: Raw Node'NestedNode 'Const -> m (Parsed Node'NestedNode)
parse Raw Node'NestedNode 'Const
raw_ = (Text -> Word64 -> Parsed Node'NestedNode
Parsed Text -> Parsed Word64 -> Parsed Node'NestedNode
Node'NestedNode (Text -> Word64 -> Parsed Node'NestedNode)
-> m Text -> m (Word64 -> Parsed Node'NestedNode)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'NestedNode Text
-> Raw Node'NestedNode 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "name" (Field 'Slot Node'NestedNode Text)
Field 'Slot Node'NestedNode Text
#name Raw Node'NestedNode 'Const
raw_)
                                  m (Word64 -> Parsed Node'NestedNode)
-> m Word64 -> m (Parsed Node'NestedNode)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'NestedNode Word64
-> Raw Node'NestedNode 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "id" (Field 'Slot Node'NestedNode Word64)
Field 'Slot Node'NestedNode Word64
#id Raw Node'NestedNode 'Const
raw_))
instance (C.Marshal Node'NestedNode (C.Parsed Node'NestedNode)) where
    marshalInto :: Raw Node'NestedNode ('Mut s) -> Parsed Node'NestedNode -> m ()
marshalInto Raw Node'NestedNode ('Mut s)
raw_ Node'NestedNode{..} = (do
        (Field 'Slot Node'NestedNode Text
-> Text -> Raw Node'NestedNode ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "name" (Field 'Slot Node'NestedNode Text)
Field 'Slot Node'NestedNode Text
#name Text
Parsed Text
name Raw Node'NestedNode ('Mut s)
raw_)
        (Field 'Slot Node'NestedNode Word64
-> Word64 -> Raw Node'NestedNode ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "id" (Field 'Slot Node'NestedNode Word64)
Field 'Slot Node'NestedNode Word64
#id Word64
Parsed Word64
id Raw Node'NestedNode ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "name" GH.Slot Node'NestedNode Basics.Text) where
    fieldByLabel :: Field 'Slot Node'NestedNode Text
fieldByLabel  = (Word16 -> Field 'Slot Node'NestedNode Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "id" GH.Slot Node'NestedNode Std_.Word64) where
    fieldByLabel :: Field 'Slot Node'NestedNode Word64
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Node'NestedNode Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
64 Word64
0)
data Node'SourceInfo 
type instance (R.ReprFor Node'SourceInfo) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'SourceInfo) where
    typeId :: Word64
typeId  = Word64
17549997658772559790
instance (C.TypedStruct Node'SourceInfo) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
2
instance (C.Allocate Node'SourceInfo) where
    type AllocHint Node'SourceInfo = ()
    new :: AllocHint Node'SourceInfo
-> Message ('Mut s) -> m (Raw Node'SourceInfo ('Mut s))
new AllocHint Node'SourceInfo
_ = Message ('Mut s) -> m (Raw Node'SourceInfo ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'SourceInfo (C.Parsed Node'SourceInfo))
instance (C.AllocateList Node'SourceInfo) where
    type ListAllocHint Node'SourceInfo = Std_.Int
    newList :: ListAllocHint Node'SourceInfo
-> Message ('Mut s) -> m (Raw (List Node'SourceInfo) ('Mut s))
newList  = ListAllocHint Node'SourceInfo
-> Message ('Mut s) -> m (Raw (List Node'SourceInfo) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'SourceInfo (C.Parsed Node'SourceInfo))
data instance C.Parsed Node'SourceInfo
    = Node'SourceInfo 
        {Parsed Node'SourceInfo -> Parsed Word64
id :: (RP.Parsed Std_.Word64)
        ,Parsed Node'SourceInfo -> Parsed Text
docComment :: (RP.Parsed Basics.Text)
        ,Parsed Node'SourceInfo -> Parsed (List Node'SourceInfo'Member)
members :: (RP.Parsed (R.List Node'SourceInfo'Member))}
    deriving((forall x.
 Parsed Node'SourceInfo -> Rep (Parsed Node'SourceInfo) x)
-> (forall x.
    Rep (Parsed Node'SourceInfo) x -> Parsed Node'SourceInfo)
-> Generic (Parsed Node'SourceInfo)
forall x. Rep (Parsed Node'SourceInfo) x -> Parsed Node'SourceInfo
forall x. Parsed Node'SourceInfo -> Rep (Parsed Node'SourceInfo) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Node'SourceInfo) x -> Parsed Node'SourceInfo
$cfrom :: forall x. Parsed Node'SourceInfo -> Rep (Parsed Node'SourceInfo) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'SourceInfo))
deriving instance (Std_.Eq (C.Parsed Node'SourceInfo))
instance (C.Parse Node'SourceInfo (C.Parsed Node'SourceInfo)) where
    parse :: Raw Node'SourceInfo 'Const -> m (Parsed Node'SourceInfo)
parse Raw Node'SourceInfo 'Const
raw_ = (Word64
-> Text
-> Vector (Parsed Node'SourceInfo'Member)
-> Parsed Node'SourceInfo
Parsed Word64
-> Parsed Text
-> Parsed (List Node'SourceInfo'Member)
-> Parsed Node'SourceInfo
Node'SourceInfo (Word64
 -> Text
 -> Vector (Parsed Node'SourceInfo'Member)
 -> Parsed Node'SourceInfo)
-> m Word64
-> m (Text
      -> Vector (Parsed Node'SourceInfo'Member)
      -> Parsed Node'SourceInfo)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'SourceInfo Word64
-> Raw Node'SourceInfo 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "id" (Field 'Slot Node'SourceInfo Word64)
Field 'Slot Node'SourceInfo Word64
#id Raw Node'SourceInfo 'Const
raw_)
                                  m (Text
   -> Vector (Parsed Node'SourceInfo'Member)
   -> Parsed Node'SourceInfo)
-> m Text
-> m (Vector (Parsed Node'SourceInfo'Member)
      -> Parsed Node'SourceInfo)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'SourceInfo Text
-> Raw Node'SourceInfo 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "docComment" (Field 'Slot Node'SourceInfo Text)
Field 'Slot Node'SourceInfo Text
#docComment Raw Node'SourceInfo 'Const
raw_)
                                  m (Vector (Parsed Node'SourceInfo'Member)
   -> Parsed Node'SourceInfo)
-> m (Vector (Parsed Node'SourceInfo'Member))
-> m (Parsed Node'SourceInfo)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Node'SourceInfo (List Node'SourceInfo'Member)
-> Raw Node'SourceInfo 'Const
-> m (Vector (Parsed Node'SourceInfo'Member))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "members"
  (Field 'Slot Node'SourceInfo (List Node'SourceInfo'Member))
Field 'Slot Node'SourceInfo (List Node'SourceInfo'Member)
#members Raw Node'SourceInfo 'Const
raw_))
instance (C.Marshal Node'SourceInfo (C.Parsed Node'SourceInfo)) where
    marshalInto :: Raw Node'SourceInfo ('Mut s) -> Parsed Node'SourceInfo -> m ()
marshalInto Raw Node'SourceInfo ('Mut s)
raw_ Node'SourceInfo{..} = (do
        (Field 'Slot Node'SourceInfo Word64
-> Word64 -> Raw Node'SourceInfo ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "id" (Field 'Slot Node'SourceInfo Word64)
Field 'Slot Node'SourceInfo Word64
#id Word64
Parsed Word64
id Raw Node'SourceInfo ('Mut s)
raw_)
        (Field 'Slot Node'SourceInfo Text
-> Text -> Raw Node'SourceInfo ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "docComment" (Field 'Slot Node'SourceInfo Text)
Field 'Slot Node'SourceInfo Text
#docComment Text
Parsed Text
docComment Raw Node'SourceInfo ('Mut s)
raw_)
        (Field 'Slot Node'SourceInfo (List Node'SourceInfo'Member)
-> Vector (Parsed Node'SourceInfo'Member)
-> Raw Node'SourceInfo ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "members"
  (Field 'Slot Node'SourceInfo (List Node'SourceInfo'Member))
Field 'Slot Node'SourceInfo (List Node'SourceInfo'Member)
#members Vector (Parsed Node'SourceInfo'Member)
Parsed (List Node'SourceInfo'Member)
members Raw Node'SourceInfo ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "id" GH.Slot Node'SourceInfo Std_.Word64) where
    fieldByLabel :: Field 'Slot Node'SourceInfo Word64
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Node'SourceInfo Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
64 Word64
0)
instance (GH.HasField "docComment" GH.Slot Node'SourceInfo Basics.Text) where
    fieldByLabel :: Field 'Slot Node'SourceInfo Text
fieldByLabel  = (Word16 -> Field 'Slot Node'SourceInfo Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "members" GH.Slot Node'SourceInfo (R.List Node'SourceInfo'Member)) where
    fieldByLabel :: Field 'Slot Node'SourceInfo (List Node'SourceInfo'Member)
fieldByLabel  = (Word16 -> Field 'Slot Node'SourceInfo (List Node'SourceInfo'Member)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
1)
data Node'SourceInfo'Member 
type instance (R.ReprFor Node'SourceInfo'Member) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Node'SourceInfo'Member) where
    typeId :: Word64
typeId  = Word64
14031686161526562722
instance (C.TypedStruct Node'SourceInfo'Member) where
    numStructWords :: Word16
numStructWords  = Word16
0
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Node'SourceInfo'Member) where
    type AllocHint Node'SourceInfo'Member = ()
    new :: AllocHint Node'SourceInfo'Member
-> Message ('Mut s) -> m (Raw Node'SourceInfo'Member ('Mut s))
new AllocHint Node'SourceInfo'Member
_ = Message ('Mut s) -> m (Raw Node'SourceInfo'Member ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Node'SourceInfo'Member (C.Parsed Node'SourceInfo'Member))
instance (C.AllocateList Node'SourceInfo'Member) where
    type ListAllocHint Node'SourceInfo'Member = Std_.Int
    newList :: ListAllocHint Node'SourceInfo'Member
-> Message ('Mut s)
-> m (Raw (List Node'SourceInfo'Member) ('Mut s))
newList  = ListAllocHint Node'SourceInfo'Member
-> Message ('Mut s)
-> m (Raw (List Node'SourceInfo'Member) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Node'SourceInfo'Member (C.Parsed Node'SourceInfo'Member))
data instance C.Parsed Node'SourceInfo'Member
    = Node'SourceInfo'Member 
        {Parsed Node'SourceInfo'Member -> Parsed Text
docComment :: (RP.Parsed Basics.Text)}
    deriving((forall x.
 Parsed Node'SourceInfo'Member
 -> Rep (Parsed Node'SourceInfo'Member) x)
-> (forall x.
    Rep (Parsed Node'SourceInfo'Member) x
    -> Parsed Node'SourceInfo'Member)
-> Generic (Parsed Node'SourceInfo'Member)
forall x.
Rep (Parsed Node'SourceInfo'Member) x
-> Parsed Node'SourceInfo'Member
forall x.
Parsed Node'SourceInfo'Member
-> Rep (Parsed Node'SourceInfo'Member) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed Node'SourceInfo'Member) x
-> Parsed Node'SourceInfo'Member
$cfrom :: forall x.
Parsed Node'SourceInfo'Member
-> Rep (Parsed Node'SourceInfo'Member) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Node'SourceInfo'Member))
deriving instance (Std_.Eq (C.Parsed Node'SourceInfo'Member))
instance (C.Parse Node'SourceInfo'Member (C.Parsed Node'SourceInfo'Member)) where
    parse :: Raw Node'SourceInfo'Member 'Const
-> m (Parsed Node'SourceInfo'Member)
parse Raw Node'SourceInfo'Member 'Const
raw_ = (Text -> Parsed Node'SourceInfo'Member
Parsed Text -> Parsed Node'SourceInfo'Member
Node'SourceInfo'Member (Text -> Parsed Node'SourceInfo'Member)
-> m Text -> m (Parsed Node'SourceInfo'Member)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Node'SourceInfo'Member Text
-> Raw Node'SourceInfo'Member 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "docComment" (Field 'Slot Node'SourceInfo'Member Text)
Field 'Slot Node'SourceInfo'Member Text
#docComment Raw Node'SourceInfo'Member 'Const
raw_))
instance (C.Marshal Node'SourceInfo'Member (C.Parsed Node'SourceInfo'Member)) where
    marshalInto :: Raw Node'SourceInfo'Member ('Mut s)
-> Parsed Node'SourceInfo'Member -> m ()
marshalInto Raw Node'SourceInfo'Member ('Mut s)
raw_ Node'SourceInfo'Member{..} = (do
        (Field 'Slot Node'SourceInfo'Member Text
-> Text -> Raw Node'SourceInfo'Member ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "docComment" (Field 'Slot Node'SourceInfo'Member Text)
Field 'Slot Node'SourceInfo'Member Text
#docComment Text
Parsed Text
docComment Raw Node'SourceInfo'Member ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "docComment" GH.Slot Node'SourceInfo'Member Basics.Text) where
    fieldByLabel :: Field 'Slot Node'SourceInfo'Member Text
fieldByLabel  = (Word16 -> Field 'Slot Node'SourceInfo'Member Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
data Field 
type instance (R.ReprFor Field) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Field) where
    typeId :: Word64
typeId  = Word64
11145653318641710175
instance (C.TypedStruct Field) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
4
instance (C.Allocate Field) where
    type AllocHint Field = ()
    new :: AllocHint Field -> Message ('Mut s) -> m (Raw Field ('Mut s))
new AllocHint Field
_ = Message ('Mut s) -> m (Raw Field ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Field (C.Parsed Field))
instance (C.AllocateList Field) where
    type ListAllocHint Field = Std_.Int
    newList :: ListAllocHint Field
-> Message ('Mut s) -> m (Raw (List Field) ('Mut s))
newList  = ListAllocHint Field
-> Message ('Mut s) -> m (Raw (List Field) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Field (C.Parsed Field))
data instance C.Parsed Field
    = Field 
        {Parsed Field -> Parsed Text
name :: (RP.Parsed Basics.Text)
        ,Parsed Field -> Parsed Word16
codeOrder :: (RP.Parsed Std_.Word16)
        ,Parsed Field -> Parsed (List Annotation)
annotations :: (RP.Parsed (R.List Annotation))
        ,Parsed Field -> Parsed Word16
discriminantValue :: (RP.Parsed Std_.Word16)
        ,Parsed Field -> Parsed Field'ordinal
ordinal :: (RP.Parsed Field'ordinal)
        ,Parsed Field -> Parsed (Which Field)
union' :: (C.Parsed (GH.Which Field))}
    deriving((forall x. Parsed Field -> Rep (Parsed Field) x)
-> (forall x. Rep (Parsed Field) x -> Parsed Field)
-> Generic (Parsed Field)
forall x. Rep (Parsed Field) x -> Parsed Field
forall x. Parsed Field -> Rep (Parsed Field) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Field) x -> Parsed Field
$cfrom :: forall x. Parsed Field -> Rep (Parsed Field) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Field))
deriving instance (Std_.Eq (C.Parsed Field))
instance (C.Parse Field (C.Parsed Field)) where
    parse :: Raw Field 'Const -> m (Parsed Field)
parse Raw Field 'Const
raw_ = (Text
-> Word16
-> Vector (Parsed Annotation)
-> Word16
-> Parsed Field'ordinal
-> Parsed (Which Field)
-> Parsed Field
Parsed Text
-> Parsed Word16
-> Parsed (List Annotation)
-> Parsed Word16
-> Parsed Field'ordinal
-> Parsed (Which Field)
-> Parsed Field
Field (Text
 -> Word16
 -> Vector (Parsed Annotation)
 -> Word16
 -> Parsed Field'ordinal
 -> Parsed (Which Field)
 -> Parsed Field)
-> m Text
-> m (Word16
      -> Vector (Parsed Annotation)
      -> Word16
      -> Parsed Field'ordinal
      -> Parsed (Which Field)
      -> Parsed Field)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Field Text -> Raw Field 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "name" (Field 'Slot Field Text)
Field 'Slot Field Text
#name Raw Field 'Const
raw_)
                        m (Word16
   -> Vector (Parsed Annotation)
   -> Word16
   -> Parsed Field'ordinal
   -> Parsed (Which Field)
   -> Parsed Field)
-> m Word16
-> m (Vector (Parsed Annotation)
      -> Word16
      -> Parsed Field'ordinal
      -> Parsed (Which Field)
      -> Parsed Field)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Field Word16 -> Raw Field 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "codeOrder" (Field 'Slot Field Word16)
Field 'Slot Field Word16
#codeOrder Raw Field 'Const
raw_)
                        m (Vector (Parsed Annotation)
   -> Word16
   -> Parsed Field'ordinal
   -> Parsed (Which Field)
   -> Parsed Field)
-> m (Vector (Parsed Annotation))
-> m (Word16
      -> Parsed Field'ordinal -> Parsed (Which Field) -> Parsed Field)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Field (List Annotation)
-> Raw Field 'Const -> m (Vector (Parsed Annotation))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "annotations" (Field 'Slot Field (List Annotation))
Field 'Slot Field (List Annotation)
#annotations Raw Field 'Const
raw_)
                        m (Word16
   -> Parsed Field'ordinal -> Parsed (Which Field) -> Parsed Field)
-> m Word16
-> m (Parsed Field'ordinal -> Parsed (Which Field) -> Parsed Field)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Field Word16 -> Raw Field 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "discriminantValue" (Field 'Slot Field Word16)
Field 'Slot Field Word16
#discriminantValue Raw Field 'Const
raw_)
                        m (Parsed Field'ordinal -> Parsed (Which Field) -> Parsed Field)
-> m (Parsed Field'ordinal)
-> m (Parsed (Which Field) -> Parsed Field)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Group Field Field'ordinal
-> Raw Field 'Const -> m (Parsed Field'ordinal)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "ordinal" (Field 'Group Field Field'ordinal)
Field 'Group Field Field'ordinal
#ordinal Raw Field 'Const
raw_)
                        m (Parsed (Which Field) -> Parsed Field)
-> m (Parsed (Which Field)) -> m (Parsed Field)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Raw (Which Field) 'Const -> m (Parsed (Which Field))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Field 'Const -> Raw (Which Field) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Field 'Const
raw_)))
instance (C.Marshal Field (C.Parsed Field)) where
    marshalInto :: Raw Field ('Mut s) -> Parsed Field -> m ()
marshalInto Raw Field ('Mut s)
raw_ Field{..} = (do
        (Field 'Slot Field Text -> Text -> Raw Field ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "name" (Field 'Slot Field Text)
Field 'Slot Field Text
#name Text
Parsed Text
name Raw Field ('Mut s)
raw_)
        (Field 'Slot Field Word16 -> Word16 -> Raw Field ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "codeOrder" (Field 'Slot Field Word16)
Field 'Slot Field Word16
#codeOrder Word16
Parsed Word16
codeOrder Raw Field ('Mut s)
raw_)
        (Field 'Slot Field (List Annotation)
-> Vector (Parsed Annotation) -> Raw Field ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "annotations" (Field 'Slot Field (List Annotation))
Field 'Slot Field (List Annotation)
#annotations Vector (Parsed Annotation)
Parsed (List Annotation)
annotations Raw Field ('Mut s)
raw_)
        (Field 'Slot Field Word16 -> Word16 -> Raw Field ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "discriminantValue" (Field 'Slot Field Word16)
Field 'Slot Field Word16
#discriminantValue Word16
Parsed Word16
discriminantValue Raw Field ('Mut s)
raw_)
        (do
            Raw Field'ordinal ('Mut s)
group_ <- (Field 'Group Field Field'ordinal
-> Raw Field ('Mut s) -> m (Raw Field'ordinal ('Mut s))
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Field k a b -> Raw a mut -> m (Raw b mut)
GH.readField IsLabel "ordinal" (Field 'Group Field Field'ordinal)
Field 'Group Field Field'ordinal
#ordinal Raw Field ('Mut s)
raw_)
            (Raw Field'ordinal ('Mut s) -> Parsed Field'ordinal -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Field'ordinal ('Mut s)
group_ Parsed Field'ordinal
Parsed Field'ordinal
ordinal)
            )
        (Raw (Which Field) ('Mut s) -> Parsed (Which Field) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Field ('Mut s) -> Raw (Which Field) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Field ('Mut s)
raw_) Parsed (Which Field)
union')
        )
instance (GH.HasUnion Field) where
    unionField :: Field 'Slot Field Word16
unionField  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Field Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
16 Word64
0)
    data RawWhich Field mut_
        = RW_Field'slot (R.Raw Field'slot mut_)
        | RW_Field'group (R.Raw Field'group mut_)
        | RW_Field'unknown' Std_.Word16
    internalWhich :: Word16 -> Raw Field mut -> m (RawWhich Field mut)
internalWhich Word16
tag_ Raw Field mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw Field'slot mut -> RawWhich Field mut
forall (mut_ :: Mutability).
Raw Field'slot mut_ -> RawWhich Field mut_
RW_Field'slot (Raw Field'slot mut -> RawWhich Field mut)
-> m (Raw Field'slot mut) -> m (RawWhich Field mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Field Field'slot
-> Raw Field mut -> m (Raw Field'slot mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "slot" (Variant 'Group Field Field'slot)
Variant 'Group Field Field'slot
#slot Raw Field mut
struct_))
        Word16
1 ->
            (Raw Field'group mut -> RawWhich Field mut
forall (mut_ :: Mutability).
Raw Field'group mut_ -> RawWhich Field mut_
RW_Field'group (Raw Field'group mut -> RawWhich Field mut)
-> m (Raw Field'group mut) -> m (RawWhich Field mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Field Field'group
-> Raw Field mut -> m (Raw Field'group mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "group" (Variant 'Group Field Field'group)
Variant 'Group Field Field'group
#group Raw Field mut
struct_))
        Word16
_ ->
            (RawWhich Field mut -> m (RawWhich Field mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Field mut
forall (mut_ :: Mutability). Word16 -> RawWhich Field mut_
RW_Field'unknown' Word16
tag_))
    data Which Field
instance (GH.HasVariant "slot" GH.Group Field Field'slot) where
    variantByLabel :: Variant 'Group Field Field'slot
variantByLabel  = (Field 'Group Field Field'slot
-> Word16 -> Variant 'Group Field Field'slot
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Field Field'slot
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
0)
instance (GH.HasVariant "group" GH.Group Field Field'group) where
    variantByLabel :: Variant 'Group Field Field'group
variantByLabel  = (Field 'Group Field Field'group
-> Word16 -> Variant 'Group Field Field'group
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Field Field'group
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
1)
data instance C.Parsed (GH.Which Field)
    = Field'slot (RP.Parsed Field'slot)
    | Field'group (RP.Parsed Field'group)
    | Field'unknown' Std_.Word16
    deriving((forall x. Parsed (Which Field) -> Rep (Parsed (Which Field)) x)
-> (forall x. Rep (Parsed (Which Field)) x -> Parsed (Which Field))
-> Generic (Parsed (Which Field))
forall x. Rep (Parsed (Which Field)) x -> Parsed (Which Field)
forall x. Parsed (Which Field) -> Rep (Parsed (Which Field)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed (Which Field)) x -> Parsed (Which Field)
$cfrom :: forall x. Parsed (Which Field) -> Rep (Parsed (Which Field)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Field)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Field)))
instance (C.Parse (GH.Which Field) (C.Parsed (GH.Which Field))) where
    parse :: Raw (Which Field) 'Const -> m (Parsed (Which Field))
parse Raw (Which Field) 'Const
raw_ = (do
        RawWhich Field 'Const
rawWhich_ <- (Raw (Which Field) 'Const -> m (RawWhich Field 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Field) 'Const
raw_)
        case RawWhich Field 'Const
rawWhich_ of
            (RW_Field'slot rawArg_) ->
                (Parsed Field'slot -> Parsed (Which Field)
Parsed Field'slot -> Parsed (Which Field)
Field'slot (Parsed Field'slot -> Parsed (Which Field))
-> m (Parsed Field'slot) -> m (Parsed (Which Field))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Field'slot 'Const -> m (Parsed Field'slot)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Field'slot 'Const
rawArg_))
            (RW_Field'group rawArg_) ->
                (Parsed Field'group -> Parsed (Which Field)
Parsed Field'group -> Parsed (Which Field)
Field'group (Parsed Field'group -> Parsed (Which Field))
-> m (Parsed Field'group) -> m (Parsed (Which Field))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Field'group 'Const -> m (Parsed Field'group)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Field'group 'Const
rawArg_))
            (RW_Field'unknown' tag_) ->
                (Parsed (Which Field) -> m (Parsed (Which Field))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Field)
Field'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Field) (C.Parsed (GH.Which Field))) where
    marshalInto :: Raw (Which Field) ('Mut s) -> Parsed (Which Field) -> m ()
marshalInto Raw (Which Field) ('Mut s)
raw_ Parsed (Which Field)
parsed_ = case Parsed (Which Field)
parsed_ of
        (Field'slot arg_) ->
            (do
                Raw Field'slot ('Mut s)
rawGroup_ <- (Variant 'Group Field Field'slot
-> Raw Field ('Mut s) -> m (Raw Field'slot ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "slot" (Variant 'Group Field Field'slot)
Variant 'Group Field Field'slot
#slot (Raw (Which Field) ('Mut s) -> Raw Field ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Field) ('Mut s)
raw_))
                (Raw Field'slot ('Mut s) -> Parsed Field'slot -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Field'slot ('Mut s)
rawGroup_ Parsed Field'slot
Parsed Field'slot
arg_)
                )
        (Field'group arg_) ->
            (do
                Raw Field'group ('Mut s)
rawGroup_ <- (Variant 'Group Field Field'group
-> Raw Field ('Mut s) -> m (Raw Field'group ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "group" (Variant 'Group Field Field'group)
Variant 'Group Field Field'group
#group (Raw (Which Field) ('Mut s) -> Raw Field ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Field) ('Mut s)
raw_))
                (Raw Field'group ('Mut s) -> Parsed Field'group -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Field'group ('Mut s)
rawGroup_ Parsed Field'group
Parsed Field'group
arg_)
                )
        (Field'unknown' tag_) ->
            (Field 'Slot Field Word16 -> Word16 -> Raw Field ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Field Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Field) ('Mut s) -> Raw Field ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Field) ('Mut s)
raw_))
instance (GH.HasField "name" GH.Slot Field Basics.Text) where
    fieldByLabel :: Field 'Slot Field Text
fieldByLabel  = (Word16 -> Field 'Slot Field Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "codeOrder" GH.Slot Field Std_.Word16) where
    fieldByLabel :: Field 'Slot Field Word16
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Field Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
16 Word64
0)
instance (GH.HasField "annotations" GH.Slot Field (R.List Annotation)) where
    fieldByLabel :: Field 'Slot Field (List Annotation)
fieldByLabel  = (Word16 -> Field 'Slot Field (List Annotation)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
1)
instance (GH.HasField "discriminantValue" GH.Slot Field Std_.Word16) where
    fieldByLabel :: Field 'Slot Field Word16
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Field Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
0 BitCount
16 Word64
65535)
instance (GH.HasField "ordinal" GH.Group Field Field'ordinal) where
    fieldByLabel :: Field 'Group Field Field'ordinal
fieldByLabel  = Field 'Group Field Field'ordinal
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField
data Field'slot 
type instance (R.ReprFor Field'slot) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Field'slot) where
    typeId :: Word64
typeId  = Word64
14133145859926553711
instance (C.TypedStruct Field'slot) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
4
instance (C.Allocate Field'slot) where
    type AllocHint Field'slot = ()
    new :: AllocHint Field'slot
-> Message ('Mut s) -> m (Raw Field'slot ('Mut s))
new AllocHint Field'slot
_ = Message ('Mut s) -> m (Raw Field'slot ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Field'slot (C.Parsed Field'slot))
instance (C.AllocateList Field'slot) where
    type ListAllocHint Field'slot = Std_.Int
    newList :: ListAllocHint Field'slot
-> Message ('Mut s) -> m (Raw (List Field'slot) ('Mut s))
newList  = ListAllocHint Field'slot
-> Message ('Mut s) -> m (Raw (List Field'slot) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Field'slot (C.Parsed Field'slot))
data instance C.Parsed Field'slot
    = Field'slot' 
        {Parsed Field'slot -> Parsed Word32
offset :: (RP.Parsed Std_.Word32)
        ,Parsed Field'slot -> Parsed Type
type_ :: (RP.Parsed Type)
        ,Parsed Field'slot -> Parsed Value
defaultValue :: (RP.Parsed Value)
        ,Parsed Field'slot -> Parsed Bool
hadExplicitDefault :: (RP.Parsed Std_.Bool)}
    deriving((forall x. Parsed Field'slot -> Rep (Parsed Field'slot) x)
-> (forall x. Rep (Parsed Field'slot) x -> Parsed Field'slot)
-> Generic (Parsed Field'slot)
forall x. Rep (Parsed Field'slot) x -> Parsed Field'slot
forall x. Parsed Field'slot -> Rep (Parsed Field'slot) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Field'slot) x -> Parsed Field'slot
$cfrom :: forall x. Parsed Field'slot -> Rep (Parsed Field'slot) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Field'slot))
deriving instance (Std_.Eq (C.Parsed Field'slot))
instance (C.Parse Field'slot (C.Parsed Field'slot)) where
    parse :: Raw Field'slot 'Const -> m (Parsed Field'slot)
parse Raw Field'slot 'Const
raw_ = (Word32 -> Parsed Type -> Parsed Value -> Bool -> Parsed Field'slot
Parsed Word32
-> Parsed Type -> Parsed Value -> Parsed Bool -> Parsed Field'slot
Field'slot' (Word32
 -> Parsed Type -> Parsed Value -> Bool -> Parsed Field'slot)
-> m Word32
-> m (Parsed Type -> Parsed Value -> Bool -> Parsed Field'slot)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Field'slot Word32 -> Raw Field'slot 'Const -> m Word32
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "offset" (Field 'Slot Field'slot Word32)
Field 'Slot Field'slot Word32
#offset Raw Field'slot 'Const
raw_)
                              m (Parsed Type -> Parsed Value -> Bool -> Parsed Field'slot)
-> m (Parsed Type) -> m (Parsed Value -> Bool -> Parsed Field'slot)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Field'slot Type
-> Raw Field'slot 'Const -> m (Parsed Type)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "type_" (Field 'Slot Field'slot Type)
Field 'Slot Field'slot Type
#type_ Raw Field'slot 'Const
raw_)
                              m (Parsed Value -> Bool -> Parsed Field'slot)
-> m (Parsed Value) -> m (Bool -> Parsed Field'slot)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Field'slot Value
-> Raw Field'slot 'Const -> m (Parsed Value)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "defaultValue" (Field 'Slot Field'slot Value)
Field 'Slot Field'slot Value
#defaultValue Raw Field'slot 'Const
raw_)
                              m (Bool -> Parsed Field'slot) -> m Bool -> m (Parsed Field'slot)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Field'slot Bool -> Raw Field'slot 'Const -> m Bool
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "hadExplicitDefault" (Field 'Slot Field'slot Bool)
Field 'Slot Field'slot Bool
#hadExplicitDefault Raw Field'slot 'Const
raw_))
instance (C.Marshal Field'slot (C.Parsed Field'slot)) where
    marshalInto :: Raw Field'slot ('Mut s) -> Parsed Field'slot -> m ()
marshalInto Raw Field'slot ('Mut s)
raw_ Field'slot'{..} = (do
        (Field 'Slot Field'slot Word32
-> Word32 -> Raw Field'slot ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "offset" (Field 'Slot Field'slot Word32)
Field 'Slot Field'slot Word32
#offset Word32
Parsed Word32
offset Raw Field'slot ('Mut s)
raw_)
        (Field 'Slot Field'slot Type
-> Parsed Type -> Raw Field'slot ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "type_" (Field 'Slot Field'slot Type)
Field 'Slot Field'slot Type
#type_ Parsed Type
Parsed Type
type_ Raw Field'slot ('Mut s)
raw_)
        (Field 'Slot Field'slot Value
-> Parsed Value -> Raw Field'slot ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "defaultValue" (Field 'Slot Field'slot Value)
Field 'Slot Field'slot Value
#defaultValue Parsed Value
Parsed Value
defaultValue Raw Field'slot ('Mut s)
raw_)
        (Field 'Slot Field'slot Bool
-> Bool -> Raw Field'slot ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "hadExplicitDefault" (Field 'Slot Field'slot Bool)
Field 'Slot Field'slot Bool
#hadExplicitDefault Bool
Parsed Bool
hadExplicitDefault Raw Field'slot ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "offset" GH.Slot Field'slot Std_.Word32) where
    fieldByLabel :: Field 'Slot Field'slot Word32
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Field'slot Word32
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
32 Word16
0 BitCount
32 Word64
0)
instance (GH.HasField "type_" GH.Slot Field'slot Type) where
    fieldByLabel :: Field 'Slot Field'slot Type
fieldByLabel  = (Word16 -> Field 'Slot Field'slot Type
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
2)
instance (GH.HasField "defaultValue" GH.Slot Field'slot Value) where
    fieldByLabel :: Field 'Slot Field'slot Value
fieldByLabel  = (Word16 -> Field 'Slot Field'slot Value
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
3)
instance (GH.HasField "hadExplicitDefault" GH.Slot Field'slot Std_.Bool) where
    fieldByLabel :: Field 'Slot Field'slot Bool
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Field'slot Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
2 BitCount
1 Word64
0)
data Field'group 
type instance (R.ReprFor Field'group) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Field'group) where
    typeId :: Word64
typeId  = Word64
14626792032033250577
instance (C.TypedStruct Field'group) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
4
instance (C.Allocate Field'group) where
    type AllocHint Field'group = ()
    new :: AllocHint Field'group
-> Message ('Mut s) -> m (Raw Field'group ('Mut s))
new AllocHint Field'group
_ = Message ('Mut s) -> m (Raw Field'group ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Field'group (C.Parsed Field'group))
instance (C.AllocateList Field'group) where
    type ListAllocHint Field'group = Std_.Int
    newList :: ListAllocHint Field'group
-> Message ('Mut s) -> m (Raw (List Field'group) ('Mut s))
newList  = ListAllocHint Field'group
-> Message ('Mut s) -> m (Raw (List Field'group) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Field'group (C.Parsed Field'group))
data instance C.Parsed Field'group
    = Field'group' 
        {Parsed Field'group -> Parsed Word64
typeId :: (RP.Parsed Std_.Word64)}
    deriving((forall x. Parsed Field'group -> Rep (Parsed Field'group) x)
-> (forall x. Rep (Parsed Field'group) x -> Parsed Field'group)
-> Generic (Parsed Field'group)
forall x. Rep (Parsed Field'group) x -> Parsed Field'group
forall x. Parsed Field'group -> Rep (Parsed Field'group) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Field'group) x -> Parsed Field'group
$cfrom :: forall x. Parsed Field'group -> Rep (Parsed Field'group) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Field'group))
deriving instance (Std_.Eq (C.Parsed Field'group))
instance (C.Parse Field'group (C.Parsed Field'group)) where
    parse :: Raw Field'group 'Const -> m (Parsed Field'group)
parse Raw Field'group 'Const
raw_ = (Word64 -> Parsed Field'group
Parsed Word64 -> Parsed Field'group
Field'group' (Word64 -> Parsed Field'group)
-> m Word64 -> m (Parsed Field'group)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Field'group Word64
-> Raw Field'group 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "typeId" (Field 'Slot Field'group Word64)
Field 'Slot Field'group Word64
#typeId Raw Field'group 'Const
raw_))
instance (C.Marshal Field'group (C.Parsed Field'group)) where
    marshalInto :: Raw Field'group ('Mut s) -> Parsed Field'group -> m ()
marshalInto Raw Field'group ('Mut s)
raw_ Field'group'{..} = (do
        (Field 'Slot Field'group Word64
-> Word64 -> Raw Field'group ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "typeId" (Field 'Slot Field'group Word64)
Field 'Slot Field'group Word64
#typeId Word64
Parsed Word64
typeId Raw Field'group ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "typeId" GH.Slot Field'group Std_.Word64) where
    fieldByLabel :: Field 'Slot Field'group Word64
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Field'group Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
2 BitCount
64 Word64
0)
data Field'ordinal 
type instance (R.ReprFor Field'ordinal) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Field'ordinal) where
    typeId :: Word64
typeId  = Word64
13515537513213004774
instance (C.TypedStruct Field'ordinal) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
4
instance (C.Allocate Field'ordinal) where
    type AllocHint Field'ordinal = ()
    new :: AllocHint Field'ordinal
-> Message ('Mut s) -> m (Raw Field'ordinal ('Mut s))
new AllocHint Field'ordinal
_ = Message ('Mut s) -> m (Raw Field'ordinal ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Field'ordinal (C.Parsed Field'ordinal))
instance (C.AllocateList Field'ordinal) where
    type ListAllocHint Field'ordinal = Std_.Int
    newList :: ListAllocHint Field'ordinal
-> Message ('Mut s) -> m (Raw (List Field'ordinal) ('Mut s))
newList  = ListAllocHint Field'ordinal
-> Message ('Mut s) -> m (Raw (List Field'ordinal) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Field'ordinal (C.Parsed Field'ordinal))
data instance C.Parsed Field'ordinal
    = Field'ordinal' 
        {Parsed Field'ordinal -> Parsed (Which Field'ordinal)
union' :: (C.Parsed (GH.Which Field'ordinal))}
    deriving((forall x. Parsed Field'ordinal -> Rep (Parsed Field'ordinal) x)
-> (forall x. Rep (Parsed Field'ordinal) x -> Parsed Field'ordinal)
-> Generic (Parsed Field'ordinal)
forall x. Rep (Parsed Field'ordinal) x -> Parsed Field'ordinal
forall x. Parsed Field'ordinal -> Rep (Parsed Field'ordinal) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Field'ordinal) x -> Parsed Field'ordinal
$cfrom :: forall x. Parsed Field'ordinal -> Rep (Parsed Field'ordinal) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Field'ordinal))
deriving instance (Std_.Eq (C.Parsed Field'ordinal))
instance (C.Parse Field'ordinal (C.Parsed Field'ordinal)) where
    parse :: Raw Field'ordinal 'Const -> m (Parsed Field'ordinal)
parse Raw Field'ordinal 'Const
raw_ = (Parsed (Which Field'ordinal) -> Parsed Field'ordinal
Field'ordinal' (Parsed (Which Field'ordinal) -> Parsed Field'ordinal)
-> m (Parsed (Which Field'ordinal)) -> m (Parsed Field'ordinal)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Which Field'ordinal) 'Const
-> m (Parsed (Which Field'ordinal))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Field'ordinal 'Const -> Raw (Which Field'ordinal) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Field'ordinal 'Const
raw_)))
instance (C.Marshal Field'ordinal (C.Parsed Field'ordinal)) where
    marshalInto :: Raw Field'ordinal ('Mut s) -> Parsed Field'ordinal -> m ()
marshalInto Raw Field'ordinal ('Mut s)
raw_ Field'ordinal'{..} = (do
        (Raw (Which Field'ordinal) ('Mut s)
-> Parsed (Which Field'ordinal) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Field'ordinal ('Mut s) -> Raw (Which Field'ordinal) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Field'ordinal ('Mut s)
raw_) Parsed (Which Field'ordinal)
union')
        )
instance (GH.HasUnion Field'ordinal) where
    unionField :: Field 'Slot Field'ordinal Word16
unionField  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Field'ordinal Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
1 BitCount
16 Word64
0)
    data RawWhich Field'ordinal mut_
        = RW_Field'ordinal'implicit (R.Raw () mut_)
        | RW_Field'ordinal'explicit (R.Raw Std_.Word16 mut_)
        | RW_Field'ordinal'unknown' Std_.Word16
    internalWhich :: Word16 -> Raw Field'ordinal mut -> m (RawWhich Field'ordinal mut)
internalWhich Word16
tag_ Raw Field'ordinal mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw () mut -> RawWhich Field'ordinal mut
forall (mut_ :: Mutability).
Raw () mut_ -> RawWhich Field'ordinal mut_
RW_Field'ordinal'implicit (Raw () mut -> RawWhich Field'ordinal mut)
-> m (Raw () mut) -> m (RawWhich Field'ordinal mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Field'ordinal ()
-> Raw Field'ordinal mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "implicit" (Variant 'Slot Field'ordinal ())
Variant 'Slot Field'ordinal ()
#implicit Raw Field'ordinal mut
struct_))
        Word16
1 ->
            (Raw Word16 mut -> RawWhich Field'ordinal mut
forall (mut_ :: Mutability).
Raw Word16 mut_ -> RawWhich Field'ordinal mut_
RW_Field'ordinal'explicit (Raw Word16 mut -> RawWhich Field'ordinal mut)
-> m (Raw Word16 mut) -> m (RawWhich Field'ordinal mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Field'ordinal Word16
-> Raw Field'ordinal mut -> m (Raw Word16 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "explicit" (Variant 'Slot Field'ordinal Word16)
Variant 'Slot Field'ordinal Word16
#explicit Raw Field'ordinal mut
struct_))
        Word16
_ ->
            (RawWhich Field'ordinal mut -> m (RawWhich Field'ordinal mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Field'ordinal mut
forall (mut_ :: Mutability). Word16 -> RawWhich Field'ordinal mut_
RW_Field'ordinal'unknown' Word16
tag_))
    data Which Field'ordinal
instance (GH.HasVariant "implicit" GH.Slot Field'ordinal ()) where
    variantByLabel :: Variant 'Slot Field'ordinal ()
variantByLabel  = (Field 'Slot Field'ordinal ()
-> Word16 -> Variant 'Slot Field'ordinal ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Field'ordinal ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
0)
instance (GH.HasVariant "explicit" GH.Slot Field'ordinal Std_.Word16) where
    variantByLabel :: Variant 'Slot Field'ordinal Word16
variantByLabel  = (Field 'Slot Field'ordinal Word16
-> Word16 -> Variant 'Slot Field'ordinal Word16
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Field'ordinal Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
32 Word16
1 BitCount
16 Word64
0) Word16
1)
data instance C.Parsed (GH.Which Field'ordinal)
    = Field'ordinal'implicit 
    | Field'ordinal'explicit (RP.Parsed Std_.Word16)
    | Field'ordinal'unknown' Std_.Word16
    deriving((forall x.
 Parsed (Which Field'ordinal)
 -> Rep (Parsed (Which Field'ordinal)) x)
-> (forall x.
    Rep (Parsed (Which Field'ordinal)) x
    -> Parsed (Which Field'ordinal))
-> Generic (Parsed (Which Field'ordinal))
forall x.
Rep (Parsed (Which Field'ordinal)) x
-> Parsed (Which Field'ordinal)
forall x.
Parsed (Which Field'ordinal)
-> Rep (Parsed (Which Field'ordinal)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed (Which Field'ordinal)) x
-> Parsed (Which Field'ordinal)
$cfrom :: forall x.
Parsed (Which Field'ordinal)
-> Rep (Parsed (Which Field'ordinal)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Field'ordinal)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Field'ordinal)))
instance (C.Parse (GH.Which Field'ordinal) (C.Parsed (GH.Which Field'ordinal))) where
    parse :: Raw (Which Field'ordinal) 'Const
-> m (Parsed (Which Field'ordinal))
parse Raw (Which Field'ordinal) 'Const
raw_ = (do
        RawWhich Field'ordinal 'Const
rawWhich_ <- (Raw (Which Field'ordinal) 'Const
-> m (RawWhich Field'ordinal 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Field'ordinal) 'Const
raw_)
        case RawWhich Field'ordinal 'Const
rawWhich_ of
            (RW_Field'ordinal'implicit _) ->
                (Parsed (Which Field'ordinal) -> m (Parsed (Which Field'ordinal))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Field'ordinal)
Field'ordinal'implicit)
            (RW_Field'ordinal'explicit rawArg_) ->
                (Word16 -> Parsed (Which Field'ordinal)
Parsed Word16 -> Parsed (Which Field'ordinal)
Field'ordinal'explicit (Word16 -> Parsed (Which Field'ordinal))
-> m Word16 -> m (Parsed (Which Field'ordinal))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Word16 'Const -> m Word16
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Word16 'Const
rawArg_))
            (RW_Field'ordinal'unknown' tag_) ->
                (Parsed (Which Field'ordinal) -> m (Parsed (Which Field'ordinal))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Field'ordinal)
Field'ordinal'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Field'ordinal) (C.Parsed (GH.Which Field'ordinal))) where
    marshalInto :: Raw (Which Field'ordinal) ('Mut s)
-> Parsed (Which Field'ordinal) -> m ()
marshalInto Raw (Which Field'ordinal) ('Mut s)
raw_ Parsed (Which Field'ordinal)
parsed_ = case Parsed (Which Field'ordinal)
parsed_ of
        (Parsed (Which Field'ordinal)
Field'ordinal'implicit) ->
            (Variant 'Slot Field'ordinal ()
-> () -> Raw Field'ordinal ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "implicit" (Variant 'Slot Field'ordinal ())
Variant 'Slot Field'ordinal ()
#implicit () (Raw (Which Field'ordinal) ('Mut s) -> Raw Field'ordinal ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Field'ordinal) ('Mut s)
raw_))
        (Field'ordinal'explicit arg_) ->
            (Variant 'Slot Field'ordinal Word16
-> Word16 -> Raw Field'ordinal ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "explicit" (Variant 'Slot Field'ordinal Word16)
Variant 'Slot Field'ordinal Word16
#explicit Word16
Parsed Word16
arg_ (Raw (Which Field'ordinal) ('Mut s) -> Raw Field'ordinal ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Field'ordinal) ('Mut s)
raw_))
        (Field'ordinal'unknown' tag_) ->
            (Field 'Slot Field'ordinal Word16
-> Word16 -> Raw Field'ordinal ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Field'ordinal Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Field'ordinal) ('Mut s) -> Raw Field'ordinal ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Field'ordinal) ('Mut s)
raw_))
field'noDiscriminant :: Std_.Word16
field'noDiscriminant :: Word16
field'noDiscriminant  = (Word64 -> Word16
forall a. IsWord a => Word64 -> a
C.fromWord Word64
65535)
data Enumerant 
type instance (R.ReprFor Enumerant) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Enumerant) where
    typeId :: Word64
typeId  = Word64
10919677598968879693
instance (C.TypedStruct Enumerant) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
2
instance (C.Allocate Enumerant) where
    type AllocHint Enumerant = ()
    new :: AllocHint Enumerant
-> Message ('Mut s) -> m (Raw Enumerant ('Mut s))
new AllocHint Enumerant
_ = Message ('Mut s) -> m (Raw Enumerant ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Enumerant (C.Parsed Enumerant))
instance (C.AllocateList Enumerant) where
    type ListAllocHint Enumerant = Std_.Int
    newList :: ListAllocHint Enumerant
-> Message ('Mut s) -> m (Raw (List Enumerant) ('Mut s))
newList  = ListAllocHint Enumerant
-> Message ('Mut s) -> m (Raw (List Enumerant) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Enumerant (C.Parsed Enumerant))
data instance C.Parsed Enumerant
    = Enumerant 
        {Parsed Enumerant -> Parsed Text
name :: (RP.Parsed Basics.Text)
        ,Parsed Enumerant -> Parsed Word16
codeOrder :: (RP.Parsed Std_.Word16)
        ,Parsed Enumerant -> Parsed (List Annotation)
annotations :: (RP.Parsed (R.List Annotation))}
    deriving((forall x. Parsed Enumerant -> Rep (Parsed Enumerant) x)
-> (forall x. Rep (Parsed Enumerant) x -> Parsed Enumerant)
-> Generic (Parsed Enumerant)
forall x. Rep (Parsed Enumerant) x -> Parsed Enumerant
forall x. Parsed Enumerant -> Rep (Parsed Enumerant) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Enumerant) x -> Parsed Enumerant
$cfrom :: forall x. Parsed Enumerant -> Rep (Parsed Enumerant) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Enumerant))
deriving instance (Std_.Eq (C.Parsed Enumerant))
instance (C.Parse Enumerant (C.Parsed Enumerant)) where
    parse :: Raw Enumerant 'Const -> m (Parsed Enumerant)
parse Raw Enumerant 'Const
raw_ = (Text -> Word16 -> Vector (Parsed Annotation) -> Parsed Enumerant
Parsed Text
-> Parsed Word16 -> Parsed (List Annotation) -> Parsed Enumerant
Enumerant (Text -> Word16 -> Vector (Parsed Annotation) -> Parsed Enumerant)
-> m Text
-> m (Word16 -> Vector (Parsed Annotation) -> Parsed Enumerant)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Enumerant Text -> Raw Enumerant 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "name" (Field 'Slot Enumerant Text)
Field 'Slot Enumerant Text
#name Raw Enumerant 'Const
raw_)
                            m (Word16 -> Vector (Parsed Annotation) -> Parsed Enumerant)
-> m Word16 -> m (Vector (Parsed Annotation) -> Parsed Enumerant)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Enumerant Word16 -> Raw Enumerant 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "codeOrder" (Field 'Slot Enumerant Word16)
Field 'Slot Enumerant Word16
#codeOrder Raw Enumerant 'Const
raw_)
                            m (Vector (Parsed Annotation) -> Parsed Enumerant)
-> m (Vector (Parsed Annotation)) -> m (Parsed Enumerant)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Enumerant (List Annotation)
-> Raw Enumerant 'Const -> m (Vector (Parsed Annotation))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "annotations" (Field 'Slot Enumerant (List Annotation))
Field 'Slot Enumerant (List Annotation)
#annotations Raw Enumerant 'Const
raw_))
instance (C.Marshal Enumerant (C.Parsed Enumerant)) where
    marshalInto :: Raw Enumerant ('Mut s) -> Parsed Enumerant -> m ()
marshalInto Raw Enumerant ('Mut s)
raw_ Enumerant{..} = (do
        (Field 'Slot Enumerant Text
-> Text -> Raw Enumerant ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "name" (Field 'Slot Enumerant Text)
Field 'Slot Enumerant Text
#name Text
Parsed Text
name Raw Enumerant ('Mut s)
raw_)
        (Field 'Slot Enumerant Word16
-> Word16 -> Raw Enumerant ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "codeOrder" (Field 'Slot Enumerant Word16)
Field 'Slot Enumerant Word16
#codeOrder Word16
Parsed Word16
codeOrder Raw Enumerant ('Mut s)
raw_)
        (Field 'Slot Enumerant (List Annotation)
-> Vector (Parsed Annotation) -> Raw Enumerant ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "annotations" (Field 'Slot Enumerant (List Annotation))
Field 'Slot Enumerant (List Annotation)
#annotations Vector (Parsed Annotation)
Parsed (List Annotation)
annotations Raw Enumerant ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "name" GH.Slot Enumerant Basics.Text) where
    fieldByLabel :: Field 'Slot Enumerant Text
fieldByLabel  = (Word16 -> Field 'Slot Enumerant Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "codeOrder" GH.Slot Enumerant Std_.Word16) where
    fieldByLabel :: Field 'Slot Enumerant Word16
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Enumerant Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
16 Word64
0)
instance (GH.HasField "annotations" GH.Slot Enumerant (R.List Annotation)) where
    fieldByLabel :: Field 'Slot Enumerant (List Annotation)
fieldByLabel  = (Word16 -> Field 'Slot Enumerant (List Annotation)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
1)
data Superclass 
type instance (R.ReprFor Superclass) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Superclass) where
    typeId :: Word64
typeId  = Word64
12220001500510083064
instance (C.TypedStruct Superclass) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Superclass) where
    type AllocHint Superclass = ()
    new :: AllocHint Superclass
-> Message ('Mut s) -> m (Raw Superclass ('Mut s))
new AllocHint Superclass
_ = Message ('Mut s) -> m (Raw Superclass ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Superclass (C.Parsed Superclass))
instance (C.AllocateList Superclass) where
    type ListAllocHint Superclass = Std_.Int
    newList :: ListAllocHint Superclass
-> Message ('Mut s) -> m (Raw (List Superclass) ('Mut s))
newList  = ListAllocHint Superclass
-> Message ('Mut s) -> m (Raw (List Superclass) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Superclass (C.Parsed Superclass))
data instance C.Parsed Superclass
    = Superclass 
        {Parsed Superclass -> Parsed Word64
id :: (RP.Parsed Std_.Word64)
        ,Parsed Superclass -> Parsed Brand
brand :: (RP.Parsed Brand)}
    deriving((forall x. Parsed Superclass -> Rep (Parsed Superclass) x)
-> (forall x. Rep (Parsed Superclass) x -> Parsed Superclass)
-> Generic (Parsed Superclass)
forall x. Rep (Parsed Superclass) x -> Parsed Superclass
forall x. Parsed Superclass -> Rep (Parsed Superclass) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Superclass) x -> Parsed Superclass
$cfrom :: forall x. Parsed Superclass -> Rep (Parsed Superclass) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Superclass))
deriving instance (Std_.Eq (C.Parsed Superclass))
instance (C.Parse Superclass (C.Parsed Superclass)) where
    parse :: Raw Superclass 'Const -> m (Parsed Superclass)
parse Raw Superclass 'Const
raw_ = (Word64 -> Parsed Brand -> Parsed Superclass
Parsed Word64 -> Parsed Brand -> Parsed Superclass
Superclass (Word64 -> Parsed Brand -> Parsed Superclass)
-> m Word64 -> m (Parsed Brand -> Parsed Superclass)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Superclass Word64 -> Raw Superclass 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "id" (Field 'Slot Superclass Word64)
Field 'Slot Superclass Word64
#id Raw Superclass 'Const
raw_)
                             m (Parsed Brand -> Parsed Superclass)
-> m (Parsed Brand) -> m (Parsed Superclass)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Superclass Brand
-> Raw Superclass 'Const -> m (Parsed Brand)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "brand" (Field 'Slot Superclass Brand)
Field 'Slot Superclass Brand
#brand Raw Superclass 'Const
raw_))
instance (C.Marshal Superclass (C.Parsed Superclass)) where
    marshalInto :: Raw Superclass ('Mut s) -> Parsed Superclass -> m ()
marshalInto Raw Superclass ('Mut s)
raw_ Superclass{..} = (do
        (Field 'Slot Superclass Word64
-> Word64 -> Raw Superclass ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "id" (Field 'Slot Superclass Word64)
Field 'Slot Superclass Word64
#id Word64
Parsed Word64
id Raw Superclass ('Mut s)
raw_)
        (Field 'Slot Superclass Brand
-> Parsed Brand -> Raw Superclass ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "brand" (Field 'Slot Superclass Brand)
Field 'Slot Superclass Brand
#brand Parsed Brand
Parsed Brand
brand Raw Superclass ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "id" GH.Slot Superclass Std_.Word64) where
    fieldByLabel :: Field 'Slot Superclass Word64
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Superclass Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
64 Word64
0)
instance (GH.HasField "brand" GH.Slot Superclass Brand) where
    fieldByLabel :: Field 'Slot Superclass Brand
fieldByLabel  = (Word16 -> Field 'Slot Superclass Brand
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
data Method 
type instance (R.ReprFor Method) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Method) where
    typeId :: Word64
typeId  = Word64
10736806783679155584
instance (C.TypedStruct Method) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
5
instance (C.Allocate Method) where
    type AllocHint Method = ()
    new :: AllocHint Method -> Message ('Mut s) -> m (Raw Method ('Mut s))
new AllocHint Method
_ = Message ('Mut s) -> m (Raw Method ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Method (C.Parsed Method))
instance (C.AllocateList Method) where
    type ListAllocHint Method = Std_.Int
    newList :: ListAllocHint Method
-> Message ('Mut s) -> m (Raw (List Method) ('Mut s))
newList  = ListAllocHint Method
-> Message ('Mut s) -> m (Raw (List Method) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Method (C.Parsed Method))
data instance C.Parsed Method
    = Method 
        {Parsed Method -> Parsed Text
name :: (RP.Parsed Basics.Text)
        ,Parsed Method -> Parsed Word16
codeOrder :: (RP.Parsed Std_.Word16)
        ,Parsed Method -> Parsed Word64
paramStructType :: (RP.Parsed Std_.Word64)
        ,Parsed Method -> Parsed Word64
resultStructType :: (RP.Parsed Std_.Word64)
        ,Parsed Method -> Parsed (List Annotation)
annotations :: (RP.Parsed (R.List Annotation))
        ,Parsed Method -> Parsed Brand
paramBrand :: (RP.Parsed Brand)
        ,Parsed Method -> Parsed Brand
resultBrand :: (RP.Parsed Brand)
        ,Parsed Method -> Parsed (List Node'Parameter)
implicitParameters :: (RP.Parsed (R.List Node'Parameter))}
    deriving((forall x. Parsed Method -> Rep (Parsed Method) x)
-> (forall x. Rep (Parsed Method) x -> Parsed Method)
-> Generic (Parsed Method)
forall x. Rep (Parsed Method) x -> Parsed Method
forall x. Parsed Method -> Rep (Parsed Method) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Method) x -> Parsed Method
$cfrom :: forall x. Parsed Method -> Rep (Parsed Method) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Method))
deriving instance (Std_.Eq (C.Parsed Method))
instance (C.Parse Method (C.Parsed Method)) where
    parse :: Raw Method 'Const -> m (Parsed Method)
parse Raw Method 'Const
raw_ = (Text
-> Word16
-> Word64
-> Word64
-> Vector (Parsed Annotation)
-> Parsed Brand
-> Parsed Brand
-> Vector (Parsed Node'Parameter)
-> Parsed Method
Parsed Text
-> Parsed Word16
-> Parsed Word64
-> Parsed Word64
-> Parsed (List Annotation)
-> Parsed Brand
-> Parsed Brand
-> Parsed (List Node'Parameter)
-> Parsed Method
Method (Text
 -> Word16
 -> Word64
 -> Word64
 -> Vector (Parsed Annotation)
 -> Parsed Brand
 -> Parsed Brand
 -> Vector (Parsed Node'Parameter)
 -> Parsed Method)
-> m Text
-> m (Word16
      -> Word64
      -> Word64
      -> Vector (Parsed Annotation)
      -> Parsed Brand
      -> Parsed Brand
      -> Vector (Parsed Node'Parameter)
      -> Parsed Method)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Method Text -> Raw Method 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "name" (Field 'Slot Method Text)
Field 'Slot Method Text
#name Raw Method 'Const
raw_)
                         m (Word16
   -> Word64
   -> Word64
   -> Vector (Parsed Annotation)
   -> Parsed Brand
   -> Parsed Brand
   -> Vector (Parsed Node'Parameter)
   -> Parsed Method)
-> m Word16
-> m (Word64
      -> Word64
      -> Vector (Parsed Annotation)
      -> Parsed Brand
      -> Parsed Brand
      -> Vector (Parsed Node'Parameter)
      -> Parsed Method)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Method Word16 -> Raw Method 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "codeOrder" (Field 'Slot Method Word16)
Field 'Slot Method Word16
#codeOrder Raw Method 'Const
raw_)
                         m (Word64
   -> Word64
   -> Vector (Parsed Annotation)
   -> Parsed Brand
   -> Parsed Brand
   -> Vector (Parsed Node'Parameter)
   -> Parsed Method)
-> m Word64
-> m (Word64
      -> Vector (Parsed Annotation)
      -> Parsed Brand
      -> Parsed Brand
      -> Vector (Parsed Node'Parameter)
      -> Parsed Method)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Method Word64 -> Raw Method 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "paramStructType" (Field 'Slot Method Word64)
Field 'Slot Method Word64
#paramStructType Raw Method 'Const
raw_)
                         m (Word64
   -> Vector (Parsed Annotation)
   -> Parsed Brand
   -> Parsed Brand
   -> Vector (Parsed Node'Parameter)
   -> Parsed Method)
-> m Word64
-> m (Vector (Parsed Annotation)
      -> Parsed Brand
      -> Parsed Brand
      -> Vector (Parsed Node'Parameter)
      -> Parsed Method)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Method Word64 -> Raw Method 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "resultStructType" (Field 'Slot Method Word64)
Field 'Slot Method Word64
#resultStructType Raw Method 'Const
raw_)
                         m (Vector (Parsed Annotation)
   -> Parsed Brand
   -> Parsed Brand
   -> Vector (Parsed Node'Parameter)
   -> Parsed Method)
-> m (Vector (Parsed Annotation))
-> m (Parsed Brand
      -> Parsed Brand -> Vector (Parsed Node'Parameter) -> Parsed Method)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Method (List Annotation)
-> Raw Method 'Const -> m (Vector (Parsed Annotation))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "annotations" (Field 'Slot Method (List Annotation))
Field 'Slot Method (List Annotation)
#annotations Raw Method 'Const
raw_)
                         m (Parsed Brand
   -> Parsed Brand -> Vector (Parsed Node'Parameter) -> Parsed Method)
-> m (Parsed Brand)
-> m (Parsed Brand
      -> Vector (Parsed Node'Parameter) -> Parsed Method)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Method Brand -> Raw Method 'Const -> m (Parsed Brand)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "paramBrand" (Field 'Slot Method Brand)
Field 'Slot Method Brand
#paramBrand Raw Method 'Const
raw_)
                         m (Parsed Brand -> Vector (Parsed Node'Parameter) -> Parsed Method)
-> m (Parsed Brand)
-> m (Vector (Parsed Node'Parameter) -> Parsed Method)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Method Brand -> Raw Method 'Const -> m (Parsed Brand)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "resultBrand" (Field 'Slot Method Brand)
Field 'Slot Method Brand
#resultBrand Raw Method 'Const
raw_)
                         m (Vector (Parsed Node'Parameter) -> Parsed Method)
-> m (Vector (Parsed Node'Parameter)) -> m (Parsed Method)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Method (List Node'Parameter)
-> Raw Method 'Const -> m (Vector (Parsed Node'Parameter))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "implicitParameters" (Field 'Slot Method (List Node'Parameter))
Field 'Slot Method (List Node'Parameter)
#implicitParameters Raw Method 'Const
raw_))
instance (C.Marshal Method (C.Parsed Method)) where
    marshalInto :: Raw Method ('Mut s) -> Parsed Method -> m ()
marshalInto Raw Method ('Mut s)
raw_ Method{..} = (do
        (Field 'Slot Method Text -> Text -> Raw Method ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "name" (Field 'Slot Method Text)
Field 'Slot Method Text
#name Text
Parsed Text
name Raw Method ('Mut s)
raw_)
        (Field 'Slot Method Word16 -> Word16 -> Raw Method ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "codeOrder" (Field 'Slot Method Word16)
Field 'Slot Method Word16
#codeOrder Word16
Parsed Word16
codeOrder Raw Method ('Mut s)
raw_)
        (Field 'Slot Method Word64 -> Word64 -> Raw Method ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "paramStructType" (Field 'Slot Method Word64)
Field 'Slot Method Word64
#paramStructType Word64
Parsed Word64
paramStructType Raw Method ('Mut s)
raw_)
        (Field 'Slot Method Word64 -> Word64 -> Raw Method ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "resultStructType" (Field 'Slot Method Word64)
Field 'Slot Method Word64
#resultStructType Word64
Parsed Word64
resultStructType Raw Method ('Mut s)
raw_)
        (Field 'Slot Method (List Annotation)
-> Vector (Parsed Annotation) -> Raw Method ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "annotations" (Field 'Slot Method (List Annotation))
Field 'Slot Method (List Annotation)
#annotations Vector (Parsed Annotation)
Parsed (List Annotation)
annotations Raw Method ('Mut s)
raw_)
        (Field 'Slot Method Brand
-> Parsed Brand -> Raw Method ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "paramBrand" (Field 'Slot Method Brand)
Field 'Slot Method Brand
#paramBrand Parsed Brand
Parsed Brand
paramBrand Raw Method ('Mut s)
raw_)
        (Field 'Slot Method Brand
-> Parsed Brand -> Raw Method ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "resultBrand" (Field 'Slot Method Brand)
Field 'Slot Method Brand
#resultBrand Parsed Brand
Parsed Brand
resultBrand Raw Method ('Mut s)
raw_)
        (Field 'Slot Method (List Node'Parameter)
-> Vector (Parsed Node'Parameter) -> Raw Method ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "implicitParameters" (Field 'Slot Method (List Node'Parameter))
Field 'Slot Method (List Node'Parameter)
#implicitParameters Vector (Parsed Node'Parameter)
Parsed (List Node'Parameter)
implicitParameters Raw Method ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "name" GH.Slot Method Basics.Text) where
    fieldByLabel :: Field 'Slot Method Text
fieldByLabel  = (Word16 -> Field 'Slot Method Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "codeOrder" GH.Slot Method Std_.Word16) where
    fieldByLabel :: Field 'Slot Method Word16
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Method Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
16 Word64
0)
instance (GH.HasField "paramStructType" GH.Slot Method Std_.Word64) where
    fieldByLabel :: Field 'Slot Method Word64
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Method Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
64 Word64
0)
instance (GH.HasField "resultStructType" GH.Slot Method Std_.Word64) where
    fieldByLabel :: Field 'Slot Method Word64
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Method Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
2 BitCount
64 Word64
0)
instance (GH.HasField "annotations" GH.Slot Method (R.List Annotation)) where
    fieldByLabel :: Field 'Slot Method (List Annotation)
fieldByLabel  = (Word16 -> Field 'Slot Method (List Annotation)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
1)
instance (GH.HasField "paramBrand" GH.Slot Method Brand) where
    fieldByLabel :: Field 'Slot Method Brand
fieldByLabel  = (Word16 -> Field 'Slot Method Brand
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
2)
instance (GH.HasField "resultBrand" GH.Slot Method Brand) where
    fieldByLabel :: Field 'Slot Method Brand
fieldByLabel  = (Word16 -> Field 'Slot Method Brand
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
3)
instance (GH.HasField "implicitParameters" GH.Slot Method (R.List Node'Parameter)) where
    fieldByLabel :: Field 'Slot Method (List Node'Parameter)
fieldByLabel  = (Word16 -> Field 'Slot Method (List Node'Parameter)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
4)
data Type 
type instance (R.ReprFor Type) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type) where
    typeId :: Word64
typeId  = Word64
15020482145304562784
instance (C.TypedStruct Type) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type) where
    type AllocHint Type = ()
    new :: AllocHint Type -> Message ('Mut s) -> m (Raw Type ('Mut s))
new AllocHint Type
_ = Message ('Mut s) -> m (Raw Type ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type (C.Parsed Type))
instance (C.AllocateList Type) where
    type ListAllocHint Type = Std_.Int
    newList :: ListAllocHint Type
-> Message ('Mut s) -> m (Raw (List Type) ('Mut s))
newList  = ListAllocHint Type
-> Message ('Mut s) -> m (Raw (List Type) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type (C.Parsed Type))
data instance C.Parsed Type
    = Type 
        {Parsed Type -> Parsed (Which Type)
union' :: (C.Parsed (GH.Which Type))}
    deriving((forall x. Parsed Type -> Rep (Parsed Type) x)
-> (forall x. Rep (Parsed Type) x -> Parsed Type)
-> Generic (Parsed Type)
forall x. Rep (Parsed Type) x -> Parsed Type
forall x. Parsed Type -> Rep (Parsed Type) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Type) x -> Parsed Type
$cfrom :: forall x. Parsed Type -> Rep (Parsed Type) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type))
deriving instance (Std_.Eq (C.Parsed Type))
instance (C.Parse Type (C.Parsed Type)) where
    parse :: Raw Type 'Const -> m (Parsed Type)
parse Raw Type 'Const
raw_ = (Parsed (Which Type) -> Parsed Type
Type (Parsed (Which Type) -> Parsed Type)
-> m (Parsed (Which Type)) -> m (Parsed Type)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Which Type) 'Const -> m (Parsed (Which Type))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Type 'Const -> Raw (Which Type) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Type 'Const
raw_)))
instance (C.Marshal Type (C.Parsed Type)) where
    marshalInto :: Raw Type ('Mut s) -> Parsed Type -> m ()
marshalInto Raw Type ('Mut s)
raw_ Type{..} = (do
        (Raw (Which Type) ('Mut s) -> Parsed (Which Type) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Type ('Mut s) -> Raw (Which Type) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Type ('Mut s)
raw_) Parsed (Which Type)
union')
        )
instance (GH.HasUnion Type) where
    unionField :: Field 'Slot Type Word16
unionField  = (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Type Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
16 Word64
0)
    data RawWhich Type mut_
        = RW_Type'void (R.Raw () mut_)
        | RW_Type'bool (R.Raw () mut_)
        | RW_Type'int8 (R.Raw () mut_)
        | RW_Type'int16 (R.Raw () mut_)
        | RW_Type'int32 (R.Raw () mut_)
        | RW_Type'int64 (R.Raw () mut_)
        | RW_Type'uint8 (R.Raw () mut_)
        | RW_Type'uint16 (R.Raw () mut_)
        | RW_Type'uint32 (R.Raw () mut_)
        | RW_Type'uint64 (R.Raw () mut_)
        | RW_Type'float32 (R.Raw () mut_)
        | RW_Type'float64 (R.Raw () mut_)
        | RW_Type'text (R.Raw () mut_)
        | RW_Type'data_ (R.Raw () mut_)
        | RW_Type'list (R.Raw Type'list mut_)
        | RW_Type'enum (R.Raw Type'enum mut_)
        | RW_Type'struct (R.Raw Type'struct mut_)
        | RW_Type'interface (R.Raw Type'interface mut_)
        | RW_Type'anyPointer (R.Raw Type'anyPointer mut_)
        | RW_Type'unknown' Std_.Word16
    internalWhich :: Word16 -> Raw Type mut -> m (RawWhich Type mut)
internalWhich Word16
tag_ Raw Type mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'void (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "void" (Variant 'Slot Type ())
Variant 'Slot Type ()
#void Raw Type mut
struct_))
        Word16
1 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'bool (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "bool" (Variant 'Slot Type ())
Variant 'Slot Type ()
#bool Raw Type mut
struct_))
        Word16
2 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'int8 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "int8" (Variant 'Slot Type ())
Variant 'Slot Type ()
#int8 Raw Type mut
struct_))
        Word16
3 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'int16 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "int16" (Variant 'Slot Type ())
Variant 'Slot Type ()
#int16 Raw Type mut
struct_))
        Word16
4 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'int32 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "int32" (Variant 'Slot Type ())
Variant 'Slot Type ()
#int32 Raw Type mut
struct_))
        Word16
5 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'int64 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "int64" (Variant 'Slot Type ())
Variant 'Slot Type ()
#int64 Raw Type mut
struct_))
        Word16
6 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'uint8 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "uint8" (Variant 'Slot Type ())
Variant 'Slot Type ()
#uint8 Raw Type mut
struct_))
        Word16
7 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'uint16 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "uint16" (Variant 'Slot Type ())
Variant 'Slot Type ()
#uint16 Raw Type mut
struct_))
        Word16
8 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'uint32 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "uint32" (Variant 'Slot Type ())
Variant 'Slot Type ()
#uint32 Raw Type mut
struct_))
        Word16
9 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'uint64 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "uint64" (Variant 'Slot Type ())
Variant 'Slot Type ()
#uint64 Raw Type mut
struct_))
        Word16
10 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'float32 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "float32" (Variant 'Slot Type ())
Variant 'Slot Type ()
#float32 Raw Type mut
struct_))
        Word16
11 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'float64 (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "float64" (Variant 'Slot Type ())
Variant 'Slot Type ()
#float64 Raw Type mut
struct_))
        Word16
12 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'text (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "text" (Variant 'Slot Type ())
Variant 'Slot Type ()
#text Raw Type mut
struct_))
        Word16
13 ->
            (Raw () mut -> RawWhich Type mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Type mut_
RW_Type'data_ (Raw () mut -> RawWhich Type mut)
-> m (Raw () mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type () -> Raw Type mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "data_" (Variant 'Slot Type ())
Variant 'Slot Type ()
#data_ Raw Type mut
struct_))
        Word16
14 ->
            (Raw Type'list mut -> RawWhich Type mut
forall (mut_ :: Mutability).
Raw Type'list mut_ -> RawWhich Type mut_
RW_Type'list (Raw Type'list mut -> RawWhich Type mut)
-> m (Raw Type'list mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Type Type'list
-> Raw Type mut -> m (Raw Type'list mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "list" (Variant 'Group Type Type'list)
Variant 'Group Type Type'list
#list Raw Type mut
struct_))
        Word16
15 ->
            (Raw Type'enum mut -> RawWhich Type mut
forall (mut_ :: Mutability).
Raw Type'enum mut_ -> RawWhich Type mut_
RW_Type'enum (Raw Type'enum mut -> RawWhich Type mut)
-> m (Raw Type'enum mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Type Type'enum
-> Raw Type mut -> m (Raw Type'enum mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "enum" (Variant 'Group Type Type'enum)
Variant 'Group Type Type'enum
#enum Raw Type mut
struct_))
        Word16
16 ->
            (Raw Type'struct mut -> RawWhich Type mut
forall (mut_ :: Mutability).
Raw Type'struct mut_ -> RawWhich Type mut_
RW_Type'struct (Raw Type'struct mut -> RawWhich Type mut)
-> m (Raw Type'struct mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Type Type'struct
-> Raw Type mut -> m (Raw Type'struct mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "struct" (Variant 'Group Type Type'struct)
Variant 'Group Type Type'struct
#struct Raw Type mut
struct_))
        Word16
17 ->
            (Raw Type'interface mut -> RawWhich Type mut
forall (mut_ :: Mutability).
Raw Type'interface mut_ -> RawWhich Type mut_
RW_Type'interface (Raw Type'interface mut -> RawWhich Type mut)
-> m (Raw Type'interface mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Type Type'interface
-> Raw Type mut -> m (Raw Type'interface mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "interface" (Variant 'Group Type Type'interface)
Variant 'Group Type Type'interface
#interface Raw Type mut
struct_))
        Word16
18 ->
            (Raw Type'anyPointer mut -> RawWhich Type mut
forall (mut_ :: Mutability).
Raw Type'anyPointer mut_ -> RawWhich Type mut_
RW_Type'anyPointer (Raw Type'anyPointer mut -> RawWhich Type mut)
-> m (Raw Type'anyPointer mut) -> m (RawWhich Type mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Type Type'anyPointer
-> Raw Type mut -> m (Raw Type'anyPointer mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "anyPointer" (Variant 'Group Type Type'anyPointer)
Variant 'Group Type Type'anyPointer
#anyPointer Raw Type mut
struct_))
        Word16
_ ->
            (RawWhich Type mut -> m (RawWhich Type mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Type mut
forall (mut_ :: Mutability). Word16 -> RawWhich Type mut_
RW_Type'unknown' Word16
tag_))
    data Which Type
instance (GH.HasVariant "void" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
0)
instance (GH.HasVariant "bool" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
1)
instance (GH.HasVariant "int8" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
2)
instance (GH.HasVariant "int16" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
3)
instance (GH.HasVariant "int32" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
4)
instance (GH.HasVariant "int64" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
5)
instance (GH.HasVariant "uint8" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
6)
instance (GH.HasVariant "uint16" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
7)
instance (GH.HasVariant "uint32" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
8)
instance (GH.HasVariant "uint64" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
9)
instance (GH.HasVariant "float32" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
10)
instance (GH.HasVariant "float64" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
11)
instance (GH.HasVariant "text" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
12)
instance (GH.HasVariant "data_" GH.Slot Type ()) where
    variantByLabel :: Variant 'Slot Type ()
variantByLabel  = (Field 'Slot Type () -> Word16 -> Variant 'Slot Type ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
13)
instance (GH.HasVariant "list" GH.Group Type Type'list) where
    variantByLabel :: Variant 'Group Type Type'list
variantByLabel  = (Field 'Group Type Type'list
-> Word16 -> Variant 'Group Type Type'list
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Type Type'list
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
14)
instance (GH.HasVariant "enum" GH.Group Type Type'enum) where
    variantByLabel :: Variant 'Group Type Type'enum
variantByLabel  = (Field 'Group Type Type'enum
-> Word16 -> Variant 'Group Type Type'enum
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Type Type'enum
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
15)
instance (GH.HasVariant "struct" GH.Group Type Type'struct) where
    variantByLabel :: Variant 'Group Type Type'struct
variantByLabel  = (Field 'Group Type Type'struct
-> Word16 -> Variant 'Group Type Type'struct
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Type Type'struct
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
16)
instance (GH.HasVariant "interface" GH.Group Type Type'interface) where
    variantByLabel :: Variant 'Group Type Type'interface
variantByLabel  = (Field 'Group Type Type'interface
-> Word16 -> Variant 'Group Type Type'interface
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Type Type'interface
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
17)
instance (GH.HasVariant "anyPointer" GH.Group Type Type'anyPointer) where
    variantByLabel :: Variant 'Group Type Type'anyPointer
variantByLabel  = (Field 'Group Type Type'anyPointer
-> Word16 -> Variant 'Group Type Type'anyPointer
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Type Type'anyPointer
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
18)
data instance C.Parsed (GH.Which Type)
    = Type'void 
    | Type'bool 
    | Type'int8 
    | Type'int16 
    | Type'int32 
    | Type'int64 
    | Type'uint8 
    | Type'uint16 
    | Type'uint32 
    | Type'uint64 
    | Type'float32 
    | Type'float64 
    | Type'text 
    | Type'data_ 
    | Type'list (RP.Parsed Type'list)
    | Type'enum (RP.Parsed Type'enum)
    | Type'struct (RP.Parsed Type'struct)
    | Type'interface (RP.Parsed Type'interface)
    | Type'anyPointer (RP.Parsed Type'anyPointer)
    | Type'unknown' Std_.Word16
    deriving((forall x. Parsed (Which Type) -> Rep (Parsed (Which Type)) x)
-> (forall x. Rep (Parsed (Which Type)) x -> Parsed (Which Type))
-> Generic (Parsed (Which Type))
forall x. Rep (Parsed (Which Type)) x -> Parsed (Which Type)
forall x. Parsed (Which Type) -> Rep (Parsed (Which Type)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed (Which Type)) x -> Parsed (Which Type)
$cfrom :: forall x. Parsed (Which Type) -> Rep (Parsed (Which Type)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Type)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Type)))
instance (C.Parse (GH.Which Type) (C.Parsed (GH.Which Type))) where
    parse :: Raw (Which Type) 'Const -> m (Parsed (Which Type))
parse Raw (Which Type) 'Const
raw_ = (do
        RawWhich Type 'Const
rawWhich_ <- (Raw (Which Type) 'Const -> m (RawWhich Type 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Type) 'Const
raw_)
        case RawWhich Type 'Const
rawWhich_ of
            (RW_Type'void _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'void)
            (RW_Type'bool _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'bool)
            (RW_Type'int8 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'int8)
            (RW_Type'int16 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'int16)
            (RW_Type'int32 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'int32)
            (RW_Type'int64 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'int64)
            (RW_Type'uint8 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'uint8)
            (RW_Type'uint16 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'uint16)
            (RW_Type'uint32 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'uint32)
            (RW_Type'uint64 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'uint64)
            (RW_Type'float32 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'float32)
            (RW_Type'float64 _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'float64)
            (RW_Type'text _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'text)
            (RW_Type'data_ _) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type)
Type'data_)
            (RW_Type'list rawArg_) ->
                (Parsed Type'list -> Parsed (Which Type)
Parsed Type'list -> Parsed (Which Type)
Type'list (Parsed Type'list -> Parsed (Which Type))
-> m (Parsed Type'list) -> m (Parsed (Which Type))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type'list 'Const -> m (Parsed Type'list)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type'list 'Const
rawArg_))
            (RW_Type'enum rawArg_) ->
                (Parsed Type'enum -> Parsed (Which Type)
Parsed Type'enum -> Parsed (Which Type)
Type'enum (Parsed Type'enum -> Parsed (Which Type))
-> m (Parsed Type'enum) -> m (Parsed (Which Type))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type'enum 'Const -> m (Parsed Type'enum)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type'enum 'Const
rawArg_))
            (RW_Type'struct rawArg_) ->
                (Parsed Type'struct -> Parsed (Which Type)
Parsed Type'struct -> Parsed (Which Type)
Type'struct (Parsed Type'struct -> Parsed (Which Type))
-> m (Parsed Type'struct) -> m (Parsed (Which Type))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type'struct 'Const -> m (Parsed Type'struct)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type'struct 'Const
rawArg_))
            (RW_Type'interface rawArg_) ->
                (Parsed Type'interface -> Parsed (Which Type)
Parsed Type'interface -> Parsed (Which Type)
Type'interface (Parsed Type'interface -> Parsed (Which Type))
-> m (Parsed Type'interface) -> m (Parsed (Which Type))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type'interface 'Const -> m (Parsed Type'interface)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type'interface 'Const
rawArg_))
            (RW_Type'anyPointer rawArg_) ->
                (Parsed Type'anyPointer -> Parsed (Which Type)
Parsed Type'anyPointer -> Parsed (Which Type)
Type'anyPointer (Parsed Type'anyPointer -> Parsed (Which Type))
-> m (Parsed Type'anyPointer) -> m (Parsed (Which Type))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type'anyPointer 'Const -> m (Parsed Type'anyPointer)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type'anyPointer 'Const
rawArg_))
            (RW_Type'unknown' tag_) ->
                (Parsed (Which Type) -> m (Parsed (Which Type))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Type)
Type'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Type) (C.Parsed (GH.Which Type))) where
    marshalInto :: Raw (Which Type) ('Mut s) -> Parsed (Which Type) -> m ()
marshalInto Raw (Which Type) ('Mut s)
raw_ Parsed (Which Type)
parsed_ = case Parsed (Which Type)
parsed_ of
        (Parsed (Which Type)
Type'void) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "void" (Variant 'Slot Type ())
Variant 'Slot Type ()
#void () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'bool) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "bool" (Variant 'Slot Type ())
Variant 'Slot Type ()
#bool () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'int8) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "int8" (Variant 'Slot Type ())
Variant 'Slot Type ()
#int8 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'int16) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "int16" (Variant 'Slot Type ())
Variant 'Slot Type ()
#int16 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'int32) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "int32" (Variant 'Slot Type ())
Variant 'Slot Type ()
#int32 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'int64) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "int64" (Variant 'Slot Type ())
Variant 'Slot Type ()
#int64 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'uint8) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "uint8" (Variant 'Slot Type ())
Variant 'Slot Type ()
#uint8 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'uint16) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "uint16" (Variant 'Slot Type ())
Variant 'Slot Type ()
#uint16 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'uint32) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "uint32" (Variant 'Slot Type ())
Variant 'Slot Type ()
#uint32 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'uint64) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "uint64" (Variant 'Slot Type ())
Variant 'Slot Type ()
#uint64 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'float32) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "float32" (Variant 'Slot Type ())
Variant 'Slot Type ()
#float32 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'float64) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "float64" (Variant 'Slot Type ())
Variant 'Slot Type ()
#float64 () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'text) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "text" (Variant 'Slot Type ())
Variant 'Slot Type ()
#text () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Parsed (Which Type)
Type'data_) ->
            (Variant 'Slot Type () -> () -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "data_" (Variant 'Slot Type ())
Variant 'Slot Type ()
#data_ () (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
        (Type'list arg_) ->
            (do
                Raw Type'list ('Mut s)
rawGroup_ <- (Variant 'Group Type Type'list
-> Raw Type ('Mut s) -> m (Raw Type'list ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "list" (Variant 'Group Type Type'list)
Variant 'Group Type Type'list
#list (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
                (Raw Type'list ('Mut s) -> Parsed Type'list -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Type'list ('Mut s)
rawGroup_ Parsed Type'list
Parsed Type'list
arg_)
                )
        (Type'enum arg_) ->
            (do
                Raw Type'enum ('Mut s)
rawGroup_ <- (Variant 'Group Type Type'enum
-> Raw Type ('Mut s) -> m (Raw Type'enum ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "enum" (Variant 'Group Type Type'enum)
Variant 'Group Type Type'enum
#enum (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
                (Raw Type'enum ('Mut s) -> Parsed Type'enum -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Type'enum ('Mut s)
rawGroup_ Parsed Type'enum
Parsed Type'enum
arg_)
                )
        (Type'struct arg_) ->
            (do
                Raw Type'struct ('Mut s)
rawGroup_ <- (Variant 'Group Type Type'struct
-> Raw Type ('Mut s) -> m (Raw Type'struct ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "struct" (Variant 'Group Type Type'struct)
Variant 'Group Type Type'struct
#struct (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
                (Raw Type'struct ('Mut s) -> Parsed Type'struct -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Type'struct ('Mut s)
rawGroup_ Parsed Type'struct
Parsed Type'struct
arg_)
                )
        (Type'interface arg_) ->
            (do
                Raw Type'interface ('Mut s)
rawGroup_ <- (Variant 'Group Type Type'interface
-> Raw Type ('Mut s) -> m (Raw Type'interface ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "interface" (Variant 'Group Type Type'interface)
Variant 'Group Type Type'interface
#interface (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
                (Raw Type'interface ('Mut s) -> Parsed Type'interface -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Type'interface ('Mut s)
rawGroup_ Parsed Type'interface
Parsed Type'interface
arg_)
                )
        (Type'anyPointer arg_) ->
            (do
                Raw Type'anyPointer ('Mut s)
rawGroup_ <- (Variant 'Group Type Type'anyPointer
-> Raw Type ('Mut s) -> m (Raw Type'anyPointer ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel "anyPointer" (Variant 'Group Type Type'anyPointer)
Variant 'Group Type Type'anyPointer
#anyPointer (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
                (Raw Type'anyPointer ('Mut s) -> Parsed Type'anyPointer -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Type'anyPointer ('Mut s)
rawGroup_ Parsed Type'anyPointer
Parsed Type'anyPointer
arg_)
                )
        (Type'unknown' tag_) ->
            (Field 'Slot Type Word16 -> Word16 -> Raw Type ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Type Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Type) ('Mut s) -> Raw Type ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type) ('Mut s)
raw_))
data Type'list 
type instance (R.ReprFor Type'list) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type'list) where
    typeId :: Word64
typeId  = Word64
9792858745991129751
instance (C.TypedStruct Type'list) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type'list) where
    type AllocHint Type'list = ()
    new :: AllocHint Type'list
-> Message ('Mut s) -> m (Raw Type'list ('Mut s))
new AllocHint Type'list
_ = Message ('Mut s) -> m (Raw Type'list ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type'list (C.Parsed Type'list))
instance (C.AllocateList Type'list) where
    type ListAllocHint Type'list = Std_.Int
    newList :: ListAllocHint Type'list
-> Message ('Mut s) -> m (Raw (List Type'list) ('Mut s))
newList  = ListAllocHint Type'list
-> Message ('Mut s) -> m (Raw (List Type'list) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type'list (C.Parsed Type'list))
data instance C.Parsed Type'list
    = Type'list' 
        {Parsed Type'list -> Parsed Type
elementType :: (RP.Parsed Type)}
    deriving((forall x. Parsed Type'list -> Rep (Parsed Type'list) x)
-> (forall x. Rep (Parsed Type'list) x -> Parsed Type'list)
-> Generic (Parsed Type'list)
forall x. Rep (Parsed Type'list) x -> Parsed Type'list
forall x. Parsed Type'list -> Rep (Parsed Type'list) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Type'list) x -> Parsed Type'list
$cfrom :: forall x. Parsed Type'list -> Rep (Parsed Type'list) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type'list))
deriving instance (Std_.Eq (C.Parsed Type'list))
instance (C.Parse Type'list (C.Parsed Type'list)) where
    parse :: Raw Type'list 'Const -> m (Parsed Type'list)
parse Raw Type'list 'Const
raw_ = (Parsed Type -> Parsed Type'list
Parsed Type -> Parsed Type'list
Type'list' (Parsed Type -> Parsed Type'list)
-> m (Parsed Type) -> m (Parsed Type'list)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Type'list Type
-> Raw Type'list 'Const -> m (Parsed Type)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "elementType" (Field 'Slot Type'list Type)
Field 'Slot Type'list Type
#elementType Raw Type'list 'Const
raw_))
instance (C.Marshal Type'list (C.Parsed Type'list)) where
    marshalInto :: Raw Type'list ('Mut s) -> Parsed Type'list -> m ()
marshalInto Raw Type'list ('Mut s)
raw_ Type'list'{..} = (do
        (Field 'Slot Type'list Type
-> Parsed Type -> Raw Type'list ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "elementType" (Field 'Slot Type'list Type)
Field 'Slot Type'list Type
#elementType Parsed Type
Parsed Type
elementType Raw Type'list ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "elementType" GH.Slot Type'list Type) where
    fieldByLabel :: Field 'Slot Type'list Type
fieldByLabel  = (Word16 -> Field 'Slot Type'list Type
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
data Type'enum 
type instance (R.ReprFor Type'enum) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type'enum) where
    typeId :: Word64
typeId  = Word64
11389172934837766057
instance (C.TypedStruct Type'enum) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type'enum) where
    type AllocHint Type'enum = ()
    new :: AllocHint Type'enum
-> Message ('Mut s) -> m (Raw Type'enum ('Mut s))
new AllocHint Type'enum
_ = Message ('Mut s) -> m (Raw Type'enum ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type'enum (C.Parsed Type'enum))
instance (C.AllocateList Type'enum) where
    type ListAllocHint Type'enum = Std_.Int
    newList :: ListAllocHint Type'enum
-> Message ('Mut s) -> m (Raw (List Type'enum) ('Mut s))
newList  = ListAllocHint Type'enum
-> Message ('Mut s) -> m (Raw (List Type'enum) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type'enum (C.Parsed Type'enum))
data instance C.Parsed Type'enum
    = Type'enum' 
        {Parsed Type'enum -> Parsed Word64
typeId :: (RP.Parsed Std_.Word64)
        ,Parsed Type'enum -> Parsed Brand
brand :: (RP.Parsed Brand)}
    deriving((forall x. Parsed Type'enum -> Rep (Parsed Type'enum) x)
-> (forall x. Rep (Parsed Type'enum) x -> Parsed Type'enum)
-> Generic (Parsed Type'enum)
forall x. Rep (Parsed Type'enum) x -> Parsed Type'enum
forall x. Parsed Type'enum -> Rep (Parsed Type'enum) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Type'enum) x -> Parsed Type'enum
$cfrom :: forall x. Parsed Type'enum -> Rep (Parsed Type'enum) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type'enum))
deriving instance (Std_.Eq (C.Parsed Type'enum))
instance (C.Parse Type'enum (C.Parsed Type'enum)) where
    parse :: Raw Type'enum 'Const -> m (Parsed Type'enum)
parse Raw Type'enum 'Const
raw_ = (Word64 -> Parsed Brand -> Parsed Type'enum
Parsed Word64 -> Parsed Brand -> Parsed Type'enum
Type'enum' (Word64 -> Parsed Brand -> Parsed Type'enum)
-> m Word64 -> m (Parsed Brand -> Parsed Type'enum)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Type'enum Word64 -> Raw Type'enum 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "typeId" (Field 'Slot Type'enum Word64)
Field 'Slot Type'enum Word64
#typeId Raw Type'enum 'Const
raw_)
                             m (Parsed Brand -> Parsed Type'enum)
-> m (Parsed Brand) -> m (Parsed Type'enum)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Type'enum Brand
-> Raw Type'enum 'Const -> m (Parsed Brand)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "brand" (Field 'Slot Type'enum Brand)
Field 'Slot Type'enum Brand
#brand Raw Type'enum 'Const
raw_))
instance (C.Marshal Type'enum (C.Parsed Type'enum)) where
    marshalInto :: Raw Type'enum ('Mut s) -> Parsed Type'enum -> m ()
marshalInto Raw Type'enum ('Mut s)
raw_ Type'enum'{..} = (do
        (Field 'Slot Type'enum Word64
-> Word64 -> Raw Type'enum ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "typeId" (Field 'Slot Type'enum Word64)
Field 'Slot Type'enum Word64
#typeId Word64
Parsed Word64
typeId Raw Type'enum ('Mut s)
raw_)
        (Field 'Slot Type'enum Brand
-> Parsed Brand -> Raw Type'enum ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "brand" (Field 'Slot Type'enum Brand)
Field 'Slot Type'enum Brand
#brand Parsed Brand
Parsed Brand
brand Raw Type'enum ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "typeId" GH.Slot Type'enum Std_.Word64) where
    fieldByLabel :: Field 'Slot Type'enum Word64
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Type'enum Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
64 Word64
0)
instance (GH.HasField "brand" GH.Slot Type'enum Brand) where
    fieldByLabel :: Field 'Slot Type'enum Brand
fieldByLabel  = (Word16 -> Field 'Slot Type'enum Brand
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
data Type'struct 
type instance (R.ReprFor Type'struct) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type'struct) where
    typeId :: Word64
typeId  = Word64
12410354185295152851
instance (C.TypedStruct Type'struct) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type'struct) where
    type AllocHint Type'struct = ()
    new :: AllocHint Type'struct
-> Message ('Mut s) -> m (Raw Type'struct ('Mut s))
new AllocHint Type'struct
_ = Message ('Mut s) -> m (Raw Type'struct ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type'struct (C.Parsed Type'struct))
instance (C.AllocateList Type'struct) where
    type ListAllocHint Type'struct = Std_.Int
    newList :: ListAllocHint Type'struct
-> Message ('Mut s) -> m (Raw (List Type'struct) ('Mut s))
newList  = ListAllocHint Type'struct
-> Message ('Mut s) -> m (Raw (List Type'struct) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type'struct (C.Parsed Type'struct))
data instance C.Parsed Type'struct
    = Type'struct' 
        {Parsed Type'struct -> Parsed Word64
typeId :: (RP.Parsed Std_.Word64)
        ,Parsed Type'struct -> Parsed Brand
brand :: (RP.Parsed Brand)}
    deriving((forall x. Parsed Type'struct -> Rep (Parsed Type'struct) x)
-> (forall x. Rep (Parsed Type'struct) x -> Parsed Type'struct)
-> Generic (Parsed Type'struct)
forall x. Rep (Parsed Type'struct) x -> Parsed Type'struct
forall x. Parsed Type'struct -> Rep (Parsed Type'struct) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Type'struct) x -> Parsed Type'struct
$cfrom :: forall x. Parsed Type'struct -> Rep (Parsed Type'struct) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type'struct))
deriving instance (Std_.Eq (C.Parsed Type'struct))
instance (C.Parse Type'struct (C.Parsed Type'struct)) where
    parse :: Raw Type'struct 'Const -> m (Parsed Type'struct)
parse Raw Type'struct 'Const
raw_ = (Word64 -> Parsed Brand -> Parsed Type'struct
Parsed Word64 -> Parsed Brand -> Parsed Type'struct
Type'struct' (Word64 -> Parsed Brand -> Parsed Type'struct)
-> m Word64 -> m (Parsed Brand -> Parsed Type'struct)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Type'struct Word64
-> Raw Type'struct 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "typeId" (Field 'Slot Type'struct Word64)
Field 'Slot Type'struct Word64
#typeId Raw Type'struct 'Const
raw_)
                               m (Parsed Brand -> Parsed Type'struct)
-> m (Parsed Brand) -> m (Parsed Type'struct)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Type'struct Brand
-> Raw Type'struct 'Const -> m (Parsed Brand)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "brand" (Field 'Slot Type'struct Brand)
Field 'Slot Type'struct Brand
#brand Raw Type'struct 'Const
raw_))
instance (C.Marshal Type'struct (C.Parsed Type'struct)) where
    marshalInto :: Raw Type'struct ('Mut s) -> Parsed Type'struct -> m ()
marshalInto Raw Type'struct ('Mut s)
raw_ Type'struct'{..} = (do
        (Field 'Slot Type'struct Word64
-> Word64 -> Raw Type'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "typeId" (Field 'Slot Type'struct Word64)
Field 'Slot Type'struct Word64
#typeId Word64
Parsed Word64
typeId Raw Type'struct ('Mut s)
raw_)
        (Field 'Slot Type'struct Brand
-> Parsed Brand -> Raw Type'struct ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "brand" (Field 'Slot Type'struct Brand)
Field 'Slot Type'struct Brand
#brand Parsed Brand
Parsed Brand
brand Raw Type'struct ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "typeId" GH.Slot Type'struct Std_.Word64) where
    fieldByLabel :: Field 'Slot Type'struct Word64
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Type'struct Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
64 Word64
0)
instance (GH.HasField "brand" GH.Slot Type'struct Brand) where
    fieldByLabel :: Field 'Slot Type'struct Brand
fieldByLabel  = (Word16 -> Field 'Slot Type'struct Brand
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
data Type'interface 
type instance (R.ReprFor Type'interface) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type'interface) where
    typeId :: Word64
typeId  = Word64
17116997365232503999
instance (C.TypedStruct Type'interface) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type'interface) where
    type AllocHint Type'interface = ()
    new :: AllocHint Type'interface
-> Message ('Mut s) -> m (Raw Type'interface ('Mut s))
new AllocHint Type'interface
_ = Message ('Mut s) -> m (Raw Type'interface ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type'interface (C.Parsed Type'interface))
instance (C.AllocateList Type'interface) where
    type ListAllocHint Type'interface = Std_.Int
    newList :: ListAllocHint Type'interface
-> Message ('Mut s) -> m (Raw (List Type'interface) ('Mut s))
newList  = ListAllocHint Type'interface
-> Message ('Mut s) -> m (Raw (List Type'interface) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type'interface (C.Parsed Type'interface))
data instance C.Parsed Type'interface
    = Type'interface' 
        {Parsed Type'interface -> Parsed Word64
typeId :: (RP.Parsed Std_.Word64)
        ,Parsed Type'interface -> Parsed Brand
brand :: (RP.Parsed Brand)}
    deriving((forall x. Parsed Type'interface -> Rep (Parsed Type'interface) x)
-> (forall x.
    Rep (Parsed Type'interface) x -> Parsed Type'interface)
-> Generic (Parsed Type'interface)
forall x. Rep (Parsed Type'interface) x -> Parsed Type'interface
forall x. Parsed Type'interface -> Rep (Parsed Type'interface) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Type'interface) x -> Parsed Type'interface
$cfrom :: forall x. Parsed Type'interface -> Rep (Parsed Type'interface) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type'interface))
deriving instance (Std_.Eq (C.Parsed Type'interface))
instance (C.Parse Type'interface (C.Parsed Type'interface)) where
    parse :: Raw Type'interface 'Const -> m (Parsed Type'interface)
parse Raw Type'interface 'Const
raw_ = (Word64 -> Parsed Brand -> Parsed Type'interface
Parsed Word64 -> Parsed Brand -> Parsed Type'interface
Type'interface' (Word64 -> Parsed Brand -> Parsed Type'interface)
-> m Word64 -> m (Parsed Brand -> Parsed Type'interface)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Type'interface Word64
-> Raw Type'interface 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "typeId" (Field 'Slot Type'interface Word64)
Field 'Slot Type'interface Word64
#typeId Raw Type'interface 'Const
raw_)
                                  m (Parsed Brand -> Parsed Type'interface)
-> m (Parsed Brand) -> m (Parsed Type'interface)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Type'interface Brand
-> Raw Type'interface 'Const -> m (Parsed Brand)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "brand" (Field 'Slot Type'interface Brand)
Field 'Slot Type'interface Brand
#brand Raw Type'interface 'Const
raw_))
instance (C.Marshal Type'interface (C.Parsed Type'interface)) where
    marshalInto :: Raw Type'interface ('Mut s) -> Parsed Type'interface -> m ()
marshalInto Raw Type'interface ('Mut s)
raw_ Type'interface'{..} = (do
        (Field 'Slot Type'interface Word64
-> Word64 -> Raw Type'interface ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "typeId" (Field 'Slot Type'interface Word64)
Field 'Slot Type'interface Word64
#typeId Word64
Parsed Word64
typeId Raw Type'interface ('Mut s)
raw_)
        (Field 'Slot Type'interface Brand
-> Parsed Brand -> Raw Type'interface ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "brand" (Field 'Slot Type'interface Brand)
Field 'Slot Type'interface Brand
#brand Parsed Brand
Parsed Brand
brand Raw Type'interface ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "typeId" GH.Slot Type'interface Std_.Word64) where
    fieldByLabel :: Field 'Slot Type'interface Word64
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Type'interface Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
64 Word64
0)
instance (GH.HasField "brand" GH.Slot Type'interface Brand) where
    fieldByLabel :: Field 'Slot Type'interface Brand
fieldByLabel  = (Word16 -> Field 'Slot Type'interface Brand
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
data Type'anyPointer 
type instance (R.ReprFor Type'anyPointer) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type'anyPointer) where
    typeId :: Word64
typeId  = Word64
14003731834718800369
instance (C.TypedStruct Type'anyPointer) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type'anyPointer) where
    type AllocHint Type'anyPointer = ()
    new :: AllocHint Type'anyPointer
-> Message ('Mut s) -> m (Raw Type'anyPointer ('Mut s))
new AllocHint Type'anyPointer
_ = Message ('Mut s) -> m (Raw Type'anyPointer ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type'anyPointer (C.Parsed Type'anyPointer))
instance (C.AllocateList Type'anyPointer) where
    type ListAllocHint Type'anyPointer = Std_.Int
    newList :: ListAllocHint Type'anyPointer
-> Message ('Mut s) -> m (Raw (List Type'anyPointer) ('Mut s))
newList  = ListAllocHint Type'anyPointer
-> Message ('Mut s) -> m (Raw (List Type'anyPointer) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type'anyPointer (C.Parsed Type'anyPointer))
data instance C.Parsed Type'anyPointer
    = Type'anyPointer' 
        {Parsed Type'anyPointer -> Parsed (Which Type'anyPointer)
union' :: (C.Parsed (GH.Which Type'anyPointer))}
    deriving((forall x.
 Parsed Type'anyPointer -> Rep (Parsed Type'anyPointer) x)
-> (forall x.
    Rep (Parsed Type'anyPointer) x -> Parsed Type'anyPointer)
-> Generic (Parsed Type'anyPointer)
forall x. Rep (Parsed Type'anyPointer) x -> Parsed Type'anyPointer
forall x. Parsed Type'anyPointer -> Rep (Parsed Type'anyPointer) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Type'anyPointer) x -> Parsed Type'anyPointer
$cfrom :: forall x. Parsed Type'anyPointer -> Rep (Parsed Type'anyPointer) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type'anyPointer))
deriving instance (Std_.Eq (C.Parsed Type'anyPointer))
instance (C.Parse Type'anyPointer (C.Parsed Type'anyPointer)) where
    parse :: Raw Type'anyPointer 'Const -> m (Parsed Type'anyPointer)
parse Raw Type'anyPointer 'Const
raw_ = (Parsed (Which Type'anyPointer) -> Parsed Type'anyPointer
Type'anyPointer' (Parsed (Which Type'anyPointer) -> Parsed Type'anyPointer)
-> m (Parsed (Which Type'anyPointer)) -> m (Parsed Type'anyPointer)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Which Type'anyPointer) 'Const
-> m (Parsed (Which Type'anyPointer))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Type'anyPointer 'Const -> Raw (Which Type'anyPointer) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Type'anyPointer 'Const
raw_)))
instance (C.Marshal Type'anyPointer (C.Parsed Type'anyPointer)) where
    marshalInto :: Raw Type'anyPointer ('Mut s) -> Parsed Type'anyPointer -> m ()
marshalInto Raw Type'anyPointer ('Mut s)
raw_ Type'anyPointer'{..} = (do
        (Raw (Which Type'anyPointer) ('Mut s)
-> Parsed (Which Type'anyPointer) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Type'anyPointer ('Mut s)
-> Raw (Which Type'anyPointer) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Type'anyPointer ('Mut s)
raw_) Parsed (Which Type'anyPointer)
union')
        )
instance (GH.HasUnion Type'anyPointer) where
    unionField :: Field 'Slot Type'anyPointer Word16
unionField  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Type'anyPointer Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
16 Word64
0)
    data RawWhich Type'anyPointer mut_
        = RW_Type'anyPointer'unconstrained (R.Raw Type'anyPointer'unconstrained mut_)
        | RW_Type'anyPointer'parameter (R.Raw Type'anyPointer'parameter mut_)
        | RW_Type'anyPointer'implicitMethodParameter (R.Raw Type'anyPointer'implicitMethodParameter mut_)
        | RW_Type'anyPointer'unknown' Std_.Word16
    internalWhich :: Word16
-> Raw Type'anyPointer mut -> m (RawWhich Type'anyPointer mut)
internalWhich Word16
tag_ Raw Type'anyPointer mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw Type'anyPointer'unconstrained mut
-> RawWhich Type'anyPointer mut
forall (mut_ :: Mutability).
Raw Type'anyPointer'unconstrained mut_
-> RawWhich Type'anyPointer mut_
RW_Type'anyPointer'unconstrained (Raw Type'anyPointer'unconstrained mut
 -> RawWhich Type'anyPointer mut)
-> m (Raw Type'anyPointer'unconstrained mut)
-> m (RawWhich Type'anyPointer mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Type'anyPointer Type'anyPointer'unconstrained
-> Raw Type'anyPointer mut
-> m (Raw Type'anyPointer'unconstrained mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel
  "unconstrained"
  (Variant 'Group Type'anyPointer Type'anyPointer'unconstrained)
Variant 'Group Type'anyPointer Type'anyPointer'unconstrained
#unconstrained Raw Type'anyPointer mut
struct_))
        Word16
1 ->
            (Raw Type'anyPointer'parameter mut -> RawWhich Type'anyPointer mut
forall (mut_ :: Mutability).
Raw Type'anyPointer'parameter mut_ -> RawWhich Type'anyPointer mut_
RW_Type'anyPointer'parameter (Raw Type'anyPointer'parameter mut -> RawWhich Type'anyPointer mut)
-> m (Raw Type'anyPointer'parameter mut)
-> m (RawWhich Type'anyPointer mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Group Type'anyPointer Type'anyPointer'parameter
-> Raw Type'anyPointer mut -> m (Raw Type'anyPointer'parameter mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel
  "parameter"
  (Variant 'Group Type'anyPointer Type'anyPointer'parameter)
Variant 'Group Type'anyPointer Type'anyPointer'parameter
#parameter Raw Type'anyPointer mut
struct_))
        Word16
2 ->
            (Raw Type'anyPointer'implicitMethodParameter mut
-> RawWhich Type'anyPointer mut
forall (mut_ :: Mutability).
Raw Type'anyPointer'implicitMethodParameter mut_
-> RawWhich Type'anyPointer mut_
RW_Type'anyPointer'implicitMethodParameter (Raw Type'anyPointer'implicitMethodParameter mut
 -> RawWhich Type'anyPointer mut)
-> m (Raw Type'anyPointer'implicitMethodParameter mut)
-> m (RawWhich Type'anyPointer mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant
  'Group Type'anyPointer Type'anyPointer'implicitMethodParameter
-> Raw Type'anyPointer mut
-> m (Raw Type'anyPointer'implicitMethodParameter mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel
  "implicitMethodParameter"
  (Variant
     'Group Type'anyPointer Type'anyPointer'implicitMethodParameter)
Variant
  'Group Type'anyPointer Type'anyPointer'implicitMethodParameter
#implicitMethodParameter Raw Type'anyPointer mut
struct_))
        Word16
_ ->
            (RawWhich Type'anyPointer mut -> m (RawWhich Type'anyPointer mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Type'anyPointer mut
forall (mut_ :: Mutability).
Word16 -> RawWhich Type'anyPointer mut_
RW_Type'anyPointer'unknown' Word16
tag_))
    data Which Type'anyPointer
instance (GH.HasVariant "unconstrained" GH.Group Type'anyPointer Type'anyPointer'unconstrained) where
    variantByLabel :: Variant 'Group Type'anyPointer Type'anyPointer'unconstrained
variantByLabel  = (Field 'Group Type'anyPointer Type'anyPointer'unconstrained
-> Word16
-> Variant 'Group Type'anyPointer Type'anyPointer'unconstrained
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Type'anyPointer Type'anyPointer'unconstrained
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
0)
instance (GH.HasVariant "parameter" GH.Group Type'anyPointer Type'anyPointer'parameter) where
    variantByLabel :: Variant 'Group Type'anyPointer Type'anyPointer'parameter
variantByLabel  = (Field 'Group Type'anyPointer Type'anyPointer'parameter
-> Word16
-> Variant 'Group Type'anyPointer Type'anyPointer'parameter
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Group Type'anyPointer Type'anyPointer'parameter
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
1)
instance (GH.HasVariant "implicitMethodParameter" GH.Group Type'anyPointer Type'anyPointer'implicitMethodParameter) where
    variantByLabel :: Variant
  'Group Type'anyPointer Type'anyPointer'implicitMethodParameter
variantByLabel  = (Field
  'Group Type'anyPointer Type'anyPointer'implicitMethodParameter
-> Word16
-> Variant
     'Group Type'anyPointer Type'anyPointer'implicitMethodParameter
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field
  'Group Type'anyPointer Type'anyPointer'implicitMethodParameter
forall b a. (ReprFor b ~ 'Ptr ('Just 'Struct)) => Field 'Group a b
GH.groupField Word16
2)
data instance C.Parsed (GH.Which Type'anyPointer)
    = Type'anyPointer'unconstrained (RP.Parsed Type'anyPointer'unconstrained)
    | Type'anyPointer'parameter (RP.Parsed Type'anyPointer'parameter)
    | Type'anyPointer'implicitMethodParameter (RP.Parsed Type'anyPointer'implicitMethodParameter)
    | Type'anyPointer'unknown' Std_.Word16
    deriving((forall x.
 Parsed (Which Type'anyPointer)
 -> Rep (Parsed (Which Type'anyPointer)) x)
-> (forall x.
    Rep (Parsed (Which Type'anyPointer)) x
    -> Parsed (Which Type'anyPointer))
-> Generic (Parsed (Which Type'anyPointer))
forall x.
Rep (Parsed (Which Type'anyPointer)) x
-> Parsed (Which Type'anyPointer)
forall x.
Parsed (Which Type'anyPointer)
-> Rep (Parsed (Which Type'anyPointer)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed (Which Type'anyPointer)) x
-> Parsed (Which Type'anyPointer)
$cfrom :: forall x.
Parsed (Which Type'anyPointer)
-> Rep (Parsed (Which Type'anyPointer)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Type'anyPointer)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Type'anyPointer)))
instance (C.Parse (GH.Which Type'anyPointer) (C.Parsed (GH.Which Type'anyPointer))) where
    parse :: Raw (Which Type'anyPointer) 'Const
-> m (Parsed (Which Type'anyPointer))
parse Raw (Which Type'anyPointer) 'Const
raw_ = (do
        RawWhich Type'anyPointer 'Const
rawWhich_ <- (Raw (Which Type'anyPointer) 'Const
-> m (RawWhich Type'anyPointer 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Type'anyPointer) 'Const
raw_)
        case RawWhich Type'anyPointer 'Const
rawWhich_ of
            (RW_Type'anyPointer'unconstrained rawArg_) ->
                (Parsed Type'anyPointer'unconstrained
-> Parsed (Which Type'anyPointer)
Parsed Type'anyPointer'unconstrained
-> Parsed (Which Type'anyPointer)
Type'anyPointer'unconstrained (Parsed Type'anyPointer'unconstrained
 -> Parsed (Which Type'anyPointer))
-> m (Parsed Type'anyPointer'unconstrained)
-> m (Parsed (Which Type'anyPointer))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type'anyPointer'unconstrained 'Const
-> m (Parsed Type'anyPointer'unconstrained)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type'anyPointer'unconstrained 'Const
rawArg_))
            (RW_Type'anyPointer'parameter rawArg_) ->
                (Parsed Type'anyPointer'parameter -> Parsed (Which Type'anyPointer)
Parsed Type'anyPointer'parameter -> Parsed (Which Type'anyPointer)
Type'anyPointer'parameter (Parsed Type'anyPointer'parameter
 -> Parsed (Which Type'anyPointer))
-> m (Parsed Type'anyPointer'parameter)
-> m (Parsed (Which Type'anyPointer))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type'anyPointer'parameter 'Const
-> m (Parsed Type'anyPointer'parameter)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type'anyPointer'parameter 'Const
rawArg_))
            (RW_Type'anyPointer'implicitMethodParameter rawArg_) ->
                (Parsed Type'anyPointer'implicitMethodParameter
-> Parsed (Which Type'anyPointer)
Parsed Type'anyPointer'implicitMethodParameter
-> Parsed (Which Type'anyPointer)
Type'anyPointer'implicitMethodParameter (Parsed Type'anyPointer'implicitMethodParameter
 -> Parsed (Which Type'anyPointer))
-> m (Parsed Type'anyPointer'implicitMethodParameter)
-> m (Parsed (Which Type'anyPointer))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type'anyPointer'implicitMethodParameter 'Const
-> m (Parsed Type'anyPointer'implicitMethodParameter)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type'anyPointer'implicitMethodParameter 'Const
rawArg_))
            (RW_Type'anyPointer'unknown' tag_) ->
                (Parsed (Which Type'anyPointer)
-> m (Parsed (Which Type'anyPointer))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Type'anyPointer)
Type'anyPointer'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Type'anyPointer) (C.Parsed (GH.Which Type'anyPointer))) where
    marshalInto :: Raw (Which Type'anyPointer) ('Mut s)
-> Parsed (Which Type'anyPointer) -> m ()
marshalInto Raw (Which Type'anyPointer) ('Mut s)
raw_ Parsed (Which Type'anyPointer)
parsed_ = case Parsed (Which Type'anyPointer)
parsed_ of
        (Type'anyPointer'unconstrained arg_) ->
            (do
                Raw Type'anyPointer'unconstrained ('Mut s)
rawGroup_ <- (Variant 'Group Type'anyPointer Type'anyPointer'unconstrained
-> Raw Type'anyPointer ('Mut s)
-> m (Raw Type'anyPointer'unconstrained ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel
  "unconstrained"
  (Variant 'Group Type'anyPointer Type'anyPointer'unconstrained)
Variant 'Group Type'anyPointer Type'anyPointer'unconstrained
#unconstrained (Raw (Which Type'anyPointer) ('Mut s)
-> Raw Type'anyPointer ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer) ('Mut s)
raw_))
                (Raw Type'anyPointer'unconstrained ('Mut s)
-> Parsed Type'anyPointer'unconstrained -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Type'anyPointer'unconstrained ('Mut s)
rawGroup_ Parsed Type'anyPointer'unconstrained
Parsed Type'anyPointer'unconstrained
arg_)
                )
        (Type'anyPointer'parameter arg_) ->
            (do
                Raw Type'anyPointer'parameter ('Mut s)
rawGroup_ <- (Variant 'Group Type'anyPointer Type'anyPointer'parameter
-> Raw Type'anyPointer ('Mut s)
-> m (Raw Type'anyPointer'parameter ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel
  "parameter"
  (Variant 'Group Type'anyPointer Type'anyPointer'parameter)
Variant 'Group Type'anyPointer Type'anyPointer'parameter
#parameter (Raw (Which Type'anyPointer) ('Mut s)
-> Raw Type'anyPointer ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer) ('Mut s)
raw_))
                (Raw Type'anyPointer'parameter ('Mut s)
-> Parsed Type'anyPointer'parameter -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Type'anyPointer'parameter ('Mut s)
rawGroup_ Parsed Type'anyPointer'parameter
Parsed Type'anyPointer'parameter
arg_)
                )
        (Type'anyPointer'implicitMethodParameter arg_) ->
            (do
                Raw Type'anyPointer'implicitMethodParameter ('Mut s)
rawGroup_ <- (Variant
  'Group Type'anyPointer Type'anyPointer'implicitMethodParameter
-> Raw Type'anyPointer ('Mut s)
-> m (Raw Type'anyPointer'implicitMethodParameter ('Mut s))
forall a b (m :: * -> *) s.
(HasUnion a, RWCtx m s) =>
Variant 'Group a b -> Raw a ('Mut s) -> m (Raw b ('Mut s))
GH.initVariant IsLabel
  "implicitMethodParameter"
  (Variant
     'Group Type'anyPointer Type'anyPointer'implicitMethodParameter)
Variant
  'Group Type'anyPointer Type'anyPointer'implicitMethodParameter
#implicitMethodParameter (Raw (Which Type'anyPointer) ('Mut s)
-> Raw Type'anyPointer ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer) ('Mut s)
raw_))
                (Raw Type'anyPointer'implicitMethodParameter ('Mut s)
-> Parsed Type'anyPointer'implicitMethodParameter -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto Raw Type'anyPointer'implicitMethodParameter ('Mut s)
rawGroup_ Parsed Type'anyPointer'implicitMethodParameter
Parsed Type'anyPointer'implicitMethodParameter
arg_)
                )
        (Type'anyPointer'unknown' tag_) ->
            (Field 'Slot Type'anyPointer Word16
-> Word16 -> Raw Type'anyPointer ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Type'anyPointer Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Type'anyPointer) ('Mut s)
-> Raw Type'anyPointer ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer) ('Mut s)
raw_))
data Type'anyPointer'unconstrained 
type instance (R.ReprFor Type'anyPointer'unconstrained) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type'anyPointer'unconstrained) where
    typeId :: Word64
typeId  = Word64
10248890354574636630
instance (C.TypedStruct Type'anyPointer'unconstrained) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type'anyPointer'unconstrained) where
    type AllocHint Type'anyPointer'unconstrained = ()
    new :: AllocHint Type'anyPointer'unconstrained
-> Message ('Mut s)
-> m (Raw Type'anyPointer'unconstrained ('Mut s))
new AllocHint Type'anyPointer'unconstrained
_ = Message ('Mut s) -> m (Raw Type'anyPointer'unconstrained ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type'anyPointer'unconstrained (C.Parsed Type'anyPointer'unconstrained))
instance (C.AllocateList Type'anyPointer'unconstrained) where
    type ListAllocHint Type'anyPointer'unconstrained = Std_.Int
    newList :: ListAllocHint Type'anyPointer'unconstrained
-> Message ('Mut s)
-> m (Raw (List Type'anyPointer'unconstrained) ('Mut s))
newList  = ListAllocHint Type'anyPointer'unconstrained
-> Message ('Mut s)
-> m (Raw (List Type'anyPointer'unconstrained) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type'anyPointer'unconstrained (C.Parsed Type'anyPointer'unconstrained))
data instance C.Parsed Type'anyPointer'unconstrained
    = Type'anyPointer'unconstrained' 
        {Parsed Type'anyPointer'unconstrained
-> Parsed (Which Type'anyPointer'unconstrained)
union' :: (C.Parsed (GH.Which Type'anyPointer'unconstrained))}
    deriving((forall x.
 Parsed Type'anyPointer'unconstrained
 -> Rep (Parsed Type'anyPointer'unconstrained) x)
-> (forall x.
    Rep (Parsed Type'anyPointer'unconstrained) x
    -> Parsed Type'anyPointer'unconstrained)
-> Generic (Parsed Type'anyPointer'unconstrained)
forall x.
Rep (Parsed Type'anyPointer'unconstrained) x
-> Parsed Type'anyPointer'unconstrained
forall x.
Parsed Type'anyPointer'unconstrained
-> Rep (Parsed Type'anyPointer'unconstrained) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed Type'anyPointer'unconstrained) x
-> Parsed Type'anyPointer'unconstrained
$cfrom :: forall x.
Parsed Type'anyPointer'unconstrained
-> Rep (Parsed Type'anyPointer'unconstrained) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type'anyPointer'unconstrained))
deriving instance (Std_.Eq (C.Parsed Type'anyPointer'unconstrained))
instance (C.Parse Type'anyPointer'unconstrained (C.Parsed Type'anyPointer'unconstrained)) where
    parse :: Raw Type'anyPointer'unconstrained 'Const
-> m (Parsed Type'anyPointer'unconstrained)
parse Raw Type'anyPointer'unconstrained 'Const
raw_ = (Parsed (Which Type'anyPointer'unconstrained)
-> Parsed Type'anyPointer'unconstrained
Type'anyPointer'unconstrained' (Parsed (Which Type'anyPointer'unconstrained)
 -> Parsed Type'anyPointer'unconstrained)
-> m (Parsed (Which Type'anyPointer'unconstrained))
-> m (Parsed Type'anyPointer'unconstrained)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Which Type'anyPointer'unconstrained) 'Const
-> m (Parsed (Which Type'anyPointer'unconstrained))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Type'anyPointer'unconstrained 'Const
-> Raw (Which Type'anyPointer'unconstrained) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Type'anyPointer'unconstrained 'Const
raw_)))
instance (C.Marshal Type'anyPointer'unconstrained (C.Parsed Type'anyPointer'unconstrained)) where
    marshalInto :: Raw Type'anyPointer'unconstrained ('Mut s)
-> Parsed Type'anyPointer'unconstrained -> m ()
marshalInto Raw Type'anyPointer'unconstrained ('Mut s)
raw_ Type'anyPointer'unconstrained'{..} = (do
        (Raw (Which Type'anyPointer'unconstrained) ('Mut s)
-> Parsed (Which Type'anyPointer'unconstrained) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Type'anyPointer'unconstrained ('Mut s)
-> Raw (Which Type'anyPointer'unconstrained) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Type'anyPointer'unconstrained ('Mut s)
raw_) Parsed (Which Type'anyPointer'unconstrained)
union')
        )
instance (GH.HasUnion Type'anyPointer'unconstrained) where
    unionField :: Field 'Slot Type'anyPointer'unconstrained Word16
unionField  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Type'anyPointer'unconstrained Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
1 BitCount
16 Word64
0)
    data RawWhich Type'anyPointer'unconstrained mut_
        = RW_Type'anyPointer'unconstrained'anyKind (R.Raw () mut_)
        | RW_Type'anyPointer'unconstrained'struct (R.Raw () mut_)
        | RW_Type'anyPointer'unconstrained'list (R.Raw () mut_)
        | RW_Type'anyPointer'unconstrained'capability (R.Raw () mut_)
        | RW_Type'anyPointer'unconstrained'unknown' Std_.Word16
    internalWhich :: Word16
-> Raw Type'anyPointer'unconstrained mut
-> m (RawWhich Type'anyPointer'unconstrained mut)
internalWhich Word16
tag_ Raw Type'anyPointer'unconstrained mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw () mut -> RawWhich Type'anyPointer'unconstrained mut
forall (mut_ :: Mutability).
Raw () mut_ -> RawWhich Type'anyPointer'unconstrained mut_
RW_Type'anyPointer'unconstrained'anyKind (Raw () mut -> RawWhich Type'anyPointer'unconstrained mut)
-> m (Raw () mut) -> m (RawWhich Type'anyPointer'unconstrained mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type'anyPointer'unconstrained ()
-> Raw Type'anyPointer'unconstrained mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "anyKind" (Variant 'Slot Type'anyPointer'unconstrained ())
Variant 'Slot Type'anyPointer'unconstrained ()
#anyKind Raw Type'anyPointer'unconstrained mut
struct_))
        Word16
1 ->
            (Raw () mut -> RawWhich Type'anyPointer'unconstrained mut
forall (mut_ :: Mutability).
Raw () mut_ -> RawWhich Type'anyPointer'unconstrained mut_
RW_Type'anyPointer'unconstrained'struct (Raw () mut -> RawWhich Type'anyPointer'unconstrained mut)
-> m (Raw () mut) -> m (RawWhich Type'anyPointer'unconstrained mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type'anyPointer'unconstrained ()
-> Raw Type'anyPointer'unconstrained mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "struct" (Variant 'Slot Type'anyPointer'unconstrained ())
Variant 'Slot Type'anyPointer'unconstrained ()
#struct Raw Type'anyPointer'unconstrained mut
struct_))
        Word16
2 ->
            (Raw () mut -> RawWhich Type'anyPointer'unconstrained mut
forall (mut_ :: Mutability).
Raw () mut_ -> RawWhich Type'anyPointer'unconstrained mut_
RW_Type'anyPointer'unconstrained'list (Raw () mut -> RawWhich Type'anyPointer'unconstrained mut)
-> m (Raw () mut) -> m (RawWhich Type'anyPointer'unconstrained mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type'anyPointer'unconstrained ()
-> Raw Type'anyPointer'unconstrained mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "list" (Variant 'Slot Type'anyPointer'unconstrained ())
Variant 'Slot Type'anyPointer'unconstrained ()
#list Raw Type'anyPointer'unconstrained mut
struct_))
        Word16
3 ->
            (Raw () mut -> RawWhich Type'anyPointer'unconstrained mut
forall (mut_ :: Mutability).
Raw () mut_ -> RawWhich Type'anyPointer'unconstrained mut_
RW_Type'anyPointer'unconstrained'capability (Raw () mut -> RawWhich Type'anyPointer'unconstrained mut)
-> m (Raw () mut) -> m (RawWhich Type'anyPointer'unconstrained mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Type'anyPointer'unconstrained ()
-> Raw Type'anyPointer'unconstrained mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel
  "capability" (Variant 'Slot Type'anyPointer'unconstrained ())
Variant 'Slot Type'anyPointer'unconstrained ()
#capability Raw Type'anyPointer'unconstrained mut
struct_))
        Word16
_ ->
            (RawWhich Type'anyPointer'unconstrained mut
-> m (RawWhich Type'anyPointer'unconstrained mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Type'anyPointer'unconstrained mut
forall (mut_ :: Mutability).
Word16 -> RawWhich Type'anyPointer'unconstrained mut_
RW_Type'anyPointer'unconstrained'unknown' Word16
tag_))
    data Which Type'anyPointer'unconstrained
instance (GH.HasVariant "anyKind" GH.Slot Type'anyPointer'unconstrained ()) where
    variantByLabel :: Variant 'Slot Type'anyPointer'unconstrained ()
variantByLabel  = (Field 'Slot Type'anyPointer'unconstrained ()
-> Word16 -> Variant 'Slot Type'anyPointer'unconstrained ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type'anyPointer'unconstrained ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
0)
instance (GH.HasVariant "struct" GH.Slot Type'anyPointer'unconstrained ()) where
    variantByLabel :: Variant 'Slot Type'anyPointer'unconstrained ()
variantByLabel  = (Field 'Slot Type'anyPointer'unconstrained ()
-> Word16 -> Variant 'Slot Type'anyPointer'unconstrained ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type'anyPointer'unconstrained ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
1)
instance (GH.HasVariant "list" GH.Slot Type'anyPointer'unconstrained ()) where
    variantByLabel :: Variant 'Slot Type'anyPointer'unconstrained ()
variantByLabel  = (Field 'Slot Type'anyPointer'unconstrained ()
-> Word16 -> Variant 'Slot Type'anyPointer'unconstrained ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type'anyPointer'unconstrained ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
2)
instance (GH.HasVariant "capability" GH.Slot Type'anyPointer'unconstrained ()) where
    variantByLabel :: Variant 'Slot Type'anyPointer'unconstrained ()
variantByLabel  = (Field 'Slot Type'anyPointer'unconstrained ()
-> Word16 -> Variant 'Slot Type'anyPointer'unconstrained ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Type'anyPointer'unconstrained ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
3)
data instance C.Parsed (GH.Which Type'anyPointer'unconstrained)
    = Type'anyPointer'unconstrained'anyKind 
    | Type'anyPointer'unconstrained'struct 
    | Type'anyPointer'unconstrained'list 
    | Type'anyPointer'unconstrained'capability 
    | Type'anyPointer'unconstrained'unknown' Std_.Word16
    deriving((forall x.
 Parsed (Which Type'anyPointer'unconstrained)
 -> Rep (Parsed (Which Type'anyPointer'unconstrained)) x)
-> (forall x.
    Rep (Parsed (Which Type'anyPointer'unconstrained)) x
    -> Parsed (Which Type'anyPointer'unconstrained))
-> Generic (Parsed (Which Type'anyPointer'unconstrained))
forall x.
Rep (Parsed (Which Type'anyPointer'unconstrained)) x
-> Parsed (Which Type'anyPointer'unconstrained)
forall x.
Parsed (Which Type'anyPointer'unconstrained)
-> Rep (Parsed (Which Type'anyPointer'unconstrained)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed (Which Type'anyPointer'unconstrained)) x
-> Parsed (Which Type'anyPointer'unconstrained)
$cfrom :: forall x.
Parsed (Which Type'anyPointer'unconstrained)
-> Rep (Parsed (Which Type'anyPointer'unconstrained)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Type'anyPointer'unconstrained)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Type'anyPointer'unconstrained)))
instance (C.Parse (GH.Which Type'anyPointer'unconstrained) (C.Parsed (GH.Which Type'anyPointer'unconstrained))) where
    parse :: Raw (Which Type'anyPointer'unconstrained) 'Const
-> m (Parsed (Which Type'anyPointer'unconstrained))
parse Raw (Which Type'anyPointer'unconstrained) 'Const
raw_ = (do
        RawWhich Type'anyPointer'unconstrained 'Const
rawWhich_ <- (Raw (Which Type'anyPointer'unconstrained) 'Const
-> m (RawWhich Type'anyPointer'unconstrained 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Type'anyPointer'unconstrained) 'Const
raw_)
        case RawWhich Type'anyPointer'unconstrained 'Const
rawWhich_ of
            (RW_Type'anyPointer'unconstrained'anyKind _) ->
                (Parsed (Which Type'anyPointer'unconstrained)
-> m (Parsed (Which Type'anyPointer'unconstrained))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'anyKind)
            (RW_Type'anyPointer'unconstrained'struct _) ->
                (Parsed (Which Type'anyPointer'unconstrained)
-> m (Parsed (Which Type'anyPointer'unconstrained))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'struct)
            (RW_Type'anyPointer'unconstrained'list _) ->
                (Parsed (Which Type'anyPointer'unconstrained)
-> m (Parsed (Which Type'anyPointer'unconstrained))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'list)
            (RW_Type'anyPointer'unconstrained'capability _) ->
                (Parsed (Which Type'anyPointer'unconstrained)
-> m (Parsed (Which Type'anyPointer'unconstrained))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'capability)
            (RW_Type'anyPointer'unconstrained'unknown' tag_) ->
                (Parsed (Which Type'anyPointer'unconstrained)
-> m (Parsed (Which Type'anyPointer'unconstrained))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Type'anyPointer'unconstrained) (C.Parsed (GH.Which Type'anyPointer'unconstrained))) where
    marshalInto :: Raw (Which Type'anyPointer'unconstrained) ('Mut s)
-> Parsed (Which Type'anyPointer'unconstrained) -> m ()
marshalInto Raw (Which Type'anyPointer'unconstrained) ('Mut s)
raw_ Parsed (Which Type'anyPointer'unconstrained)
parsed_ = case Parsed (Which Type'anyPointer'unconstrained)
parsed_ of
        (Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'anyKind) ->
            (Variant 'Slot Type'anyPointer'unconstrained ()
-> () -> Raw Type'anyPointer'unconstrained ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "anyKind" (Variant 'Slot Type'anyPointer'unconstrained ())
Variant 'Slot Type'anyPointer'unconstrained ()
#anyKind () (Raw (Which Type'anyPointer'unconstrained) ('Mut s)
-> Raw Type'anyPointer'unconstrained ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer'unconstrained) ('Mut s)
raw_))
        (Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'struct) ->
            (Variant 'Slot Type'anyPointer'unconstrained ()
-> () -> Raw Type'anyPointer'unconstrained ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "struct" (Variant 'Slot Type'anyPointer'unconstrained ())
Variant 'Slot Type'anyPointer'unconstrained ()
#struct () (Raw (Which Type'anyPointer'unconstrained) ('Mut s)
-> Raw Type'anyPointer'unconstrained ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer'unconstrained) ('Mut s)
raw_))
        (Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'list) ->
            (Variant 'Slot Type'anyPointer'unconstrained ()
-> () -> Raw Type'anyPointer'unconstrained ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "list" (Variant 'Slot Type'anyPointer'unconstrained ())
Variant 'Slot Type'anyPointer'unconstrained ()
#list () (Raw (Which Type'anyPointer'unconstrained) ('Mut s)
-> Raw Type'anyPointer'unconstrained ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer'unconstrained) ('Mut s)
raw_))
        (Parsed (Which Type'anyPointer'unconstrained)
Type'anyPointer'unconstrained'capability) ->
            (Variant 'Slot Type'anyPointer'unconstrained ()
-> () -> Raw Type'anyPointer'unconstrained ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel
  "capability" (Variant 'Slot Type'anyPointer'unconstrained ())
Variant 'Slot Type'anyPointer'unconstrained ()
#capability () (Raw (Which Type'anyPointer'unconstrained) ('Mut s)
-> Raw Type'anyPointer'unconstrained ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer'unconstrained) ('Mut s)
raw_))
        (Type'anyPointer'unconstrained'unknown' tag_) ->
            (Field 'Slot Type'anyPointer'unconstrained Word16
-> Word16 -> Raw Type'anyPointer'unconstrained ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Type'anyPointer'unconstrained Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Type'anyPointer'unconstrained) ('Mut s)
-> Raw Type'anyPointer'unconstrained ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Type'anyPointer'unconstrained) ('Mut s)
raw_))
data Type'anyPointer'parameter 
type instance (R.ReprFor Type'anyPointer'parameter) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type'anyPointer'parameter) where
    typeId :: Word64
typeId  = Word64
11372142272178113157
instance (C.TypedStruct Type'anyPointer'parameter) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type'anyPointer'parameter) where
    type AllocHint Type'anyPointer'parameter = ()
    new :: AllocHint Type'anyPointer'parameter
-> Message ('Mut s) -> m (Raw Type'anyPointer'parameter ('Mut s))
new AllocHint Type'anyPointer'parameter
_ = Message ('Mut s) -> m (Raw Type'anyPointer'parameter ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type'anyPointer'parameter (C.Parsed Type'anyPointer'parameter))
instance (C.AllocateList Type'anyPointer'parameter) where
    type ListAllocHint Type'anyPointer'parameter = Std_.Int
    newList :: ListAllocHint Type'anyPointer'parameter
-> Message ('Mut s)
-> m (Raw (List Type'anyPointer'parameter) ('Mut s))
newList  = ListAllocHint Type'anyPointer'parameter
-> Message ('Mut s)
-> m (Raw (List Type'anyPointer'parameter) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type'anyPointer'parameter (C.Parsed Type'anyPointer'parameter))
data instance C.Parsed Type'anyPointer'parameter
    = Type'anyPointer'parameter' 
        {Parsed Type'anyPointer'parameter -> Parsed Word64
scopeId :: (RP.Parsed Std_.Word64)
        ,Parsed Type'anyPointer'parameter -> Parsed Word16
parameterIndex :: (RP.Parsed Std_.Word16)}
    deriving((forall x.
 Parsed Type'anyPointer'parameter
 -> Rep (Parsed Type'anyPointer'parameter) x)
-> (forall x.
    Rep (Parsed Type'anyPointer'parameter) x
    -> Parsed Type'anyPointer'parameter)
-> Generic (Parsed Type'anyPointer'parameter)
forall x.
Rep (Parsed Type'anyPointer'parameter) x
-> Parsed Type'anyPointer'parameter
forall x.
Parsed Type'anyPointer'parameter
-> Rep (Parsed Type'anyPointer'parameter) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed Type'anyPointer'parameter) x
-> Parsed Type'anyPointer'parameter
$cfrom :: forall x.
Parsed Type'anyPointer'parameter
-> Rep (Parsed Type'anyPointer'parameter) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type'anyPointer'parameter))
deriving instance (Std_.Eq (C.Parsed Type'anyPointer'parameter))
instance (C.Parse Type'anyPointer'parameter (C.Parsed Type'anyPointer'parameter)) where
    parse :: Raw Type'anyPointer'parameter 'Const
-> m (Parsed Type'anyPointer'parameter)
parse Raw Type'anyPointer'parameter 'Const
raw_ = (Word64 -> Word16 -> Parsed Type'anyPointer'parameter
Parsed Word64 -> Parsed Word16 -> Parsed Type'anyPointer'parameter
Type'anyPointer'parameter' (Word64 -> Word16 -> Parsed Type'anyPointer'parameter)
-> m Word64 -> m (Word16 -> Parsed Type'anyPointer'parameter)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Type'anyPointer'parameter Word64
-> Raw Type'anyPointer'parameter 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "scopeId" (Field 'Slot Type'anyPointer'parameter Word64)
Field 'Slot Type'anyPointer'parameter Word64
#scopeId Raw Type'anyPointer'parameter 'Const
raw_)
                                             m (Word16 -> Parsed Type'anyPointer'parameter)
-> m Word16 -> m (Parsed Type'anyPointer'parameter)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Type'anyPointer'parameter Word16
-> Raw Type'anyPointer'parameter 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "parameterIndex" (Field 'Slot Type'anyPointer'parameter Word16)
Field 'Slot Type'anyPointer'parameter Word16
#parameterIndex Raw Type'anyPointer'parameter 'Const
raw_))
instance (C.Marshal Type'anyPointer'parameter (C.Parsed Type'anyPointer'parameter)) where
    marshalInto :: Raw Type'anyPointer'parameter ('Mut s)
-> Parsed Type'anyPointer'parameter -> m ()
marshalInto Raw Type'anyPointer'parameter ('Mut s)
raw_ Type'anyPointer'parameter'{..} = (do
        (Field 'Slot Type'anyPointer'parameter Word64
-> Word64 -> Raw Type'anyPointer'parameter ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "scopeId" (Field 'Slot Type'anyPointer'parameter Word64)
Field 'Slot Type'anyPointer'parameter Word64
#scopeId Word64
Parsed Word64
scopeId Raw Type'anyPointer'parameter ('Mut s)
raw_)
        (Field 'Slot Type'anyPointer'parameter Word16
-> Word16 -> Raw Type'anyPointer'parameter ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "parameterIndex" (Field 'Slot Type'anyPointer'parameter Word16)
Field 'Slot Type'anyPointer'parameter Word16
#parameterIndex Word16
Parsed Word16
parameterIndex Raw Type'anyPointer'parameter ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "scopeId" GH.Slot Type'anyPointer'parameter Std_.Word64) where
    fieldByLabel :: Field 'Slot Type'anyPointer'parameter Word64
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Type'anyPointer'parameter Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
2 BitCount
64 Word64
0)
instance (GH.HasField "parameterIndex" GH.Slot Type'anyPointer'parameter Std_.Word16) where
    fieldByLabel :: Field 'Slot Type'anyPointer'parameter Word16
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Type'anyPointer'parameter Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
1 BitCount
16 Word64
0)
data Type'anyPointer'implicitMethodParameter 
type instance (R.ReprFor Type'anyPointer'implicitMethodParameter) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Type'anyPointer'implicitMethodParameter) where
    typeId :: Word64
typeId  = Word64
13470206089842057844
instance (C.TypedStruct Type'anyPointer'implicitMethodParameter) where
    numStructWords :: Word16
numStructWords  = Word16
3
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Type'anyPointer'implicitMethodParameter) where
    type AllocHint Type'anyPointer'implicitMethodParameter = ()
    new :: AllocHint Type'anyPointer'implicitMethodParameter
-> Message ('Mut s)
-> m (Raw Type'anyPointer'implicitMethodParameter ('Mut s))
new AllocHint Type'anyPointer'implicitMethodParameter
_ = Message ('Mut s)
-> m (Raw Type'anyPointer'implicitMethodParameter ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Type'anyPointer'implicitMethodParameter (C.Parsed Type'anyPointer'implicitMethodParameter))
instance (C.AllocateList Type'anyPointer'implicitMethodParameter) where
    type ListAllocHint Type'anyPointer'implicitMethodParameter = Std_.Int
    newList :: ListAllocHint Type'anyPointer'implicitMethodParameter
-> Message ('Mut s)
-> m (Raw (List Type'anyPointer'implicitMethodParameter) ('Mut s))
newList  = ListAllocHint Type'anyPointer'implicitMethodParameter
-> Message ('Mut s)
-> m (Raw (List Type'anyPointer'implicitMethodParameter) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Type'anyPointer'implicitMethodParameter (C.Parsed Type'anyPointer'implicitMethodParameter))
data instance C.Parsed Type'anyPointer'implicitMethodParameter
    = Type'anyPointer'implicitMethodParameter' 
        {Parsed Type'anyPointer'implicitMethodParameter -> Parsed Word16
parameterIndex :: (RP.Parsed Std_.Word16)}
    deriving((forall x.
 Parsed Type'anyPointer'implicitMethodParameter
 -> Rep (Parsed Type'anyPointer'implicitMethodParameter) x)
-> (forall x.
    Rep (Parsed Type'anyPointer'implicitMethodParameter) x
    -> Parsed Type'anyPointer'implicitMethodParameter)
-> Generic (Parsed Type'anyPointer'implicitMethodParameter)
forall x.
Rep (Parsed Type'anyPointer'implicitMethodParameter) x
-> Parsed Type'anyPointer'implicitMethodParameter
forall x.
Parsed Type'anyPointer'implicitMethodParameter
-> Rep (Parsed Type'anyPointer'implicitMethodParameter) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed Type'anyPointer'implicitMethodParameter) x
-> Parsed Type'anyPointer'implicitMethodParameter
$cfrom :: forall x.
Parsed Type'anyPointer'implicitMethodParameter
-> Rep (Parsed Type'anyPointer'implicitMethodParameter) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Type'anyPointer'implicitMethodParameter))
deriving instance (Std_.Eq (C.Parsed Type'anyPointer'implicitMethodParameter))
instance (C.Parse Type'anyPointer'implicitMethodParameter (C.Parsed Type'anyPointer'implicitMethodParameter)) where
    parse :: Raw Type'anyPointer'implicitMethodParameter 'Const
-> m (Parsed Type'anyPointer'implicitMethodParameter)
parse Raw Type'anyPointer'implicitMethodParameter 'Const
raw_ = (Word16 -> Parsed Type'anyPointer'implicitMethodParameter
Parsed Word16 -> Parsed Type'anyPointer'implicitMethodParameter
Type'anyPointer'implicitMethodParameter' (Word16 -> Parsed Type'anyPointer'implicitMethodParameter)
-> m Word16 -> m (Parsed Type'anyPointer'implicitMethodParameter)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Type'anyPointer'implicitMethodParameter Word16
-> Raw Type'anyPointer'implicitMethodParameter 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "parameterIndex"
  (Field 'Slot Type'anyPointer'implicitMethodParameter Word16)
Field 'Slot Type'anyPointer'implicitMethodParameter Word16
#parameterIndex Raw Type'anyPointer'implicitMethodParameter 'Const
raw_))
instance (C.Marshal Type'anyPointer'implicitMethodParameter (C.Parsed Type'anyPointer'implicitMethodParameter)) where
    marshalInto :: Raw Type'anyPointer'implicitMethodParameter ('Mut s)
-> Parsed Type'anyPointer'implicitMethodParameter -> m ()
marshalInto Raw Type'anyPointer'implicitMethodParameter ('Mut s)
raw_ Type'anyPointer'implicitMethodParameter'{..} = (do
        (Field 'Slot Type'anyPointer'implicitMethodParameter Word16
-> Word16
-> Raw Type'anyPointer'implicitMethodParameter ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "parameterIndex"
  (Field 'Slot Type'anyPointer'implicitMethodParameter Word16)
Field 'Slot Type'anyPointer'implicitMethodParameter Word16
#parameterIndex Word16
Parsed Word16
parameterIndex Raw Type'anyPointer'implicitMethodParameter ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "parameterIndex" GH.Slot Type'anyPointer'implicitMethodParameter Std_.Word16) where
    fieldByLabel :: Field 'Slot Type'anyPointer'implicitMethodParameter Word16
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot Type'anyPointer'implicitMethodParameter Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
1 BitCount
16 Word64
0)
data Brand 
type instance (R.ReprFor Brand) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Brand) where
    typeId :: Word64
typeId  = Word64
10391024731148337707
instance (C.TypedStruct Brand) where
    numStructWords :: Word16
numStructWords  = Word16
0
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Brand) where
    type AllocHint Brand = ()
    new :: AllocHint Brand -> Message ('Mut s) -> m (Raw Brand ('Mut s))
new AllocHint Brand
_ = Message ('Mut s) -> m (Raw Brand ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Brand (C.Parsed Brand))
instance (C.AllocateList Brand) where
    type ListAllocHint Brand = Std_.Int
    newList :: ListAllocHint Brand
-> Message ('Mut s) -> m (Raw (List Brand) ('Mut s))
newList  = ListAllocHint Brand
-> Message ('Mut s) -> m (Raw (List Brand) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Brand (C.Parsed Brand))
data instance C.Parsed Brand
    = Brand 
        {Parsed Brand -> Parsed (List Brand'Scope)
scopes :: (RP.Parsed (R.List Brand'Scope))}
    deriving((forall x. Parsed Brand -> Rep (Parsed Brand) x)
-> (forall x. Rep (Parsed Brand) x -> Parsed Brand)
-> Generic (Parsed Brand)
forall x. Rep (Parsed Brand) x -> Parsed Brand
forall x. Parsed Brand -> Rep (Parsed Brand) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Brand) x -> Parsed Brand
$cfrom :: forall x. Parsed Brand -> Rep (Parsed Brand) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Brand))
deriving instance (Std_.Eq (C.Parsed Brand))
instance (C.Parse Brand (C.Parsed Brand)) where
    parse :: Raw Brand 'Const -> m (Parsed Brand)
parse Raw Brand 'Const
raw_ = (Vector (Parsed Brand'Scope) -> Parsed Brand
Parsed (List Brand'Scope) -> Parsed Brand
Brand (Vector (Parsed Brand'Scope) -> Parsed Brand)
-> m (Vector (Parsed Brand'Scope)) -> m (Parsed Brand)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Brand (List Brand'Scope)
-> Raw Brand 'Const -> m (Vector (Parsed Brand'Scope))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "scopes" (Field 'Slot Brand (List Brand'Scope))
Field 'Slot Brand (List Brand'Scope)
#scopes Raw Brand 'Const
raw_))
instance (C.Marshal Brand (C.Parsed Brand)) where
    marshalInto :: Raw Brand ('Mut s) -> Parsed Brand -> m ()
marshalInto Raw Brand ('Mut s)
raw_ Brand{..} = (do
        (Field 'Slot Brand (List Brand'Scope)
-> Vector (Parsed Brand'Scope) -> Raw Brand ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "scopes" (Field 'Slot Brand (List Brand'Scope))
Field 'Slot Brand (List Brand'Scope)
#scopes Vector (Parsed Brand'Scope)
Parsed (List Brand'Scope)
scopes Raw Brand ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "scopes" GH.Slot Brand (R.List Brand'Scope)) where
    fieldByLabel :: Field 'Slot Brand (List Brand'Scope)
fieldByLabel  = (Word16 -> Field 'Slot Brand (List Brand'Scope)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
data Brand'Scope 
type instance (R.ReprFor Brand'Scope) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Brand'Scope) where
    typeId :: Word64
typeId  = Word64
12382423449155627977
instance (C.TypedStruct Brand'Scope) where
    numStructWords :: Word16
numStructWords  = Word16
2
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Brand'Scope) where
    type AllocHint Brand'Scope = ()
    new :: AllocHint Brand'Scope
-> Message ('Mut s) -> m (Raw Brand'Scope ('Mut s))
new AllocHint Brand'Scope
_ = Message ('Mut s) -> m (Raw Brand'Scope ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Brand'Scope (C.Parsed Brand'Scope))
instance (C.AllocateList Brand'Scope) where
    type ListAllocHint Brand'Scope = Std_.Int
    newList :: ListAllocHint Brand'Scope
-> Message ('Mut s) -> m (Raw (List Brand'Scope) ('Mut s))
newList  = ListAllocHint Brand'Scope
-> Message ('Mut s) -> m (Raw (List Brand'Scope) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Brand'Scope (C.Parsed Brand'Scope))
data instance C.Parsed Brand'Scope
    = Brand'Scope 
        {Parsed Brand'Scope -> Parsed Word64
scopeId :: (RP.Parsed Std_.Word64)
        ,Parsed Brand'Scope -> Parsed (Which Brand'Scope)
union' :: (C.Parsed (GH.Which Brand'Scope))}
    deriving((forall x. Parsed Brand'Scope -> Rep (Parsed Brand'Scope) x)
-> (forall x. Rep (Parsed Brand'Scope) x -> Parsed Brand'Scope)
-> Generic (Parsed Brand'Scope)
forall x. Rep (Parsed Brand'Scope) x -> Parsed Brand'Scope
forall x. Parsed Brand'Scope -> Rep (Parsed Brand'Scope) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Brand'Scope) x -> Parsed Brand'Scope
$cfrom :: forall x. Parsed Brand'Scope -> Rep (Parsed Brand'Scope) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Brand'Scope))
deriving instance (Std_.Eq (C.Parsed Brand'Scope))
instance (C.Parse Brand'Scope (C.Parsed Brand'Scope)) where
    parse :: Raw Brand'Scope 'Const -> m (Parsed Brand'Scope)
parse Raw Brand'Scope 'Const
raw_ = (Word64 -> Parsed (Which Brand'Scope) -> Parsed Brand'Scope
Parsed Word64 -> Parsed (Which Brand'Scope) -> Parsed Brand'Scope
Brand'Scope (Word64 -> Parsed (Which Brand'Scope) -> Parsed Brand'Scope)
-> m Word64 -> m (Parsed (Which Brand'Scope) -> Parsed Brand'Scope)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Brand'Scope Word64
-> Raw Brand'Scope 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "scopeId" (Field 'Slot Brand'Scope Word64)
Field 'Slot Brand'Scope Word64
#scopeId Raw Brand'Scope 'Const
raw_)
                              m (Parsed (Which Brand'Scope) -> Parsed Brand'Scope)
-> m (Parsed (Which Brand'Scope)) -> m (Parsed Brand'Scope)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Raw (Which Brand'Scope) 'Const -> m (Parsed (Which Brand'Scope))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Brand'Scope 'Const -> Raw (Which Brand'Scope) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Brand'Scope 'Const
raw_)))
instance (C.Marshal Brand'Scope (C.Parsed Brand'Scope)) where
    marshalInto :: Raw Brand'Scope ('Mut s) -> Parsed Brand'Scope -> m ()
marshalInto Raw Brand'Scope ('Mut s)
raw_ Brand'Scope{..} = (do
        (Field 'Slot Brand'Scope Word64
-> Word64 -> Raw Brand'Scope ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "scopeId" (Field 'Slot Brand'Scope Word64)
Field 'Slot Brand'Scope Word64
#scopeId Word64
Parsed Word64
scopeId Raw Brand'Scope ('Mut s)
raw_)
        (Raw (Which Brand'Scope) ('Mut s)
-> Parsed (Which Brand'Scope) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Brand'Scope ('Mut s) -> Raw (Which Brand'Scope) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Brand'Scope ('Mut s)
raw_) Parsed (Which Brand'Scope)
union')
        )
instance (GH.HasUnion Brand'Scope) where
    unionField :: Field 'Slot Brand'Scope Word16
unionField  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Brand'Scope Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
16 Word64
0)
    data RawWhich Brand'Scope mut_
        = RW_Brand'Scope'bind (R.Raw (R.List Brand'Binding) mut_)
        | RW_Brand'Scope'inherit (R.Raw () mut_)
        | RW_Brand'Scope'unknown' Std_.Word16
    internalWhich :: Word16 -> Raw Brand'Scope mut -> m (RawWhich Brand'Scope mut)
internalWhich Word16
tag_ Raw Brand'Scope mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw (List Brand'Binding) mut -> RawWhich Brand'Scope mut
forall (mut_ :: Mutability).
Raw (List Brand'Binding) mut_ -> RawWhich Brand'Scope mut_
RW_Brand'Scope'bind (Raw (List Brand'Binding) mut -> RawWhich Brand'Scope mut)
-> m (Raw (List Brand'Binding) mut) -> m (RawWhich Brand'Scope mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Brand'Scope (List Brand'Binding)
-> Raw Brand'Scope mut -> m (Raw (List Brand'Binding) mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "bind" (Variant 'Slot Brand'Scope (List Brand'Binding))
Variant 'Slot Brand'Scope (List Brand'Binding)
#bind Raw Brand'Scope mut
struct_))
        Word16
1 ->
            (Raw () mut -> RawWhich Brand'Scope mut
forall (mut_ :: Mutability).
Raw () mut_ -> RawWhich Brand'Scope mut_
RW_Brand'Scope'inherit (Raw () mut -> RawWhich Brand'Scope mut)
-> m (Raw () mut) -> m (RawWhich Brand'Scope mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Brand'Scope ()
-> Raw Brand'Scope mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "inherit" (Variant 'Slot Brand'Scope ())
Variant 'Slot Brand'Scope ()
#inherit Raw Brand'Scope mut
struct_))
        Word16
_ ->
            (RawWhich Brand'Scope mut -> m (RawWhich Brand'Scope mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Brand'Scope mut
forall (mut_ :: Mutability). Word16 -> RawWhich Brand'Scope mut_
RW_Brand'Scope'unknown' Word16
tag_))
    data Which Brand'Scope
instance (GH.HasVariant "bind" GH.Slot Brand'Scope (R.List Brand'Binding)) where
    variantByLabel :: Variant 'Slot Brand'Scope (List Brand'Binding)
variantByLabel  = (Field 'Slot Brand'Scope (List Brand'Binding)
-> Word16 -> Variant 'Slot Brand'Scope (List Brand'Binding)
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (Word16 -> Field 'Slot Brand'Scope (List Brand'Binding)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0) Word16
0)
instance (GH.HasVariant "inherit" GH.Slot Brand'Scope ()) where
    variantByLabel :: Variant 'Slot Brand'Scope ()
variantByLabel  = (Field 'Slot Brand'Scope ()
-> Word16 -> Variant 'Slot Brand'Scope ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Brand'Scope ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
1)
data instance C.Parsed (GH.Which Brand'Scope)
    = Brand'Scope'bind (RP.Parsed (R.List Brand'Binding))
    | Brand'Scope'inherit 
    | Brand'Scope'unknown' Std_.Word16
    deriving((forall x.
 Parsed (Which Brand'Scope) -> Rep (Parsed (Which Brand'Scope)) x)
-> (forall x.
    Rep (Parsed (Which Brand'Scope)) x -> Parsed (Which Brand'Scope))
-> Generic (Parsed (Which Brand'Scope))
forall x.
Rep (Parsed (Which Brand'Scope)) x -> Parsed (Which Brand'Scope)
forall x.
Parsed (Which Brand'Scope) -> Rep (Parsed (Which Brand'Scope)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed (Which Brand'Scope)) x -> Parsed (Which Brand'Scope)
$cfrom :: forall x.
Parsed (Which Brand'Scope) -> Rep (Parsed (Which Brand'Scope)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Brand'Scope)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Brand'Scope)))
instance (C.Parse (GH.Which Brand'Scope) (C.Parsed (GH.Which Brand'Scope))) where
    parse :: Raw (Which Brand'Scope) 'Const -> m (Parsed (Which Brand'Scope))
parse Raw (Which Brand'Scope) 'Const
raw_ = (do
        RawWhich Brand'Scope 'Const
rawWhich_ <- (Raw (Which Brand'Scope) 'Const -> m (RawWhich Brand'Scope 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Brand'Scope) 'Const
raw_)
        case RawWhich Brand'Scope 'Const
rawWhich_ of
            (RW_Brand'Scope'bind rawArg_) ->
                (Vector (Parsed Brand'Binding) -> Parsed (Which Brand'Scope)
Parsed (List Brand'Binding) -> Parsed (Which Brand'Scope)
Brand'Scope'bind (Vector (Parsed Brand'Binding) -> Parsed (Which Brand'Scope))
-> m (Vector (Parsed Brand'Binding))
-> m (Parsed (Which Brand'Scope))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (List Brand'Binding) 'Const
-> m (Vector (Parsed Brand'Binding))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw (List Brand'Binding) 'Const
rawArg_))
            (RW_Brand'Scope'inherit _) ->
                (Parsed (Which Brand'Scope) -> m (Parsed (Which Brand'Scope))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Brand'Scope)
Brand'Scope'inherit)
            (RW_Brand'Scope'unknown' tag_) ->
                (Parsed (Which Brand'Scope) -> m (Parsed (Which Brand'Scope))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Brand'Scope)
Brand'Scope'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Brand'Scope) (C.Parsed (GH.Which Brand'Scope))) where
    marshalInto :: Raw (Which Brand'Scope) ('Mut s)
-> Parsed (Which Brand'Scope) -> m ()
marshalInto Raw (Which Brand'Scope) ('Mut s)
raw_ Parsed (Which Brand'Scope)
parsed_ = case Parsed (Which Brand'Scope)
parsed_ of
        (Brand'Scope'bind arg_) ->
            (Variant 'Slot Brand'Scope (List Brand'Binding)
-> Vector (Parsed Brand'Binding)
-> Raw Brand'Scope ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "bind" (Variant 'Slot Brand'Scope (List Brand'Binding))
Variant 'Slot Brand'Scope (List Brand'Binding)
#bind Vector (Parsed Brand'Binding)
Parsed (List Brand'Binding)
arg_ (Raw (Which Brand'Scope) ('Mut s) -> Raw Brand'Scope ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Brand'Scope) ('Mut s)
raw_))
        (Parsed (Which Brand'Scope)
Brand'Scope'inherit) ->
            (Variant 'Slot Brand'Scope ()
-> () -> Raw Brand'Scope ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "inherit" (Variant 'Slot Brand'Scope ())
Variant 'Slot Brand'Scope ()
#inherit () (Raw (Which Brand'Scope) ('Mut s) -> Raw Brand'Scope ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Brand'Scope) ('Mut s)
raw_))
        (Brand'Scope'unknown' tag_) ->
            (Field 'Slot Brand'Scope Word16
-> Word16 -> Raw Brand'Scope ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Brand'Scope Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Brand'Scope) ('Mut s) -> Raw Brand'Scope ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Brand'Scope) ('Mut s)
raw_))
instance (GH.HasField "scopeId" GH.Slot Brand'Scope Std_.Word64) where
    fieldByLabel :: Field 'Slot Brand'Scope Word64
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Brand'Scope Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
64 Word64
0)
data Brand'Binding 
type instance (R.ReprFor Brand'Binding) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Brand'Binding) where
    typeId :: Word64
typeId  = Word64
14439610327179913212
instance (C.TypedStruct Brand'Binding) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Brand'Binding) where
    type AllocHint Brand'Binding = ()
    new :: AllocHint Brand'Binding
-> Message ('Mut s) -> m (Raw Brand'Binding ('Mut s))
new AllocHint Brand'Binding
_ = Message ('Mut s) -> m (Raw Brand'Binding ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Brand'Binding (C.Parsed Brand'Binding))
instance (C.AllocateList Brand'Binding) where
    type ListAllocHint Brand'Binding = Std_.Int
    newList :: ListAllocHint Brand'Binding
-> Message ('Mut s) -> m (Raw (List Brand'Binding) ('Mut s))
newList  = ListAllocHint Brand'Binding
-> Message ('Mut s) -> m (Raw (List Brand'Binding) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Brand'Binding (C.Parsed Brand'Binding))
data instance C.Parsed Brand'Binding
    = Brand'Binding 
        {Parsed Brand'Binding -> Parsed (Which Brand'Binding)
union' :: (C.Parsed (GH.Which Brand'Binding))}
    deriving((forall x. Parsed Brand'Binding -> Rep (Parsed Brand'Binding) x)
-> (forall x. Rep (Parsed Brand'Binding) x -> Parsed Brand'Binding)
-> Generic (Parsed Brand'Binding)
forall x. Rep (Parsed Brand'Binding) x -> Parsed Brand'Binding
forall x. Parsed Brand'Binding -> Rep (Parsed Brand'Binding) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Brand'Binding) x -> Parsed Brand'Binding
$cfrom :: forall x. Parsed Brand'Binding -> Rep (Parsed Brand'Binding) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Brand'Binding))
deriving instance (Std_.Eq (C.Parsed Brand'Binding))
instance (C.Parse Brand'Binding (C.Parsed Brand'Binding)) where
    parse :: Raw Brand'Binding 'Const -> m (Parsed Brand'Binding)
parse Raw Brand'Binding 'Const
raw_ = (Parsed (Which Brand'Binding) -> Parsed Brand'Binding
Brand'Binding (Parsed (Which Brand'Binding) -> Parsed Brand'Binding)
-> m (Parsed (Which Brand'Binding)) -> m (Parsed Brand'Binding)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Which Brand'Binding) 'Const
-> m (Parsed (Which Brand'Binding))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Brand'Binding 'Const -> Raw (Which Brand'Binding) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Brand'Binding 'Const
raw_)))
instance (C.Marshal Brand'Binding (C.Parsed Brand'Binding)) where
    marshalInto :: Raw Brand'Binding ('Mut s) -> Parsed Brand'Binding -> m ()
marshalInto Raw Brand'Binding ('Mut s)
raw_ Brand'Binding{..} = (do
        (Raw (Which Brand'Binding) ('Mut s)
-> Parsed (Which Brand'Binding) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Brand'Binding ('Mut s) -> Raw (Which Brand'Binding) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Brand'Binding ('Mut s)
raw_) Parsed (Which Brand'Binding)
union')
        )
instance (GH.HasUnion Brand'Binding) where
    unionField :: Field 'Slot Brand'Binding Word16
unionField  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Brand'Binding Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
16 Word64
0)
    data RawWhich Brand'Binding mut_
        = RW_Brand'Binding'unbound (R.Raw () mut_)
        | RW_Brand'Binding'type_ (R.Raw Type mut_)
        | RW_Brand'Binding'unknown' Std_.Word16
    internalWhich :: Word16 -> Raw Brand'Binding mut -> m (RawWhich Brand'Binding mut)
internalWhich Word16
tag_ Raw Brand'Binding mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw () mut -> RawWhich Brand'Binding mut
forall (mut_ :: Mutability).
Raw () mut_ -> RawWhich Brand'Binding mut_
RW_Brand'Binding'unbound (Raw () mut -> RawWhich Brand'Binding mut)
-> m (Raw () mut) -> m (RawWhich Brand'Binding mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Brand'Binding ()
-> Raw Brand'Binding mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "unbound" (Variant 'Slot Brand'Binding ())
Variant 'Slot Brand'Binding ()
#unbound Raw Brand'Binding mut
struct_))
        Word16
1 ->
            (Raw Type mut -> RawWhich Brand'Binding mut
forall (mut_ :: Mutability).
Raw Type mut_ -> RawWhich Brand'Binding mut_
RW_Brand'Binding'type_ (Raw Type mut -> RawWhich Brand'Binding mut)
-> m (Raw Type mut) -> m (RawWhich Brand'Binding mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Brand'Binding Type
-> Raw Brand'Binding mut -> m (Raw Type mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "type_" (Variant 'Slot Brand'Binding Type)
Variant 'Slot Brand'Binding Type
#type_ Raw Brand'Binding mut
struct_))
        Word16
_ ->
            (RawWhich Brand'Binding mut -> m (RawWhich Brand'Binding mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Brand'Binding mut
forall (mut_ :: Mutability). Word16 -> RawWhich Brand'Binding mut_
RW_Brand'Binding'unknown' Word16
tag_))
    data Which Brand'Binding
instance (GH.HasVariant "unbound" GH.Slot Brand'Binding ()) where
    variantByLabel :: Variant 'Slot Brand'Binding ()
variantByLabel  = (Field 'Slot Brand'Binding ()
-> Word16 -> Variant 'Slot Brand'Binding ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Brand'Binding ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
0)
instance (GH.HasVariant "type_" GH.Slot Brand'Binding Type) where
    variantByLabel :: Variant 'Slot Brand'Binding Type
variantByLabel  = (Field 'Slot Brand'Binding Type
-> Word16 -> Variant 'Slot Brand'Binding Type
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (Word16 -> Field 'Slot Brand'Binding Type
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0) Word16
1)
data instance C.Parsed (GH.Which Brand'Binding)
    = Brand'Binding'unbound 
    | Brand'Binding'type_ (RP.Parsed Type)
    | Brand'Binding'unknown' Std_.Word16
    deriving((forall x.
 Parsed (Which Brand'Binding)
 -> Rep (Parsed (Which Brand'Binding)) x)
-> (forall x.
    Rep (Parsed (Which Brand'Binding)) x
    -> Parsed (Which Brand'Binding))
-> Generic (Parsed (Which Brand'Binding))
forall x.
Rep (Parsed (Which Brand'Binding)) x
-> Parsed (Which Brand'Binding)
forall x.
Parsed (Which Brand'Binding)
-> Rep (Parsed (Which Brand'Binding)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed (Which Brand'Binding)) x
-> Parsed (Which Brand'Binding)
$cfrom :: forall x.
Parsed (Which Brand'Binding)
-> Rep (Parsed (Which Brand'Binding)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Brand'Binding)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Brand'Binding)))
instance (C.Parse (GH.Which Brand'Binding) (C.Parsed (GH.Which Brand'Binding))) where
    parse :: Raw (Which Brand'Binding) 'Const
-> m (Parsed (Which Brand'Binding))
parse Raw (Which Brand'Binding) 'Const
raw_ = (do
        RawWhich Brand'Binding 'Const
rawWhich_ <- (Raw (Which Brand'Binding) 'Const
-> m (RawWhich Brand'Binding 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Brand'Binding) 'Const
raw_)
        case RawWhich Brand'Binding 'Const
rawWhich_ of
            (RW_Brand'Binding'unbound _) ->
                (Parsed (Which Brand'Binding) -> m (Parsed (Which Brand'Binding))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Brand'Binding)
Brand'Binding'unbound)
            (RW_Brand'Binding'type_ rawArg_) ->
                (Parsed Type -> Parsed (Which Brand'Binding)
Parsed Type -> Parsed (Which Brand'Binding)
Brand'Binding'type_ (Parsed Type -> Parsed (Which Brand'Binding))
-> m (Parsed Type) -> m (Parsed (Which Brand'Binding))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Type 'Const -> m (Parsed Type)
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Type 'Const
rawArg_))
            (RW_Brand'Binding'unknown' tag_) ->
                (Parsed (Which Brand'Binding) -> m (Parsed (Which Brand'Binding))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Brand'Binding)
Brand'Binding'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Brand'Binding) (C.Parsed (GH.Which Brand'Binding))) where
    marshalInto :: Raw (Which Brand'Binding) ('Mut s)
-> Parsed (Which Brand'Binding) -> m ()
marshalInto Raw (Which Brand'Binding) ('Mut s)
raw_ Parsed (Which Brand'Binding)
parsed_ = case Parsed (Which Brand'Binding)
parsed_ of
        (Parsed (Which Brand'Binding)
Brand'Binding'unbound) ->
            (Variant 'Slot Brand'Binding ()
-> () -> Raw Brand'Binding ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "unbound" (Variant 'Slot Brand'Binding ())
Variant 'Slot Brand'Binding ()
#unbound () (Raw (Which Brand'Binding) ('Mut s) -> Raw Brand'Binding ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Brand'Binding) ('Mut s)
raw_))
        (Brand'Binding'type_ arg_) ->
            (Variant 'Slot Brand'Binding Type
-> Parsed Type -> Raw Brand'Binding ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "type_" (Variant 'Slot Brand'Binding Type)
Variant 'Slot Brand'Binding Type
#type_ Parsed Type
Parsed Type
arg_ (Raw (Which Brand'Binding) ('Mut s) -> Raw Brand'Binding ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Brand'Binding) ('Mut s)
raw_))
        (Brand'Binding'unknown' tag_) ->
            (Field 'Slot Brand'Binding Word16
-> Word16 -> Raw Brand'Binding ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Brand'Binding Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Brand'Binding) ('Mut s) -> Raw Brand'Binding ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Brand'Binding) ('Mut s)
raw_))
data Value 
type instance (R.ReprFor Value) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Value) where
    typeId :: Word64
typeId  = Word64
14853958794117909659
instance (C.TypedStruct Value) where
    numStructWords :: Word16
numStructWords  = Word16
2
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate Value) where
    type AllocHint Value = ()
    new :: AllocHint Value -> Message ('Mut s) -> m (Raw Value ('Mut s))
new AllocHint Value
_ = Message ('Mut s) -> m (Raw Value ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Value (C.Parsed Value))
instance (C.AllocateList Value) where
    type ListAllocHint Value = Std_.Int
    newList :: ListAllocHint Value
-> Message ('Mut s) -> m (Raw (List Value) ('Mut s))
newList  = ListAllocHint Value
-> Message ('Mut s) -> m (Raw (List Value) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Value (C.Parsed Value))
data instance C.Parsed Value
    = Value 
        {Parsed Value -> Parsed (Which Value)
union' :: (C.Parsed (GH.Which Value))}
    deriving((forall x. Parsed Value -> Rep (Parsed Value) x)
-> (forall x. Rep (Parsed Value) x -> Parsed Value)
-> Generic (Parsed Value)
forall x. Rep (Parsed Value) x -> Parsed Value
forall x. Parsed Value -> Rep (Parsed Value) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Value) x -> Parsed Value
$cfrom :: forall x. Parsed Value -> Rep (Parsed Value) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Value))
deriving instance (Std_.Eq (C.Parsed Value))
instance (C.Parse Value (C.Parsed Value)) where
    parse :: Raw Value 'Const -> m (Parsed Value)
parse Raw Value 'Const
raw_ = (Parsed (Which Value) -> Parsed Value
Value (Parsed (Which Value) -> Parsed Value)
-> m (Parsed (Which Value)) -> m (Parsed Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Which Value) 'Const -> m (Parsed (Which Value))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse (Raw Value 'Const -> Raw (Which Value) 'Const
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Value 'Const
raw_)))
instance (C.Marshal Value (C.Parsed Value)) where
    marshalInto :: Raw Value ('Mut s) -> Parsed Value -> m ()
marshalInto Raw Value ('Mut s)
raw_ Value{..} = (do
        (Raw (Which Value) ('Mut s) -> Parsed (Which Value) -> m ()
forall t p (m :: * -> *) s.
(Marshal t p, RWCtx m s) =>
Raw t ('Mut s) -> p -> m ()
C.marshalInto (Raw Value ('Mut s) -> Raw (Which Value) ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw a mut -> Raw (Which a) mut
GH.structUnion Raw Value ('Mut s)
raw_) Parsed (Which Value)
union')
        )
instance (GH.HasUnion Value) where
    unionField :: Field 'Slot Value Word16
unionField  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Value Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
16 Word64
0)
    data RawWhich Value mut_
        = RW_Value'void (R.Raw () mut_)
        | RW_Value'bool (R.Raw Std_.Bool mut_)
        | RW_Value'int8 (R.Raw Std_.Int8 mut_)
        | RW_Value'int16 (R.Raw Std_.Int16 mut_)
        | RW_Value'int32 (R.Raw Std_.Int32 mut_)
        | RW_Value'int64 (R.Raw Std_.Int64 mut_)
        | RW_Value'uint8 (R.Raw Std_.Word8 mut_)
        | RW_Value'uint16 (R.Raw Std_.Word16 mut_)
        | RW_Value'uint32 (R.Raw Std_.Word32 mut_)
        | RW_Value'uint64 (R.Raw Std_.Word64 mut_)
        | RW_Value'float32 (R.Raw Std_.Float mut_)
        | RW_Value'float64 (R.Raw Std_.Double mut_)
        | RW_Value'text (R.Raw Basics.Text mut_)
        | RW_Value'data_ (R.Raw Basics.Data mut_)
        | RW_Value'list (R.Raw (Std_.Maybe Basics.AnyPointer) mut_)
        | RW_Value'enum (R.Raw Std_.Word16 mut_)
        | RW_Value'struct (R.Raw (Std_.Maybe Basics.AnyPointer) mut_)
        | RW_Value'interface (R.Raw () mut_)
        | RW_Value'anyPointer (R.Raw (Std_.Maybe Basics.AnyPointer) mut_)
        | RW_Value'unknown' Std_.Word16
    internalWhich :: Word16 -> Raw Value mut -> m (RawWhich Value mut)
internalWhich Word16
tag_ Raw Value mut
struct_ = case Word16
tag_ of
        Word16
0 ->
            (Raw () mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Value mut_
RW_Value'void (Raw () mut -> RawWhich Value mut)
-> m (Raw () mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value () -> Raw Value mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "void" (Variant 'Slot Value ())
Variant 'Slot Value ()
#void Raw Value mut
struct_))
        Word16
1 ->
            (Raw Bool mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Bool mut_ -> RawWhich Value mut_
RW_Value'bool (Raw Bool mut -> RawWhich Value mut)
-> m (Raw Bool mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Bool -> Raw Value mut -> m (Raw Bool mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "bool" (Variant 'Slot Value Bool)
Variant 'Slot Value Bool
#bool Raw Value mut
struct_))
        Word16
2 ->
            (Raw Int8 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Int8 mut_ -> RawWhich Value mut_
RW_Value'int8 (Raw Int8 mut -> RawWhich Value mut)
-> m (Raw Int8 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Int8 -> Raw Value mut -> m (Raw Int8 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "int8" (Variant 'Slot Value Int8)
Variant 'Slot Value Int8
#int8 Raw Value mut
struct_))
        Word16
3 ->
            (Raw Int16 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Int16 mut_ -> RawWhich Value mut_
RW_Value'int16 (Raw Int16 mut -> RawWhich Value mut)
-> m (Raw Int16 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Int16 -> Raw Value mut -> m (Raw Int16 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "int16" (Variant 'Slot Value Int16)
Variant 'Slot Value Int16
#int16 Raw Value mut
struct_))
        Word16
4 ->
            (Raw Int32 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Int32 mut_ -> RawWhich Value mut_
RW_Value'int32 (Raw Int32 mut -> RawWhich Value mut)
-> m (Raw Int32 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Int32 -> Raw Value mut -> m (Raw Int32 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "int32" (Variant 'Slot Value Int32)
Variant 'Slot Value Int32
#int32 Raw Value mut
struct_))
        Word16
5 ->
            (Raw Int64 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Int64 mut_ -> RawWhich Value mut_
RW_Value'int64 (Raw Int64 mut -> RawWhich Value mut)
-> m (Raw Int64 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Int64 -> Raw Value mut -> m (Raw Int64 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "int64" (Variant 'Slot Value Int64)
Variant 'Slot Value Int64
#int64 Raw Value mut
struct_))
        Word16
6 ->
            (Raw Word8 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Word8 mut_ -> RawWhich Value mut_
RW_Value'uint8 (Raw Word8 mut -> RawWhich Value mut)
-> m (Raw Word8 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Word8 -> Raw Value mut -> m (Raw Word8 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "uint8" (Variant 'Slot Value Word8)
Variant 'Slot Value Word8
#uint8 Raw Value mut
struct_))
        Word16
7 ->
            (Raw Word16 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Word16 mut_ -> RawWhich Value mut_
RW_Value'uint16 (Raw Word16 mut -> RawWhich Value mut)
-> m (Raw Word16 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Word16 -> Raw Value mut -> m (Raw Word16 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "uint16" (Variant 'Slot Value Word16)
Variant 'Slot Value Word16
#uint16 Raw Value mut
struct_))
        Word16
8 ->
            (Raw Word32 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Word32 mut_ -> RawWhich Value mut_
RW_Value'uint32 (Raw Word32 mut -> RawWhich Value mut)
-> m (Raw Word32 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Word32 -> Raw Value mut -> m (Raw Word32 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "uint32" (Variant 'Slot Value Word32)
Variant 'Slot Value Word32
#uint32 Raw Value mut
struct_))
        Word16
9 ->
            (Raw Word64 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Word64 mut_ -> RawWhich Value mut_
RW_Value'uint64 (Raw Word64 mut -> RawWhich Value mut)
-> m (Raw Word64 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Word64 -> Raw Value mut -> m (Raw Word64 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "uint64" (Variant 'Slot Value Word64)
Variant 'Slot Value Word64
#uint64 Raw Value mut
struct_))
        Word16
10 ->
            (Raw Float mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Float mut_ -> RawWhich Value mut_
RW_Value'float32 (Raw Float mut -> RawWhich Value mut)
-> m (Raw Float mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Float -> Raw Value mut -> m (Raw Float mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "float32" (Variant 'Slot Value Float)
Variant 'Slot Value Float
#float32 Raw Value mut
struct_))
        Word16
11 ->
            (Raw Double mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Double mut_ -> RawWhich Value mut_
RW_Value'float64 (Raw Double mut -> RawWhich Value mut)
-> m (Raw Double mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Double -> Raw Value mut -> m (Raw Double mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "float64" (Variant 'Slot Value Double)
Variant 'Slot Value Double
#float64 Raw Value mut
struct_))
        Word16
12 ->
            (Raw Text mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Text mut_ -> RawWhich Value mut_
RW_Value'text (Raw Text mut -> RawWhich Value mut)
-> m (Raw Text mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Text -> Raw Value mut -> m (Raw Text mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "text" (Variant 'Slot Value Text)
Variant 'Slot Value Text
#text Raw Value mut
struct_))
        Word16
13 ->
            (Raw Data mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Data mut_ -> RawWhich Value mut_
RW_Value'data_ (Raw Data mut -> RawWhich Value mut)
-> m (Raw Data mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Data -> Raw Value mut -> m (Raw Data mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "data_" (Variant 'Slot Value Data)
Variant 'Slot Value Data
#data_ Raw Value mut
struct_))
        Word16
14 ->
            (Raw (Maybe AnyPointer) mut -> RawWhich Value mut
forall (mut_ :: Mutability).
Raw (Maybe AnyPointer) mut_ -> RawWhich Value mut_
RW_Value'list (Raw (Maybe AnyPointer) mut -> RawWhich Value mut)
-> m (Raw (Maybe AnyPointer) mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value (Maybe AnyPointer)
-> Raw Value mut -> m (Raw (Maybe AnyPointer) mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "list" (Variant 'Slot Value (Maybe AnyPointer))
Variant 'Slot Value (Maybe AnyPointer)
#list Raw Value mut
struct_))
        Word16
15 ->
            (Raw Word16 mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw Word16 mut_ -> RawWhich Value mut_
RW_Value'enum (Raw Word16 mut -> RawWhich Value mut)
-> m (Raw Word16 mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value Word16 -> Raw Value mut -> m (Raw Word16 mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "enum" (Variant 'Slot Value Word16)
Variant 'Slot Value Word16
#enum Raw Value mut
struct_))
        Word16
16 ->
            (Raw (Maybe AnyPointer) mut -> RawWhich Value mut
forall (mut_ :: Mutability).
Raw (Maybe AnyPointer) mut_ -> RawWhich Value mut_
RW_Value'struct (Raw (Maybe AnyPointer) mut -> RawWhich Value mut)
-> m (Raw (Maybe AnyPointer) mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value (Maybe AnyPointer)
-> Raw Value mut -> m (Raw (Maybe AnyPointer) mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "struct" (Variant 'Slot Value (Maybe AnyPointer))
Variant 'Slot Value (Maybe AnyPointer)
#struct Raw Value mut
struct_))
        Word16
17 ->
            (Raw () mut -> RawWhich Value mut
forall (mut_ :: Mutability). Raw () mut_ -> RawWhich Value mut_
RW_Value'interface (Raw () mut -> RawWhich Value mut)
-> m (Raw () mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value () -> Raw Value mut -> m (Raw () mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "interface" (Variant 'Slot Value ())
Variant 'Slot Value ()
#interface Raw Value mut
struct_))
        Word16
18 ->
            (Raw (Maybe AnyPointer) mut -> RawWhich Value mut
forall (mut_ :: Mutability).
Raw (Maybe AnyPointer) mut_ -> RawWhich Value mut_
RW_Value'anyPointer (Raw (Maybe AnyPointer) mut -> RawWhich Value mut)
-> m (Raw (Maybe AnyPointer) mut) -> m (RawWhich Value mut)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Variant 'Slot Value (Maybe AnyPointer)
-> Raw Value mut -> m (Raw (Maybe AnyPointer) mut)
forall (k :: FieldKind) a b (mut :: Mutability) (m :: * -> *).
(IsStruct a, ReadCtx m mut) =>
Variant k a b -> Raw a mut -> m (Raw b mut)
GH.readVariant IsLabel "anyPointer" (Variant 'Slot Value (Maybe AnyPointer))
Variant 'Slot Value (Maybe AnyPointer)
#anyPointer Raw Value mut
struct_))
        Word16
_ ->
            (RawWhich Value mut -> m (RawWhich Value mut)
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> RawWhich Value mut
forall (mut_ :: Mutability). Word16 -> RawWhich Value mut_
RW_Value'unknown' Word16
tag_))
    data Which Value
instance (GH.HasVariant "void" GH.Slot Value ()) where
    variantByLabel :: Variant 'Slot Value ()
variantByLabel  = (Field 'Slot Value () -> Word16 -> Variant 'Slot Value ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Value ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
0)
instance (GH.HasVariant "bool" GH.Slot Value Std_.Bool) where
    variantByLabel :: Variant 'Slot Value Bool
variantByLabel  = (Field 'Slot Value Bool -> Word16 -> Variant 'Slot Value Bool
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Value Bool
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
0 BitCount
1 Word64
0) Word16
1)
instance (GH.HasVariant "int8" GH.Slot Value Std_.Int8) where
    variantByLabel :: Variant 'Slot Value Int8
variantByLabel  = (Field 'Slot Value Int8 -> Word16 -> Variant 'Slot Value Int8
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Value Int8
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
0 BitCount
8 Word64
0) Word16
2)
instance (GH.HasVariant "int16" GH.Slot Value Std_.Int16) where
    variantByLabel :: Variant 'Slot Value Int16
variantByLabel  = (Field 'Slot Value Int16 -> Word16 -> Variant 'Slot Value Int16
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Value Int16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
0 BitCount
16 Word64
0) Word16
3)
instance (GH.HasVariant "int32" GH.Slot Value Std_.Int32) where
    variantByLabel :: Variant 'Slot Value Int32
variantByLabel  = (Field 'Slot Value Int32 -> Word16 -> Variant 'Slot Value Int32
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Value Int32
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
32 Word16
0 BitCount
32 Word64
0) Word16
4)
instance (GH.HasVariant "int64" GH.Slot Value Std_.Int64) where
    variantByLabel :: Variant 'Slot Value Int64
variantByLabel  = (Field 'Slot Value Int64 -> Word16 -> Variant 'Slot Value Int64
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Value Int64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
64 Word64
0) Word16
5)
instance (GH.HasVariant "uint8" GH.Slot Value Std_.Word8) where
    variantByLabel :: Variant 'Slot Value Word8
variantByLabel  = (Field 'Slot Value Word8 -> Word16 -> Variant 'Slot Value Word8
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Value Word8
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
0 BitCount
8 Word64
0) Word16
6)
instance (GH.HasVariant "uint16" GH.Slot Value Std_.Word16) where
    variantByLabel :: Variant 'Slot Value Word16
variantByLabel  = (Field 'Slot Value Word16 -> Word16 -> Variant 'Slot Value Word16
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Value Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
0 BitCount
16 Word64
0) Word16
7)
instance (GH.HasVariant "uint32" GH.Slot Value Std_.Word32) where
    variantByLabel :: Variant 'Slot Value Word32
variantByLabel  = (Field 'Slot Value Word32 -> Word16 -> Variant 'Slot Value Word32
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Value Word32
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
32 Word16
0 BitCount
32 Word64
0) Word16
8)
instance (GH.HasVariant "uint64" GH.Slot Value Std_.Word64) where
    variantByLabel :: Variant 'Slot Value Word64
variantByLabel  = (Field 'Slot Value Word64 -> Word16 -> Variant 'Slot Value Word64
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Value Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
64 Word64
0) Word16
9)
instance (GH.HasVariant "float32" GH.Slot Value Std_.Float) where
    variantByLabel :: Variant 'Slot Value Float
variantByLabel  = (Field 'Slot Value Float -> Word16 -> Variant 'Slot Value Float
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot Value Float
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
32 Word16
0 BitCount
32 Word64
0) Word16
10)
instance (GH.HasVariant "float64" GH.Slot Value Std_.Double) where
    variantByLabel :: Variant 'Slot Value Double
variantByLabel  = (Field 'Slot Value Double -> Word16 -> Variant 'Slot Value Double
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Value Double
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
1 BitCount
64 Word64
0) Word16
11)
instance (GH.HasVariant "text" GH.Slot Value Basics.Text) where
    variantByLabel :: Variant 'Slot Value Text
variantByLabel  = (Field 'Slot Value Text -> Word16 -> Variant 'Slot Value Text
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (Word16 -> Field 'Slot Value Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0) Word16
12)
instance (GH.HasVariant "data_" GH.Slot Value Basics.Data) where
    variantByLabel :: Variant 'Slot Value Data
variantByLabel  = (Field 'Slot Value Data -> Word16 -> Variant 'Slot Value Data
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (Word16 -> Field 'Slot Value Data
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0) Word16
13)
instance (GH.HasVariant "list" GH.Slot Value (Std_.Maybe Basics.AnyPointer)) where
    variantByLabel :: Variant 'Slot Value (Maybe AnyPointer)
variantByLabel  = (Field 'Slot Value (Maybe AnyPointer)
-> Word16 -> Variant 'Slot Value (Maybe AnyPointer)
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (Word16 -> Field 'Slot Value (Maybe AnyPointer)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0) Word16
14)
instance (GH.HasVariant "enum" GH.Slot Value Std_.Word16) where
    variantByLabel :: Variant 'Slot Value Word16
variantByLabel  = (Field 'Slot Value Word16 -> Word16 -> Variant 'Slot Value Word16
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Value Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
0 BitCount
16 Word64
0) Word16
15)
instance (GH.HasVariant "struct" GH.Slot Value (Std_.Maybe Basics.AnyPointer)) where
    variantByLabel :: Variant 'Slot Value (Maybe AnyPointer)
variantByLabel  = (Field 'Slot Value (Maybe AnyPointer)
-> Word16 -> Variant 'Slot Value (Maybe AnyPointer)
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (Word16 -> Field 'Slot Value (Maybe AnyPointer)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0) Word16
16)
instance (GH.HasVariant "interface" GH.Slot Value ()) where
    variantByLabel :: Variant 'Slot Value ()
variantByLabel  = (Field 'Slot Value () -> Word16 -> Variant 'Slot Value ()
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant Field 'Slot Value ()
forall b a. (ReprFor b ~ 'Data 'Sz0) => Field 'Slot a b
GH.voidField Word16
17)
instance (GH.HasVariant "anyPointer" GH.Slot Value (Std_.Maybe Basics.AnyPointer)) where
    variantByLabel :: Variant 'Slot Value (Maybe AnyPointer)
variantByLabel  = (Field 'Slot Value (Maybe AnyPointer)
-> Word16 -> Variant 'Slot Value (Maybe AnyPointer)
forall (k :: FieldKind) a b. Field k a b -> Word16 -> Variant k a b
GH.Variant (Word16 -> Field 'Slot Value (Maybe AnyPointer)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0) Word16
18)
data instance C.Parsed (GH.Which Value)
    = Value'void 
    | Value'bool (RP.Parsed Std_.Bool)
    | Value'int8 (RP.Parsed Std_.Int8)
    | Value'int16 (RP.Parsed Std_.Int16)
    | Value'int32 (RP.Parsed Std_.Int32)
    | Value'int64 (RP.Parsed Std_.Int64)
    | Value'uint8 (RP.Parsed Std_.Word8)
    | Value'uint16 (RP.Parsed Std_.Word16)
    | Value'uint32 (RP.Parsed Std_.Word32)
    | Value'uint64 (RP.Parsed Std_.Word64)
    | Value'float32 (RP.Parsed Std_.Float)
    | Value'float64 (RP.Parsed Std_.Double)
    | Value'text (RP.Parsed Basics.Text)
    | Value'data_ (RP.Parsed Basics.Data)
    | Value'list (RP.Parsed (Std_.Maybe Basics.AnyPointer))
    | Value'enum (RP.Parsed Std_.Word16)
    | Value'struct (RP.Parsed (Std_.Maybe Basics.AnyPointer))
    | Value'interface 
    | Value'anyPointer (RP.Parsed (Std_.Maybe Basics.AnyPointer))
    | Value'unknown' Std_.Word16
    deriving((forall x. Parsed (Which Value) -> Rep (Parsed (Which Value)) x)
-> (forall x. Rep (Parsed (Which Value)) x -> Parsed (Which Value))
-> Generic (Parsed (Which Value))
forall x. Rep (Parsed (Which Value)) x -> Parsed (Which Value)
forall x. Parsed (Which Value) -> Rep (Parsed (Which Value)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed (Which Value)) x -> Parsed (Which Value)
$cfrom :: forall x. Parsed (Which Value) -> Rep (Parsed (Which Value)) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed (GH.Which Value)))
deriving instance (Std_.Eq (C.Parsed (GH.Which Value)))
instance (C.Parse (GH.Which Value) (C.Parsed (GH.Which Value))) where
    parse :: Raw (Which Value) 'Const -> m (Parsed (Which Value))
parse Raw (Which Value) 'Const
raw_ = (do
        RawWhich Value 'Const
rawWhich_ <- (Raw (Which Value) 'Const -> m (RawWhich Value 'Const)
forall a (mut :: Mutability) (m :: * -> *).
(ReadCtx m mut, HasUnion a) =>
Raw (Which a) mut -> m (RawWhich a mut)
GH.unionWhich Raw (Which Value) 'Const
raw_)
        case RawWhich Value 'Const
rawWhich_ of
            (RW_Value'void _) ->
                (Parsed (Which Value) -> m (Parsed (Which Value))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Value)
Value'void)
            (RW_Value'bool rawArg_) ->
                (Bool -> Parsed (Which Value)
Parsed Bool -> Parsed (Which Value)
Value'bool (Bool -> Parsed (Which Value))
-> m Bool -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Bool 'Const -> m Bool
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Bool 'Const
rawArg_))
            (RW_Value'int8 rawArg_) ->
                (Int8 -> Parsed (Which Value)
Parsed Int8 -> Parsed (Which Value)
Value'int8 (Int8 -> Parsed (Which Value))
-> m Int8 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Int8 'Const -> m Int8
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Int8 'Const
rawArg_))
            (RW_Value'int16 rawArg_) ->
                (Int16 -> Parsed (Which Value)
Parsed Int16 -> Parsed (Which Value)
Value'int16 (Int16 -> Parsed (Which Value))
-> m Int16 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Int16 'Const -> m Int16
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Int16 'Const
rawArg_))
            (RW_Value'int32 rawArg_) ->
                (Int32 -> Parsed (Which Value)
Parsed Int32 -> Parsed (Which Value)
Value'int32 (Int32 -> Parsed (Which Value))
-> m Int32 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Int32 'Const -> m Int32
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Int32 'Const
rawArg_))
            (RW_Value'int64 rawArg_) ->
                (Int64 -> Parsed (Which Value)
Parsed Int64 -> Parsed (Which Value)
Value'int64 (Int64 -> Parsed (Which Value))
-> m Int64 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Int64 'Const -> m Int64
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Int64 'Const
rawArg_))
            (RW_Value'uint8 rawArg_) ->
                (Word8 -> Parsed (Which Value)
Parsed Word8 -> Parsed (Which Value)
Value'uint8 (Word8 -> Parsed (Which Value))
-> m Word8 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Word8 'Const -> m Word8
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Word8 'Const
rawArg_))
            (RW_Value'uint16 rawArg_) ->
                (Word16 -> Parsed (Which Value)
Parsed Word16 -> Parsed (Which Value)
Value'uint16 (Word16 -> Parsed (Which Value))
-> m Word16 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Word16 'Const -> m Word16
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Word16 'Const
rawArg_))
            (RW_Value'uint32 rawArg_) ->
                (Word32 -> Parsed (Which Value)
Parsed Word32 -> Parsed (Which Value)
Value'uint32 (Word32 -> Parsed (Which Value))
-> m Word32 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Word32 'Const -> m Word32
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Word32 'Const
rawArg_))
            (RW_Value'uint64 rawArg_) ->
                (Word64 -> Parsed (Which Value)
Parsed Word64 -> Parsed (Which Value)
Value'uint64 (Word64 -> Parsed (Which Value))
-> m Word64 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Word64 'Const -> m Word64
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Word64 'Const
rawArg_))
            (RW_Value'float32 rawArg_) ->
                (Float -> Parsed (Which Value)
Parsed Float -> Parsed (Which Value)
Value'float32 (Float -> Parsed (Which Value))
-> m Float -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Float 'Const -> m Float
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Float 'Const
rawArg_))
            (RW_Value'float64 rawArg_) ->
                (Double -> Parsed (Which Value)
Parsed Double -> Parsed (Which Value)
Value'float64 (Double -> Parsed (Which Value))
-> m Double -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Double 'Const -> m Double
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Double 'Const
rawArg_))
            (RW_Value'text rawArg_) ->
                (Text -> Parsed (Which Value)
Parsed Text -> Parsed (Which Value)
Value'text (Text -> Parsed (Which Value))
-> m Text -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Text 'Const -> m Text
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Text 'Const
rawArg_))
            (RW_Value'data_ rawArg_) ->
                (ByteString -> Parsed (Which Value)
Parsed Data -> Parsed (Which Value)
Value'data_ (ByteString -> Parsed (Which Value))
-> m ByteString -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Data 'Const -> m ByteString
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Data 'Const
rawArg_))
            (RW_Value'list rawArg_) ->
                (Maybe (Parsed AnyPointer) -> Parsed (Which Value)
Parsed (Maybe AnyPointer) -> Parsed (Which Value)
Value'list (Maybe (Parsed AnyPointer) -> Parsed (Which Value))
-> m (Maybe (Parsed AnyPointer)) -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Maybe AnyPointer) 'Const -> m (Maybe (Parsed AnyPointer))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw (Maybe AnyPointer) 'Const
rawArg_))
            (RW_Value'enum rawArg_) ->
                (Word16 -> Parsed (Which Value)
Parsed Word16 -> Parsed (Which Value)
Value'enum (Word16 -> Parsed (Which Value))
-> m Word16 -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw Word16 'Const -> m Word16
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw Word16 'Const
rawArg_))
            (RW_Value'struct rawArg_) ->
                (Maybe (Parsed AnyPointer) -> Parsed (Which Value)
Parsed (Maybe AnyPointer) -> Parsed (Which Value)
Value'struct (Maybe (Parsed AnyPointer) -> Parsed (Which Value))
-> m (Maybe (Parsed AnyPointer)) -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Maybe AnyPointer) 'Const -> m (Maybe (Parsed AnyPointer))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw (Maybe AnyPointer) 'Const
rawArg_))
            (RW_Value'interface _) ->
                (Parsed (Which Value) -> m (Parsed (Which Value))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure Parsed (Which Value)
Value'interface)
            (RW_Value'anyPointer rawArg_) ->
                (Maybe (Parsed AnyPointer) -> Parsed (Which Value)
Parsed (Maybe AnyPointer) -> Parsed (Which Value)
Value'anyPointer (Maybe (Parsed AnyPointer) -> Parsed (Which Value))
-> m (Maybe (Parsed AnyPointer)) -> m (Parsed (Which Value))
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Raw (Maybe AnyPointer) 'Const -> m (Maybe (Parsed AnyPointer))
forall t p (m :: * -> *).
(Parse t p, ReadCtx m 'Const) =>
Raw t 'Const -> m p
C.parse Raw (Maybe AnyPointer) 'Const
rawArg_))
            (RW_Value'unknown' tag_) ->
                (Parsed (Which Value) -> m (Parsed (Which Value))
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure (Word16 -> Parsed (Which Value)
Value'unknown' Word16
tag_))
        )
instance (C.Marshal (GH.Which Value) (C.Parsed (GH.Which Value))) where
    marshalInto :: Raw (Which Value) ('Mut s) -> Parsed (Which Value) -> m ()
marshalInto Raw (Which Value) ('Mut s)
raw_ Parsed (Which Value)
parsed_ = case Parsed (Which Value)
parsed_ of
        (Parsed (Which Value)
Value'void) ->
            (Variant 'Slot Value () -> () -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "void" (Variant 'Slot Value ())
Variant 'Slot Value ()
#void () (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'bool arg_) ->
            (Variant 'Slot Value Bool -> Bool -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "bool" (Variant 'Slot Value Bool)
Variant 'Slot Value Bool
#bool Bool
Parsed Bool
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'int8 arg_) ->
            (Variant 'Slot Value Int8 -> Int8 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "int8" (Variant 'Slot Value Int8)
Variant 'Slot Value Int8
#int8 Int8
Parsed Int8
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'int16 arg_) ->
            (Variant 'Slot Value Int16 -> Int16 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "int16" (Variant 'Slot Value Int16)
Variant 'Slot Value Int16
#int16 Int16
Parsed Int16
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'int32 arg_) ->
            (Variant 'Slot Value Int32 -> Int32 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "int32" (Variant 'Slot Value Int32)
Variant 'Slot Value Int32
#int32 Int32
Parsed Int32
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'int64 arg_) ->
            (Variant 'Slot Value Int64 -> Int64 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "int64" (Variant 'Slot Value Int64)
Variant 'Slot Value Int64
#int64 Int64
Parsed Int64
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'uint8 arg_) ->
            (Variant 'Slot Value Word8 -> Word8 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "uint8" (Variant 'Slot Value Word8)
Variant 'Slot Value Word8
#uint8 Word8
Parsed Word8
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'uint16 arg_) ->
            (Variant 'Slot Value Word16 -> Word16 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "uint16" (Variant 'Slot Value Word16)
Variant 'Slot Value Word16
#uint16 Word16
Parsed Word16
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'uint32 arg_) ->
            (Variant 'Slot Value Word32 -> Word32 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "uint32" (Variant 'Slot Value Word32)
Variant 'Slot Value Word32
#uint32 Word32
Parsed Word32
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'uint64 arg_) ->
            (Variant 'Slot Value Word64 -> Word64 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "uint64" (Variant 'Slot Value Word64)
Variant 'Slot Value Word64
#uint64 Word64
Parsed Word64
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'float32 arg_) ->
            (Variant 'Slot Value Float -> Float -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "float32" (Variant 'Slot Value Float)
Variant 'Slot Value Float
#float32 Float
Parsed Float
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'float64 arg_) ->
            (Variant 'Slot Value Double -> Double -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "float64" (Variant 'Slot Value Double)
Variant 'Slot Value Double
#float64 Double
Parsed Double
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'text arg_) ->
            (Variant 'Slot Value Text -> Text -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "text" (Variant 'Slot Value Text)
Variant 'Slot Value Text
#text Text
Parsed Text
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'data_ arg_) ->
            (Variant 'Slot Value Data
-> ByteString -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "data_" (Variant 'Slot Value Data)
Variant 'Slot Value Data
#data_ ByteString
Parsed Data
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'list arg_) ->
            (Variant 'Slot Value (Maybe AnyPointer)
-> Maybe (Parsed AnyPointer) -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "list" (Variant 'Slot Value (Maybe AnyPointer))
Variant 'Slot Value (Maybe AnyPointer)
#list Maybe (Parsed AnyPointer)
Parsed (Maybe AnyPointer)
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'enum arg_) ->
            (Variant 'Slot Value Word16 -> Word16 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "enum" (Variant 'Slot Value Word16)
Variant 'Slot Value Word16
#enum Word16
Parsed Word16
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'struct arg_) ->
            (Variant 'Slot Value (Maybe AnyPointer)
-> Maybe (Parsed AnyPointer) -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "struct" (Variant 'Slot Value (Maybe AnyPointer))
Variant 'Slot Value (Maybe AnyPointer)
#struct Maybe (Parsed AnyPointer)
Parsed (Maybe AnyPointer)
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Parsed (Which Value)
Value'interface) ->
            (Variant 'Slot Value () -> () -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "interface" (Variant 'Slot Value ())
Variant 'Slot Value ()
#interface () (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'anyPointer arg_) ->
            (Variant 'Slot Value (Maybe AnyPointer)
-> Maybe (Parsed AnyPointer) -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(HasUnion a, Parse b bp, RWCtx m s) =>
Variant 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeVariant IsLabel "anyPointer" (Variant 'Slot Value (Maybe AnyPointer))
Variant 'Slot Value (Maybe AnyPointer)
#anyPointer Maybe (Parsed AnyPointer)
Parsed (Maybe AnyPointer)
arg_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
        (Value'unknown' tag_) ->
            (Field 'Slot Value Word16 -> Word16 -> Raw Value ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField Field 'Slot Value Word16
forall a. HasUnion a => Field 'Slot a Word16
GH.unionField Word16
tag_ (Raw (Which Value) ('Mut s) -> Raw Value ('Mut s)
forall a (mut :: Mutability).
HasUnion a =>
Raw (Which a) mut -> Raw a mut
GH.unionStruct Raw (Which Value) ('Mut s)
raw_))
data Annotation 
type instance (R.ReprFor Annotation) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId Annotation) where
    typeId :: Word64
typeId  = Word64
17422339044421236034
instance (C.TypedStruct Annotation) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
2
instance (C.Allocate Annotation) where
    type AllocHint Annotation = ()
    new :: AllocHint Annotation
-> Message ('Mut s) -> m (Raw Annotation ('Mut s))
new AllocHint Annotation
_ = Message ('Mut s) -> m (Raw Annotation ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc Annotation (C.Parsed Annotation))
instance (C.AllocateList Annotation) where
    type ListAllocHint Annotation = Std_.Int
    newList :: ListAllocHint Annotation
-> Message ('Mut s) -> m (Raw (List Annotation) ('Mut s))
newList  = ListAllocHint Annotation
-> Message ('Mut s) -> m (Raw (List Annotation) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc Annotation (C.Parsed Annotation))
data instance C.Parsed Annotation
    = Annotation 
        {Parsed Annotation -> Parsed Word64
id :: (RP.Parsed Std_.Word64)
        ,Parsed Annotation -> Parsed Value
value :: (RP.Parsed Value)
        ,Parsed Annotation -> Parsed Brand
brand :: (RP.Parsed Brand)}
    deriving((forall x. Parsed Annotation -> Rep (Parsed Annotation) x)
-> (forall x. Rep (Parsed Annotation) x -> Parsed Annotation)
-> Generic (Parsed Annotation)
forall x. Rep (Parsed Annotation) x -> Parsed Annotation
forall x. Parsed Annotation -> Rep (Parsed Annotation) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed Annotation) x -> Parsed Annotation
$cfrom :: forall x. Parsed Annotation -> Rep (Parsed Annotation) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed Annotation))
deriving instance (Std_.Eq (C.Parsed Annotation))
instance (C.Parse Annotation (C.Parsed Annotation)) where
    parse :: Raw Annotation 'Const -> m (Parsed Annotation)
parse Raw Annotation 'Const
raw_ = (Word64 -> Parsed Value -> Parsed Brand -> Parsed Annotation
Parsed Word64 -> Parsed Value -> Parsed Brand -> Parsed Annotation
Annotation (Word64 -> Parsed Value -> Parsed Brand -> Parsed Annotation)
-> m Word64
-> m (Parsed Value -> Parsed Brand -> Parsed Annotation)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot Annotation Word64 -> Raw Annotation 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "id" (Field 'Slot Annotation Word64)
Field 'Slot Annotation Word64
#id Raw Annotation 'Const
raw_)
                             m (Parsed Value -> Parsed Brand -> Parsed Annotation)
-> m (Parsed Value) -> m (Parsed Brand -> Parsed Annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Annotation Value
-> Raw Annotation 'Const -> m (Parsed Value)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "value" (Field 'Slot Annotation Value)
Field 'Slot Annotation Value
#value Raw Annotation 'Const
raw_)
                             m (Parsed Brand -> Parsed Annotation)
-> m (Parsed Brand) -> m (Parsed Annotation)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot Annotation Brand
-> Raw Annotation 'Const -> m (Parsed Brand)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "brand" (Field 'Slot Annotation Brand)
Field 'Slot Annotation Brand
#brand Raw Annotation 'Const
raw_))
instance (C.Marshal Annotation (C.Parsed Annotation)) where
    marshalInto :: Raw Annotation ('Mut s) -> Parsed Annotation -> m ()
marshalInto Raw Annotation ('Mut s)
raw_ Annotation{..} = (do
        (Field 'Slot Annotation Word64
-> Word64 -> Raw Annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "id" (Field 'Slot Annotation Word64)
Field 'Slot Annotation Word64
#id Word64
Parsed Word64
id Raw Annotation ('Mut s)
raw_)
        (Field 'Slot Annotation Value
-> Parsed Value -> Raw Annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "value" (Field 'Slot Annotation Value)
Field 'Slot Annotation Value
#value Parsed Value
Parsed Value
value Raw Annotation ('Mut s)
raw_)
        (Field 'Slot Annotation Brand
-> Parsed Brand -> Raw Annotation ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "brand" (Field 'Slot Annotation Brand)
Field 'Slot Annotation Brand
#brand Parsed Brand
Parsed Brand
brand Raw Annotation ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "id" GH.Slot Annotation Std_.Word64) where
    fieldByLabel :: Field 'Slot Annotation Word64
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot Annotation Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
64 Word64
0)
instance (GH.HasField "value" GH.Slot Annotation Value) where
    fieldByLabel :: Field 'Slot Annotation Value
fieldByLabel  = (Word16 -> Field 'Slot Annotation Value
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "brand" GH.Slot Annotation Brand) where
    fieldByLabel :: Field 'Slot Annotation Brand
fieldByLabel  = (Word16 -> Field 'Slot Annotation Brand
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
1)
data ElementSize 
    = ElementSize'empty 
    | ElementSize'bit 
    | ElementSize'byte 
    | ElementSize'twoBytes 
    | ElementSize'fourBytes 
    | ElementSize'eightBytes 
    | ElementSize'pointer 
    | ElementSize'inlineComposite 
    | ElementSize'unknown' Std_.Word16
    deriving(ElementSize -> ElementSize -> Bool
(ElementSize -> ElementSize -> Bool)
-> (ElementSize -> ElementSize -> Bool) -> Eq ElementSize
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ElementSize -> ElementSize -> Bool
$c/= :: ElementSize -> ElementSize -> Bool
== :: ElementSize -> ElementSize -> Bool
$c== :: ElementSize -> ElementSize -> Bool
Std_.Eq
            ,Int -> ElementSize -> ShowS
[ElementSize] -> ShowS
ElementSize -> String
(Int -> ElementSize -> ShowS)
-> (ElementSize -> String)
-> ([ElementSize] -> ShowS)
-> Show ElementSize
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ElementSize] -> ShowS
$cshowList :: [ElementSize] -> ShowS
show :: ElementSize -> String
$cshow :: ElementSize -> String
showsPrec :: Int -> ElementSize -> ShowS
$cshowsPrec :: Int -> ElementSize -> ShowS
Std_.Show
            ,(forall x. ElementSize -> Rep ElementSize x)
-> (forall x. Rep ElementSize x -> ElementSize)
-> Generic ElementSize
forall x. Rep ElementSize x -> ElementSize
forall x. ElementSize -> Rep ElementSize x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ElementSize x -> ElementSize
$cfrom :: forall x. ElementSize -> Rep ElementSize x
Generics.Generic)
type instance (R.ReprFor ElementSize) = (R.Data R.Sz16)
instance (C.HasTypeId ElementSize) where
    typeId :: Word64
typeId  = Word64
15102134695616452902
instance (Std_.Enum ElementSize) where
    toEnum :: Int -> ElementSize
toEnum Int
n_ = case Int
n_ of
        Int
0 ->
            ElementSize
ElementSize'empty
        Int
1 ->
            ElementSize
ElementSize'bit
        Int
2 ->
            ElementSize
ElementSize'byte
        Int
3 ->
            ElementSize
ElementSize'twoBytes
        Int
4 ->
            ElementSize
ElementSize'fourBytes
        Int
5 ->
            ElementSize
ElementSize'eightBytes
        Int
6 ->
            ElementSize
ElementSize'pointer
        Int
7 ->
            ElementSize
ElementSize'inlineComposite
        Int
tag_ ->
            (Word16 -> ElementSize
ElementSize'unknown' (Int -> Word16
forall a b. (Integral a, Num b) => a -> b
Std_.fromIntegral Int
tag_))
    fromEnum :: ElementSize -> Int
fromEnum ElementSize
value_ = case ElementSize
value_ of
        (ElementSize
ElementSize'empty) ->
            Int
0
        (ElementSize
ElementSize'bit) ->
            Int
1
        (ElementSize
ElementSize'byte) ->
            Int
2
        (ElementSize
ElementSize'twoBytes) ->
            Int
3
        (ElementSize
ElementSize'fourBytes) ->
            Int
4
        (ElementSize
ElementSize'eightBytes) ->
            Int
5
        (ElementSize
ElementSize'pointer) ->
            Int
6
        (ElementSize
ElementSize'inlineComposite) ->
            Int
7
        (ElementSize'unknown' Word16
tag_) ->
            (Word16 -> Int
forall a b. (Integral a, Num b) => a -> b
Std_.fromIntegral Word16
tag_)
instance (C.IsWord ElementSize) where
    fromWord :: Word64 -> ElementSize
fromWord Word64
w_ = (Int -> ElementSize
forall a. Enum a => Int -> a
Std_.toEnum (Word64 -> Int
forall a b. (Integral a, Num b) => a -> b
Std_.fromIntegral Word64
w_))
    toWord :: ElementSize -> Word64
toWord ElementSize
v_ = (Int -> Word64
forall a b. (Integral a, Num b) => a -> b
Std_.fromIntegral (ElementSize -> Int
forall a. Enum a => a -> Int
Std_.fromEnum ElementSize
v_))
instance (C.Parse ElementSize ElementSize) where
    parse :: Raw ElementSize 'Const -> m ElementSize
parse  = Raw ElementSize 'Const -> m ElementSize
forall a (m :: * -> *).
(ReprFor a ~ 'Data 'Sz16, Enum a, Applicative m) =>
Raw a 'Const -> m a
GH.parseEnum
    encode :: Message ('Mut s) -> ElementSize -> m (Raw ElementSize ('Mut s))
encode  = Message ('Mut s) -> ElementSize -> m (Raw ElementSize ('Mut s))
forall a (m :: * -> *) s.
(ReprFor a ~ 'Data 'Sz16, Enum a, RWCtx m s) =>
Message ('Mut s) -> a -> m (Raw a ('Mut s))
GH.encodeEnum
instance (C.AllocateList ElementSize) where
    type ListAllocHint ElementSize = Std_.Int
instance (C.EstimateListAlloc ElementSize ElementSize)
data CapnpVersion 
type instance (R.ReprFor CapnpVersion) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId CapnpVersion) where
    typeId :: Word64
typeId  = Word64
15590670654532458851
instance (C.TypedStruct CapnpVersion) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
0
instance (C.Allocate CapnpVersion) where
    type AllocHint CapnpVersion = ()
    new :: AllocHint CapnpVersion
-> Message ('Mut s) -> m (Raw CapnpVersion ('Mut s))
new AllocHint CapnpVersion
_ = Message ('Mut s) -> m (Raw CapnpVersion ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc CapnpVersion (C.Parsed CapnpVersion))
instance (C.AllocateList CapnpVersion) where
    type ListAllocHint CapnpVersion = Std_.Int
    newList :: ListAllocHint CapnpVersion
-> Message ('Mut s) -> m (Raw (List CapnpVersion) ('Mut s))
newList  = ListAllocHint CapnpVersion
-> Message ('Mut s) -> m (Raw (List CapnpVersion) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc CapnpVersion (C.Parsed CapnpVersion))
data instance C.Parsed CapnpVersion
    = CapnpVersion 
        {Parsed CapnpVersion -> Parsed Word16
major :: (RP.Parsed Std_.Word16)
        ,Parsed CapnpVersion -> Parsed Word8
minor :: (RP.Parsed Std_.Word8)
        ,Parsed CapnpVersion -> Parsed Word8
micro :: (RP.Parsed Std_.Word8)}
    deriving((forall x. Parsed CapnpVersion -> Rep (Parsed CapnpVersion) x)
-> (forall x. Rep (Parsed CapnpVersion) x -> Parsed CapnpVersion)
-> Generic (Parsed CapnpVersion)
forall x. Rep (Parsed CapnpVersion) x -> Parsed CapnpVersion
forall x. Parsed CapnpVersion -> Rep (Parsed CapnpVersion) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep (Parsed CapnpVersion) x -> Parsed CapnpVersion
$cfrom :: forall x. Parsed CapnpVersion -> Rep (Parsed CapnpVersion) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed CapnpVersion))
deriving instance (Std_.Eq (C.Parsed CapnpVersion))
instance (C.Parse CapnpVersion (C.Parsed CapnpVersion)) where
    parse :: Raw CapnpVersion 'Const -> m (Parsed CapnpVersion)
parse Raw CapnpVersion 'Const
raw_ = (Word16 -> Word8 -> Word8 -> Parsed CapnpVersion
Parsed Word16
-> Parsed Word8 -> Parsed Word8 -> Parsed CapnpVersion
CapnpVersion (Word16 -> Word8 -> Word8 -> Parsed CapnpVersion)
-> m Word16 -> m (Word8 -> Word8 -> Parsed CapnpVersion)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot CapnpVersion Word16
-> Raw CapnpVersion 'Const -> m Word16
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "major" (Field 'Slot CapnpVersion Word16)
Field 'Slot CapnpVersion Word16
#major Raw CapnpVersion 'Const
raw_)
                               m (Word8 -> Word8 -> Parsed CapnpVersion)
-> m Word8 -> m (Word8 -> Parsed CapnpVersion)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot CapnpVersion Word8
-> Raw CapnpVersion 'Const -> m Word8
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "minor" (Field 'Slot CapnpVersion Word8)
Field 'Slot CapnpVersion Word8
#minor Raw CapnpVersion 'Const
raw_)
                               m (Word8 -> Parsed CapnpVersion)
-> m Word8 -> m (Parsed CapnpVersion)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot CapnpVersion Word8
-> Raw CapnpVersion 'Const -> m Word8
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "micro" (Field 'Slot CapnpVersion Word8)
Field 'Slot CapnpVersion Word8
#micro Raw CapnpVersion 'Const
raw_))
instance (C.Marshal CapnpVersion (C.Parsed CapnpVersion)) where
    marshalInto :: Raw CapnpVersion ('Mut s) -> Parsed CapnpVersion -> m ()
marshalInto Raw CapnpVersion ('Mut s)
raw_ CapnpVersion{..} = (do
        (Field 'Slot CapnpVersion Word16
-> Word16 -> Raw CapnpVersion ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "major" (Field 'Slot CapnpVersion Word16)
Field 'Slot CapnpVersion Word16
#major Word16
Parsed Word16
major Raw CapnpVersion ('Mut s)
raw_)
        (Field 'Slot CapnpVersion Word8
-> Word8 -> Raw CapnpVersion ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "minor" (Field 'Slot CapnpVersion Word8)
Field 'Slot CapnpVersion Word8
#minor Word8
Parsed Word8
minor Raw CapnpVersion ('Mut s)
raw_)
        (Field 'Slot CapnpVersion Word8
-> Word8 -> Raw CapnpVersion ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "micro" (Field 'Slot CapnpVersion Word8)
Field 'Slot CapnpVersion Word8
#micro Word8
Parsed Word8
micro Raw CapnpVersion ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "major" GH.Slot CapnpVersion Std_.Word16) where
    fieldByLabel :: Field 'Slot CapnpVersion Word16
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot CapnpVersion Word16
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
16 Word64
0)
instance (GH.HasField "minor" GH.Slot CapnpVersion Std_.Word8) where
    fieldByLabel :: Field 'Slot CapnpVersion Word8
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot CapnpVersion Word8
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
16 Word16
0 BitCount
8 Word64
0)
instance (GH.HasField "micro" GH.Slot CapnpVersion Std_.Word8) where
    fieldByLabel :: Field 'Slot CapnpVersion Word8
fieldByLabel  = (BitCount
-> Word16 -> BitCount -> Word64 -> Field 'Slot CapnpVersion Word8
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
24 Word16
0 BitCount
8 Word64
0)
data CodeGeneratorRequest 
type instance (R.ReprFor CodeGeneratorRequest) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId CodeGeneratorRequest) where
    typeId :: Word64
typeId  = Word64
13818529054586492878
instance (C.TypedStruct CodeGeneratorRequest) where
    numStructWords :: Word16
numStructWords  = Word16
0
    numStructPtrs :: Word16
numStructPtrs  = Word16
4
instance (C.Allocate CodeGeneratorRequest) where
    type AllocHint CodeGeneratorRequest = ()
    new :: AllocHint CodeGeneratorRequest
-> Message ('Mut s) -> m (Raw CodeGeneratorRequest ('Mut s))
new AllocHint CodeGeneratorRequest
_ = Message ('Mut s) -> m (Raw CodeGeneratorRequest ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc CodeGeneratorRequest (C.Parsed CodeGeneratorRequest))
instance (C.AllocateList CodeGeneratorRequest) where
    type ListAllocHint CodeGeneratorRequest = Std_.Int
    newList :: ListAllocHint CodeGeneratorRequest
-> Message ('Mut s) -> m (Raw (List CodeGeneratorRequest) ('Mut s))
newList  = ListAllocHint CodeGeneratorRequest
-> Message ('Mut s) -> m (Raw (List CodeGeneratorRequest) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc CodeGeneratorRequest (C.Parsed CodeGeneratorRequest))
data instance C.Parsed CodeGeneratorRequest
    = CodeGeneratorRequest 
        {Parsed CodeGeneratorRequest -> Parsed (List Node)
nodes :: (RP.Parsed (R.List Node))
        ,Parsed CodeGeneratorRequest
-> Parsed (List CodeGeneratorRequest'RequestedFile)
requestedFiles :: (RP.Parsed (R.List CodeGeneratorRequest'RequestedFile))
        ,Parsed CodeGeneratorRequest -> Parsed CapnpVersion
capnpVersion :: (RP.Parsed CapnpVersion)
        ,Parsed CodeGeneratorRequest -> Parsed (List Node'SourceInfo)
sourceInfo :: (RP.Parsed (R.List Node'SourceInfo))}
    deriving((forall x.
 Parsed CodeGeneratorRequest -> Rep (Parsed CodeGeneratorRequest) x)
-> (forall x.
    Rep (Parsed CodeGeneratorRequest) x -> Parsed CodeGeneratorRequest)
-> Generic (Parsed CodeGeneratorRequest)
forall x.
Rep (Parsed CodeGeneratorRequest) x -> Parsed CodeGeneratorRequest
forall x.
Parsed CodeGeneratorRequest -> Rep (Parsed CodeGeneratorRequest) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed CodeGeneratorRequest) x -> Parsed CodeGeneratorRequest
$cfrom :: forall x.
Parsed CodeGeneratorRequest -> Rep (Parsed CodeGeneratorRequest) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed CodeGeneratorRequest))
deriving instance (Std_.Eq (C.Parsed CodeGeneratorRequest))
instance (C.Parse CodeGeneratorRequest (C.Parsed CodeGeneratorRequest)) where
    parse :: Raw CodeGeneratorRequest 'Const -> m (Parsed CodeGeneratorRequest)
parse Raw CodeGeneratorRequest 'Const
raw_ = (Vector (Parsed Node)
-> Vector (Parsed CodeGeneratorRequest'RequestedFile)
-> Parsed CapnpVersion
-> Vector (Parsed Node'SourceInfo)
-> Parsed CodeGeneratorRequest
Parsed (List Node)
-> Parsed (List CodeGeneratorRequest'RequestedFile)
-> Parsed CapnpVersion
-> Parsed (List Node'SourceInfo)
-> Parsed CodeGeneratorRequest
CodeGeneratorRequest (Vector (Parsed Node)
 -> Vector (Parsed CodeGeneratorRequest'RequestedFile)
 -> Parsed CapnpVersion
 -> Vector (Parsed Node'SourceInfo)
 -> Parsed CodeGeneratorRequest)
-> m (Vector (Parsed Node))
-> m (Vector (Parsed CodeGeneratorRequest'RequestedFile)
      -> Parsed CapnpVersion
      -> Vector (Parsed Node'SourceInfo)
      -> Parsed CodeGeneratorRequest)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot CodeGeneratorRequest (List Node)
-> Raw CodeGeneratorRequest 'Const -> m (Vector (Parsed Node))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel "nodes" (Field 'Slot CodeGeneratorRequest (List Node))
Field 'Slot CodeGeneratorRequest (List Node)
#nodes Raw CodeGeneratorRequest 'Const
raw_)
                                       m (Vector (Parsed CodeGeneratorRequest'RequestedFile)
   -> Parsed CapnpVersion
   -> Vector (Parsed Node'SourceInfo)
   -> Parsed CodeGeneratorRequest)
-> m (Vector (Parsed CodeGeneratorRequest'RequestedFile))
-> m (Parsed CapnpVersion
      -> Vector (Parsed Node'SourceInfo) -> Parsed CodeGeneratorRequest)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field
  'Slot
  CodeGeneratorRequest
  (List CodeGeneratorRequest'RequestedFile)
-> Raw CodeGeneratorRequest 'Const
-> m (Vector (Parsed CodeGeneratorRequest'RequestedFile))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "requestedFiles"
  (Field
     'Slot
     CodeGeneratorRequest
     (List CodeGeneratorRequest'RequestedFile))
Field
  'Slot
  CodeGeneratorRequest
  (List CodeGeneratorRequest'RequestedFile)
#requestedFiles Raw CodeGeneratorRequest 'Const
raw_)
                                       m (Parsed CapnpVersion
   -> Vector (Parsed Node'SourceInfo) -> Parsed CodeGeneratorRequest)
-> m (Parsed CapnpVersion)
-> m (Vector (Parsed Node'SourceInfo)
      -> Parsed CodeGeneratorRequest)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot CodeGeneratorRequest CapnpVersion
-> Raw CodeGeneratorRequest 'Const -> m (Parsed CapnpVersion)
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "capnpVersion" (Field 'Slot CodeGeneratorRequest CapnpVersion)
Field 'Slot CodeGeneratorRequest CapnpVersion
#capnpVersion Raw CodeGeneratorRequest 'Const
raw_)
                                       m (Vector (Parsed Node'SourceInfo) -> Parsed CodeGeneratorRequest)
-> m (Vector (Parsed Node'SourceInfo))
-> m (Parsed CodeGeneratorRequest)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot CodeGeneratorRequest (List Node'SourceInfo)
-> Raw CodeGeneratorRequest 'Const
-> m (Vector (Parsed Node'SourceInfo))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "sourceInfo"
  (Field 'Slot CodeGeneratorRequest (List Node'SourceInfo))
Field 'Slot CodeGeneratorRequest (List Node'SourceInfo)
#sourceInfo Raw CodeGeneratorRequest 'Const
raw_))
instance (C.Marshal CodeGeneratorRequest (C.Parsed CodeGeneratorRequest)) where
    marshalInto :: Raw CodeGeneratorRequest ('Mut s)
-> Parsed CodeGeneratorRequest -> m ()
marshalInto Raw CodeGeneratorRequest ('Mut s)
raw_ CodeGeneratorRequest{..} = (do
        (Field 'Slot CodeGeneratorRequest (List Node)
-> Vector (Parsed Node)
-> Raw CodeGeneratorRequest ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel "nodes" (Field 'Slot CodeGeneratorRequest (List Node))
Field 'Slot CodeGeneratorRequest (List Node)
#nodes Vector (Parsed Node)
Parsed (List Node)
nodes Raw CodeGeneratorRequest ('Mut s)
raw_)
        (Field
  'Slot
  CodeGeneratorRequest
  (List CodeGeneratorRequest'RequestedFile)
-> Vector (Parsed CodeGeneratorRequest'RequestedFile)
-> Raw CodeGeneratorRequest ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "requestedFiles"
  (Field
     'Slot
     CodeGeneratorRequest
     (List CodeGeneratorRequest'RequestedFile))
Field
  'Slot
  CodeGeneratorRequest
  (List CodeGeneratorRequest'RequestedFile)
#requestedFiles Vector (Parsed CodeGeneratorRequest'RequestedFile)
Parsed (List CodeGeneratorRequest'RequestedFile)
requestedFiles Raw CodeGeneratorRequest ('Mut s)
raw_)
        (Field 'Slot CodeGeneratorRequest CapnpVersion
-> Parsed CapnpVersion -> Raw CodeGeneratorRequest ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "capnpVersion" (Field 'Slot CodeGeneratorRequest CapnpVersion)
Field 'Slot CodeGeneratorRequest CapnpVersion
#capnpVersion Parsed CapnpVersion
Parsed CapnpVersion
capnpVersion Raw CodeGeneratorRequest ('Mut s)
raw_)
        (Field 'Slot CodeGeneratorRequest (List Node'SourceInfo)
-> Vector (Parsed Node'SourceInfo)
-> Raw CodeGeneratorRequest ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "sourceInfo"
  (Field 'Slot CodeGeneratorRequest (List Node'SourceInfo))
Field 'Slot CodeGeneratorRequest (List Node'SourceInfo)
#sourceInfo Vector (Parsed Node'SourceInfo)
Parsed (List Node'SourceInfo)
sourceInfo Raw CodeGeneratorRequest ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "nodes" GH.Slot CodeGeneratorRequest (R.List Node)) where
    fieldByLabel :: Field 'Slot CodeGeneratorRequest (List Node)
fieldByLabel  = (Word16 -> Field 'Slot CodeGeneratorRequest (List Node)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "requestedFiles" GH.Slot CodeGeneratorRequest (R.List CodeGeneratorRequest'RequestedFile)) where
    fieldByLabel :: Field
  'Slot
  CodeGeneratorRequest
  (List CodeGeneratorRequest'RequestedFile)
fieldByLabel  = (Word16
-> Field
     'Slot
     CodeGeneratorRequest
     (List CodeGeneratorRequest'RequestedFile)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
1)
instance (GH.HasField "capnpVersion" GH.Slot CodeGeneratorRequest CapnpVersion) where
    fieldByLabel :: Field 'Slot CodeGeneratorRequest CapnpVersion
fieldByLabel  = (Word16 -> Field 'Slot CodeGeneratorRequest CapnpVersion
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
2)
instance (GH.HasField "sourceInfo" GH.Slot CodeGeneratorRequest (R.List Node'SourceInfo)) where
    fieldByLabel :: Field 'Slot CodeGeneratorRequest (List Node'SourceInfo)
fieldByLabel  = (Word16 -> Field 'Slot CodeGeneratorRequest (List Node'SourceInfo)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
3)
data CodeGeneratorRequest'RequestedFile 
type instance (R.ReprFor CodeGeneratorRequest'RequestedFile) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId CodeGeneratorRequest'RequestedFile) where
    typeId :: Word64
typeId  = Word64
14981803260258615394
instance (C.TypedStruct CodeGeneratorRequest'RequestedFile) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
2
instance (C.Allocate CodeGeneratorRequest'RequestedFile) where
    type AllocHint CodeGeneratorRequest'RequestedFile = ()
    new :: AllocHint CodeGeneratorRequest'RequestedFile
-> Message ('Mut s)
-> m (Raw CodeGeneratorRequest'RequestedFile ('Mut s))
new AllocHint CodeGeneratorRequest'RequestedFile
_ = Message ('Mut s)
-> m (Raw CodeGeneratorRequest'RequestedFile ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc CodeGeneratorRequest'RequestedFile (C.Parsed CodeGeneratorRequest'RequestedFile))
instance (C.AllocateList CodeGeneratorRequest'RequestedFile) where
    type ListAllocHint CodeGeneratorRequest'RequestedFile = Std_.Int
    newList :: ListAllocHint CodeGeneratorRequest'RequestedFile
-> Message ('Mut s)
-> m (Raw (List CodeGeneratorRequest'RequestedFile) ('Mut s))
newList  = ListAllocHint CodeGeneratorRequest'RequestedFile
-> Message ('Mut s)
-> m (Raw (List CodeGeneratorRequest'RequestedFile) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc CodeGeneratorRequest'RequestedFile (C.Parsed CodeGeneratorRequest'RequestedFile))
data instance C.Parsed CodeGeneratorRequest'RequestedFile
    = CodeGeneratorRequest'RequestedFile 
        {Parsed CodeGeneratorRequest'RequestedFile -> Parsed Word64
id :: (RP.Parsed Std_.Word64)
        ,Parsed CodeGeneratorRequest'RequestedFile -> Parsed Text
filename :: (RP.Parsed Basics.Text)
        ,Parsed CodeGeneratorRequest'RequestedFile
-> Parsed (List CodeGeneratorRequest'RequestedFile'Import)
imports :: (RP.Parsed (R.List CodeGeneratorRequest'RequestedFile'Import))}
    deriving((forall x.
 Parsed CodeGeneratorRequest'RequestedFile
 -> Rep (Parsed CodeGeneratorRequest'RequestedFile) x)
-> (forall x.
    Rep (Parsed CodeGeneratorRequest'RequestedFile) x
    -> Parsed CodeGeneratorRequest'RequestedFile)
-> Generic (Parsed CodeGeneratorRequest'RequestedFile)
forall x.
Rep (Parsed CodeGeneratorRequest'RequestedFile) x
-> Parsed CodeGeneratorRequest'RequestedFile
forall x.
Parsed CodeGeneratorRequest'RequestedFile
-> Rep (Parsed CodeGeneratorRequest'RequestedFile) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed CodeGeneratorRequest'RequestedFile) x
-> Parsed CodeGeneratorRequest'RequestedFile
$cfrom :: forall x.
Parsed CodeGeneratorRequest'RequestedFile
-> Rep (Parsed CodeGeneratorRequest'RequestedFile) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed CodeGeneratorRequest'RequestedFile))
deriving instance (Std_.Eq (C.Parsed CodeGeneratorRequest'RequestedFile))
instance (C.Parse CodeGeneratorRequest'RequestedFile (C.Parsed CodeGeneratorRequest'RequestedFile)) where
    parse :: Raw CodeGeneratorRequest'RequestedFile 'Const
-> m (Parsed CodeGeneratorRequest'RequestedFile)
parse Raw CodeGeneratorRequest'RequestedFile 'Const
raw_ = (Word64
-> Text
-> Vector (Parsed CodeGeneratorRequest'RequestedFile'Import)
-> Parsed CodeGeneratorRequest'RequestedFile
Parsed Word64
-> Parsed Text
-> Parsed (List CodeGeneratorRequest'RequestedFile'Import)
-> Parsed CodeGeneratorRequest'RequestedFile
CodeGeneratorRequest'RequestedFile (Word64
 -> Text
 -> Vector (Parsed CodeGeneratorRequest'RequestedFile'Import)
 -> Parsed CodeGeneratorRequest'RequestedFile)
-> m Word64
-> m (Text
      -> Vector (Parsed CodeGeneratorRequest'RequestedFile'Import)
      -> Parsed CodeGeneratorRequest'RequestedFile)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot CodeGeneratorRequest'RequestedFile Word64
-> Raw CodeGeneratorRequest'RequestedFile 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "id" (Field 'Slot CodeGeneratorRequest'RequestedFile Word64)
Field 'Slot CodeGeneratorRequest'RequestedFile Word64
#id Raw CodeGeneratorRequest'RequestedFile 'Const
raw_)
                                                     m (Text
   -> Vector (Parsed CodeGeneratorRequest'RequestedFile'Import)
   -> Parsed CodeGeneratorRequest'RequestedFile)
-> m Text
-> m (Vector (Parsed CodeGeneratorRequest'RequestedFile'Import)
      -> Parsed CodeGeneratorRequest'RequestedFile)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot CodeGeneratorRequest'RequestedFile Text
-> Raw CodeGeneratorRequest'RequestedFile 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "filename" (Field 'Slot CodeGeneratorRequest'RequestedFile Text)
Field 'Slot CodeGeneratorRequest'RequestedFile Text
#filename Raw CodeGeneratorRequest'RequestedFile 'Const
raw_)
                                                     m (Vector (Parsed CodeGeneratorRequest'RequestedFile'Import)
   -> Parsed CodeGeneratorRequest'RequestedFile)
-> m (Vector (Parsed CodeGeneratorRequest'RequestedFile'Import))
-> m (Parsed CodeGeneratorRequest'RequestedFile)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field
  'Slot
  CodeGeneratorRequest'RequestedFile
  (List CodeGeneratorRequest'RequestedFile'Import)
-> Raw CodeGeneratorRequest'RequestedFile 'Const
-> m (Vector (Parsed CodeGeneratorRequest'RequestedFile'Import))
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "imports"
  (Field
     'Slot
     CodeGeneratorRequest'RequestedFile
     (List CodeGeneratorRequest'RequestedFile'Import))
Field
  'Slot
  CodeGeneratorRequest'RequestedFile
  (List CodeGeneratorRequest'RequestedFile'Import)
#imports Raw CodeGeneratorRequest'RequestedFile 'Const
raw_))
instance (C.Marshal CodeGeneratorRequest'RequestedFile (C.Parsed CodeGeneratorRequest'RequestedFile)) where
    marshalInto :: Raw CodeGeneratorRequest'RequestedFile ('Mut s)
-> Parsed CodeGeneratorRequest'RequestedFile -> m ()
marshalInto Raw CodeGeneratorRequest'RequestedFile ('Mut s)
raw_ CodeGeneratorRequest'RequestedFile{..} = (do
        (Field 'Slot CodeGeneratorRequest'RequestedFile Word64
-> Word64
-> Raw CodeGeneratorRequest'RequestedFile ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "id" (Field 'Slot CodeGeneratorRequest'RequestedFile Word64)
Field 'Slot CodeGeneratorRequest'RequestedFile Word64
#id Word64
Parsed Word64
id Raw CodeGeneratorRequest'RequestedFile ('Mut s)
raw_)
        (Field 'Slot CodeGeneratorRequest'RequestedFile Text
-> Text -> Raw CodeGeneratorRequest'RequestedFile ('Mut s) -> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "filename" (Field 'Slot CodeGeneratorRequest'RequestedFile Text)
Field 'Slot CodeGeneratorRequest'RequestedFile Text
#filename Text
Parsed Text
filename Raw CodeGeneratorRequest'RequestedFile ('Mut s)
raw_)
        (Field
  'Slot
  CodeGeneratorRequest'RequestedFile
  (List CodeGeneratorRequest'RequestedFile'Import)
-> Vector (Parsed CodeGeneratorRequest'RequestedFile'Import)
-> Raw CodeGeneratorRequest'RequestedFile ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "imports"
  (Field
     'Slot
     CodeGeneratorRequest'RequestedFile
     (List CodeGeneratorRequest'RequestedFile'Import))
Field
  'Slot
  CodeGeneratorRequest'RequestedFile
  (List CodeGeneratorRequest'RequestedFile'Import)
#imports Vector (Parsed CodeGeneratorRequest'RequestedFile'Import)
Parsed (List CodeGeneratorRequest'RequestedFile'Import)
imports Raw CodeGeneratorRequest'RequestedFile ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "id" GH.Slot CodeGeneratorRequest'RequestedFile Std_.Word64) where
    fieldByLabel :: Field 'Slot CodeGeneratorRequest'RequestedFile Word64
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot CodeGeneratorRequest'RequestedFile Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
64 Word64
0)
instance (GH.HasField "filename" GH.Slot CodeGeneratorRequest'RequestedFile Basics.Text) where
    fieldByLabel :: Field 'Slot CodeGeneratorRequest'RequestedFile Text
fieldByLabel  = (Word16 -> Field 'Slot CodeGeneratorRequest'RequestedFile Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)
instance (GH.HasField "imports" GH.Slot CodeGeneratorRequest'RequestedFile (R.List CodeGeneratorRequest'RequestedFile'Import)) where
    fieldByLabel :: Field
  'Slot
  CodeGeneratorRequest'RequestedFile
  (List CodeGeneratorRequest'RequestedFile'Import)
fieldByLabel  = (Word16
-> Field
     'Slot
     CodeGeneratorRequest'RequestedFile
     (List CodeGeneratorRequest'RequestedFile'Import)
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
1)
data CodeGeneratorRequest'RequestedFile'Import 
type instance (R.ReprFor CodeGeneratorRequest'RequestedFile'Import) = (R.Ptr (Std_.Just R.Struct))
instance (C.HasTypeId CodeGeneratorRequest'RequestedFile'Import) where
    typeId :: Word64
typeId  = Word64
12560611460656617445
instance (C.TypedStruct CodeGeneratorRequest'RequestedFile'Import) where
    numStructWords :: Word16
numStructWords  = Word16
1
    numStructPtrs :: Word16
numStructPtrs  = Word16
1
instance (C.Allocate CodeGeneratorRequest'RequestedFile'Import) where
    type AllocHint CodeGeneratorRequest'RequestedFile'Import = ()
    new :: AllocHint CodeGeneratorRequest'RequestedFile'Import
-> Message ('Mut s)
-> m (Raw CodeGeneratorRequest'RequestedFile'Import ('Mut s))
new AllocHint CodeGeneratorRequest'RequestedFile'Import
_ = Message ('Mut s)
-> m (Raw CodeGeneratorRequest'RequestedFile'Import ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Message ('Mut s) -> m (Raw a ('Mut s))
C.newTypedStruct
instance (C.EstimateAlloc CodeGeneratorRequest'RequestedFile'Import (C.Parsed CodeGeneratorRequest'RequestedFile'Import))
instance (C.AllocateList CodeGeneratorRequest'RequestedFile'Import) where
    type ListAllocHint CodeGeneratorRequest'RequestedFile'Import = Std_.Int
    newList :: ListAllocHint CodeGeneratorRequest'RequestedFile'Import
-> Message ('Mut s)
-> m (Raw
        (List CodeGeneratorRequest'RequestedFile'Import) ('Mut s))
newList  = ListAllocHint CodeGeneratorRequest'RequestedFile'Import
-> Message ('Mut s)
-> m (Raw
        (List CodeGeneratorRequest'RequestedFile'Import) ('Mut s))
forall a (m :: * -> *) s.
(TypedStruct a, RWCtx m s) =>
Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s))
C.newTypedStructList
instance (C.EstimateListAlloc CodeGeneratorRequest'RequestedFile'Import (C.Parsed CodeGeneratorRequest'RequestedFile'Import))
data instance C.Parsed CodeGeneratorRequest'RequestedFile'Import
    = CodeGeneratorRequest'RequestedFile'Import 
        {Parsed CodeGeneratorRequest'RequestedFile'Import -> Parsed Word64
id :: (RP.Parsed Std_.Word64)
        ,Parsed CodeGeneratorRequest'RequestedFile'Import -> Parsed Text
name :: (RP.Parsed Basics.Text)}
    deriving((forall x.
 Parsed CodeGeneratorRequest'RequestedFile'Import
 -> Rep (Parsed CodeGeneratorRequest'RequestedFile'Import) x)
-> (forall x.
    Rep (Parsed CodeGeneratorRequest'RequestedFile'Import) x
    -> Parsed CodeGeneratorRequest'RequestedFile'Import)
-> Generic (Parsed CodeGeneratorRequest'RequestedFile'Import)
forall x.
Rep (Parsed CodeGeneratorRequest'RequestedFile'Import) x
-> Parsed CodeGeneratorRequest'RequestedFile'Import
forall x.
Parsed CodeGeneratorRequest'RequestedFile'Import
-> Rep (Parsed CodeGeneratorRequest'RequestedFile'Import) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep (Parsed CodeGeneratorRequest'RequestedFile'Import) x
-> Parsed CodeGeneratorRequest'RequestedFile'Import
$cfrom :: forall x.
Parsed CodeGeneratorRequest'RequestedFile'Import
-> Rep (Parsed CodeGeneratorRequest'RequestedFile'Import) x
Generics.Generic)
deriving instance (Std_.Show (C.Parsed CodeGeneratorRequest'RequestedFile'Import))
deriving instance (Std_.Eq (C.Parsed CodeGeneratorRequest'RequestedFile'Import))
instance (C.Parse CodeGeneratorRequest'RequestedFile'Import (C.Parsed CodeGeneratorRequest'RequestedFile'Import)) where
    parse :: Raw CodeGeneratorRequest'RequestedFile'Import 'Const
-> m (Parsed CodeGeneratorRequest'RequestedFile'Import)
parse Raw CodeGeneratorRequest'RequestedFile'Import 'Const
raw_ = (Word64 -> Text -> Parsed CodeGeneratorRequest'RequestedFile'Import
Parsed Word64
-> Parsed Text -> Parsed CodeGeneratorRequest'RequestedFile'Import
CodeGeneratorRequest'RequestedFile'Import (Word64
 -> Text -> Parsed CodeGeneratorRequest'RequestedFile'Import)
-> m Word64
-> m (Text -> Parsed CodeGeneratorRequest'RequestedFile'Import)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (Field 'Slot CodeGeneratorRequest'RequestedFile'Import Word64
-> Raw CodeGeneratorRequest'RequestedFile'Import 'Const -> m Word64
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "id" (Field 'Slot CodeGeneratorRequest'RequestedFile'Import Word64)
Field 'Slot CodeGeneratorRequest'RequestedFile'Import Word64
#id Raw CodeGeneratorRequest'RequestedFile'Import 'Const
raw_)
                                                            m (Text -> Parsed CodeGeneratorRequest'RequestedFile'Import)
-> m Text -> m (Parsed CodeGeneratorRequest'RequestedFile'Import)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> (Field 'Slot CodeGeneratorRequest'RequestedFile'Import Text
-> Raw CodeGeneratorRequest'RequestedFile'Import 'Const -> m Text
forall a b bp (m :: * -> *) (k :: FieldKind).
(IsStruct a, Parse b bp, ReadCtx m 'Const) =>
Field k a b -> Raw a 'Const -> m bp
GH.parseField IsLabel
  "name" (Field 'Slot CodeGeneratorRequest'RequestedFile'Import Text)
Field 'Slot CodeGeneratorRequest'RequestedFile'Import Text
#name Raw CodeGeneratorRequest'RequestedFile'Import 'Const
raw_))
instance (C.Marshal CodeGeneratorRequest'RequestedFile'Import (C.Parsed CodeGeneratorRequest'RequestedFile'Import)) where
    marshalInto :: Raw CodeGeneratorRequest'RequestedFile'Import ('Mut s)
-> Parsed CodeGeneratorRequest'RequestedFile'Import -> m ()
marshalInto Raw CodeGeneratorRequest'RequestedFile'Import ('Mut s)
raw_ CodeGeneratorRequest'RequestedFile'Import{..} = (do
        (Field 'Slot CodeGeneratorRequest'RequestedFile'Import Word64
-> Word64
-> Raw CodeGeneratorRequest'RequestedFile'Import ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "id" (Field 'Slot CodeGeneratorRequest'RequestedFile'Import Word64)
Field 'Slot CodeGeneratorRequest'RequestedFile'Import Word64
#id Word64
Parsed Word64
id Raw CodeGeneratorRequest'RequestedFile'Import ('Mut s)
raw_)
        (Field 'Slot CodeGeneratorRequest'RequestedFile'Import Text
-> Text
-> Raw CodeGeneratorRequest'RequestedFile'Import ('Mut s)
-> m ()
forall a b (m :: * -> *) s bp.
(IsStruct a, Parse b bp, RWCtx m s) =>
Field 'Slot a b -> bp -> Raw a ('Mut s) -> m ()
GH.encodeField IsLabel
  "name" (Field 'Slot CodeGeneratorRequest'RequestedFile'Import Text)
Field 'Slot CodeGeneratorRequest'RequestedFile'Import Text
#name Text
Parsed Text
name Raw CodeGeneratorRequest'RequestedFile'Import ('Mut s)
raw_)
        (() -> m ()
forall (f :: * -> *) a. Applicative f => a -> f a
Std_.pure ())
        )
instance (GH.HasField "id" GH.Slot CodeGeneratorRequest'RequestedFile'Import Std_.Word64) where
    fieldByLabel :: Field 'Slot CodeGeneratorRequest'RequestedFile'Import Word64
fieldByLabel  = (BitCount
-> Word16
-> BitCount
-> Word64
-> Field 'Slot CodeGeneratorRequest'RequestedFile'Import Word64
forall b a (sz :: DataSz).
(ReprFor b ~ 'Data sz, IsWord (UntypedData sz)) =>
BitCount -> Word16 -> BitCount -> Word64 -> Field 'Slot a b
GH.dataField BitCount
0 Word16
0 BitCount
64 Word64
0)
instance (GH.HasField "name" GH.Slot CodeGeneratorRequest'RequestedFile'Import Basics.Text) where
    fieldByLabel :: Field 'Slot CodeGeneratorRequest'RequestedFile'Import Text
fieldByLabel  = (Word16
-> Field 'Slot CodeGeneratorRequest'RequestedFile'Import Text
forall a b. IsPtr b => Word16 -> Field 'Slot a b
GH.ptrField Word16
0)