Source file reason_syntax_util.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
722
723
724
725
726
727
728
# 1 "reason_syntax_util.cppo.ml"
open Ppxlib
let rename_labels = ref false
(** Check to see if the string `s` is made up of `keyword` and zero or more
trailing `_` characters. *)
let potentially_conflicts_with ~keyword s =
let s_length = String.length s in
let keyword_length = String.length keyword in
s_length >= keyword_length && (
try
for i = 0 to keyword_length - 1 do
if keyword.[i] <> s.[i] then raise Exit;
done;
for i = keyword_length to s_length - 1 do
if s.[i] <> '_' then raise Exit;
done;
true
with
| Exit -> false
)
(** Add/remove an appropriate suffix when mangling potential keywords *)
let string_add_suffix x = x ^ "_"
let string_drop_suffix x = String.sub x 0 (String.length x - 1)
(** What do these *_swap functions do? Here's an example: Reason code uses `!`
for logical not, while ocaml uses `not`. So, for converting between reason
and ocaml syntax, ocaml `not` converts to `!`, reason `!` converts to
`not`.
In more complicated cases where a reserved keyword exists in one syntax but
not the other, these functions translate any potentially conflicting
identifier into the same identifier with a suffix attached, or remove the
suffix when converting back. Two examples:
reason to ocaml:
pub: invalid in reason to begin with
pub_: pub
pub__: pub_
ocaml to reason:
pub: pub_
pub_: pub__
pub__: pub___
=====
reason to ocaml:
match: match_
match_: match__
match__: match___
ocaml to reason:
match: invalid in ocaml to begin with
match_: match
match__: match_
*)
let reason_to_ml_swap = function
| "!" -> "not"
| "^" -> "!"
| "++" -> "^"
| "===" -> "=="
| "==" -> "="
| "\\!==" -> "!=="
| "\\===" -> "==="
| "!=" -> "<>"
| "!==" -> "!="
| x when (
potentially_conflicts_with ~keyword:"match" x
|| potentially_conflicts_with ~keyword:"method" x
|| potentially_conflicts_with ~keyword:"private" x
|| potentially_conflicts_with ~keyword:"not" x) -> string_add_suffix x
| x when (
potentially_conflicts_with ~keyword:"switch_" x
|| potentially_conflicts_with ~keyword:"pub_" x
|| potentially_conflicts_with ~keyword:"pri_" x) -> string_drop_suffix x
| everything_else -> everything_else
let ml_to_reason_swap = function
| "not" -> "!"
| "!" -> "^"
| "^" -> "++"
| "==" -> "==="
| "=" -> "=="
| "!==" -> "\\!=="
| "===" -> "\\==="
| "<>" -> "!="
| "!=" -> "!=="
| x when (
potentially_conflicts_with ~keyword:"match_" x
|| potentially_conflicts_with ~keyword:"method_" x
|| potentially_conflicts_with ~keyword:"private_" x
|| potentially_conflicts_with ~keyword:"not_" x) -> string_drop_suffix x
| x when (
potentially_conflicts_with ~keyword:"switch" x
|| potentially_conflicts_with ~keyword:"pub" x
|| potentially_conflicts_with ~keyword:"pri" x) -> string_add_suffix x
| everything_else -> everything_else
let escape_string str =
let buf = Buffer.create (String.length str) in
String.iter (fun c ->
match c with
| '\t' -> Buffer.add_string buf "\\t"
| '\r' -> Buffer.add_string buf "\\r"
| '\n' -> Buffer.add_string buf "\\n"
| '\\' -> Buffer.add_string buf "\\\\"
| '"' -> Buffer.add_string buf "\\\""
| c when c < ' ' -> Buffer.add_string buf (Char.escaped c)
| c -> Buffer.add_char buf c
) str;
Buffer.contents buf
module TrailingCommaMarker = struct
let char = Char.chr 249
let string = String.make 1 char
end
module EOLMarker = struct
let char = Char.chr 248
let string = String.make 1 char
end
(** [is_prefixed prefix i str] checks if prefix is the prefix of str
* starting from position i
*)
let is_prefixed prefix str i =
let len = String.length prefix in
let j = ref 0 in
while !j < len && String.unsafe_get prefix !j =
String.unsafe_get str (i + !j) do
incr j
done;
(!j = len)
(**
* pick_while returns a tuple where first element is longest prefix (possibly empty) of the list of elements that satisfy p
* and second element is the remainder of the list
*)
let rec pick_while p = function
| [] -> [], []
| hd::tl when p hd ->
let (satisfied, not_satisfied) = pick_while p tl in
hd :: satisfied, not_satisfied
| l -> ([], l)
(** [find_substring sub str i]
returns the smallest [j >= i] such that [sub = str.[j..length sub - 1]]
raises [Not_found] if there is no such j
behavior is not defined if [sub] is the empty string
*)
let find_substring sub str i =
let len = String.length str - String.length sub in
let found = ref false and i = ref i in
while not !found && !i <= len do
if is_prefixed sub str !i then
found := true
else
incr i;
done;
if not !found then
raise Not_found;
!i
(** [replace_string old_str new_str str] replaces old_str to new_str in str *)
let replace_string old_str new_str str =
match find_substring old_str str 0 with
| exception Not_found -> str
| occurrence ->
let buffer = Buffer.create (String.length str + 15) in
let rec loop i j =
Buffer.add_substring buffer str i (j - i);
Buffer.add_string buffer new_str;
let i = j + String.length old_str in
match find_substring old_str str i with
| j -> loop i j
| exception Not_found ->
Buffer.add_substring buffer str i (String.length str - i)
in
loop 0 occurrence;
Buffer.contents buffer
let split_by ?(keep_empty=false) is_delim str =
let len = String.length str in
let rec loop acc last_pos pos =
if pos = -1 then
if last_pos = 0 && not keep_empty then
acc
else
String.sub str 0 last_pos :: acc
else
if is_delim str.[pos] then
let new_len = (last_pos - pos - 1) in
if new_len <> 0 || keep_empty then
let v = String.sub str (pos + 1) new_len in
loop ( v :: acc)
pos (pos - 1)
else loop acc pos (pos - 1)
else loop acc last_pos (pos - 1)
in
loop [] len (len - 1)
let rec trim_right_idx str idx =
if idx = -1 then 0
else
match String.get str idx with
| '\t' | ' ' | '\n' | '\r' -> trim_right_idx str (idx - 1)
| _ -> idx + 1
let trim_right str =
let length = String.length str in
if length = 0 then ""
else
let index = trim_right_idx str (length - 1) in
if index = 0 then ""
else if index = length then
str
else String.sub str 0 index
let processLine line =
let rightTrimmed = trim_right line in
let trimmedLen = String.length rightTrimmed in
if trimmedLen = 0 then
rightTrimmed
else
let segments =
split_by
~keep_empty:false
(fun c -> c = TrailingCommaMarker.char)
rightTrimmed in
let hadTrailingCommaMarkerBeforeNewline =
String.get rightTrimmed (trimmedLen - 1) = TrailingCommaMarker.char
in
let almostEverything = String.concat "" segments in
let lineBuilder = if hadTrailingCommaMarkerBeforeNewline then
almostEverything ^ ","
else
almostEverything
in
split_by ~keep_empty:false (fun c -> c = EOLMarker.char) lineBuilder
|> List.map trim_right
|> String.concat "\n"
let processLineEndingsAndStarts str =
split_by ~keep_empty:true (fun x -> x = '\n') str
|> List.map processLine
|> String.concat "\n"
|> String.trim
let str =
match String.index str '\n' with
| exception Not_found -> false
| n -> n = String.length str - 1
let map_lident f lid =
let swapped = match lid.txt with
| Lident s -> Lident (f s)
| Ldot(longPrefix, s) -> Ldot(longPrefix, f s)
| Lapply (y,s) -> Lapply (y, s)
in
{ lid with txt = swapped }
let map_arg_label f = function
| Nolabel -> Nolabel
| Labelled lbl ->
Labelled (f lbl)
| Optional lbl ->
Optional (f lbl)
let map_class_expr f class_expr =
{ class_expr
with pcl_desc = match class_expr.pcl_desc with
| Pcl_constr (lid, ts) ->
Pcl_constr (map_lident f lid, ts)
| e -> e
}
let map_class_type f class_type =
{ class_type
with pcty_desc = match class_type.pcty_desc with
| Pcty_constr (lid, ct) ->
Pcty_constr (map_lident f lid, ct)
| Pcty_arrow (arg_lbl, ct, cls_type) ->
Pcty_arrow (map_arg_label f arg_lbl, ct, cls_type)
| x -> x
}
let map_core_type f typ =
{ typ with ptyp_desc =
match typ.ptyp_desc with
| Ptyp_var var -> Ptyp_var (f var)
| Ptyp_arrow (lbl, t1, t2) ->
let lbl' = match lbl with
| Labelled s when !rename_labels -> Labelled (f s)
| Optional s when !rename_labels -> Optional (f s)
| lbl -> lbl
in
Ptyp_arrow (lbl', t1, t2)
| Ptyp_constr (lid, typs) ->
Ptyp_constr (map_lident f lid, typs)
| Ptyp_object (fields, closed_flag) when !rename_labels ->
Ptyp_object
(List.map (function
| { pof_desc = Otag (s, typ); _ } as pof -> { pof with pof_desc = Otag ({ s with txt = f s.txt }, typ) }
| other -> other)
fields
, closed_flag)
| Ptyp_class (lid, typs) ->
Ptyp_class (map_lident f lid, typs)
| Ptyp_alias (typ, s) ->
Ptyp_alias (typ, f s)
| Ptyp_variant (rfs, closed, lbls) ->
Ptyp_variant (List.map (function
| { prf_desc = Rtag (lbl, b, cts); _ } as prf ->
{ prf with prf_desc = Rtag ({ lbl with txt = f lbl.txt }, b, cts) }
| t -> t) rfs, closed, lbls)
| Ptyp_poly (vars, typ) ->
Ptyp_poly (List.map (fun li -> { li with txt = f li.txt }) vars, typ)
| Ptyp_package (lid, typs) ->
Ptyp_package (map_lident f lid, List.map (fun (lid, typ) -> (map_lident f lid, typ)) typs)
| other -> other
}
(** identifier_mapper maps all identifiers in an AST with a mapping function f
this is used by swap_operator_mapper right below, to traverse the whole AST
and swapping the symbols listed above.
*)
class identifier_mapper f =
let map_fields fields = List.map(fun (lid,x) -> (map_lident f lid, x)) fields in
let map_name ({txt;_} as name) = {name with txt=(f txt)} in
let map_lid lid = map_lident f lid in
let map_label label = map_arg_label f label in
object
inherit Ast_traverse.map as super
method! expression (expr: Parsetree.expression) =
let expr =
match expr with
| { pexp_desc = Pexp_ident lid;_ } ->
{ expr with pexp_desc = Pexp_ident (map_lid lid) }
| { pexp_desc = Pexp_fun (label, eo, pat, e);_ } when !rename_labels ->
{ expr with pexp_desc = Pexp_fun (map_label label, eo, pat, e) }
| { pexp_desc = Pexp_apply (e, args);_ } when !rename_labels ->
{ expr with
pexp_desc = Pexp_apply (e, List.map (fun (label, e) ->
(map_label label), e) args) }
| { pexp_desc = Pexp_variant (s, e);_ } ->
{ expr with
pexp_desc = Pexp_variant (f s, e) }
| { pexp_desc = Pexp_record (fields, closed);_ } when !rename_labels ->
{ expr with pexp_desc = Pexp_record (map_fields fields, closed) }
| { pexp_desc = Pexp_field (e, lid);_ } when !rename_labels ->
{ expr with
pexp_desc = Pexp_field (e, map_lid lid) }
| { pexp_desc = Pexp_setfield (e1, lid, e2);_ } when !rename_labels ->
{ expr with
pexp_desc = Pexp_setfield (e1, map_lid lid, e2) }
| { pexp_desc = Pexp_send (e, s);_ } ->
{ expr with
pexp_desc = Pexp_send (e, { s with txt = f s.txt }) }
| { pexp_desc = Pexp_new lid;_ } ->
{ expr with
pexp_desc = Pexp_new (map_lid lid) }
| { pexp_desc = Pexp_setinstvar (name, e);_ } ->
{ expr with
pexp_desc = Pexp_setinstvar (map_name name, e) }
| { pexp_desc = Pexp_override name_exp_list;_ } ->
let name_exp_list = List.map (fun (name,e) -> (map_name name, e)) name_exp_list in
{ expr with
pexp_desc = Pexp_override name_exp_list }
| { pexp_desc = Pexp_newtype (s, e);_ } ->
{ expr with
pexp_desc = Pexp_newtype ({ s with txt = f s.txt }, e) }
| _ -> expr
in
super#expression expr
method! pattern pat =
let pat =
match pat with
| { ppat_desc = Ppat_var name;_ } ->
{ pat with ppat_desc = Ppat_var (map_name name) }
| { ppat_desc = Ppat_alias (p, name);_ } ->
{ pat with ppat_desc = Ppat_alias (p, map_name name) }
| { ppat_desc = Ppat_variant (s, po);_ } ->
{ pat with
ppat_desc = Ppat_variant (f s, po) }
| { ppat_desc = Ppat_record (fields, closed);_ } when !rename_labels ->
{ pat with
ppat_desc = Ppat_record (map_fields fields, closed) }
| { ppat_desc = Ppat_type lid;_ } ->
{ pat with ppat_desc = Ppat_type (map_lid lid) }
| _ -> pat
in
super#pattern pat
method! value_description desc =
let desc' =
{ desc with
pval_name = map_name desc.pval_name }
in
super#value_description desc'
method! type_declaration type_decl =
let type_decl' =
{ type_decl with ptype_name = map_name type_decl.ptype_name }
in
let type_decl'' = match type_decl'.ptype_kind with
| Ptype_record lst when !rename_labels ->
{ type_decl'
with ptype_kind = Ptype_record (List.map (fun lbl ->
{ lbl with pld_name = map_name lbl.pld_name })
lst) }
| _ -> type_decl'
in
super#type_declaration type_decl''
method! core_type typ = super#core_type (map_core_type f typ)
method! class_declaration class_decl =
let class_decl' =
{ class_decl
with pci_name = map_name class_decl.pci_name
; pci_expr = map_class_expr f class_decl.pci_expr
}
in
super#class_declaration class_decl'
method! class_field class_field =
let class_field_desc' = match class_field.pcf_desc with
| Pcf_inherit (ovf, e, lo) ->
Pcf_inherit (ovf, map_class_expr f e, lo)
| Pcf_val (lbl, mut, kind) ->
Pcf_val ({lbl with txt = f lbl.txt}, mut, kind)
| Pcf_method (lbl, priv, kind) ->
Pcf_method ({lbl with txt = f lbl.txt}, priv, kind)
| x -> x
in
super#class_field { class_field with pcf_desc = class_field_desc' }
method! class_type_field class_type_field =
let class_type_field_desc' = match class_type_field.pctf_desc with
| Pctf_inherit class_type ->
Pctf_inherit (map_class_type f class_type)
| Pctf_val (lbl, mut, vf, ct) ->
Pctf_val ({ lbl with txt = f lbl.txt }, mut, vf, ct)
| Pctf_method (lbl, pf, vf, ct) ->
Pctf_method ({ lbl with txt = f lbl.txt }, pf, vf, ct)
| x -> x
in
super#class_type_field
{ class_type_field
with pctf_desc = class_type_field_desc' }
method! class_type_declaration class_type_decl =
let class_type_decl' =
{ class_type_decl
with pci_name = map_name class_type_decl.pci_name }
in
super#class_type_declaration class_type_decl'
method! module_type_declaration module_type_decl =
let module_type_decl' =
{ module_type_decl
with pmtd_name = map_name module_type_decl.pmtd_name }
in
super#module_type_declaration module_type_decl'
end
let remove_stylistic_attrs_mapper_maker =
object
inherit Ast_traverse.map as super
method! expression expr =
let {Reason_attributes.stylisticAttrs; arityAttrs; docAttrs; stdAttrs; jsxAttrs;_} =
Reason_attributes.partitionAttributes ~allowUncurry:false expr.pexp_attributes
in
let expr = if stylisticAttrs != [] then
{ expr with pexp_attributes = arityAttrs @ docAttrs @ stdAttrs @ jsxAttrs }
else expr
in
super#expression expr
method! pattern pat =
let {Reason_attributes.stylisticAttrs; arityAttrs; docAttrs; stdAttrs; jsxAttrs;_} =
Reason_attributes.partitionAttributes ~allowUncurry:false pat.ppat_attributes
in
let pat = if stylisticAttrs != [] then
{ pat with ppat_attributes = arityAttrs @ docAttrs @ stdAttrs @ jsxAttrs }
else pat
in
super#pattern pat
end
let escape_stars_slashes str =
if String.contains str '/' then
replace_string "/*" "/\\*" @@
replace_string "*/" "*\\/" @@
replace_string "//" "/\\/" @@
str
else
str
let remove_stylistic_attrs_mapper =
remove_stylistic_attrs_mapper_maker
let let_monad_symbols = [ '$'; '&'; '*'; '+'; '-'; '/'; '<'; '='; '>'; '@';
'^'; '|'; '.'; '!']
let is_letop s =
# 594 "reason_syntax_util.cppo.ml"
String.length s > 3
# 598 "reason_syntax_util.cppo.ml"
&& s.[0] = 'l'
&& s.[1] = 'e'
&& s.[2] = 't'
# 602 "reason_syntax_util.cppo.ml"
&& List.mem s.[3] let_monad_symbols
# 609 "reason_syntax_util.cppo.ml"
let is_andop s =
# 611 "reason_syntax_util.cppo.ml"
String.length s > 3
# 615 "reason_syntax_util.cppo.ml"
&& s.[0] = 'a'
&& s.[1] = 'n'
&& s.[2] = 'd'
# 619 "reason_syntax_util.cppo.ml"
&& List.mem s.[3] let_monad_symbols
# 627 "reason_syntax_util.cppo.ml"
let backport_letopt_mapper = new Ast_traverse.map
let expand_letop_identifier s = s
let compress_letop_identifier s = s
# 770 "reason_syntax_util.cppo.ml"
(** escape_stars_slashes_mapper escapes all stars and slashes in an AST *)
class escape_stars_slashes_mapper = object
inherit identifier_mapper escape_stars_slashes
end
class reason_to_ml_swap_operator_mapper = object
inherit identifier_mapper reason_to_ml_swap
end
class ml_to_reason_swap_operator_mapper = object
inherit identifier_mapper ml_to_reason_swap
end
let attribute_equals to_compare = function
| { attr_name = {txt;_}; _ } -> txt = to_compare
let attribute_exists txt attributes = List.exists (attribute_equals txt) attributes
let attributes_conflicted attribute1 attribute2 attributes =
attribute_exists attribute1 attributes &&
attribute_exists attribute2 attributes
let normalized_attributes attribute attributes =
List.filter (fun x -> not (attribute_equals attribute x)) attributes
let apply_mapper_to_structure mapper s= mapper#structure s
let apply_mapper_to_signature mapper s= mapper#signature s
let apply_mapper_to_type mapper s= mapper#core_type s
let apply_mapper_to_expr mapper s= mapper#expression s
let apply_mapper_to_pattern mapper s= mapper#pattern s
let apply_mapper_to_toplevel_phrase mapper toplevel_phrase =
match toplevel_phrase with
| Ptop_def x -> Ptop_def (apply_mapper_to_structure mapper x)
| x -> x
let apply_mapper_to_use_file mapper use_file =
List.map (fun x -> apply_mapper_to_toplevel_phrase mapper x) use_file
let map_first f = function
| [] -> invalid_arg "Syntax_util.map_first: empty list"
| x :: xs -> f x :: xs
let map_last f l =
match List.rev l with
| [] -> invalid_arg "Syntax_util.map_last: empty list"
| x :: xs -> List.rev (f x :: xs)
let location_is_before loc1 loc2 =
let open Location in
loc1.loc_end.Lexing.pos_cnum <= loc2.loc_start.Lexing.pos_cnum
let location_contains loc1 loc2 =
let open Location in
loc1.loc_start.Lexing.pos_cnum <= loc2.loc_start.Lexing.pos_cnum &&
loc1.loc_end.Lexing.pos_cnum >= loc2.loc_end.Lexing.pos_cnum
# 842 "reason_syntax_util.cppo.ml"
let split_compiler_error (err : Location.Error.t) =
(Location.Error.get_location err, Format.asprintf "%s" (Location.Error.message err))
# 849 "reason_syntax_util.cppo.ml"
let explode_str str =
let rec loop acc i =
if i < 0 then acc else loop (str.[i] :: acc) (i - 1)
in
loop [] (String.length str - 1)
module Clflags = struct
include Ocaml_common.Clflags
# 859 "reason_syntax_util.cppo.ml"
let fast = unsafe
# 861 "reason_syntax_util.cppo.ml"
end
let parse_lid s =
# 865 "reason_syntax_util.cppo.ml"
let unflatten l =
match l with
| [] -> None
| hd :: tl -> Some (List.fold_left (fun p s -> Ldot(p, s)) (Lident hd) tl)
in
match unflatten (String.split_on_char '.' s) with
| Some lid -> lid
| None -> failwith (Format.asprintf "parse_lid: unable to parse '%s' to longident" s)