Skip to content

Commit a6a8c75

Browse files
committed
Add indirection for field/block meta data information
1 parent c72f219 commit a6a8c75

9 files changed

+97
-32
lines changed

.depend

+11-10
Original file line numberDiff line numberDiff line change
@@ -143,11 +143,11 @@ parsing/pprintast.cmx : parsing/parsetree.cmi utils/misc.cmx \
143143
parsing/ast_helper.cmx parsing/pprintast.cmi
144144
parsing/pprintast.cmi : parsing/parsetree.cmi
145145
parsing/printast.cmo : parsing/parsetree.cmi utils/misc.cmi \
146-
parsing/longident.cmi parsing/location.cmi parsing/asttypes.cmi \
147-
parsing/printast.cmi
146+
parsing/longident.cmi parsing/location.cmi utils/clflags.cmi \
147+
parsing/asttypes.cmi parsing/printast.cmi
148148
parsing/printast.cmx : parsing/parsetree.cmi utils/misc.cmx \
149-
parsing/longident.cmx parsing/location.cmx parsing/asttypes.cmi \
150-
parsing/printast.cmi
149+
parsing/longident.cmx parsing/location.cmx utils/clflags.cmx \
150+
parsing/asttypes.cmi parsing/printast.cmi
151151
parsing/printast.cmi : parsing/parsetree.cmi
152152
parsing/syntaxerr.cmo : parsing/location.cmi parsing/syntaxerr.cmi
153153
parsing/syntaxerr.cmx : parsing/location.cmx parsing/syntaxerr.cmi
@@ -317,12 +317,12 @@ typing/printtyp.cmi : typing/types.cmi typing/path.cmi \
317317
typing/env.cmi parsing/asttypes.cmi
318318
typing/printtyped.cmo : typing/types.cmi typing/typedtree.cmi \
319319
parsing/printast.cmi typing/path.cmi utils/misc.cmi parsing/longident.cmi \
320-
parsing/location.cmi typing/ident.cmi parsing/asttypes.cmi \
321-
typing/printtyped.cmi
320+
parsing/location.cmi typing/ident.cmi utils/clflags.cmi \
321+
parsing/asttypes.cmi typing/printtyped.cmi
322322
typing/printtyped.cmx : typing/types.cmx typing/typedtree.cmx \
323323
parsing/printast.cmx typing/path.cmx utils/misc.cmx parsing/longident.cmx \
324-
parsing/location.cmx typing/ident.cmx parsing/asttypes.cmi \
325-
typing/printtyped.cmi
324+
parsing/location.cmx typing/ident.cmx utils/clflags.cmx \
325+
parsing/asttypes.cmi typing/printtyped.cmi
326326
typing/printtyped.cmi : typing/typedtree.cmi
327327
typing/stypes.cmo : typing/typedtree.cmi typing/printtyp.cmi utils/misc.cmi \
328328
parsing/location.cmi utils/clflags.cmi typing/annot.cmi typing/stypes.cmi
@@ -574,8 +574,9 @@ bytecomp/lambda.cmo : typing/types.cmi typing/primitive.cmi typing/path.cmi \
574574
bytecomp/lambda.cmx : typing/types.cmx typing/primitive.cmx typing/path.cmx \
575575
utils/misc.cmx parsing/location.cmx typing/ident.cmx typing/env.cmx \
576576
parsing/asttypes.cmi bytecomp/lambda.cmi
577-
bytecomp/lambda.cmi : typing/types.cmi typing/primitive.cmi typing/path.cmi \
578-
parsing/location.cmi typing/ident.cmi typing/env.cmi parsing/asttypes.cmi
577+
bytecomp/lambda.cmi : typing/types.cmi typing/typedtree.cmi \
578+
typing/primitive.cmi typing/path.cmi parsing/location.cmi \
579+
typing/ident.cmi typing/env.cmi parsing/asttypes.cmi
579580
bytecomp/matching.cmo : typing/types.cmi typing/typeopt.cmi \
580581
typing/typedtree.cmi bytecomp/switch.cmi bytecomp/printlambda.cmi \
581582
typing/primitive.cmi typing/predef.cmi typing/path.cmi \

