| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Language.Cimple
Documentation
data LexemeClass Source #
Constructors
Instances
parseTranslationUnit :: Alex [NonTerm] Source #
module Language.Cimple.MapAst
Instances
| Eq AlexPosn Source # | |
| Ord AlexPosn Source # | |
Defined in Language.Cimple.Lexer | |
| Show AlexPosn Source # | |
| Generic AlexPosn Source # | |
| ToJSON AlexPosn Source # | |
| FromJSON AlexPosn Source # | |
Defined in Language.Cimple.Lexer | |
| type Rep AlexPosn Source # | |
Defined in Language.Cimple.Lexer type Rep AlexPosn = D1 ('MetaData "AlexPosn" "Language.Cimple.Lexer" "cimple-0.0.17-inplace" 'False) (C1 ('MetaCons "AlexPn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int)))) | |
alexScanTokens :: ByteString -> Either String [Lexeme Text] Source #
Constructors
| L AlexPosn LexemeClass text |
Instances
lexemeClass :: Lexeme text -> LexemeClass Source #
lexemePosn :: Lexeme text -> AlexPosn Source #
lexemeText :: Lexeme text -> text Source #
lexemeLine :: Lexeme text -> Int Source #
Instances
Constructors
| BopNe | |
| BopEq | |
| BopOr | |
| BopBitXor | |
| BopBitOr | |
| BopAnd | |
| BopBitAnd | |
| BopDiv | |
| BopMul | |
| BopMod | |
| BopPlus | |
| BopMinus | |
| BopLt | |
| BopLe | |
| BopLsh | |
| BopGt | |
| BopGe | |
| BopRsh |
Instances
Instances
| Bounded UnaryOp Source # | |
| Enum UnaryOp Source # | |
| Eq UnaryOp Source # | |
| Ord UnaryOp Source # | |
| Read UnaryOp Source # | |
| Show UnaryOp Source # | |
| Generic UnaryOp Source # | |
| ToJSON UnaryOp Source # | |
| FromJSON UnaryOp Source # | |
Defined in Language.Cimple.Ast | |
| type Rep UnaryOp Source # | |
Defined in Language.Cimple.Ast type Rep UnaryOp = D1 ('MetaData "UnaryOp" "Language.Cimple.Ast" "cimple-0.0.17-inplace" 'False) ((C1 ('MetaCons "UopNot" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "UopNeg" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UopMinus" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "UopAddress" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UopDeref" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "UopIncr" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UopDecr" 'PrefixI 'False) (U1 :: Type -> Type)))) | |
data LiteralType Source #
Instances
Constructors
Instances
data CommentStyle Source #
Instances
data CommentF lexeme a Source #
Constructors
| DocComment [a] | |
| DocWord lexeme | |
| DocSentence [a] lexeme | |
| DocNewline | |
| DocAttention [a] | |
| DocBrief [a] | |
| DocDeprecated [a] | |
| DocExtends lexeme | |
| DocImplements lexeme | |
| DocParam (Maybe lexeme) lexeme [a] | |
| DocReturn [a] | |
| DocRetval lexeme [a] | |
| DocSee lexeme [a] | |
| DocPrivate | |
| DocParagraph [a] | |
| DocLine [a] | |
| DocList [a] | |
| DocULItem [a] [a] | |
| DocOLItem lexeme [a] | |
| DocColon lexeme | |
| DocRef lexeme | |
| DocP lexeme | |
| DocLParen a | |
| DocRParen a | |
| DocAssignOp AssignOp a a | |
| DocBinaryOp BinaryOp a a |
Instances
Instances
removeAnnot :: AnnotNode lexeme -> Node lexeme Source #
type DefaultActions a = IdentityActions (State a) Text Source #
defaultActions :: DefaultActions state Source #