File: LexTerm.g

package info (click to toggle)
frown 0.6.1-14
  • links: PTS, VCS
  • area: main
  • in suites: jessie, jessie-kfreebsd
  • size: 9,956 kB
  • ctags: 271
  • sloc: haskell: 35,132; makefile: 228; csh: 35; yacc: 23
file content (106 lines) | stat: -rw-r--r-- 3,950 bytes parent folder | download | duplicates (6)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
{-

This example demonstrates the use of a monadic lexer. We use a
continution passing style lexer for reasons of efficiency.

Requires |-98| or |-fglasgow-exts|.

	frown --lexer --expected --signature LexTerm.g

Try

	parse "(2+3)+4" :: IO Expr
	parse "2\n+3\n)+4" :: IO Expr
-}

module LexTerm
where
import Char

data AddOp                    =  Plus  | Minus
                                 deriving (Show)

data Expr                     =  Add Expr AddOp Expr
                              |  Const Int
                                 deriving (Show)

type Result                   =  Lex IO

%{

Terminal                      =  NAT   {Int}   as "numeral"
                              |  ADDOP {AddOp} as "`+' or `-'"
                              |  LPAR          as "`('"
                              |  RPAR          as "`)'"
                              | *EOF           as "<end of input>";

Nonterminal                   = *expr  {Expr}
                              |  term  {Expr};

expr  {Add e1 op e2}          :  expr {e1}, ADDOP {op}, term {e2};
      {e}                     |  term {e};
term  {Const n}               :  NAT {n};
      {e}                     |  LPAR, expr {e}, RPAR;

}%

data Lex m a                  =  Lex { unLex :: forall ans . (a -> [Terminal] -> Int -> m ans)
                                                             -> [Terminal] -> Int -> m ans }

instance Monad (Lex m) where
    return a                  =  Lex (\ cont -> cont a)
    m >>= k                   =  Lex (\ cont -> unLex m (\ a -> unLex (k a) cont))

frown la t                    =  Lex (\ cont inp n ->
                                      fail ("line " ++ show n ++ ": syntax error"
                                            ++ "\nexpected: " ++ concat (intersperse ", " la)
                                            ++ "\nfound   : " ++ unlex (t : inp)))

get                           =  Lex (\ cont inp n ->
                                      case inp of
                                          []           -> cont EOF inp n
                                          SPACE s : ts -> unLex get cont ts (newlines s + n)
                                          t : ts       -> cont t ts n)

data Terminal                 =  SPACE String | NAT Int | ADDOP AddOp | LPAR | RPAR | EOF
                                 deriving (Show)

lexer                         :: String -> [Terminal]
lexer []                      =  [EOF]
lexer ('+' : cs)              =  ADDOP Plus   : lexer cs
lexer ('-' : cs)              =  ADDOP Minus  : lexer cs
lexer ('(' : cs)              =  LPAR : lexer cs
lexer (')' : cs)              =  RPAR : lexer cs
lexer (c : cs)
    | isSpace c               =  let (s, cs') = span isSpace cs
                                 in  SPACE (c : s) : lexer cs'
    | isDigit c               =  let (n, cs') = span isDigit cs
                                 in  NAT (read (c : n)) : lexer cs'
    | otherwise               =  lexer cs

newlines s                    =  sum [ 1 | '\n' <- s ]

unlex []                      =  []
unlex [EOF]                   =  "<end of input>"
unlex (ADDOP Plus  : ts)      =  '+' : unlex ts
unlex (ADDOP Minus : ts)      =  '-' : unlex ts
unlex (LPAR        : ts)      =  '(' : unlex ts
unlex (RPAR        : ts)      =  ')' : unlex ts
unlex (SPACE s     : ts)      =  s      ++ unlex ts
unlex (NAT n       : ts)      =  show n ++ unlex ts

{-
expect EOF                    =  "<end of input>"
expect (ADDOP _)              =  "addition operator"
expect LPAR                   =  "`('"
expect RPAR                   =  "`)'"
expect (NAT _)                =  "numeral"
-}

intersperse		      :: a -> [a] -> [a]
intersperse s []	      =  []
intersperse s (a : as)	      =  a : intersperse1 as
  where intersperse1 []       =  []
        intersperse1 (a : as) =  s : a : intersperse1 as

parse inp                     =  unLex expr (\a _ _ -> return a) (lexer inp) 1