bytecomp/lambda.ml

+23-2
Original file line numberDiff line numberDiff line change
@@ -52,19 +52,38 @@ type tag_info =
5252
| Blk_lazy_general
5353
| Blk_lazy_forward
5454
| Blk_class (* Ocaml style class*)
55+
5556
let default_tag_info : tag_info = Blk_na ""
57+
let blk_record = ref (fun fields ->
58+
let all_labels_info = fields |> Array.map (fun (x,_) -> x.Types.lbl_name) in
59+
Blk_record all_labels_info
60+
)
61+
62+
let blk_record_ext = ref (fun fields ->
63+
let all_labels_info = fields |> Array.map (fun (x,_) -> x.Types.lbl_name) in
64+
Blk_record_ext all_labels_info
65+
)
66+
67+
let blk_record_inlined = ref (fun fields name num_nonconsts ->
68+
let all_labels_info = fields |> Array.map (fun (x,_) -> x.Types.lbl_name) in
69+
Blk_record_inlined (all_labels_info, name, num_nonconsts)
70+
)
5671

5772
let ref_tag_info : tag_info = Blk_record [| "contents" |]
5873

5974
type field_dbg_info =
6075
| Fld_na
61-
| Fld_record of string
76+
| Fld_record of {name : string; mutable_flag : Asttypes.mutable_flag}
6277
| Fld_module of string
6378
| Fld_record_inline of string
6479
| Fld_record_extension of string
6580
| Fld_tuple
6681

67-
let ref_field_info : field_dbg_info = Fld_record "contents"
82+
let fld_record = ref (fun (lbl : Types.label_description) ->
83+
Fld_record {name = lbl.lbl_name; mutable_flag = Mutable})
84+
85+
let ref_field_info : field_dbg_info =
86+
Fld_record { name = "contents"; mutable_flag = Mutable}
6887

6988
type set_field_dbg_info =
7089
| Fld_set_na
@@ -73,6 +92,8 @@ type set_field_dbg_info =
7392
| Fld_record_extension_set of string
7493

7594
let ref_field_set_info : set_field_dbg_info = Fld_record_set "contents"
95+
let fld_record_set = ref ( fun (lbl : Types.label_description) ->
96+
Fld_record_set lbl.lbl_name )
7697

7798
type immediate_or_pointer =
7899
| Immediate

bytecomp/lambda.mli

+30-1
Original file line numberDiff line numberDiff line change
@@ -62,18 +62,43 @@ type tag_info =
6262
| Blk_lazy_general
6363
| Blk_lazy_forward
6464
| Blk_class (* ocaml style class *)
65+
66+
val blk_record :
67+
(
68+
(Types.label_description* Typedtree.record_label_definition) array ->
69+
tag_info
70+
) ref
71+
72+
val blk_record_ext :
73+
(
74+
(Types.label_description* Typedtree.record_label_definition) array ->
75+
tag_info
76+
) ref
77+
78+
val blk_record_inlined :
79+
(
80+
(Types.label_description* Typedtree.record_label_definition) array ->
81+
string ->
82+
int ->
83+
tag_info
84+
) ref
85+
6586
val default_tag_info : tag_info
6687

6788
val ref_tag_info : tag_info
6889

6990
type field_dbg_info =
7091
| Fld_na
71-
| Fld_record of string
92+
| Fld_record of {name : string; mutable_flag : Asttypes.mutable_flag}
7293
| Fld_module of string
7394
| Fld_record_inline of string
7495
| Fld_record_extension of string
7596
| Fld_tuple
7697

98+
val fld_record :
99+
(Types.label_description ->
100+
field_dbg_info) ref
101+
77102
val ref_field_info : field_dbg_info
78103

79104
type set_field_dbg_info =
@@ -84,6 +109,10 @@ type set_field_dbg_info =
84109

85110
val ref_field_set_info : set_field_dbg_info
86111

112+
val fld_record_set :
113+
(Types.label_description ->
114+
set_field_dbg_info) ref
115+
87116
type immediate_or_pointer =
88117
| Immediate
89118
| Pointer

