-
Notifications
You must be signed in to change notification settings - Fork 97
/
Copy pathparser.mly
147 lines (111 loc) · 4.39 KB
/
parser.mly
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
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
%{
[@@@warning "-32"]
open Error
let point_of_position Lexing.{ pos_lnum; pos_cnum; _ } =
Loc.{ line = pos_lnum; column = pos_cnum }
type lexspan = (Lexing.position * Lexing.position)
let to_location : lexspan -> Loc.span =
fun (start, end_) ->
let open Loc in
let start_point = point_of_position start
and end_point = point_of_position end_ in
{ file = start.pos_fname; start = start_point; end_ = end_point }
let wrap_location : lexspan -> 'a -> 'a Loc.with_location = fun loc value ->
let location = to_location loc in
{ location; value }
let throw : lexspan -> Error.parser_error -> unit = fun loc error ->
raise @@ Parser_error (wrap_location loc error)
exception Debug of [ `DEBUG ] Loc.with_location
let raise_unimplemented : only_for_debugging:lexspan -> 'a =
fun ~only_for_debugging:loc ->
raise @@ Debug (wrap_location loc `DEBUG)
let exn_location : only_for_debugging:lexspan -> exn =
fun ~only_for_debugging:loc -> Debug (wrap_location loc `DEBUG)
let tag : Ast.tag -> Ast.block_element = fun tag -> `Tag tag
%}
%token SPACE NEWLINE
%token RIGHT_BRACE
%token RIGHT_CODE_DELIMITER
%token COMMENT
%token <string> Blank_line
%token <string> Single_newline
%token <string> Space
%token <string> Word
%token MINUS PLUS BAR
%token <Ast.style> Style
%token <Ast.alignment> Paragraph_style
%token <string> Modules
%token <string> Math_span
%token <string> Math_block
%token <string option * string> Raw_markup
%token <Ast.code_block> Code_block
%token <string> Code_span
%token <Ast.list_kind> List
%token <Ast.list_item> List_item
%token Table_light
%token Table_heavy
%token Table_row
%token <Ast.table_cell_kind> Table_cell
%token <int * string option> Section_heading
%token <Parser_types.tag> Tag
%token <string> Simple_ref
%token <string> Ref_with_replacement
%token <string> Simple_link
%token <string> Link_with_replacement
%token <Parser_types.(media * media_target)> Media
%token <Parser_types.(media * media_target * string)> Media_with_replacement
%token <string> Verbatim
%token END
%start <Ast.t> main
%%
%public %inline located(token):
value = token; { wrap_location $sloc value }
let main :=
| _ = whitespace; { [] }
| tag_ = tag; { [ wrap_location $sloc tag_ ]}
| END; { [] }
| _ = error; { raise @@ exn_location ~only_for_debugging:( $loc ) }
let whitespace :=
| SPACE; { `Space " " }
| NEWLINE; { `Space "\n" }
| ~ = Space; <`Space>
| ~ = Blank_line; <`Space>
| ~ = Single_newline; <`Space>
let inline_element :=
| ~ = Word; <`Word>
| ~ = Code_span; <`Code_span>
| ~ = Raw_markup; <`Raw_markup>
| style = Style; inner = inline_element; { `Style (style, wrap_location $loc inner) }
| ~ = Math_span; <`Math_span>
| _ = ref; <>
(* TODO: Determine how we want to handle recursive elements like refs and some of the tags that have nestable_block inners
Currently, this is broken *)
let ref :=
| ref = Simple_ref; children = inline_element; { `Reference (`Simple, ref, wrap_location $loc children) }
| _ref_w_text = Ref_with_replacement; children = inline_element; { `Reference (`Replacement, ref, wrap_location $loc children) }
let list_light :=
| MINUS; unordered_items = separated_list(NEWLINE; MINUS, text); { `List (`Unordered, `Light, unordered_items) }
| PLUS; unordered_items = separated_list(NEWLINE; PLUS, text); { `List (`Ordered, `Light, unordered_items) }
let text :=
| ~ = Word; whitespace; <`Word>
let tag :=
| inner_tag = Tag; {
let open Parser_types in
match inner_tag with
| Version version -> tag @@ `Version version
| Since version -> tag @@ `Since version
| Before _version -> raise_unimplemented ~only_for_debugging:( $loc )
| Canonical implementation -> tag @@ `Canonical (wrap_location $loc implementation)
| Inline -> tag `Inline
| Open -> tag `Open
| Closed -> tag `Closed
| Hidden -> tag `Hidden
| Deprecated -> raise_unimplemented ~only_for_debugging:( $loc )
| Return -> raise_unimplemented ~only_for_debugging:( $loc )
| Author _author -> raise_unimplemented ~only_for_debugging:( $loc )
| Param _param -> raise_unimplemented ~only_for_debugging:( $loc )
| Raise _exn -> raise_unimplemented ~only_for_debugging:( $loc )
| See (_kind, _href) -> raise_unimplemented ~only_for_debugging:( $loc )
}
let style := ~ = Style; <>
let paragraph_style := ~ = Paragraph_style; <>