clafer-0.3.5: clafer compiles Clafer models to other formats, such as Alloy, XML, HTML, Dot.

Safe HaskellNone

Language.Clafer.Front.Lexclafer

Documentation

tok :: (t1 -> t2 -> t) -> t1 -> t2 -> tSource

share :: String -> StringSource

data Tok Source

Constructors

TS !String !Int 
TL !String 
TI !String 
TV !String 
TD !String 
TC !String 
T_PosInteger !String 
T_PosDouble !String 
T_PosString !String 
T_PosIdent !String 

Instances

Eq Tok 
Ord Tok 
Show Tok 

data Token Source

Constructors

PT Posn Tok 
Err Posn 

Instances

Eq Token 
Ord Token 
Show Token 

tokenPos :: [Token] -> StringSource

posLineCol :: Posn -> (Int, Int)Source

mkPosToken :: Token -> ((Int, Int), String)Source

prToken :: Token -> StringSource

data BTree Source

Constructors

N 
B String Tok BTree BTree 

Instances

Show BTree 

eitherResIdent :: (String -> Tok) -> String -> TokSource

unescapeInitTail :: String -> StringSource

data Posn Source

Constructors

Pn !Int !Int !Int 

Instances

Eq Posn 
Ord Posn 
Show Posn 

alexMove :: Posn -> Char -> PosnSource

type AlexInput = (Posn, Char, String)Source

tokens :: String -> [Token]Source

alex_accept :: Array Int [AlexAcc (Posn -> String -> Token) user]Source

quickIndex :: Array Int [AlexAcc (Posn -> String -> Token) (Any *)] -> Int -> [AlexAcc (Posn -> String -> Token) (Any *)]Source

alexScan :: AlexInput -> Int -> AlexReturn (Posn -> String -> Token)Source

alexScanUser :: Any * -> (Posn, Char, String) -> Int -> AlexReturn (Posn -> String -> Token)Source

alex_scan_tkn :: Any * -> (Posn, Char, String) -> Int# -> (Posn, Char, String) -> Int# -> AlexLastAcc (Posn -> String -> Token) -> (AlexLastAcc (Posn -> String -> Token), (Posn, Char, String))Source

data AlexLastAcc a Source

Constructors

AlexNone 
AlexLastAcc a !AlexInput !Int 
AlexLastSkip !AlexInput !Int 

Instances

Functor AlexLastAcc 

data AlexAcc a user Source

type AlexAccPred user = user -> AlexInput -> Int -> AlexInput -> BoolSource

alexAndPred :: (t -> t1 -> t2 -> t3 -> Bool) -> (t -> t1 -> t2 -> t3 -> Bool) -> t -> t1 -> t2 -> t3 -> BoolSource

alexPrevCharIs :: Char -> t -> AlexInput -> t1 -> t2 -> BoolSource

alexPrevCharMatches :: (Char -> t3) -> t -> AlexInput -> t1 -> t2 -> t3Source

alexPrevCharIsOneOf :: Array Char e -> t -> AlexInput -> t1 -> t2 -> eSource

alexRightContext :: Int -> Any * -> t -> t1 -> (Posn, Char, String) -> BoolSource

iUnbox :: Int -> Int#Source

data AlexAddr Source

Constructors

AlexA# Addr#