Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
data LexemeClass Source #
Instances
parseTranslationUnit :: Alex [NonTerm] Source #
source :: Maybe ByteString 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.19-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 #
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
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.19-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
Instances
data CommentStyle Source #
Instances
data CommentF lexeme a Source #
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 #