Safe Haskell | None |
---|---|
Language | Haskell2010 |
Language.Fortran.Lexer.FreeForm
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 #
Constructors
AlexNone | |
AlexLastAcc a !AlexInput !Int | |
AlexLastSkip !AlexInput !Int |
Instances
Constructors
AlexAccNone | |
AlexAcc a | |
AlexAccSkip | |
AlexAccPred a (AlexAccPred user) (AlexAcc a user) | |
AlexAccSkipPred (AlexAccPred user) (AlexAcc a user) |
alexAndPred :: (t3 -> t2 -> t1 -> t -> Bool) -> (t3 -> t2 -> t1 -> t -> Bool) -> t3 -> t2 -> t1 -> t -> Bool Source #
alexPrevCharMatches :: (Char -> t3) -> t2 -> AlexInput -> t1 -> t -> t3 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 #
Constructors
Lexeme | |
Fields
|
initLexeme :: Lexeme Source #
Constructors
StartCode | |
Fields
|
Constructors
AlexInput | |
Fields
|
Constructors
User FortranVersion ParanthesesCount |
alexInputPrevChar :: AlexInput -> Char Source #
currentChar :: AlexInput -> Char Source #
isContinuation :: AlexInput -> Bool Source #
alexScanUser :: User -> AlexInput -> Int -> AlexReturn (LexAction (Maybe Token)) Source #
Constructors
Instances
class SpecifiesType a where Source #
Minimal complete definition
Methods
isTypeSpec :: a -> Bool Source #
Instances
initParseState :: ByteString -> FortranVersion -> String -> ParseState AlexInput Source #
collectFreeTokens :: FortranVersion -> ByteString -> [Token] Source #