Safe Haskell | None |
---|---|
Language | Haskell2010 |
Sugar.Lexer
Documentation
data LexerState Source #
Constructors
LexerState | |
Fields
|
Instances
Eq LexerState Source # | |
Defined in Sugar.Lexer | |
Show LexerState Source # | |
Defined in Sugar.Lexer Methods showsPrec :: Int -> LexerState -> ShowS # show :: LexerState -> String # showList :: [LexerState] -> ShowS # |
type LexemeStep = (SourceLocation, Lexeme) Source #
data SourceLocation Source #
Constructors
SourceLocation | |
Instances
Eq SourceLocation Source # | |
Defined in Sugar.Lexer Methods (==) :: SourceLocation -> SourceLocation -> Bool # (/=) :: SourceLocation -> SourceLocation -> Bool # | |
Show SourceLocation Source # | |
Defined in Sugar.Lexer Methods showsPrec :: Int -> SourceLocation -> ShowS # show :: SourceLocation -> String # showList :: [SourceLocation] -> ShowS # |
Constructors
sugarLexerState :: String -> LexerState Source #