Source file ppx_sexp_conv_grammar.ml
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
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
176
177
178
179
180
181
182
183
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
207
208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
260
261
262
263
264
265
266
267
268
269
270
271
272
273
274
275
276
277
278
279
280
281
282
283
284
285
286
287
288
289
290
291
292
293
294
295
296
297
298
299
300
301
302
303
304
305
306
307
308
309
310
311
312
313
314
315
316
317
318
319
320
321
322
323
324
325
326
327
328
329
330
331
332
333
334
335
336
337
338
339
340
341
342
343
344
345
346
347
348
349
350
351
352
353
354
355
356
357
358
359
360
361
362
363
364
365
366
367
368
369
370
371
372
373
374
375
376
377
378
379
380
381
382
383
384
385
386
387
388
389
390
391
392
393
394
395
396
397
398
399
400
401
402
403
404
405
406
407
408
409
410
411
412
413
414
415
416
417
418
419
420
421
422
423
424
425
426
427
428
429
430
431
432
433
434
435
436
437
438
439
440
441
442
443
444
445
446
447
448
449
450
451
452
453
454
455
456
457
458
459
460
461
462
463
464
465
466
467
468
469
470
471
472
473
474
475
476
477
478
479
480
481
482
483
484
485
486
487
488
489
490
491
492
493
494
495
496
497
498
499
500
501
502
503
504
505
506
507
508
509
510
511
512
513
514
515
516
517
518
519
520
521
522
523
524
525
526
527
528
529
530
531
532
533
534
535
536
537
538
539
540
541
542
543
544
545
546
547
548
549
550
551
552
553
554
555
556
557
558
559
560
561
562
563
564
565
566
567
568
569
570
571
572
573
574
575
576
577
578
579
580
581
582
583
584
585
586
587
588
589
590
591
592
593
594
595
596
597
598
599
600
601
602
603
604
605
606
607
608
609
610
611
612
613
614
615
616
617
618
619
620
621
622
623
624
625
626
627
628
629
630
631
632
633
634
635
636
637
638
639
640
641
642
643
644
645
646
647
648
649
650
651
652
653
654
655
656
657
658
659
660
661
662
663
664
665
666
667
668
669
670
671
672
673
674
675
676
677
678
679
680
681
682
683
684
685
686
687
688
689
690
691
692
693
694
695
696
697
698
699
700
701
702
703
704
705
706
707
708
709
710
711
712
713
714
715
716
717
718
719
720
721
open! Base
open! Ppxlib
open Ast_builder.Default
let copy =
object
inherit Ast_traverse.map
method! location loc = { loc with loc_ghost = true }
method! attributes _ = []
end
;;
let unsupported ~loc string =
Location.raise_errorf ~loc "sexp_grammar: %s are unsupported" string
;;
let ewith_tag ~loc ~key ~value grammar =
[%expr { key = [%e key]; value = [%e value]; grammar = [%e grammar] }]
;;
let eno_tag ~loc grammar = [%expr No_tag [%e grammar]]
let etag ~loc with_tag = [%expr Tag [%e with_tag]]
let etagged ~loc with_tag = [%expr Tagged [%e with_tag]]
let ~loc =
( [%expr Ppx_sexp_conv_lib.Sexp_grammar.doc_comment_tag]
, [%expr Atom [%e estring ~loc comment]] )
;;
module Tags = struct
type t =
{ defined_using_tags : expression option
; defined_using_tag : (expression * expression) list
}
let get x ~tags ~tag =
{ defined_using_tags = Attribute.get tags x
; defined_using_tag = Attribute.get tag x |> Option.value ~default:[]
}
;;
end
let rec with_tag_assoc_list grammar ~loc ~tags_expr ~wrap_tag ~wrap_tags =
match tags_expr with
| [%expr []] -> grammar
| [%expr ([%e? key], [%e? value]) :: [%e? tags_expr]] ->
wrap_tag
~loc
(ewith_tag
~loc
~key
~value
(with_tag_assoc_list grammar ~loc ~tags_expr ~wrap_tag ~wrap_tags))
| _ -> wrap_tags grammar ~loc ~tags_expr
;;
let with_tags grammar ~wrap_tag ~wrap_tags ~loc ~(tags : Tags.t) ~ =
let = List.map comments ~f:(tag_of_doc_comment ~loc) in
let init =
match tags.defined_using_tags with
| None -> grammar
| Some tags_expr -> with_tag_assoc_list grammar ~loc ~tags_expr ~wrap_tag ~wrap_tags
in
List.fold_right
(List.concat [ tags_from_comments; tags.defined_using_tag ])
~init
~f:(fun (key, value) grammar -> wrap_tag ~loc (ewith_tag ~loc ~key ~value grammar))
;;
let with_tags_as_list grammar ~core_type ~loc ~tags ~ =
let wrap_tags grammar ~loc ~tags_expr =
[%expr
Sexplib0.Sexp_conv.sexp_grammar_with_tag_list
([%e grammar] : [%t core_type] Sexplib0.Sexp_grammar.with_tag_list)
~tags:[%e tags_expr]]
in
with_tags (eno_tag ~loc grammar) ~wrap_tag:etag ~wrap_tags ~loc ~tags ~comments
;;
let with_tags_as_grammar grammar ~loc ~tags ~ =
let wrap_tags grammar ~loc ~tags_expr =
[%expr Sexplib0.Sexp_conv.sexp_grammar_with_tags [%e grammar] ~tags:[%e tags_expr]]
in
with_tags grammar ~wrap_tag:etagged ~wrap_tags ~loc ~tags ~comments
;;
let grammar_name name = name ^ "_sexp_grammar"
let tyvar_grammar_name name = grammar_name ("_'" ^ name)
let estr { loc; txt } = estring ~loc txt
let grammar_type ~loc core_type =
[%type: [%t copy#core_type core_type] Sexplib0.Sexp_grammar.t]
;;
let abstract_grammar ~ctxt ~loc id =
let module_name =
ctxt |> Expansion_context.Deriver.code_path |> Code_path.fully_qualified_path
in
[%expr Any [%e estr { id with txt = String.concat ~sep:"." [ module_name; id.txt ] }]]
;;
let arrow_grammar ~loc = [%expr Sexplib0.Sexp_conv.fun_sexp_grammar.untyped]
let opaque_grammar ~loc = [%expr Sexplib0.Sexp_conv.opaque_sexp_grammar.untyped]
let any_grammar ~loc name = [%expr Any [%e estring ~loc name]]
let list_grammar ~loc expr = [%expr List [%e expr]]
let many_grammar ~loc expr = [%expr Many [%e expr]]
let fields_grammar ~loc expr = [%expr Fields [%e expr]]
let tyvar_grammar ~loc expr = [%expr Tyvar [%e expr]]
let recursive_grammar ~loc name args = [%expr Recursive ([%e name], [%e args])]
let tycon_grammar ~loc tycon_name params defns =
[%expr Tycon ([%e tycon_name], [%e params], [%e defns])]
;;
let defns_type ~loc = [%type: Sexplib0.Sexp_grammar.defn Stdlib.List.t Stdlib.Lazy.t]
let untyped_grammar ~loc expr =
match expr with
| [%expr { untyped = [%e? untyped] }] -> untyped
| _ -> [%expr [%e expr].untyped]
;;
let typed_grammar ~loc expr =
match expr with
| [%expr [%e? typed].untyped] -> typed
| _ -> [%expr { untyped = [%e expr] }]
;;
let annotated_grammar ~loc expr core_type =
pexp_constraint ~loc expr (grammar_type ~loc core_type)
;;
let defn_expr ~loc ~tycon ~tyvars ~grammar =
[%expr { tycon = [%e tycon]; tyvars = [%e tyvars]; grammar = [%e grammar] }]
;;
let union_grammar ~loc exprs =
match exprs with
| [] -> [%expr Union []]
| [ expr ] -> expr
| _ -> [%expr Union [%e elist ~loc exprs]]
;;
let tuple_grammar ~loc exprs =
List.fold_right exprs ~init:[%expr Empty] ~f:(fun expr rest ->
[%expr Cons ([%e expr], [%e rest])])
;;
let atom_clause ~loc = [%expr Atom_clause]
let list_clause ~loc args = [%expr List_clause { args = [%e args] }]
module Variant_clause_type = struct
type t =
{ name : label loc
; comments : string list
; tags : Tags.t
; clause_kind : expression
}
let to_grammar_expr { name; ; tags; clause_kind } ~loc =
[%expr { name = [%e estr name]; clause_kind = [%e clause_kind] }]
|> with_tags_as_list
~loc:name.loc
~comments
~tags
~core_type:[%type: Sexplib0.Sexp_grammar.clause]
;;
end
let variant_grammars ~loc ~case_sensitivity ~clauses =
match List.is_empty clauses with
| true -> []
| false ->
let clause_exprs = List.map clauses ~f:(Variant_clause_type.to_grammar_expr ~loc) in
let grammar =
[%expr
Variant
{ case_sensitivity = [%e case_sensitivity]
; clauses = [%e elist ~loc clause_exprs]
}]
in
[ grammar ]
;;
let td_params_fun td expr =
let loc = td.ptype_loc in
let params =
List.map td.ptype_params ~f:(fun param ->
let { loc; txt } = get_type_param_name param in
pvar ~loc (tyvar_grammar_name txt))
in
eabstract ~loc params expr
;;
module Row_field_type = struct
type t =
| Inherit of core_type
| Tag_no_arg of string loc
| Tag_with_arg of string loc * core_type
let of_row_field ~loc row_field =
match row_field with
| Rinherit core_type -> Inherit core_type
| Rtag (name, possibly_no_arg, possible_type_args) ->
(match possibly_no_arg, possible_type_args with
| true, [] -> Tag_no_arg name
| false, [ core_type ] -> Tag_with_arg (name, core_type)
| false, [] -> unsupported ~loc "empty polymorphic variant types"
| true, _ :: _ | false, _ :: _ :: _ -> unsupported ~loc "intersection types")
;;
end
let attributes ~ =
match tags_of_doc_comments with
| false -> []
| true ->
let doc_pattern = Ast_pattern.(pstr (pstr_eval (estring __) nil ^:: nil)) in
List.filter_map attributes ~f:(fun attribute ->
match attribute.attr_name.txt with
| "ocaml.doc" | "doc" ->
Ast_pattern.parse
doc_pattern
attribute.attr_loc
attribute.attr_payload
~on_error:(fun () -> None)
(fun doc -> Some doc)
| _ -> None)
;;
let grammar_of_type_tags core_type grammar ~ =
let tags = Tags.get core_type ~tags:Attrs.tags_type ~tag:Attrs.tag_type in
let loc = core_type.ptyp_loc in
let = attr_doc_comments ~tags_of_doc_comments core_type.ptyp_attributes in
with_tags_as_grammar grammar ~loc ~tags ~comments
;;
let grammar_of_field_tags field grammar ~ =
let tags = Tags.get field ~tags:Attrs.tags_ld ~tag:Attrs.tag_ld in
let loc = field.pld_loc in
let = attr_doc_comments ~tags_of_doc_comments field.pld_attributes in
with_tags_as_list
grammar
~loc
~tags
~comments
~core_type:[%type: Sexplib0.Sexp_grammar.field]
;;
let rec grammar_of_type core_type ~rec_flag ~ =
let loc = core_type.ptyp_loc in
let grammar =
let from_attribute =
match
( Attribute.get Attrs.grammar_custom core_type
, Attribute.get Attrs.grammar_any core_type )
with
| Some _, Some _ ->
Some
[%expr
[%ocaml.warning
"[@sexp_grammar.custom] and [@sexp_grammar.any] are mutually exclusive"]]
| Some expr, None ->
Some (untyped_grammar ~loc (annotated_grammar ~loc expr core_type))
| None, Some maybe_name ->
Some (any_grammar ~loc (Option.value maybe_name ~default:"ANY"))
| None, None ->
(match Attribute.get Attrs.opaque core_type with
| Some () -> Some (opaque_grammar ~loc)
| None -> None)
in
match from_attribute with
| Some expr -> expr
| None ->
(match Ppxlib_jane.Jane_syntax.Core_type.of_ast core_type with
| Some (Jtyp_tuple ltps, _attrs) ->
grammar_of_labeled_tuple ~loc ~rec_flag ~tags_of_doc_comments ltps
| Some (Jtyp_layout _, _) | None ->
(match core_type.ptyp_desc with
| Ptyp_any -> any_grammar ~loc "_"
| Ptyp_var name ->
(match rec_flag with
| Recursive ->
tyvar_grammar ~loc (estring ~loc name)
| Nonrecursive ->
unapplied_type_constr_conv
~loc
~f:tyvar_grammar_name
(Located.lident ~loc name)
|> untyped_grammar ~loc)
| Ptyp_arrow _ -> arrow_grammar ~loc
| Ptyp_tuple list ->
List.map ~f:(grammar_of_type ~rec_flag ~tags_of_doc_comments) list
|> tuple_grammar ~loc
|> list_grammar ~loc
| Ptyp_constr (id, args) ->
List.map args ~f:(fun core_type ->
let loc = core_type.ptyp_loc in
grammar_of_type ~rec_flag ~tags_of_doc_comments core_type
|> typed_grammar ~loc)
|> type_constr_conv ~loc ~f:grammar_name id
|> untyped_grammar ~loc
| Ptyp_object _ -> unsupported ~loc "object types"
| Ptyp_class _ -> unsupported ~loc "class types"
| Ptyp_alias _ -> unsupported ~loc "type aliases"
| Ptyp_variant (rows, closed_flag, (_ : string list option)) ->
(match closed_flag with
| Open -> unsupported ~loc "open polymorphic variant types"
| Closed ->
grammar_of_polymorphic_variant ~loc ~rec_flag ~tags_of_doc_comments rows)
| Ptyp_poly _ -> unsupported ~loc "explicitly polymorphic types"
| Ptyp_package _ -> unsupported ~loc "first-class module types"
| Ptyp_extension _ -> unsupported ~loc "unexpanded ppx extensions"))
in
grammar_of_type_tags core_type grammar ~tags_of_doc_comments
and grammar_of_labeled_tuple ~loc ~rec_flag ~ alist =
assert (Labeled_tuple.is_valid alist);
let fields =
List.concat_map alist ~f:(fun (lbl, typ) ->
let lbl = Labeled_tuple.atom_of_label lbl in
let field = grammar_of_type ~rec_flag ~tags_of_doc_comments typ in
let clauses : Variant_clause_type.t list =
[ { name = { txt = lbl; loc }
; comments = []
; tags =
{ defined_using_tags = None; defined_using_tag = [] }
; clause_kind = list_clause ~loc [%expr Cons ([%e field], Empty)]
}
]
in
let case_sensitivity = [%expr Case_sensitive] in
variant_grammars ~loc ~case_sensitivity ~clauses)
in
list_grammar ~loc (tuple_grammar ~loc fields)
and grammar_of_polymorphic_variant ~loc ~rec_flag ~ rows =
let inherits, clauses =
List.partition_map rows ~f:(fun row : (_, Variant_clause_type.t) Either.t ->
let tags = Tags.get row ~tags:Attrs.tags_poly ~tag:Attrs.tag_poly in
let = attr_doc_comments ~tags_of_doc_comments row.prf_attributes in
match Attribute.get Attrs.list_poly row with
| Some () ->
(match Row_field_type.of_row_field ~loc row.prf_desc with
| Tag_with_arg (name, [%type: [%t? ty] list]) ->
let clause_kind =
grammar_of_type ~rec_flag ~tags_of_doc_comments ty
|> many_grammar ~loc
|> list_clause ~loc
in
Second { name; comments; tags; clause_kind }
| _ -> Attrs.invalid_attribute ~loc Attrs.list_poly "_ list")
| None ->
(match Row_field_type.of_row_field ~loc row.prf_desc with
| Inherit core_type ->
First
(grammar_of_type ~rec_flag ~tags_of_doc_comments core_type
|> with_tags_as_grammar ~loc ~tags ~comments)
| Tag_no_arg name ->
Second { name; comments; tags; clause_kind = atom_clause ~loc }
| Tag_with_arg (name, core_type) ->
let clause_kind =
[ grammar_of_type ~rec_flag ~tags_of_doc_comments core_type ]
|> tuple_grammar ~loc
|> list_clause ~loc
in
Second { name; comments; tags; clause_kind }))
in
variant_grammars ~loc ~case_sensitivity:[%expr Case_sensitive] ~clauses
|> List.append inherits
|> union_grammar ~loc
;;
let record_expr ~loc ~rec_flag ~ ~ syntax fields =
let fields =
List.map fields ~f:(fun field ->
let loc = field.pld_loc in
let field_kind = Record_field_attrs.Of_sexp.create ~loc field in
let required =
match field_kind with
| Specific Required -> true
| Specific (Default _)
| Sexp_bool | Sexp_option _ | Sexp_array _ | Sexp_list _ | Omit_nil -> false
in
let args =
match field_kind with
| Specific Required | Specific (Default _) | Omit_nil ->
[%expr
Cons
([%e grammar_of_type ~tags_of_doc_comments ~rec_flag field.pld_type], Empty)]
| Sexp_bool -> [%expr Empty]
| Sexp_option ty ->
[%expr Cons ([%e grammar_of_type ~tags_of_doc_comments ~rec_flag ty], Empty)]
| Sexp_list ty | Sexp_array ty ->
[%expr
Cons
(List (Many [%e grammar_of_type ~tags_of_doc_comments ~rec_flag ty]), Empty)]
in
[%expr
{ name = [%e estr field.pld_name]
; required = [%e ebool ~loc required]
; args = [%e args]
}]
|> grammar_of_field_tags field ~tags_of_doc_comments)
in
let =
match Attribute.get extra_attr syntax with
| Some () -> true
| None -> false
in
[%expr
{ allow_extra_fields = [%e ebool ~loc allow_extra_fields]
; fields = [%e elist ~loc fields]
}]
;;
let grammar_of_variant ~loc ~rec_flag ~ clause_decls =
let clauses =
List.map clause_decls ~f:(fun clause : Variant_clause_type.t ->
let loc = clause.pcd_loc in
let tags = Tags.get clause ~tags:Attrs.tags_cd ~tag:Attrs.tag_cd in
let = attr_doc_comments ~tags_of_doc_comments clause.pcd_attributes in
match Attribute.get Attrs.list_variant clause with
| Some () ->
(match clause.pcd_args with
| Pcstr_tuple [ [%type: [%t? ty] list] ] ->
let args =
many_grammar ~loc (grammar_of_type ty ~rec_flag ~tags_of_doc_comments)
in
{ name = clause.pcd_name; comments; tags; clause_kind = list_clause ~loc args }
| _ -> Attrs.invalid_attribute ~loc Attrs.list_variant "_ list")
| None ->
(match clause.pcd_args with
| Pcstr_tuple [] ->
{ name = clause.pcd_name; comments; tags; clause_kind = atom_clause ~loc }
| Pcstr_tuple (_ :: _ as args) ->
let args =
tuple_grammar
~loc
(List.map args ~f:(grammar_of_type ~rec_flag ~tags_of_doc_comments))
in
{ name = clause.pcd_name; comments; tags; clause_kind = list_clause ~loc args }
| Pcstr_record fields ->
let args =
record_expr
~loc
~rec_flag
~tags_of_doc_comments
~extra_attr:Attrs.allow_extra_fields_cd
clause
fields
|> fields_grammar ~loc
in
{ name = clause.pcd_name; comments; tags; clause_kind = list_clause ~loc args }))
in
variant_grammars
~loc
~case_sensitivity:[%expr Case_sensitive_except_first_character]
~clauses
|> union_grammar ~loc
;;
let grammar_of_td ~ctxt ~rec_flag ~ td =
let loc = td.ptype_loc in
match td.ptype_kind with
| Ptype_open -> unsupported ~loc "open types"
| Ptype_record fields ->
record_expr
~loc
~rec_flag
~tags_of_doc_comments
~extra_attr:Attrs.allow_extra_fields_td
td
fields
|> fields_grammar ~loc
|> list_grammar ~loc
| Ptype_variant clauses ->
grammar_of_variant ~loc ~rec_flag ~tags_of_doc_comments clauses
| Ptype_abstract ->
(match td.ptype_manifest with
| None -> abstract_grammar ~ctxt ~loc td.ptype_name
| Some core_type -> grammar_of_type ~rec_flag ~tags_of_doc_comments core_type)
;;
let pattern_of_td td =
let { loc; txt } = td.ptype_name in
ppat_constraint
~loc
(pvar ~loc (grammar_name txt))
(ptyp_poly
~loc
(List.map td.ptype_params ~f:get_type_param_name)
(combinator_type_of_type_declaration td ~f:grammar_type))
;;
let rec is_preallocated_constant expr =
match expr.pexp_desc with
| Pexp_constraint (expr, _) | Pexp_coerce (expr, _, _) | Pexp_open (_, expr) ->
is_preallocated_constant expr
| Pexp_constant _ -> true
| Pexp_tuple args -> List.for_all ~f:is_preallocated_constant args
| Pexp_variant (_, maybe_arg) | Pexp_construct (_, maybe_arg) ->
Option.for_all ~f:is_preallocated_constant maybe_arg
| Pexp_record (fields, maybe_template) ->
List.for_all fields ~f:(fun (_, expr) -> is_preallocated_constant expr)
&& Option.for_all ~f:is_preallocated_constant maybe_template
| _ -> false
;;
let rec is_variable_access expr =
match expr.pexp_desc with
| Pexp_constraint (expr, _) | Pexp_coerce (expr, _, _) | Pexp_open (_, expr) ->
is_variable_access expr
| Pexp_ident _ -> true
| Pexp_field (expr, _) -> is_variable_access expr
| _ -> false
;;
let grammar_needs_lazy_wrapper expr =
not (is_preallocated_constant expr || is_variable_access expr)
;;
let lazy_grammar ~loc td expr =
if List.is_empty td.ptype_params
&& grammar_needs_lazy_wrapper expr
then [%expr Lazy (lazy [%e expr])]
else expr
;;
let force_expr ~loc expr = [%expr Stdlib.Lazy.force [%e expr]]
let nonrecursive_grammars ~ctxt ~loc ~ td_lists =
List.concat_map td_lists ~f:(fun tds ->
List.map tds ~f:(fun td ->
let td = name_type_params_in_td td in
let loc = td.ptype_loc in
let pat = pattern_of_td td in
let expr =
grammar_of_td ~ctxt ~rec_flag:Nonrecursive ~tags_of_doc_comments td
|> lazy_grammar td ~loc
|> typed_grammar ~loc
|> td_params_fun td
in
value_binding ~loc ~pat ~expr)
|> pstr_value_list ~loc Nonrecursive)
;;
let recursive_grammar_tycons tds =
List.map tds ~f:(fun td ->
let td = name_type_params_in_td td in
let loc = td.ptype_loc in
let pat = pattern_of_td td in
let expr =
recursive_grammar
~loc
(estr td.ptype_name)
(List.map td.ptype_params ~f:(fun param ->
let { loc; txt } = get_type_param_name param in
tyvar_grammar_name txt |> evar ~loc |> untyped_grammar ~loc)
|> elist ~loc)
|> typed_grammar ~loc
|> td_params_fun td
in
value_binding ~loc ~pat ~expr)
;;
let recursive_grammar_defns ~ctxt ~loc ~ tds =
List.map tds ~f:(fun td ->
let td = name_type_params_in_td td in
let loc = td.ptype_loc in
let tycon = estr td.ptype_name in
let tyvars =
List.map td.ptype_params ~f:(fun param -> estr (get_type_param_name param))
|> elist ~loc
in
let grammar = grammar_of_td ~ctxt ~rec_flag:Recursive ~tags_of_doc_comments td in
defn_expr ~loc ~tycon ~tyvars ~grammar)
|> elist ~loc
;;
let recursive_grammar_expr ~defns_name td =
let td = name_type_params_in_td td in
let loc = td.ptype_loc in
let pat = pattern_of_td td in
let expr =
let tyvars =
List.map td.ptype_params ~f:(fun param ->
let { loc; txt } = get_type_param_name param in
tyvar_grammar_name txt |> evar ~loc |> untyped_grammar ~loc)
|> elist ~loc
in
tycon_grammar
~loc
(estr td.ptype_name)
tyvars
(evar ~loc defns_name |> force_expr ~loc)
|> lazy_grammar td ~loc
|> typed_grammar ~loc
|> td_params_fun td
in
value_binding ~loc ~pat ~expr
;;
let recursive_grammars ~ctxt ~loc ~ tds =
match List.is_empty tds with
| true -> []
| false ->
let defns_name = gen_symbol ~prefix:"grammars" () in
let defns_item =
let expr =
recursive_grammar_defns ~ctxt ~loc ~tags_of_doc_comments tds
|> pexp_let ~loc Nonrecursive (recursive_grammar_tycons tds)
|> pexp_lazy ~loc
in
let pat = ppat_constraint ~loc (pvar ~loc defns_name) (defns_type ~loc) in
pstr_value ~loc Nonrecursive [ value_binding ~loc ~pat ~expr ]
in
let grammars_item =
List.map tds ~f:(recursive_grammar_expr ~defns_name) |> pstr_value ~loc Nonrecursive
in
[%str
include struct
open struct
[%%i defns_item]
end
[%%i grammars_item]
end]
;;
let partition_recursive_and_nonrecursive ~rec_flag tds =
match (rec_flag : rec_flag) with
| Nonrecursive -> [], [ tds ]
| Recursive ->
let rec loop tds ~acc =
let obj =
object
inherit type_is_recursive Recursive tds
method recursion td = {<type_names = [ td.ptype_name.txt ]>}#go ()
end
in
let recursive, nonrecursive =
List.partition_tf tds ~f:(fun td ->
match obj#recursion td with
| Recursive -> true
| Nonrecursive -> false)
in
if List.is_empty recursive || List.is_empty nonrecursive
then recursive, nonrecursive :: acc
else loop recursive ~acc:(nonrecursive :: acc)
in
loop tds ~acc:[]
;;
let str_type_decl ~ctxt (rec_flag, tds) =
let loc = Expansion_context.Deriver.derived_item_loc ctxt in
let recursive, nonrecursive = partition_recursive_and_nonrecursive ~rec_flag tds in
[ recursive_grammars ~ctxt ~loc ~tags_of_doc_comments recursive
; nonrecursive_grammars ~ctxt ~loc ~tags_of_doc_comments nonrecursive
]
|> List.concat
;;
let sig_type_decl ~ctxt:_ (_rec_flag, tds) =
List.map tds ~f:(fun td ->
let loc = td.ptype_loc in
value_description
~loc
~name:(Loc.map td.ptype_name ~f:grammar_name)
~type_:(combinator_type_of_type_declaration td ~f:grammar_type)
~prim:[]
|> psig_value ~loc)
;;
let extension_loc ~ctxt =
let loc = Expansion_context.Extension.extension_point_loc ctxt in
{ loc with loc_ghost = true }
;;
let core_type ~ ~ctxt core_type =
let loc = extension_loc ~ctxt in
pexp_constraint
~loc
(core_type
|> grammar_of_type ~rec_flag:Nonrecursive ~tags_of_doc_comments
|> typed_grammar ~loc)
(core_type |> grammar_type ~loc)
|> Merlin_helpers.hide_expression
;;
let type_extension ~ctxt core_type =
assert_no_attributes_in#core_type core_type;
let loc = extension_loc ~ctxt in
core_type |> grammar_type ~loc
;;