Skip to content

Commit e06e0f2

Browse files
committed
Cleanup processing of warning/warnerror attributes.
1 parent e85d5ec commit e06e0f2

File tree

5 files changed

+83
-79
lines changed

5 files changed

+83
-79
lines changed

parsing/builtin_attributes.ml

+14-28
Original file line numberDiff line numberDiff line change
@@ -141,18 +141,7 @@ let emit_external_warnings =
141141
}
142142

143143

144-
let warning_scope = ref []
145-
146-
let warning_enter_scope () =
147-
warning_scope := (Warnings.backup ()) :: !warning_scope
148-
let warning_leave_scope () =
149-
match !warning_scope with
150-
| [] -> assert false
151-
| hd :: tl ->
152-
Warnings.restore hd;
153-
warning_scope := tl
154-
155-
let warning_attribute attrs =
144+
let warning_attribute =
156145
let process loc txt errflag payload =
157146
match string_of_payload payload with
158147
| Some s ->
@@ -167,26 +156,23 @@ let warning_attribute attrs =
167156
(Warnings.Attribute_payload
168157
(txt, "A single string literal is expected"))
169158
in
170-
List.iter
171-
(function
172-
| ({txt = ("ocaml.warning"|"warning") as txt; loc}, payload) ->
173-
process loc txt false payload
174-
| ({txt = ("ocaml.warnerror"|"warnerror") as txt; loc}, payload) ->
175-
process loc txt true payload
176-
| _ ->
177-
()
178-
)
179-
attrs
180-
181-
let with_warning_attribute attrs f =
159+
function
160+
| ({txt = ("ocaml.warning"|"warning") as txt; loc}, payload) ->
161+
process loc txt false payload
162+
| ({txt = ("ocaml.warnerror"|"warnerror") as txt; loc}, payload) ->
163+
process loc txt true payload
164+
| _ ->
165+
()
166+
167+
let warning_scope attrs f =
168+
let prev = Warnings.backup () in
182169
try
183-
warning_enter_scope ();
184-
warning_attribute attrs;
170+
List.iter warning_attribute attrs;
185171
let ret = f () in
186-
warning_leave_scope ();
172+
Warnings.restore prev;
187173
ret
188174
with exn ->
189-
warning_leave_scope ();
175+
Warnings.restore prev;
190176
raise exn
191177

192178

parsing/builtin_attributes.mli

+15-4
Original file line numberDiff line numberDiff line change
@@ -44,10 +44,21 @@ val check_deprecated_mutable_inclusion:
4444

4545
val error_of_extension: Parsetree.extension -> Location.error
4646

