Safe Haskell | None |
---|---|
Language | Haskell98 |
Happy.Frontend.AbsSyn
Synopsis
- data BookendedAbsSyn = BookendedAbsSyn (Maybe String) (AbsSyn String) (Maybe String)
- data AbsSyn e = AbsSyn [Directive String] [Rule e]
- data Directive a
- = TokenType String
- | TokenSpec [(a, TokenSpec)]
- | TokenName String (Maybe String) Bool
- | TokenLexer String String
- | TokenImportedIdentity
- | TokenMonad String String String String
- | TokenNonassoc [String]
- | TokenRight [String]
- | TokenLeft [String]
- | TokenExpect Int
- | TokenError String (Maybe String)
- | TokenErrorExpected
- | TokenErrorHandlerType String
- | TokenAttributetype String
- | TokenAttribute String String
- getTokenType :: [Directive t] -> String
- getTokenSpec :: [Directive t] -> [(t, TokenSpec)]
- getParserNames :: [Directive t] -> [Directive t]
- getLexer :: [Directive t] -> Maybe (String, String)
- getImportedIdentity :: [Directive t] -> Bool
- getMonad :: [Directive t] -> (Bool, String, String, String, String)
- data ErrorHandlerInfo
- getError :: [Directive t] -> ErrorHandlerInfo
- getPrios :: [Directive t] -> [Directive t]
- getPrioNames :: Directive t -> [String]
- getExpect :: [Directive t] -> Maybe Int
- getErrorExpectedMode :: Eq t => [Directive t] -> ErrorExpectedMode
- getAttributes :: [Directive t] -> [(String, String)]
- getAttributetype :: [Directive t] -> Maybe String
- getAttributeGrammarExtras :: [Directive t] -> Maybe AttributeGrammarExtras
- parseTokenSpec :: String -> TokenSpec
- data Rule e = Rule String [String] [Prod e] (Maybe String)
- data Prod e = Prod [Term] e Int Prec
- data Term = App String [Term]
- data Prec
- data TokenSpec
- = TokenFixed String
- | TokenWithValue ExpressionWithHole
Documentation
data BookendedAbsSyn Source #
Constructors
getTokenType :: [Directive t] -> String Source #
getTokenSpec :: [Directive t] -> [(t, TokenSpec)] Source #
getParserNames :: [Directive t] -> [Directive t] Source #
getImportedIdentity :: [Directive t] -> Bool Source #
data ErrorHandlerInfo #
getError :: [Directive t] -> ErrorHandlerInfo Source #
getPrioNames :: Directive t -> [String] Source #
getErrorExpectedMode :: Eq t => [Directive t] -> ErrorExpectedMode Source #
getAttributeGrammarExtras :: [Directive t] -> Maybe AttributeGrammarExtras Source #
parseTokenSpec :: String -> TokenSpec Source #
Parse a token spec.
The first occurence of $$
indicates an expression in which the $$
will be substituted for the actual lexed token. $$
in string or char
literals ('".."' and '\'.'') however does not count.
Constructors
TokenFixed String | |
TokenWithValue ExpressionWithHole |