| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
Language.C99.AST
Documentation
data PreprocToken Source #
Constructors
| IdentBase IdentNonDigit | |
| IdentConsNonDigit Ident IdentNonDigit | |
| IdentCons Ident Digit |
data IdentNonDigit Source #
Constructors
| IdentNonDigit NonDigit | |
| IdentNonDigitUniv UnivCharName |
Instances
| Pretty IdentNonDigit Source # | |
Defined in Language.C99.Pretty Methods pretty :: IdentNonDigit -> Doc Source # | |
data UnivCharName Source #
Constructors
| UnivCharName1 HexQuad | |
| UnivCharName2 HexQuad HexQuad |
Instances
| Pretty UnivCharName Source # | |
Defined in Language.C99.Pretty Methods pretty :: UnivCharName -> Doc Source # | |
Constructors
| ConstInt IntConst | |
| ConstFloat FloatConst | |
| ConstEnum EnumConst | |
| ConstChar CharConst |
Constructors
| DecBase NonZeroDigit | |
| DecCons DecConst Digit |
Constructors
| OX |
data NonZeroDigit Source #
Instances
| Pretty NonZeroDigit Source # | |
Defined in Language.C99.Pretty Methods pretty :: NonZeroDigit -> Doc Source # | |
data UnsignedSuffix Source #
Constructors
| U |
Instances
| Pretty UnsignedSuffix Source # | |
Defined in Language.C99.Pretty Methods pretty :: UnsignedSuffix -> Doc Source # | |
data LongSuffix Source #
Constructors
| L |
Instances
| Pretty LongSuffix Source # | |
Defined in Language.C99.Pretty Methods pretty :: LongSuffix -> Doc Source # | |
data LongLongSuffix Source #
Constructors
| LL |
Instances
| Pretty LongLongSuffix Source # | |
Defined in Language.C99.Pretty Methods pretty :: LongLongSuffix -> Doc Source # | |
data FloatConst Source #
Constructors
| FloatDec DecFloatConst | |
| FloatHex HexFloatConst |
Instances
| Pretty FloatConst Source # | |
Defined in Language.C99.Pretty Methods pretty :: FloatConst -> Doc Source # | |
data DecFloatConst Source #
Constructors
| DecFloatFrac FracConst (Maybe ExpPart) (Maybe FloatSuffix) | |
| DecFloatDigits DigitSeq ExpPart (Maybe FloatSuffix) |
Instances
| Pretty DecFloatConst Source # | |
Defined in Language.C99.Pretty Methods pretty :: DecFloatConst -> Doc Source # | |
data HexFloatConst Source #
Constructors
| HexFloatFrac HexPrefix HexFracConst BinExpPart (Maybe FloatSuffix) | |
| HexFloatDigits HexPrefix HexDigitSeq BinExpPart (Maybe FloatSuffix) |
Instances
| Pretty HexFloatConst Source # | |
Defined in Language.C99.Pretty Methods pretty :: HexFloatConst -> Doc Source # | |
data HexFracConst Source #
Constructors
| HexFracZero (Maybe HexDigitSeq) HexDigitSeq | |
| HexFrac HexDigitSeq |
Instances
| Pretty HexFracConst Source # | |
Defined in Language.C99.Pretty Methods pretty :: HexFracConst -> Doc Source # | |
data BinExpPart Source #
Instances
| Pretty BinExpPart Source # | |
Defined in Language.C99.Pretty Methods pretty :: BinExpPart -> Doc Source # | |
data HexDigitSeq Source #
Constructors
| HexDigitBase HexDigit | |
| HexDigitCons HexDigitSeq HexDigit |
Instances
| Pretty HexDigitSeq Source # | |
Defined in Language.C99.Pretty Methods pretty :: HexDigitSeq -> Doc Source # | |
data FloatSuffix Source #
Instances
| Pretty FloatSuffix Source # | |
Defined in Language.C99.Pretty Methods pretty :: FloatSuffix -> Doc Source # | |
Constructors
| EscSimple SimpleEscSeq | |
| EscOc OcEscSeq | |
| EscHex HexEscSeq | |
| EscUniv UnivCharName |
data SimpleEscSeq Source #
Instances
| Pretty SimpleEscSeq Source # | |
Defined in Language.C99.Pretty Methods pretty :: SimpleEscSeq -> Doc Source # | |
Constructors
| HexEscBase HexDigit | |
| HexEscCons HexEscSeq HexDigit |
Constructors
data HeaderName Source #
Constructors
| HeaderGlobal HCharSeq | |
| HeaderLocal QCharSeq |
data PostfixExpr Source #
Constructors
Instances
| Pretty PostfixExpr Source # | |
Defined in Language.C99.Pretty Methods pretty :: PostfixExpr -> Doc Source # | |
data ArgExprList Source #
Constructors
| ArgExprListBase AssignExpr | |
| ArgExprListCons ArgExprList AssignExpr |
Instances
| Pretty ArgExprList Source # | |
Defined in Language.C99.Pretty Methods pretty :: ArgExprList -> Doc Source # | |
data AssignExpr Source #
Constructors
| AssignCond CondExpr | |
| Assign UnaryExpr AssignOp AssignExpr |
Instances
| Pretty AssignExpr Source # | |
Defined in Language.C99.Pretty Methods pretty :: AssignExpr -> Doc Source # | |
Constructors
| ExprAssign AssignExpr | |
| Expr Expr AssignExpr |
Constructors
| Decln DeclnSpecs (Maybe InitDeclrList) |
data DeclnSpecs Source #
Constructors
| DeclnSpecsStorage StorageClassSpec (Maybe DeclnSpecs) | |
| DeclnSpecsType TypeSpec (Maybe DeclnSpecs) | |
| DeclnSpecsQual TypeQual (Maybe DeclnSpecs) | |
| DeclnSpecsFun FunSpec (Maybe DeclnSpecs) |
Instances
| Pretty DeclnSpecs Source # | |
Defined in Language.C99.Pretty Methods pretty :: DeclnSpecs -> Doc Source # | |
data InitDeclrList Source #
Constructors
| InitDeclrBase InitDeclr | |
| InitDeclrCons InitDeclrList InitDeclr |
Instances
| Pretty InitDeclrList Source # | |
Defined in Language.C99.Pretty Methods pretty :: InitDeclrList -> Doc Source # | |
Constructors
| InitDeclr Declr | |
| InitDeclrInitr Declr Init |
data StorageClassSpec Source #
Instances
| Pretty StorageClassSpec Source # | |
Defined in Language.C99.Pretty Methods pretty :: StorageClassSpec -> Doc Source # | |
data StructOrUnionSpec Source #
Constructors
| StructOrUnionDecln StructOrUnion (Maybe Ident) StructDeclnList | |
| StructOrUnionForwDecln StructOrUnion Ident |
Instances
| Pretty StructOrUnionSpec Source # | |
Defined in Language.C99.Pretty Methods pretty :: StructOrUnionSpec -> Doc Source # | |
data StructOrUnion Source #
Instances
| Pretty StructOrUnion Source # | |
Defined in Language.C99.Pretty Methods pretty :: StructOrUnion -> Doc Source # | |
data StructDeclnList Source #
Instances
| Pretty StructDeclnList Source # | |
Defined in Language.C99.Pretty Methods pretty :: StructDeclnList -> Doc Source # | |
data StructDecln Source #
Constructors
| StructDecln SpecQualList StructDeclrList |
Instances
| Pretty StructDecln Source # | |
Defined in Language.C99.Pretty Methods pretty :: StructDecln -> Doc Source # | |
data SpecQualList Source #
Constructors
| SpecQualType TypeSpec (Maybe SpecQualList) | |
| SpecQualQual TypeQual (Maybe SpecQualList) |
Instances
| Pretty SpecQualList Source # | |
Defined in Language.C99.Pretty Methods pretty :: SpecQualList -> Doc Source # | |
data StructDeclrList Source #
Instances
| Pretty StructDeclrList Source # | |
Defined in Language.C99.Pretty Methods pretty :: StructDeclrList -> Doc Source # | |
data StructDeclr Source #
Constructors
| StructDeclr Declr | |
| StructDeclrBit (Maybe Declr) ConstExpr |
Instances
| Pretty StructDeclr Source # | |
Defined in Language.C99.Pretty Methods pretty :: StructDeclr -> Doc Source # | |
Constructors
| SpecInline |
Constructors
| Declr (Maybe Ptr) DirectDeclr |
data DirectDeclr Source #
Constructors
Instances
| Pretty DirectDeclr Source # | |
Defined in Language.C99.Pretty Methods pretty :: DirectDeclr -> Doc Source # | |
Constructors
| PtrBase (Maybe TypeQualList) | |
| PtrCons (Maybe TypeQualList) Ptr |
data TypeQualList Source #
Constructors
| TypeQualBase TypeQual | |
| TypeQualCons TypeQualList TypeQual |
Instances
| Pretty TypeQualList Source # | |
Defined in Language.C99.Pretty Methods pretty :: TypeQualList -> Doc Source # | |
data ParamTypeList Source #
Constructors
| ParamTypeList ParamList | |
| ParamTypeListVar ParamList |
Instances
| Pretty ParamTypeList Source # | |
Defined in Language.C99.Pretty Methods pretty :: ParamTypeList -> Doc Source # | |
Constructors
| ParamBase ParamDecln | |
| ParamCons ParamList ParamDecln |
data ParamDecln Source #
Constructors
| ParamDecln DeclnSpecs Declr | |
| ParamDeclnAbstract DeclnSpecs (Maybe DirectAbstractDeclr) |
Instances
| Pretty ParamDecln Source # | |
Defined in Language.C99.Pretty Methods pretty :: ParamDecln -> Doc Source # | |
Constructors
| IdentListBase Ident | |
| IdentListCons IdentList Ident |
Constructors
| TypeName SpecQualList (Maybe AbstractDeclr) |
data AbstractDeclr Source #
Constructors
| AbstractDeclr Ptr | |
| AbstractDeclrDirect (Maybe Ptr) DirectAbstractDeclr |
Instances
| Pretty AbstractDeclr Source # | |
Defined in Language.C99.Pretty Methods pretty :: AbstractDeclr -> Doc Source # | |
data DirectAbstractDeclr Source #
Constructors
Instances
| Pretty DirectAbstractDeclr Source # | |
Defined in Language.C99.Pretty Methods pretty :: DirectAbstractDeclr -> Doc Source # | |
data TypedefName Source #
Constructors
| TypedefName Ident |
Instances
| Pretty TypedefName Source # | |
Defined in Language.C99.Pretty Methods pretty :: TypedefName -> Doc Source # | |
Constructors
| InitExpr AssignExpr | |
| InitList InitList |
Constructors
| Design DesigrList |
data DesigrList Source #
Constructors
| DesigrBase Desigr | |
| DesigrCons DesigrList Desigr |
Instances
| Pretty DesigrList Source # | |
Defined in Language.C99.Pretty Methods pretty :: DesigrList -> Doc Source # | |
Constructors
| DesigrConst ConstExpr | |
| DesigrIdent Ident |
data LabeledStmt Source #
Constructors
| LabeledIdent Ident Stmt | |
| LabeledCase ConstExpr Stmt | |
| LabeledDefault Stmt |
Instances
| Pretty LabeledStmt Source # | |
Defined in Language.C99.Pretty Methods pretty :: LabeledStmt -> Doc Source # | |
data CompoundStmt Source #
Constructors
| Compound (Maybe BlockItemList) |
Instances
| Pretty CompoundStmt Source # | |
Defined in Language.C99.Pretty Methods pretty :: CompoundStmt -> Doc Source # | |
data BlockItemList Source #
Constructors
| BlockItemBase BlockItem | |
| BlockItemCons BlockItemList BlockItem |
Instances
| Pretty BlockItemList Source # | |
Defined in Language.C99.Pretty Methods pretty :: BlockItemList -> Doc Source # | |
Constructors
| BlockItemDecln Decln | |
| BlockItemStmt Stmt |
data SelectStmt Source #
Constructors
| SelectIf Expr Stmt | |
| SelectIfElse Expr Stmt Stmt | |
| SelectSwitch Expr Stmt |
Instances
| Pretty SelectStmt Source # | |
Defined in Language.C99.Pretty Methods pretty :: SelectStmt -> Doc Source # | |
Constructors
| JumpGoto Ident | |
| JumpContinue | |
| JumpBreak | |
| JumpReturn (Maybe Expr) |
Constructors
| TransUnitBase ExtDecln | |
| TransUnitCons TransUnit ExtDecln |
Constructors
| FunDef DeclnSpecs Declr (Maybe DeclnList) CompoundStmt |
data PreprocFile Source #
Constructors
| PreprocFile (Maybe Group) |
data ElifGroups Source #
Constructors
| ElifBase ElifGroup | |
| ElifCons ElifGroups ElifGroup |
data ControlLine Source #
Constructors
data NonDirective Source #
Constructors
| NonDirective PPTokens NewLine |
data ReplaceList Source #
Constructors
| ReplaceList (Maybe PPTokens) |
Constructors
| PPTokensBase PreprocToken | |
| PPTokensCons PPTokens PreprocToken |