forked from ocaml/ocaml
-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathbuiltin_attributes.ml
412 lines (363 loc) · 13.1 KB
/
builtin_attributes.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
(**************************************************************************)
(* *)
(* OCaml *)
(* *)
(* Alain Frisch, LexiFi *)
(* *)
(* Copyright 2012 Institut National de Recherche en Informatique et *)
(* en Automatique. *)
(* *)
(* All rights reserved. This file is distributed under the terms of *)
(* the GNU Lesser General Public License version 2.1, with the *)
(* special exception on linking described in the file LICENSE. *)
(* *)
(**************************************************************************)
open Asttypes
open Parsetree
open Ast_helper
module Attribute_table = Hashtbl.Make (struct
type t = string with_loc
let hash : t -> int = Hashtbl.hash
let equal : t -> t -> bool = (=)
end)
let unused_attrs = Attribute_table.create 128
let mark_used t = Attribute_table.remove unused_attrs t
(* [attr_order] is used to issue unused attribute warnings in the order the
attributes occur in the file rather than the random order of the hash table
*)
let attr_order a1 a2 =
match String.compare a1.loc.loc_start.pos_fname a2.loc.loc_start.pos_fname
with
| 0 -> Int.compare a1.loc.loc_start.pos_cnum a2.loc.loc_start.pos_cnum
| n -> n
let compiler_stops_before_attributes_consumed () =
let stops_before_lambda =
match !Clflags.stop_after with
| None -> false
| Some pass -> Clflags.Compiler_pass.(compare pass Lambda) < 0
in
stops_before_lambda || !Clflags.print_types
let warn_unused () =
let keys = List.of_seq (Attribute_table.to_seq_keys unused_attrs) in
Attribute_table.clear unused_attrs;
if not (compiler_stops_before_attributes_consumed ()) then
let keys = List.sort attr_order keys in
List.iter (fun sloc ->
Location.prerr_warning sloc.loc (Warnings.Misplaced_attribute sloc.txt))
keys
(* These are the attributes that are tracked in the builtin_attrs table for
misplaced attribute warnings. *)
let builtin_attrs =
[ "alert"
; "boxed"
; "deprecated"
; "deprecated_mutable"
; "explicit_arity"
; "immediate"
; "immediate64"
; "inline"
; "inlined"
; "noalloc"
; "poll"
; "ppwarning"
; "specialise"
; "specialised"
; "tailcall"
; "tail_mod_cons"
; "unboxed"
; "untagged"
; "unrolled"
; "warnerror"
; "warning"
; "warn_on_literal_pattern"
]
let builtin_attrs =
let tbl = Hashtbl.create 128 in
List.iter (fun attr -> Hashtbl.add tbl attr ()) builtin_attrs;
tbl
let drop_ocaml_attr_prefix s =
let len = String.length s in
if String.starts_with ~prefix:"ocaml." s && len > 6 then
String.sub s 6 (len - 6)
else
s
let is_builtin_attr s = Hashtbl.mem builtin_attrs (drop_ocaml_attr_prefix s)
type current_phase = Parser | Invariant_check
let register_attr current_phase name =
match current_phase with
| Parser when !Clflags.all_ppx <> [] -> ()
| Parser | Invariant_check ->
if is_builtin_attr name.txt then
Attribute_table.replace unused_attrs name ()
let string_of_cst const =
match const.pconst_desc with
| Pconst_string(s, _, _) -> Some s
| _ -> None
let string_of_payload = function
| PStr[{pstr_desc=Pstr_eval({pexp_desc=Pexp_constant c},_)}] ->
string_of_cst c
| _ -> None
let string_of_opt_payload p =
match string_of_payload p with
| Some s -> s
| None -> ""
module Style = Misc.Style
let error_of_extension ext =
let submessage_from main_loc main_txt = function
| {pstr_desc=Pstr_extension
(({txt = ("ocaml.error"|"error"); loc}, p), _)} ->
begin match p with
| PStr([{pstr_desc=Pstr_eval
({pexp_desc=Pexp_constant
{pconst_desc=Pconst_string(msg, _, _); _}}, _)}
]) ->
Location.msg ~loc "%a" Format_doc.pp_print_text msg
| _ ->
Location.msg ~loc "Invalid syntax for sub-message of extension %a."
Style.inline_code main_txt
end
| {pstr_desc=Pstr_extension (({txt; loc}, _), _)} ->
Location.msg ~loc "Uninterpreted extension '%a'."
Style.inline_code txt
| _ ->
Location.msg ~loc:main_loc
"Invalid syntax for sub-message of extension %a."
Style.inline_code main_txt
in
match ext with
| ({txt = ("ocaml.error"|"error") as txt; loc}, p) ->
begin match p with
| PStr [] -> raise Location.Already_displayed_error
| PStr({pstr_desc=Pstr_eval
({pexp_desc=Pexp_constant
{pconst_desc=Pconst_string(msg, _, _)}}, _)}::
inner) ->
let sub = List.map (submessage_from loc txt) inner in
Location.error_of_printer ~loc ~sub Format_doc.pp_print_text msg
| _ ->
Location.errorf ~loc "Invalid syntax for extension '%s'." txt
end
| ({txt; loc}, _) ->
Location.errorf ~loc "Uninterpreted extension '%s'." txt
let attr_equals_builtin {attr_name = {txt; _}; _} s =
(* Check for attribute s or ocaml.s. Avoid allocating a fresh string. *)
txt = s ||
( String.length txt = 6 + String.length s
&& String.starts_with ~prefix:"ocaml." txt
&& String.ends_with ~suffix:s txt)
let mark_alert_used a =
if attr_equals_builtin a "deprecated" || attr_equals_builtin a "alert"
then mark_used a.attr_name
let mark_alerts_used l = List.iter mark_alert_used l
let mark_warn_on_literal_pattern_used l =
List.iter (fun a ->
if attr_equals_builtin a "warn_on_literal_pattern"
then mark_used a.attr_name)
l
let mark_deprecated_mutable_used l =
List.iter (fun a ->
if attr_equals_builtin a "deprecated_mutable"
then mark_used a.attr_name)
l
let mark_payload_attrs_used payload =
let iter =
{ Ast_iterator.default_iterator
with attribute = fun self a ->
mark_used a.attr_name;
Ast_iterator.default_iterator.attribute self a
}
in
iter.payload iter payload
let kind_and_message = function
| PStr[
{pstr_desc=
Pstr_eval
({pexp_desc=Pexp_apply
({pexp_desc=Pexp_ident{txt=Longident.Lident id}},
[Nolabel,{pexp_desc=Pexp_constant
{pconst_desc=Pconst_string(s,_,_); _}}])
},_)}] ->
Some (id, s)
| PStr[
{pstr_desc=
Pstr_eval
({pexp_desc=Pexp_ident{txt=Longident.Lident id}},_)}] ->
Some (id, "")
| _ -> None
let cat s1 s2 =
if s2 = "" then s1 else s1 ^ "\n" ^ s2
let alert_attr x =
if attr_equals_builtin x "deprecated" then
Some (x, "deprecated", string_of_opt_payload x.attr_payload)
else if attr_equals_builtin x "alert" then
begin match kind_and_message x.attr_payload with
| Some (kind, message) -> Some (x, kind, message)
| None -> None (* note: bad payloads detected by warning_attribute *)
end
else None
let alert_attrs l =
List.filter_map alert_attr l
let alerts_of_attrs l =
List.fold_left
(fun acc (_, kind, message) ->
let upd = function
| None | Some "" -> Some message
| Some s -> Some (cat s message)
in
Misc.Stdlib.String.Map.update kind upd acc
)
Misc.Stdlib.String.Map.empty
(alert_attrs l)
let check_alerts loc attrs s =
Misc.Stdlib.String.Map.iter
(fun kind message -> Location.alert loc ~kind (cat s message))
(alerts_of_attrs attrs)
let check_alerts_inclusion ~def ~use loc attrs1 attrs2 s =
let m2 = alerts_of_attrs attrs2 in
Misc.Stdlib.String.Map.iter
(fun kind msg ->
if not (Misc.Stdlib.String.Map.mem kind m2) then
Location.alert ~def ~use ~kind loc (cat s msg)
)
(alerts_of_attrs attrs1)
let rec deprecated_mutable_of_attrs = function
| [] -> None
| attr :: _ when attr_equals_builtin attr "deprecated_mutable" ->
Some (string_of_opt_payload attr.attr_payload)
| _ :: tl -> deprecated_mutable_of_attrs tl
let check_deprecated_mutable loc attrs s =
match deprecated_mutable_of_attrs attrs with
| None -> ()
| Some txt ->
Location.deprecated loc (Printf.sprintf "mutating field %s" (cat s txt))
let check_deprecated_mutable_inclusion ~def ~use loc attrs1 attrs2 s =
match deprecated_mutable_of_attrs attrs1,
deprecated_mutable_of_attrs attrs2
with
| None, _ | Some _, Some _ -> ()
| Some txt, None ->
Location.deprecated ~def ~use loc
(Printf.sprintf "mutating field %s" (cat s txt))
let rec attrs_of_sig = function
| {psig_desc = Psig_attribute a} :: tl ->
a :: attrs_of_sig tl
| _ ->
[]
let alerts_of_sig ~mark sg =
let a = attrs_of_sig sg in
if mark then mark_alerts_used a;
alerts_of_attrs a
let rec attrs_of_str = function
| {pstr_desc = Pstr_attribute a} :: tl ->
a :: attrs_of_str tl
| _ ->
[]
let alerts_of_str ~mark str =
let a = attrs_of_str str in
if mark then mark_alerts_used a;
alerts_of_attrs a
let warn_payload loc txt msg =
Location.prerr_warning loc (Warnings.Attribute_payload (txt, msg))
let warning_attribute ?(ppwarning = true) =
let process loc name errflag payload =
mark_used name;
match string_of_payload payload with
| Some s ->
begin try
Option.iter (Location.prerr_alert loc)
(Warnings.parse_options errflag s)
with Arg.Bad msg -> warn_payload loc name.txt msg
end
| None ->
warn_payload loc name.txt "A single string literal is expected"
in
let process_alert loc name = function
| PStr[{pstr_desc=
Pstr_eval(
{pexp_desc=Pexp_constant {pconst_desc=Pconst_string(s,_,_); _}},
_)
}] ->
begin
mark_used name;
try Warnings.parse_alert_option s
with Arg.Bad msg -> warn_payload loc name.txt msg
end
| k ->
match kind_and_message k with
| Some ("all", _) ->
warn_payload loc name.txt "The alert name 'all' is reserved"
| Some _ ->
(* Do [mark_used] in the [Some] case only if Warning 53 is
disabled. Later, they will be marked used (provided they are in a
valid place) in [compile_common], when they are extracted to be
persisted inside the [.cmi] file. *)
if not (Warnings.is_active (Misplaced_attribute ""))
then mark_used name
| None -> begin
(* Do [mark_used] in the [None] case, which is just malformed and
covered by the "Invalid payload" warning. *)
mark_used name;
warn_payload loc name.txt "Invalid payload"
end
in
fun ({attr_name; attr_loc; attr_payload} as attr) ->
if attr_equals_builtin attr "warning" then
process attr_loc attr_name false attr_payload
else if attr_equals_builtin attr "warnerror" then
process attr_loc attr_name true attr_payload
else if attr_equals_builtin attr "alert" then
process_alert attr_loc attr_name attr_payload
else if ppwarning && attr_equals_builtin attr "ppwarning" then
begin match attr_payload with
| PStr [{ pstr_desc=
Pstr_eval({pexp_desc=Pexp_constant
{pconst_desc=Pconst_string (s, _, _); _}},_);
pstr_loc }] ->
(mark_used attr_name;
Location.prerr_warning pstr_loc (Warnings.Preprocessor s))
| _ ->
(mark_used attr_name;
warn_payload attr_loc attr_name.txt
"A single string literal is expected")
end
let warning_scope ?ppwarning attrs f =
let prev = Warnings.backup () in
try
List.iter (warning_attribute ?ppwarning) (List.rev attrs);
let ret = f () in
Warnings.restore prev;
ret
with exn ->
Warnings.restore prev;
raise exn
let has_attribute nm attrs =
List.exists
(fun a ->
if attr_equals_builtin a nm
then (mark_used a.attr_name; true)
else false)
attrs
type attr_action = Mark_used_only | Return
let select_attributes actions attrs =
List.filter (fun a ->
List.exists (fun (nm, action) ->
attr_equals_builtin a nm &&
begin
mark_used a.attr_name;
action = Return
end)
actions
) attrs
let warn_on_literal_pattern attrs =
has_attribute "warn_on_literal_pattern" attrs
let explicit_arity attrs = has_attribute "explicit_arity" attrs
let immediate attrs = has_attribute "immediate" attrs
let immediate64 attrs = has_attribute "immediate64" attrs
(* The "ocaml.boxed (default)" and "ocaml.unboxed (default)"
attributes cannot be input by the user, they are added by the
compiler when applying the default setting. This is done to record
in the .cmi the default used by the compiler when compiling the
source file because the default can change between compiler
invocations. *)
let has_unboxed attrs = has_attribute "unboxed" attrs
let has_boxed attrs = has_attribute "boxed" attrs