Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- newtype Namespace = Namespace {
- unNamespace :: [Text]
- newtype Ident = Ident {}
- data TypeRef = TypeRef {}
- class HasIdent a where
- data EnumDecl = EnumDecl {}
- data EnumVal = EnumVal {
- enumValIdent :: !Ident
- enumValInt :: !Integer
- data EnumType
- data StructDecl = StructDecl {
- structIdent :: !Ident
- structAlignment :: !Alignment
- structSize :: !InlineSize
- structFields :: !(NonEmpty StructField)
- data StructField = StructField {}
- data StructFieldType
- newtype DefaultVal a = DefaultVal a
- data Required
- data IsRoot
- data TableDecl = TableDecl {
- tableIdent :: !Ident
- tableIsRoot :: !IsRoot
- tableFields :: ![TableField]
- data TableField = TableField {}
- data TableFieldType
- = TInt8 !(DefaultVal Integer)
- | TInt16 !(DefaultVal Integer)
- | TInt32 !(DefaultVal Integer)
- | TInt64 !(DefaultVal Integer)
- | TWord8 !(DefaultVal Integer)
- | TWord16 !(DefaultVal Integer)
- | TWord32 !(DefaultVal Integer)
- | TWord64 !(DefaultVal Integer)
- | TFloat !(DefaultVal Scientific)
- | TDouble !(DefaultVal Scientific)
- | TBool !(DefaultVal Bool)
- | TString !Required
- | TEnum !TypeRef !EnumType !(DefaultVal Integer)
- | TStruct !TypeRef !Required
- | TTable !TypeRef !Required
- | TUnion !TypeRef !Required
- | TVector !Required !VectorElementType
- data VectorElementType
- data UnionDecl = UnionDecl {
- unionIdent :: !Ident
- unionVals :: !(NonEmpty UnionVal)
- data UnionVal = UnionVal {}
Re-exports from SyntaxTree
Namespace | |
|
Instances
class HasIdent a where Source #
Instances
Enums
EnumVal | |
|
Structs
data StructDecl Source #
StructDecl | |
|
Instances
Eq StructDecl Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree (==) :: StructDecl -> StructDecl -> Bool # (/=) :: StructDecl -> StructDecl -> Bool # | |
Show StructDecl Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree showsPrec :: Int -> StructDecl -> ShowS # show :: StructDecl -> String # showList :: [StructDecl] -> ShowS # | |
HasIdent StructDecl Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree getIdent :: StructDecl -> Ident Source # |
data StructField Source #
StructField | |
|
Instances
Eq StructField Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree (==) :: StructField -> StructField -> Bool # (/=) :: StructField -> StructField -> Bool # | |
Show StructField Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree showsPrec :: Int -> StructField -> ShowS # show :: StructField -> String # showList :: [StructField] -> ShowS # | |
HasIdent StructField Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree getIdent :: StructField -> Ident Source # |
data StructFieldType Source #
SInt8 | |
SInt16 | |
SInt32 | |
SInt64 | |
SWord8 | |
SWord16 | |
SWord32 | |
SWord64 | |
SFloat | |
SDouble | |
SBool | |
SEnum !TypeRef !EnumType | |
SStruct !(Namespace, StructDecl) |
Instances
Eq StructFieldType Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree (==) :: StructFieldType -> StructFieldType -> Bool # (/=) :: StructFieldType -> StructFieldType -> Bool # | |
Show StructFieldType Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree showsPrec :: Int -> StructFieldType -> ShowS # show :: StructFieldType -> String # showList :: [StructFieldType] -> ShowS # |
Tables
newtype DefaultVal a Source #
Instances
NotRoot | This table is not the root table. |
IsRoot !(Maybe Text) | This table is the root table, and has an optional file identifier. |
TableDecl | |
|
data TableField Source #
TableField | |
|
Instances
Eq TableField Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree (==) :: TableField -> TableField -> Bool # (/=) :: TableField -> TableField -> Bool # | |
Show TableField Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree showsPrec :: Int -> TableField -> ShowS # show :: TableField -> String # showList :: [TableField] -> ShowS # | |
HasIdent TableField Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree getIdent :: TableField -> Ident Source # |
data TableFieldType Source #
Instances
Eq TableFieldType Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree (==) :: TableFieldType -> TableFieldType -> Bool # (/=) :: TableFieldType -> TableFieldType -> Bool # | |
Show TableFieldType Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree showsPrec :: Int -> TableFieldType -> ShowS # show :: TableFieldType -> String # showList :: [TableFieldType] -> ShowS # |
data VectorElementType Source #
VInt8 | |
VInt16 | |
VInt32 | |
VInt64 | |
VWord8 | |
VWord16 | |
VWord32 | |
VWord64 | |
VFloat | |
VDouble | |
VBool | |
VString | |
VEnum !TypeRef !EnumType | |
VStruct !TypeRef | |
VTable !TypeRef | |
VUnion !TypeRef |
Instances
Eq VectorElementType Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree (==) :: VectorElementType -> VectorElementType -> Bool # (/=) :: VectorElementType -> VectorElementType -> Bool # | |
Show VectorElementType Source # | |
Defined in FlatBuffers.Internal.Compiler.ValidSyntaxTree showsPrec :: Int -> VectorElementType -> ShowS # show :: VectorElementType -> String # showList :: [VectorElementType] -> ShowS # |