{-# LANGUAGE TypeFamilies #-} {-# LANGUAGE DataKinds #-} {-# LANGUAGE DeriveGeneric #-} {-# LANGUAGE DuplicateRecordFields #-} {-# LANGUAGE EmptyDataDeriving #-} {-# LANGUAGE FlexibleContexts #-} {-# 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.Stream where import qualified Capnp.Repr as R import qualified Capnp.Repr.Parsed as RP import qualified Capnp.Basics as Basics import qualified GHC.OverloadedLabels as OL import qualified Capnp.GenHelpers as GH import qualified Capnp.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 StreamResult type instance (R.ReprFor StreamResult) = (R.Ptr (Std_.Just R.Struct)) instance (C.HasTypeId StreamResult) where typeId :: Word64 typeId = Word64 11051721556433613166 instance (C.TypedStruct StreamResult) where numStructWords :: Word16 numStructWords = Word16 0 numStructPtrs :: Word16 numStructPtrs = Word16 0 instance (C.Allocate StreamResult) where type AllocHint StreamResult = () new :: forall (m :: * -> *) s. RWCtx m s => AllocHint StreamResult -> Message ('Mut s) -> m (Raw StreamResult ('Mut s)) new AllocHint StreamResult _ = forall a (m :: * -> *) s. (TypedStruct a, RWCtx m s) => Message ('Mut s) -> m (Raw a ('Mut s)) C.newTypedStruct instance (C.EstimateAlloc StreamResult (C.Parsed StreamResult)) instance (C.AllocateList StreamResult) where type ListAllocHint StreamResult = Std_.Int newList :: forall (m :: * -> *) s. RWCtx m s => ListAllocHint StreamResult -> Message ('Mut s) -> m (Raw (List StreamResult) ('Mut s)) newList = forall a (m :: * -> *) s. (TypedStruct a, RWCtx m s) => Int -> Message ('Mut s) -> m (Raw (List a) ('Mut s)) C.newTypedStructList instance (C.EstimateListAlloc StreamResult (C.Parsed StreamResult)) data instance C.Parsed StreamResult = StreamResult {} deriving(forall x. Rep (Parsed StreamResult) x -> Parsed StreamResult forall x. Parsed StreamResult -> Rep (Parsed StreamResult) x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep (Parsed StreamResult) x -> Parsed StreamResult $cfrom :: forall x. Parsed StreamResult -> Rep (Parsed StreamResult) x Generics.Generic) deriving instance (Std_.Show (C.Parsed StreamResult)) deriving instance (Std_.Eq (C.Parsed StreamResult)) instance (C.Parse StreamResult (C.Parsed StreamResult)) where parse :: forall (m :: * -> *). ReadCtx m 'Const => Raw StreamResult 'Const -> m (Parsed StreamResult) parse Raw StreamResult 'Const raw_ = (forall (f :: * -> *) a. Applicative f => a -> f a Std_.pure Parsed StreamResult StreamResult) instance (C.Marshal StreamResult (C.Parsed StreamResult)) where marshalInto :: forall (m :: * -> *) s. RWCtx m s => Raw StreamResult ('Mut s) -> Parsed StreamResult -> m () marshalInto Raw StreamResult ('Mut s) _raw (Parsed StreamResult R:ParsedStreamResult StreamResult) = (forall (f :: * -> *) a. Applicative f => a -> f a Std_.pure ())