47-
val warning_enter_scope: unit -> unit
48-
val warning_leave_scope: unit -> unit
49-
val warning_attribute: Parsetree.attributes -> unit
50-
val with_warning_attribute: Parsetree.attributes -> (unit -> 'a) -> 'a
47+
val warning_attribute: Parsetree.attribute -> unit
48+
(** Apply warning settings from the specified attribute.
49+
"ocaml.warning"/"ocaml.warnerror" (and variants without the prefix)
50+
are processed and other attributes are ignored. *)
51+
52+
val warning_scope: Parsetree.attributes -> (unit -> 'a) -> 'a
53+
(** Execute a function in a new scope for warning settings. This
54+
means that the effect of any call to [warning_attribute] during
55+
the execution of this function will be discarded after
56+
execution.
57+
58+
The function also takes a list of attributes which are processed
59+
with [warning_attribute] in the fresh scope before the function
60+
is executed.
61+
*)
5162

5263
val emit_external_warnings: Ast_iterator.iterator
5364

typing/typeclass.ml

+15-13
Original file line numberDiff line numberDiff line change
@@ -446,7 +446,7 @@ let rec class_type_field env self_type meths
446446
val_sig, concr_meths, inher)
447447

448448
| Pctf_attribute x ->
449-
Builtin_attributes.warning_attribute [x];
449+
Builtin_attributes.warning_attribute x;
450450
(mkctf (Tctf_attribute x) :: fields,
451451
val_sig, concr_meths, inher)
452452

@@ -472,13 +472,14 @@ and class_signature env {pcsig_self=sty; pcsig_fields=sign} =
472472
end;
473473

474474
(* Class type fields *)
475-
Builtin_attributes.warning_enter_scope ();
476475
let (rev_fields, val_sig, concr_meths, inher) =
477-
List.fold_left (class_type_field env self_type meths)
478-
([], Vars.empty, Concr.empty, [])
479-
sign
476+
Builtin_attributes.warning_scope []
477+
(fun () ->
478+
List.fold_left (class_type_field env self_type meths)
479+
([], Vars.empty, Concr.empty, [])
480+
sign
481+
)
480482
in
481-
Builtin_attributes.warning_leave_scope ();
482483
let cty = {csig_self = self_type;
483484
csig_vars = val_sig;
484485
csig_concr = concr_meths;
@@ -757,7 +758,7 @@ let rec class_field self_loc cl_num self_type meths vars
757758
(val_env, met_env, par_env, field::fields, concr_meths, warn_vals,
758759
inher, local_meths, local_vals)
759760
| Pcf_attribute x ->
760-
Builtin_attributes.warning_attribute [x];
761+
Builtin_attributes.warning_attribute x;
761762
(val_env, met_env, par_env,
762763
lazy (mkcf (Tcf_attribute x)) :: fields,
763764
concr_meths, warn_vals, inher, local_meths, local_vals)
@@ -811,14 +812,15 @@ and class_structure cl_num final val_env met_env loc
811812
end;
812813

813814
(* Typing of class fields *)
814-
Builtin_attributes.warning_enter_scope ();
815815
let (_, _, _, fields, concr_meths, _, inher, _local_meths, _local_vals) =
816-
List.fold_left (class_field self_loc cl_num self_type meths vars)
817-
(val_env, meth_env, par_env, [], Concr.empty, Concr.empty, [],
818-
Concr.empty, Concr.empty)
819-
str
816+
Builtin_attributes.warning_scope []
817+
(fun () ->
818+
List.fold_left (class_field self_loc cl_num self_type meths vars)
819+
(val_env, meth_env, par_env, [], Concr.empty, Concr.empty, [],
820+
Concr.empty, Concr.empty)
821+
str
822+
)
820823
in
821-
Builtin_attributes.warning_leave_scope ();
822824
Ctype.unify val_env self_type (Ctype.newvar ());
823825
let sign =
824826
{csig_self = public_self;

typing/typecore.ml

+9-7
Original file line numberDiff line numberDiff line change
@@ -1948,10 +1948,12 @@ let rec type_exp ?recarg env sexp =
19481948

19491949
and type_expect ?in_function ?recarg env sexp ty_expected =
19501950
let previous_saved_types = Cmt_format.get_saved_types () in
1951-
Builtin_attributes.warning_enter_scope ();
1952-
Builtin_attributes.warning_attribute sexp.pexp_attributes;
1953-
let exp = type_expect_ ?in_function ?recarg env sexp ty_expected in
1954-
Builtin_attributes.warning_leave_scope ();
1951+
let exp =
1952+
Builtin_attributes.warning_scope sexp.pexp_attributes
1953+
(fun () ->
1954+
type_expect_ ?in_function ?recarg env sexp ty_expected
1955+
)
1956+
in
19551957
Cmt_format.set_saved_types
19561958
(Cmt_format.Partial_expression exp :: previous_saved_types);
19571959
exp
@@ -4115,22 +4117,22 @@ and type_let ?(check = fun s -> Warnings.Unused_var s)
41154117
generalize_structure ty'
41164118
end;
41174119
let exp =
4118-
Builtin_attributes.with_warning_attribute pvb_attributes
4120+
Builtin_attributes.warning_scope pvb_attributes
41194121
(fun () -> type_expect exp_env sexp ty')
41204122
in
41214123
end_def ();
41224124
check_univars env true "definition" exp pat.pat_type vars;
41234125
{exp with exp_type = instance env exp.exp_type}
41244126
| _ ->
4125-
Builtin_attributes.with_warning_attribute pvb_attributes (fun () ->
4127+
Builtin_attributes.warning_scope pvb_attributes (fun () ->
41264128
type_expect exp_env sexp pat.pat_type))
41274129
spat_sexp_list pat_slot_list in
41284130
current_slot := None;
41294131
if is_recursive && not !rec_needed
41304132
&& Warnings.is_active Warnings.Unused_rec_flag then begin
41314133
let {pvb_pat; pvb_attributes} = List.hd spat_sexp_list in
41324134
(* See PR#6677 *)
4133-
Builtin_attributes.with_warning_attribute pvb_attributes
4135+
Builtin_attributes.warning_scope pvb_attributes
41344136
(fun () ->
41354137
Location.prerr_warning pvb_pat.ppat_loc Warnings.Unused_rec_flag
41364138
)

typing/typemod.ml

+30-27
Original file line numberDiff line numberDiff line change
@@ -591,7 +591,7 @@ and transl_signature env sg =
591591
match item.psig_desc with
592592
| Psig_value sdesc ->
593593
let (tdesc, newenv) =
594-
Builtin_attributes.with_warning_attribute sdesc.pval_attributes
594+
Builtin_attributes.warning_scope sdesc.pval_attributes
595595
(fun () -> Typedecl.transl_value_decl env item.psig_loc sdesc)
596596
in
597597
let (trem,rem, final_env) = transl_sig newenv srem in
@@ -634,7 +634,7 @@ and transl_signature env sg =
634634
check_name check_module names pmd.pmd_name;
635635
let id = Ident.create pmd.pmd_name.txt in
636636
let tmty =
637-
Builtin_attributes.with_warning_attribute pmd.pmd_attributes
637+
Builtin_attributes.warning_scope pmd.pmd_attributes
638638
(fun () -> transl_modtype env pmd.pmd_type)
639639
in
640640
let md = {
@@ -669,7 +669,7 @@ and transl_signature env sg =
669669
final_env
670670
| Psig_modtype pmtd ->
671671
let newenv, mtd, sg =
672-
Builtin_attributes.with_warning_attribute pmtd.pmtd_attributes
672+
Builtin_attributes.warning_scope pmtd.pmtd_attributes
673673
(fun () -> transl_modtype_decl names env pmtd)
674674
in
675675
let (trem, rem, final_env) = transl_sig newenv srem in
@@ -684,7 +684,7 @@ and transl_signature env sg =
684684
| Psig_include sincl ->
685685
let smty = sincl.pincl_mod in
686686
let tmty =
687-
Builtin_attributes.with_warning_attribute sincl.pincl_attributes
687+
Builtin_attributes.warning_scope sincl.pincl_attributes
688688
(fun () -> transl_modtype env smty)
689689
in
690690
let mty = tmty.mty_type in
@@ -742,21 +742,22 @@ and transl_signature env sg =
742742
classes [rem]),
743743
final_env
744744
| Psig_attribute x ->
745-
Builtin_attributes.warning_attribute [x];
745+
Builtin_attributes.warning_attribute x;
746746
let (trem,rem, final_env) = transl_sig env srem in
747747
mksig (Tsig_attribute x) env loc :: trem, rem, final_env
748748
| Psig_extension (ext, _attrs) ->
749749
raise (Error_forward (Builtin_attributes.error_of_extension ext))
750750
in
751751
let previous_saved_types = Cmt_format.get_saved_types () in
752-
Builtin_attributes.warning_enter_scope ();
753-
let (trem, rem, final_env) = transl_sig (Env.in_signature true env) sg in
754-
let rem = simplify_signature rem in
755-
let sg = { sig_items = trem; sig_type = rem; sig_final_env = final_env } in
756-
Builtin_attributes.warning_leave_scope ();
757-
Cmt_format.set_saved_types
758-
((Cmt_format.Partial_signature sg) :: previous_saved_types);
759-
sg
752+
Builtin_attributes.warning_scope []
753+
(fun () ->
754+
let (trem, rem, final_env) = transl_sig (Env.in_signature true env) sg in
755+
let rem = simplify_signature rem in
756+
let sg = { sig_items = trem; sig_type = rem; sig_final_env = final_env } in
757+
Cmt_format.set_saved_types
758+
((Cmt_format.Partial_signature sg) :: previous_saved_types);
759+
sg
760+
)
760761

761762
and transl_modtype_decl names env
762763
{pmtd_name; pmtd_type; pmtd_attributes; pmtd_loc} =
@@ -794,7 +795,7 @@ and transl_recmodule_modtypes env sdecls =
794795
List.map2
795796
(fun pmd (id, id_loc, _mty) ->
796797
let tmty =
797-
Builtin_attributes.with_warning_attribute pmd.pmd_attributes
798+
Builtin_attributes.warning_scope pmd.pmd_attributes
798799
(fun () -> transl_modtype env_c pmd.pmd_type)
799800
in
800801
(id, id_loc, tmty))
@@ -1227,7 +1228,7 @@ and type_structure ?(toplevel = false) funct_body anchor env sstr scope =
12271228
match desc with
12281229
| Pstr_eval (sexpr, attrs) ->
12291230
let expr =
1230-
Builtin_attributes.with_warning_attribute attrs
1231+
Builtin_attributes.warning_scope attrs
12311232
(fun () -> Typecore.type_expression env sexpr)
12321233
in
12331234
Tstr_eval (expr, attrs), [], env
@@ -1290,7 +1291,7 @@ and type_structure ?(toplevel = false) funct_body anchor env sstr scope =
12901291
check_name check_module names name;
12911292
let id = Ident.create name.txt in (* create early for PR#6752 *)
12921293
let modl =
1293-
Builtin_attributes.with_warning_attribute attrs
1294+
Builtin_attributes.warning_scope attrs
12941295
(fun () ->
12951296
type_module ~alias:true true funct_body
12961297
(anchor_submodule name.txt anchor) env smodl
@@ -1343,7 +1344,7 @@ and type_structure ?(toplevel = false) funct_body anchor env sstr scope =
13431344
List.map2
13441345
(fun {md_id=id; md_type=mty} (name, _, smodl, attrs, loc) ->
13451346
let modl =
1346-
Builtin_attributes.with_warning_attribute attrs
1347+
Builtin_attributes.warning_scope attrs
13471348
(fun () ->
13481349
type_module true funct_body (anchor_recmodule id)
13491350
newenv smodl
@@ -1382,7 +1383,7 @@ and type_structure ?(toplevel = false) funct_body anchor env sstr scope =
13821383
| Pstr_modtype pmtd ->
13831384
(* check that it is non-abstract *)
13841385
let newenv, mtd, sg =
1385-
Builtin_attributes.with_warning_attribute pmtd.pmtd_attributes
1386+
Builtin_attributes.warning_scope pmtd.pmtd_attributes
13861387
(fun () -> transl_modtype_decl names env pmtd)
13871388
in
13881389
Tstr_modtype mtd, [sg], newenv
@@ -1443,7 +1444,7 @@ and type_structure ?(toplevel = false) funct_body anchor env sstr scope =
14431444
| Pstr_include sincl ->
14441445
let smodl = sincl.pincl_mod in
14451446
let modl =
1446-
Builtin_attributes.with_warning_attribute sincl.pincl_attributes
1447+
Builtin_attributes.warning_scope sincl.pincl_attributes
14471448
(fun () -> type_module true funct_body None env smodl)
14481449
in
14491450
(* Rename all identifiers bound by this signature to avoid clashes *)
@@ -1462,7 +1463,7 @@ and type_structure ?(toplevel = false) funct_body anchor env sstr scope =
14621463
| Pstr_extension (ext, _attrs) ->
14631464
raise (Error_forward (Builtin_attributes.error_of_extension ext))
14641465
| Pstr_attribute x ->
1465-
Builtin_attributes.warning_attribute [x];
1466+
Builtin_attributes.warning_attribute x;
14661467
Tstr_attribute x, [], env
14671468
in
14681469
let rec type_struct env sstr =
@@ -1482,13 +1483,15 @@ and type_structure ?(toplevel = false) funct_body anchor env sstr scope =
14821483
(* moved to genannot *)
14831484
List.iter (function {pstr_loc = l} -> Stypes.record_phrase l) sstr;
14841485
let previous_saved_types = Cmt_format.get_saved_types () in
1485-
if not toplevel then Builtin_attributes.warning_enter_scope ();
1486-
let (items, sg, final_env) = type_struct env sstr in
1487-
let str = { str_items = items; str_type = sg; str_final_env = final_env } in
1488-
if not toplevel then Builtin_attributes.warning_leave_scope ();
1489-
Cmt_format.set_saved_types
1490-
(Cmt_format.Partial_structure str :: previous_saved_types);
1491-
str, sg, final_env
1486+
let run () =
1487+
let (items, sg, final_env) = type_struct env sstr in
1488+
let str = { str_items = items; str_type = sg; str_final_env = final_env } in
1489+
Cmt_format.set_saved_types
1490+
(Cmt_format.Partial_structure str :: previous_saved_types);
1491+
str, sg, final_env
1492+
in
1493+
if toplevel then run ()
1494+
else Builtin_attributes.warning_scope [] run
14921495

14931496
let type_toplevel_phrase env s =
14941497
Env.reset_required_globals ();

0 commit comments

Comments
 (0)