bytecomp/matching.ml

+2-2
Original file line numberDiff line numberDiff line change
@@ -1655,11 +1655,11 @@ let make_record_matching loc all_labels def = function
16551655
let access =
16561656
match lbl.lbl_repres with
16571657
| Record_regular ->
1658-
Lprim (Pfield (lbl.lbl_pos, Fld_record lbl.lbl_name), [arg], loc)
1658+
Lprim (Pfield (lbl.lbl_pos, !Lambda.fld_record lbl), [arg], loc)
16591659
| Record_inlined _ ->
16601660
Lprim (Pfield (lbl.lbl_pos, Fld_record_inline lbl.lbl_name), [arg], loc)
16611661
| Record_unboxed _ -> arg
1662-
| Record_float -> Lprim (Pfloatfield (lbl.lbl_pos, Fld_record lbl.lbl_name), [arg], loc)
1662+
| Record_float -> Lprim (Pfloatfield (lbl.lbl_pos, !Lambda.fld_record lbl), [arg], loc)
16631663
| Record_extension -> Lprim (Pfield (lbl.lbl_pos + 1, Fld_record_extension lbl.lbl_name), [arg], loc)
16641664
in
16651665
let str =

bytecomp/printlambda.ml

+1-1
Original file line numberDiff line numberDiff line change
@@ -142,7 +142,7 @@ let primitive ppf = function
142142
fprintf ppf "makeblock %i%a" tag block_shape shape
143143
| Pmakeblock(tag, _, Mutable, shape) ->
144144
fprintf ppf "makemutable %i%a" tag block_shape shape
145-
| Pfield (n, (Fld_module s | Fld_record s)) -> fprintf ppf "field:%s/%i" s n
145+
| Pfield (n, (Fld_module s | Fld_record {name=s})) -> fprintf ppf "field:%s/%i" s n
146146
| Pfield (n,_) -> fprintf ppf "field %i" n
147147
| Pfield_computed -> fprintf ppf "field_computed"
148148
| Psetfield(n, ptr, init, _) ->

bytecomp/translcore.ml

