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

Safe HaskellNone

Language.Clafer.Front.Lexclafer

Synopsis

Documentation

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 :: (Posn, Char, [Byte], String) -> Int -> AlexReturn (Posn -> String -> Token)Source

alexScanUser :: t -> (Posn, Char, [Byte], String) -> Int -> AlexReturn (Posn -> String -> Token)Source

alex_scan_tkn :: t -> t1 -> Int# -> (Posn, Char, [Byte], String) -> Int# -> AlexLastAcc (Posn -> String -> Token) -> (AlexLastAcc (Posn -> String -> Token), (Posn, Char, [Byte], String))Source

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] -> [Char]Source

tokenLineCol :: Token -> (Int, Int)Source

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 Byte = Word8Source

type AlexInput = (Posn, Char, [Byte], String)Source

tokens :: String -> [Token]Source

utf8Encode :: Char -> [Word8]Source

Encode a Haskell String to a list of Word8 values, in UTF8 format.

data AlexAddr Source

Constructors

AlexA# Addr# 

data AlexAcc a user Source

Constructors

AlexAccNone 
AlexAcc a 
AlexAccSkip 

iUnbox :: Int -> Int#Source