Copyright | (c) 1999 - 2004 Wolfgang Lux 2005 Martin Engelke 2011 - 2013 Björn Peemöller 2016 Finn Teegen 2016 Jan Tikovsky |
---|---|
License | BSD-3-clause |
Maintainer | bjp@informatik.uni-kiel.de |
Stability | experimental |
Portability | portable |
Safe Haskell | Safe |
Language | Haskell2010 |
Synopsis
- data Token = Token Category Attributes
- data Category
- = CharTok
- | IntTok
- | FloatTok
- | StringTok
- | Id
- | QId
- | Sym
- | QSym
- | LeftParen
- | RightParen
- | Semicolon
- | LeftBrace
- | RightBrace
- | LeftBracket
- | RightBracket
- | Comma
- | Underscore
- | Backquote
- | VSemicolon
- | VRightBrace
- | KW_case
- | KW_class
- | KW_data
- | KW_default
- | KW_deriving
- | KW_do
- | KW_else
- | KW_external
- | KW_fcase
- | KW_free
- | KW_if
- | KW_import
- | KW_in
- | KW_infix
- | KW_infixl
- | KW_infixr
- | KW_instance
- | KW_let
- | KW_module
- | KW_newtype
- | KW_of
- | KW_then
- | KW_type
- | KW_where
- | At
- | Colon
- | DotDot
- | DoubleColon
- | Equals
- | Backslash
- | Bar
- | LeftArrow
- | RightArrow
- | Tilde
- | DoubleArrow
- | Id_as
- | Id_ccall
- | Id_forall
- | Id_hiding
- | Id_interface
- | Id_primitive
- | Id_qualified
- | SymDot
- | SymMinus
- | SymStar
- | PragmaLanguage
- | PragmaOptions
- | PragmaHiding
- | PragmaMethod
- | PragmaModule
- | PragmaEnd
- | LineComment
- | NestedComment
- | EOF
- data Attributes
- = NoAttributes
- | CharAttributes { }
- | IntAttributes { }
- | FloatAttributes { }
- | StringAttributes { }
- | IdentAttributes { }
- | OptionsAttributes { }
- lexSource :: FilePath -> String -> CYM [(Span, Token)]
- lexer :: Lexer Token a
- fullLexer :: Lexer Token a
Data types for tokens
Data type for curry lexer tokens
Category of curry tokens
data Attributes Source #
Attributes associated to a token
NoAttributes | |
CharAttributes | |
IntAttributes | |
FloatAttributes | |
StringAttributes | |
IdentAttributes | |
OptionsAttributes | |
Instances
Show Attributes Source # | |
Defined in Curry.Syntax.Lexer showsPrec :: Int -> Attributes -> ShowS # show :: Attributes -> String # showList :: [Attributes] -> ShowS # |