+15-16
Original file line numberDiff line numberDiff line change
@@ -1034,23 +1034,23 @@ and transl_exp0 e =
10341034
let targ = transl_exp arg in
10351035
begin match lbl.lbl_repres with
10361036
Record_regular ->
1037-
Lprim (Pfield (lbl.lbl_pos, Fld_record lbl.lbl_name), [targ], e.exp_loc)
1037+
Lprim (Pfield (lbl.lbl_pos, !Lambda.fld_record lbl), [targ], e.exp_loc)
10381038
| Record_inlined _ ->
10391039
Lprim (Pfield (lbl.lbl_pos, Fld_record_inline lbl.lbl_name), [targ], e.exp_loc)
10401040
| Record_unboxed _ -> targ
1041-
| Record_float -> Lprim (Pfloatfield (lbl.lbl_pos, Fld_record lbl.lbl_name), [targ], e.exp_loc)
1041+
| Record_float -> Lprim (Pfloatfield (lbl.lbl_pos, !Lambda.fld_record lbl), [targ], e.exp_loc)
10421042
| Record_extension ->
10431043
Lprim (Pfield (lbl.lbl_pos + 1, Fld_record_extension lbl.lbl_name), [targ], e.exp_loc)
10441044
end
10451045
| Texp_setfield(arg, _, lbl, newval) ->
10461046
let access =
10471047
match lbl.lbl_repres with
10481048
Record_regular ->
1049-
Psetfield(lbl.lbl_pos, maybe_pointer newval, Assignment, Fld_record_set lbl.lbl_name)
1049+
Psetfield(lbl.lbl_pos, maybe_pointer newval, Assignment, !Lambda.fld_record_set lbl)
10501050
| Record_inlined _ ->
10511051
Psetfield(lbl.lbl_pos, maybe_pointer newval, Assignment, Fld_record_inline_set lbl.lbl_name)
10521052
| Record_unboxed _ -> assert false
1053-
| Record_float -> Psetfloatfield (lbl.lbl_pos, Assignment, Fld_record_set lbl.lbl_name)
1053+
| Record_float -> Psetfloatfield (lbl.lbl_pos, Assignment, !Lambda.fld_record_set lbl)
10541054
| Record_extension ->
10551055
Psetfield (lbl.lbl_pos + 1, maybe_pointer newval, Assignment, Fld_record_extension_set lbl.lbl_name)
10561056
in
@@ -1440,11 +1440,11 @@ and transl_record loc env fields repres opt_init_expr =
14401440
let field_kind = value_kind env typ in
14411441
let access =
14421442
match repres with
1443-
Record_regular -> Pfield (i, Fld_record lbl.lbl_name)
1443+
Record_regular -> Pfield (i, !Lambda.fld_record lbl)
14441444
| Record_inlined _ -> Pfield (i, Fld_record_inline lbl.lbl_name)
14451445
| Record_unboxed _ -> assert false
14461446
| Record_extension -> Pfield (i + 1, Fld_record_extension lbl.lbl_name)
1447-
| Record_float -> Pfloatfield (i, Fld_record lbl.lbl_name) in
1447+
| Record_float -> Pfloatfield (i, !Lambda.fld_record lbl) in
14481448
Lprim(access, [Lvar init_id], loc), field_kind
14491449
| Overridden (_lid, expr) ->
14501450
let field_kind = value_kind expr.exp_env expr.exp_type in
@@ -1456,30 +1456,29 @@ and transl_record loc env fields repres opt_init_expr =
14561456
if Array.exists (fun (lbl, _) -> lbl.lbl_mut = Mutable) fields
14571457
then Mutable
14581458
else Immutable in
1459-
let all_labels_info = fields |> Array.map (fun (x,_) -> x.Types.lbl_name) in
14601459
let lam =
14611460
try
14621461
if mut = Mutable then raise Not_constant;
14631462
let cl = List.map extract_constant ll in
14641463
match repres with
1465-
| Record_regular -> Lconst(Const_block(0, Lambda.Blk_record all_labels_info, cl))
1466-
| Record_inlined {tag;name;num_nonconsts} -> Lconst(Const_block(tag, Lambda.Blk_record_inlined (all_labels_info,name,num_nonconsts), cl))
1464+
| Record_regular -> Lconst(Const_block(0, !Lambda.blk_record fields, cl))
1465+
| Record_inlined {tag;name;num_nonconsts} -> Lconst(Const_block(tag, !Lambda.blk_record_inlined fields name num_nonconsts, cl))
14671466
| Record_unboxed _ -> Lconst(match cl with [v] -> v | _ -> assert false)
14681467
| Record_float ->
1469-
if !Clflags.bs_only then Lconst(Const_block(0, Lambda.Blk_record all_labels_info, cl))
1468+
if !Clflags.bs_only then Lconst(Const_block(0, !Lambda.blk_record fields, cl))
14701469
else
14711470
Lconst(Const_float_array(List.map extract_float cl))
14721471
| Record_extension ->
14731472
raise Not_constant
14741473
with Not_constant ->
14751474
match repres with
14761475
Record_regular ->
1477-
Lprim(Pmakeblock(0, Lambda.Blk_record all_labels_info, mut, Some shape), ll, loc)
1476+
Lprim(Pmakeblock(0, !Lambda.blk_record fields, mut, Some shape), ll, loc)
14781477
| Record_inlined {tag;name; num_nonconsts} ->
1479-
Lprim(Pmakeblock(tag, Lambda.Blk_record_inlined (all_labels_info, name, num_nonconsts), mut, Some shape), ll, loc)
1478+
Lprim(Pmakeblock(tag, !Lambda.blk_record_inlined fields name num_nonconsts, mut, Some shape), ll, loc)
14801479
| Record_unboxed _ -> (match ll with [v] -> v | _ -> assert false)
14811480
| Record_float ->
1482-
if !Clflags.bs_only then Lprim(Pmakeblock(0, Lambda.Blk_record all_labels_info, mut, Some shape), ll, loc)
1481+
if !Clflags.bs_only then Lprim(Pmakeblock(0, !Lambda.blk_record fields, mut, Some shape), ll, loc)
14831482
else
14841483
Lprim(Pmakearray (Pfloatarray, mut), ll, loc)
14851484
| Record_extension ->
@@ -1490,7 +1489,7 @@ and transl_record loc env fields repres opt_init_expr =
14901489
| _ -> assert false
14911490
in
14921491
let slot = transl_extension_path env path in
1493-
Lprim(Pmakeblock(0, Lambda.Blk_record_ext all_labels_info, mut, Some (Pgenval :: shape)), slot :: ll, loc)
1492+
Lprim(Pmakeblock(0, !Lambda.blk_record_ext fields, mut, Some (Pgenval :: shape)), slot :: ll, loc)
14941493
in
14951494
begin match opt_init_expr with
14961495
None -> lam
@@ -1508,11 +1507,11 @@ and transl_record loc env fields repres opt_init_expr =
15081507
let upd =
15091508
match repres with
15101509
Record_regular ->
1511-
Psetfield(lbl.lbl_pos, maybe_pointer expr, Assignment, Fld_record_set lbl.lbl_name)
1510+
Psetfield(lbl.lbl_pos, maybe_pointer expr, Assignment, !Lambda.fld_record_set lbl)
15121511
| Record_inlined _ ->
15131512
Psetfield(lbl.lbl_pos, maybe_pointer expr, Assignment, Fld_record_inline_set lbl.lbl_name)
15141513
| Record_unboxed _ -> assert false
1515-
| Record_float -> Psetfloatfield (lbl.lbl_pos, Assignment, Fld_record_set lbl.lbl_name)
1514+
| Record_float -> Psetfloatfield (lbl.lbl_pos, Assignment, !Lambda.fld_record_set lbl)
15161515
| Record_extension ->
15171516
Psetfield(lbl.lbl_pos + 1, maybe_pointer expr, Assignment, Fld_record_extension_set lbl.lbl_name)
15181517
in

