@@ -1034,23 +1034,23 @@ and transl_exp0 e =
1034
1034
let targ = transl_exp arg in
1035
1035
begin match lbl.lbl_repres with
1036
1036
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)
1038
1038
| Record_inlined _ ->
1039
1039
Lprim (Pfield (lbl.lbl_pos, Fld_record_inline lbl.lbl_name), [targ], e.exp_loc)
1040
1040
| 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)
1042
1042
| Record_extension ->
1043
1043
Lprim (Pfield (lbl.lbl_pos + 1 , Fld_record_extension lbl.lbl_name), [targ], e.exp_loc)
1044
1044
end
1045
1045
| Texp_setfield (arg , _ , lbl , newval ) ->
1046
1046
let access =
1047
1047
match lbl.lbl_repres with
1048
1048
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)
1050
1050
| Record_inlined _ ->
1051
1051
Psetfield (lbl.lbl_pos, maybe_pointer newval, Assignment , Fld_record_inline_set lbl.lbl_name)
1052
1052
| 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)
1054
1054
| Record_extension ->
1055
1055
Psetfield (lbl.lbl_pos + 1 , maybe_pointer newval, Assignment , Fld_record_extension_set lbl.lbl_name)
1056
1056
in
@@ -1440,11 +1440,11 @@ and transl_record loc env fields repres opt_init_expr =
1440
1440
let field_kind = value_kind env typ in
1441
1441
let access =
1442
1442
match repres with
1443
- Record_regular -> Pfield (i, Fld_record lbl.lbl_name )
1443
+ Record_regular -> Pfield (i, ! Lambda. fld_record lbl)
1444
1444
| Record_inlined _ -> Pfield (i, Fld_record_inline lbl.lbl_name)
1445
1445
| Record_unboxed _ -> assert false
1446
1446
| 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
1448
1448
Lprim (access, [Lvar init_id], loc), field_kind
1449
1449
| Overridden (_lid , expr ) ->
1450
1450
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 =
1456
1456
if Array. exists (fun (lbl , _ ) -> lbl.lbl_mut = Mutable ) fields
1457
1457
then Mutable
1458
1458
else Immutable in
1459
- let all_labels_info = fields |> Array. map (fun (x ,_ ) -> x.Types. lbl_name) in
1460
1459
let lam =
1461
1460
try
1462
1461
if mut = Mutable then raise Not_constant ;
1463
1462
let cl = List. map extract_constant ll in
1464
1463
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))
1467
1466
| Record_unboxed _ -> Lconst (match cl with [v] -> v | _ -> assert false )
1468
1467
| 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))
1470
1469
else
1471
1470
Lconst (Const_float_array (List. map extract_float cl))
1472
1471
| Record_extension ->
1473
1472
raise Not_constant
1474
1473
with Not_constant ->
1475
1474
match repres with
1476
1475
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)
1478
1477
| 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)
1480
1479
| Record_unboxed _ -> (match ll with [v] -> v | _ -> assert false )
1481
1480
| 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)
1483
1482
else
1484
1483
Lprim (Pmakearray (Pfloatarray , mut), ll, loc)
1485
1484
| Record_extension ->
@@ -1490,7 +1489,7 @@ and transl_record loc env fields repres opt_init_expr =
1490
1489
| _ -> assert false
1491
1490
in
1492
1491
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)
1494
1493
in
1495
1494
begin match opt_init_expr with
1496
1495
None -> lam
@@ -1508,11 +1507,11 @@ and transl_record loc env fields repres opt_init_expr =
1508
1507
let upd =
1509
1508
match repres with
1510
1509
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)
1512
1511
| Record_inlined _ ->
1513
1512
Psetfield (lbl.lbl_pos, maybe_pointer expr, Assignment , Fld_record_inline_set lbl.lbl_name)
1514
1513
| 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)
1516
1515
| Record_extension ->
1517
1516
Psetfield (lbl.lbl_pos + 1 , maybe_pointer expr, Assignment , Fld_record_extension_set lbl.lbl_name)
1518
1517
in
0 commit comments