@@ -187,7 +187,7 @@ let value_description sub v =
187
187
(sub.typ sub v.val_desc)
188
188
189
189
let module_binding sub mb =
190
- let loc = sub.location sub mb.mb_loc; in
190
+ let loc = sub.location sub mb.mb_loc in
191
191
let attrs = sub.attributes sub mb.mb_attributes in
192
192
Mb. mk ~loc ~attrs
193
193
(map_loc sub mb.mb_name)
@@ -196,7 +196,7 @@ let module_binding sub mb =
196
196
let type_parameter sub (ct , v ) = (sub.typ sub ct, v)
197
197
198
198
let type_declaration sub decl =
199
- let loc = sub.location sub decl.typ_loc; in
199
+ let loc = sub.location sub decl.typ_loc in
200
200
let attrs = sub.attributes sub decl.typ_attributes in
201
201
Type. mk ~loc ~attrs
202
202
~params: (List. map (type_parameter sub) decl.typ_params)
@@ -223,15 +223,15 @@ let constructor_arguments sub = function
223
223
| Cstr_record l -> Pcstr_record (List. map (sub.label_declaration sub) l)
224
224
225
225
let constructor_declaration sub cd =
226
- let loc = sub.location sub cd.cd_loc; in
226
+ let loc = sub.location sub cd.cd_loc in
227
227
let attrs = sub.attributes sub cd.cd_attributes in
228
228
Type. constructor ~loc ~attrs
229
229
~args: (constructor_arguments sub cd.cd_args)
230
230
?res:(map_opt (sub.typ sub) cd.cd_res)
231
231
(map_loc sub cd.cd_name)
232
232
233
233
let label_declaration sub ld =
234
- let loc = sub.location sub ld.ld_loc; in
234
+ let loc = sub.location sub ld.ld_loc in
235
235
let attrs = sub.attributes sub ld.ld_attributes in
236
236
Type. field ~loc ~attrs
237
237
~mut: ld.ld_mutable
@@ -247,7 +247,7 @@ let type_extension sub tyext =
247
247
(List. map (sub.extension_constructor sub) tyext.tyext_constructors)
248
248
249
249
let extension_constructor sub ext =
250
- let loc = sub.location sub ext.ext_loc; in
250
+ let loc = sub.location sub ext.ext_loc in
251
251
let attrs = sub.attributes sub ext.ext_attributes in
252
252
Te. constructor ~loc ~attrs
253
253
(map_loc sub ext.ext_name)
@@ -259,7 +259,7 @@ let extension_constructor sub ext =
259
259
)
260
260
261
261
let pattern sub pat =
262
- let loc = sub.location sub pat.pat_loc; in
262
+ let loc = sub.location sub pat.pat_loc in
263
263
(* todo: fix attributes on extras *)
264
264
let attrs = sub.attributes sub pat.pat_attributes in
265
265
let desc =
@@ -319,7 +319,7 @@ let pattern sub pat =
319
319
Pat. mk ~loc ~attrs desc
320
320
321
321
let exp_extra sub (extra , loc , attrs ) sexp =
322
- let loc = sub.location sub loc; in
322
+ let loc = sub.location sub loc in
323
323
let attrs = sub.attributes sub attrs in
324
324
let desc =
325
325
match extra with
@@ -346,14 +346,14 @@ let case sub {c_lhs; c_guard; c_rhs} =
346
346
}
347
347
348
348
let value_binding sub vb =
349
- let loc = sub.location sub vb.vb_loc; in
349
+ let loc = sub.location sub vb.vb_loc in
350
350
let attrs = sub.attributes sub vb.vb_attributes in
351
351
Vb. mk ~loc ~attrs
352
352
(sub.pat sub vb.vb_pat)
353
353
(sub.expr sub vb.vb_expr)
354
354
355
355
let expression sub exp =
356
- let loc = sub.location sub exp.exp_loc; in
356
+ let loc = sub.location sub exp.exp_loc in
357
357
let attrs = sub.attributes sub exp.exp_attributes in
358
358
let desc =
359
359
match exp.exp_desc with
@@ -481,7 +481,7 @@ let package_type sub pack =
481
481
(s, sub.typ sub ct)) pack.pack_fields)
482
482
483
483
let module_type_declaration sub mtd =
484
- let loc = sub.location sub mtd.mtd_loc; in
484
+ let loc = sub.location sub mtd.mtd_loc in
485
485
let attrs = sub.attributes sub mtd.mtd_attributes in
486
486
Mtd. mk ~loc ~attrs
487
487
?typ:(map_opt (sub.module_type sub) mtd.mtd_type)
@@ -491,7 +491,7 @@ let signature sub sg =
491
491
List. map (sub.signature_item sub) sg.sig_items
492
492
493
493
let signature_item sub item =
494
- let loc = sub.location sub item.sig_loc; in
494
+ let loc = sub.location sub item.sig_loc in
495
495
let desc =
496
496
match item.sig_desc with
497
497
Tsig_value v ->
@@ -522,14 +522,14 @@ let signature_item sub item =
522
522
Sig. mk ~loc desc
523
523
524
524
let module_declaration sub md =
525
- let loc = sub.location sub md.md_loc; in
525
+ let loc = sub.location sub md.md_loc in
526
526
let attrs = sub.attributes sub md.md_attributes in
527
527
Md. mk ~loc ~attrs
528
528
(map_loc sub md.md_name)
529
529
(sub.module_type sub md.md_type)
530
530
531
531
let include_infos f sub incl =
532
- let loc = sub.location sub incl.incl_loc; in
532
+ let loc = sub.location sub incl.incl_loc in
533
533
let attrs = sub.attributes sub incl.incl_attributes in
534
534
Incl. mk ~loc ~attrs
535
535
(f sub incl.incl_mod)
@@ -538,7 +538,7 @@ let include_declaration sub = include_infos sub.module_expr sub
538
538
let include_description sub = include_infos sub.module_type sub
539
539
540
540
let class_infos f sub ci =
541
- let loc = sub.location sub ci.ci_loc; in
541
+ let loc = sub.location sub ci.ci_loc in
542
542
let attrs = sub.attributes sub ci.ci_attributes in
543
543
Ci. mk ~loc ~attrs
544
544
~virt: ci.ci_virt
@@ -551,7 +551,7 @@ let class_description sub = class_infos sub.class_type sub
551
551
let class_type_declaration sub = class_infos sub.class_type sub
552
552
553
553
let module_type sub mty =
554
- let loc = sub.location sub mty.mty_loc; in
554
+ let loc = sub.location sub mty.mty_loc in
555
555
let attrs = sub.attributes sub mty.mty_attributes in
556
556
let desc = match mty.mty_desc with
557
557
Tmty_ident (_path , lid ) -> Pmty_ident (map_loc sub lid)
@@ -581,7 +581,7 @@ let with_constraint sub (_path, lid, cstr) =
581
581
map_loc sub lid2)
582
582
583
583
let module_expr sub mexpr =
584
- let loc = sub.location sub mexpr.mod_loc; in
584
+ let loc = sub.location sub mexpr.mod_loc in
585
585
let attrs = sub.attributes sub mexpr.mod_attributes in
586
586
match mexpr.mod_desc with
587
587
Tmod_constraint (m , _ , Tmodtype_implicit, _ ) ->
@@ -607,7 +607,7 @@ let module_expr sub mexpr =
607
607
Mod. mk ~loc ~attrs desc
608
608
609
609
let class_expr sub cexpr =
610
- let loc = sub.location sub cexpr.cl_loc; in
610
+ let loc = sub.location sub cexpr.cl_loc in
611
611
let attrs = sub.attributes sub cexpr.cl_attributes in
612
612
let desc = match cexpr.cl_desc with
613
613
| Tcl_constraint ( { cl_desc = Tcl_ident (_path, lid, tyl); _ },
@@ -644,7 +644,7 @@ let class_expr sub cexpr =
644
644
Cl. mk ~loc ~attrs desc
645
645
646
646
let class_type sub ct =
647
- let loc = sub.location sub ct.cltyp_loc; in
647
+ let loc = sub.location sub ct.cltyp_loc in
648
648
let attrs = sub.attributes sub ct.cltyp_attributes in
649
649
let desc = match ct.cltyp_desc with
650
650
Tcty_signature csg -> Pcty_signature (sub.class_signature sub csg)
@@ -664,7 +664,7 @@ let class_signature sub cs =
664
664
}
665
665
666
666
let class_type_field sub ctf =
667
- let loc = sub.location sub ctf.ctf_loc; in
667
+ let loc = sub.location sub ctf.ctf_loc in
668
668
let attrs = sub.attributes sub ctf.ctf_attributes in
669
669
let desc = match ctf.ctf_desc with
670
670
Tctf_inherit ct -> Pctf_inherit (sub.class_type sub ct)
@@ -679,7 +679,7 @@ let class_type_field sub ctf =
679
679
Ctf. mk ~loc ~attrs desc
680
680
681
681
let core_type sub ct =
682
- let loc = sub.location sub ct.ctyp_loc; in
682
+ let loc = sub.location sub ct.ctyp_loc in
683
683
let attrs = sub.attributes sub ct.ctyp_attributes in
684
684
let desc = match ct.ctyp_desc with
685
685
Ttyp_any -> Ptyp_any
@@ -735,7 +735,7 @@ and is_self_pat = function
735
735
| _ -> false
736
736
737
737
let class_field sub cf =
738
- let loc = sub.location sub cf.cf_loc; in
738
+ let loc = sub.location sub cf.cf_loc in
739
739
let attrs = sub.attributes sub cf.cf_attributes in
740
740
let desc = match cf.cf_desc with
741
741
Tcf_inherit (ovf , cl , super , _vals , _meths ) ->
0 commit comments