Safe Haskell | None |
---|---|
Language | Haskell2010 |
Language.Fortran.Lexer.FreeForm
Documentation
alex_tab_size :: Int Source #
data AlexReturn a Source #
alex_scan_tkn :: User -> AlexInput -> Int# -> AlexInput -> Int# -> AlexLastAcc -> (AlexLastAcc, AlexInput) Source #
data AlexLastAcc Source #
Constructors
AlexNone | |
AlexLastAcc !Int !AlexInput !Int | |
AlexLastSkip !AlexInput !Int |
Constructors
AlexAccNone | |
AlexAcc Int | |
AlexAccSkip | |
AlexAccPred Int (AlexAccPred user) (AlexAcc user) | |
AlexAccSkipPred (AlexAccPred user) (AlexAcc user) |
alexAndPred :: (t1 -> t2 -> t3 -> t4 -> Bool) -> (t1 -> t2 -> t3 -> t4 -> Bool) -> t1 -> t2 -> t3 -> t4 -> Bool Source #
alexPrevCharMatches :: (Char -> t) -> p1 -> AlexInput -> p2 -> p3 -> 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 #
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 #