parsing/builtin_attributes.ml

+5
Original file line numberDiff line numberDiff line change
@@ -105,6 +105,11 @@ let check_deprecated_mutable_inclusion ~def ~use loc attrs1 attrs2 s =
105105
Location.deprecated ~def ~use loc
106106
(Printf.sprintf "mutating field %s" (cat s txt))
107107

108+
let check_bs_attributes_inclusion =
109+
ref (fun _attrs1 _attrs2 _s ->
110+
None
111+
)
112+
108113
let rec deprecated_of_sig = function
109114
| {psig_desc = Psig_attribute a} :: tl ->
110115
begin match deprecated_of_attrs [a] with

parsing/builtin_attributes.mli

+4
Original file line numberDiff line numberDiff line change
@@ -42,6 +42,10 @@ val check_deprecated_mutable_inclusion:
4242
def:Location.t -> use:Location.t -> Location.t -> Parsetree.attributes ->
4343
Parsetree.attributes -> string -> unit
4444

45+
val check_bs_attributes_inclusion:
46+
(Parsetree.attributes ->
47+
Parsetree.attributes -> string -> (string*string) option ) ref
48+
4549
val error_of_extension: Parsetree.extension -> Location.error
4650

4751
val warning_attribute: ?ppwarning:bool -> Parsetree.attribute -> unit

typing/includecore.ml

+6
Original file line numberDiff line numberDiff line change
@@ -247,6 +247,12 @@ and compare_records ~loc env params1 params2 n
247247
loc
248248
ld1.ld_attributes ld2.ld_attributes
249249
(Ident.name ld1.ld_id);
250+
let field_mismatch = !Builtin_attributes.check_bs_attributes_inclusion
251+
ld1.ld_attributes ld2.ld_attributes
252+
(Ident.name ld1.ld_id) in
253+
match field_mismatch with
254+
| Some (a,b) -> [Field_names (n,a,b)]
255+
| None ->
250256
if Ctype.equal env true (ld1.ld_type::params1)(ld2.ld_type::params2)
251257
then (* add arguments to the parameters, cf. PR#7378 *)
252258
compare_records ~loc env

0 commit comments

Comments
 (0)