Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
alex_tab_size :: Int Source #
quickIndex :: Array Int (AlexAcc (LexAction (Maybe Token)) User) -> Int -> AlexAcc (LexAction (Maybe Token)) User Source #
data AlexReturn a Source #
alex_scan_tkn :: User -> AlexInput -> Int# -> AlexInput -> Int# -> AlexLastAcc (LexAction (Maybe Token)) -> (AlexLastAcc (LexAction (Maybe Token)), AlexInput) Source #
data AlexLastAcc a Source #
AlexAccNone | |
AlexAcc a | |
AlexAccSkip | |
AlexAccPred a (AlexAccPred user) (AlexAcc a user) | |
AlexAccSkipPred (AlexAccPred user) (AlexAcc a user) |
alexAndPred :: (t -> t1 -> t2 -> t3 -> Bool) -> (t -> t1 -> t2 -> t3 -> Bool) -> t -> t1 -> t2 -> t3 -> Bool Source #
alexPrevCharMatches :: (Char -> t) -> t3 -> AlexInput -> t2 -> t1 -> t Source #
alexRightContext :: Int -> AlexAccPred User Source #
precedesDoubleColon :: AlexInput -> Bool Source #
fillConstr :: (a -> Token) -> Constr Source #
resetLexeme :: LexAction () Source #
addToPreviousTokensInLine :: Token -> LexAction () Source #
stabiliseStartCode :: LexAction () Source #
normaliseStartCode :: LexAction () Source #
isValidPosition :: Position -> Bool Source #
Lexeme | |
|
initLexeme :: Lexeme Source #
StartCode | |
|
AlexInput | |
|
alexInputPrevChar :: AlexInput -> Char Source #
currentChar :: AlexInput -> Char Source #
isContinuation :: AlexInput -> Bool Source #
alexScanUser :: User -> AlexInput -> Int -> AlexReturn (LexAction (Maybe Token)) Source #
class SpecifiesType a where Source #
isTypeSpec :: a -> Bool Source #
initParseState :: ByteString -> FortranVersion -> String -> ParseState AlexInput Source #
collectFreeTokens :: FortranVersion -> ByteString -> [Token] Source #