]> CyberLeo.Net >> Repos - FreeBSD/FreeBSD.git/blob - contrib/llvm/tools/clang/include/clang/Basic/DiagnosticASTKinds.td
Import DTS files from Linux 5.4
[FreeBSD/FreeBSD.git] / contrib / llvm / tools / clang / include / clang / Basic / DiagnosticASTKinds.td
1 //==--- DiagnosticASTKinds.td - libast diagnostics ------------------------===//
2 //
3 // Part of the LLVM Project, under the Apache License v2.0 with LLVM Exceptions.
4 // See https://llvm.org/LICENSE.txt for license information.
5 // SPDX-License-Identifier: Apache-2.0 WITH LLVM-exception
6 //
7 //===----------------------------------------------------------------------===//
8
9 let Component = "AST" in {
10
11 // Constant expression diagnostics. These (and their users) belong in Sema.
12 def note_expr_divide_by_zero : Note<"division by zero">;
13 def note_constexpr_invalid_cast : Note<
14   "%select{reinterpret_cast|dynamic_cast|cast that performs the conversions of"
15   " a reinterpret_cast|cast from %1}0 is not allowed in a constant expression"
16   "%select{| in C++ standards before C++2a||}0">;
17 def note_constexpr_invalid_downcast : Note<
18   "cannot cast object of dynamic type %0 to type %1">;
19 def note_constexpr_overflow : Note<
20   "value %0 is outside the range of representable values of type %1">;
21 def note_constexpr_negative_shift : Note<"negative shift count %0">;
22 def note_constexpr_large_shift : Note<
23   "shift count %0 >= width of type %1 (%2 bit%s2)">;
24 def note_constexpr_lshift_of_negative : Note<"left shift of negative value %0">;
25 def note_constexpr_lshift_discards : Note<"signed left shift discards bits">;
26 def note_constexpr_invalid_function : Note<
27   "%select{non-constexpr|undefined}0 %select{function|constructor}1 %2 cannot "
28   "be used in a constant expression">;
29 def note_constexpr_invalid_inhctor : Note<
30   "constructor inherited from base class %0 cannot be used in a "
31   "constant expression; derived class cannot be implicitly initialized">;
32 def note_constexpr_no_return : Note<
33   "control reached end of constexpr function">;
34 def note_constexpr_virtual_call : Note<
35   "cannot evaluate call to virtual function in a constant expression "
36   "in C++ standards before C++2a">;
37 def note_constexpr_pure_virtual_call : Note<
38   "pure virtual function %q0 called">;
39 def note_constexpr_polymorphic_unknown_dynamic_type : Note<
40   "%select{||||virtual function called on|dynamic_cast applied to|"
41   "typeid applied to}0 object '%1' whose dynamic type is not constant">;
42 def note_constexpr_dynamic_cast_to_reference_failed : Note<
43   "reference dynamic_cast failed: %select{"
44   "static type %1 of operand is a non-public base class of dynamic type %2|"
45   "dynamic type %2 of operand does not have a base class of type %3|"
46   "%3 is an ambiguous base class of dynamic type %2 of operand|"
47   "%3 is a non-public base class of dynamic type %2 of operand}0">;
48 def note_constexpr_virtual_base : Note<
49   "cannot construct object of type %0 with virtual base class "
50   "in a constant expression">;
51 def note_constexpr_nonliteral : Note<
52   "non-literal type %0 cannot be used in a constant expression">;
53 def note_constexpr_non_global : Note<
54   "%select{pointer|reference}0 to %select{|subobject of }1"
55   "%select{temporary|%3}2 is not a constant expression">;
56 def note_constexpr_uninitialized : Note<
57   "%select{|sub}0object of type %1 is not initialized">;
58 def note_constexpr_subobject_declared_here : Note<
59   "subobject declared here">;
60 def note_constexpr_array_index : Note<"cannot refer to element %0 of "
61   "%select{array of %2 element%plural{1:|:s}2|non-array object}1 "
62   "in a constant expression">;
63 def note_constexpr_float_arithmetic : Note<
64   "floating point arithmetic produces %select{an infinity|a NaN}0">;
65 def note_constexpr_pointer_subtraction_not_same_array : Note<
66   "subtracted pointers are not elements of the same array">;
67 def note_constexpr_pointer_subtraction_zero_size : Note<
68   "subtraction of pointers to type %0 of zero size">;
69 def note_constexpr_pointer_comparison_base_classes : Note<
70   "comparison of addresses of subobjects of different base classes "
71   "has unspecified value">;
72 def note_constexpr_pointer_comparison_base_field : Note<
73   "comparison of address of base class subobject %0 of class %1 to field %2 "
74   "has unspecified value">;
75 def note_constexpr_pointer_comparison_differing_access : Note<
76   "comparison of address of fields %0 and %2 of %4 with differing access "
77   "specifiers (%1 vs %3) has unspecified value">;
78 def note_constexpr_compare_virtual_mem_ptr : Note<
79   "comparison of pointer to virtual member function %0 has unspecified value">;
80 def note_constexpr_past_end : Note<
81   "dereferenced pointer past the end of %select{|subobject of }0"
82   "%select{temporary|%2}1 is not a constant expression">;
83 def note_constexpr_past_end_subobject : Note<
84   "cannot %select{access base class of|access derived class of|access field of|"
85   "access array element of|ERROR|"
86   "access real component of|access imaginary component of}0 "
87   "pointer past the end of object">;
88 def note_non_null_attribute_failed : Note<
89   "null passed to a callee that requires a non-null argument">;
90 def note_constexpr_null_subobject : Note<
91   "cannot %select{access base class of|access derived class of|access field of|"
92   "access array element of|perform pointer arithmetic on|"
93   "access real component of|"
94   "access imaginary component of}0 null pointer">;
95 def note_constexpr_var_init_non_constant : Note<
96   "initializer of %0 is not a constant expression">;
97 def note_constexpr_typeid_polymorphic : Note<
98   "typeid applied to expression of polymorphic type %0 is "
99   "not allowed in a constant expression in C++ standards before C++2a">;
100 def note_constexpr_void_comparison : Note<
101   "comparison between unequal pointers to void has unspecified result">;
102 def note_constexpr_temporary_here : Note<"temporary created here">;
103 def note_constexpr_conditional_never_const : Note<
104   "both arms of conditional operator are unable to produce a "
105   "constant expression">;
106 def note_constexpr_depth_limit_exceeded : Note<
107   "constexpr evaluation exceeded maximum depth of %0 calls">;
108 def note_constexpr_call_limit_exceeded : Note<
109   "constexpr evaluation hit maximum call limit">;
110 def note_constexpr_step_limit_exceeded : Note<
111   "constexpr evaluation hit maximum step limit; possible infinite loop?">;
112 def note_constexpr_this : Note<
113   "%select{|implicit }0use of 'this' pointer is only allowed within the "
114   "evaluation of a call to a 'constexpr' member function">;
115 def note_constexpr_lifetime_ended : Note<
116   "%select{read of|assignment to|increment of|decrement of|member call on|"
117   "dynamic_cast of|typeid applied to}0 "
118   "%select{temporary|variable}1 whose lifetime has ended">;
119 def note_constexpr_access_uninit : Note<
120   "%select{read of|assignment to|increment of|decrement of|member call on|"
121   "dynamic_cast of|typeid applied to}0 "
122   "%select{object outside its lifetime|uninitialized object}1 "
123   "is not allowed in a constant expression">;
124 def note_constexpr_use_uninit_reference : Note<
125   "use of reference outside its lifetime "
126   "is not allowed in a constant expression">;
127 def note_constexpr_modify_const_type : Note<
128   "modification of object of const-qualified type %0 is not allowed "
129   "in a constant expression">;
130 def note_constexpr_access_volatile_type : Note<
131   "%select{read of|assignment to|increment of|decrement of|<ERROR>|<ERROR>}0 "
132   "volatile-qualified type %1 is not allowed in a constant expression">;
133 def note_constexpr_access_volatile_obj : Note<
134   "%select{read of|assignment to|increment of|decrement of|<ERROR>|<ERROR>}0 "
135   "volatile %select{temporary|object %2|member %2}1 is not allowed in "
136   "a constant expression">;
137 def note_constexpr_volatile_here : Note<
138   "volatile %select{temporary created|object declared|member declared}0 here">;
139 def note_constexpr_ltor_mutable : Note<
140   "read of mutable member %0 is not allowed in a constant expression">;
141 def note_constexpr_ltor_non_const_int : Note<
142   "read of non-const variable %0 is not allowed in a constant expression">;
143 def note_constexpr_ltor_non_constexpr : Note<
144   "read of non-constexpr variable %0 is not allowed in a constant expression">;
145 def note_constexpr_ltor_incomplete_type : Note<
146   "read of incomplete type %0 is not allowed in a constant expression">;
147 def note_constexpr_access_null : Note<
148   "%select{read of|assignment to|increment of|decrement of|member call on|"
149   "dynamic_cast of|typeid applied to}0 "
150   "dereferenced null pointer is not allowed in a constant expression">;
151 def note_constexpr_access_past_end : Note<
152   "%select{read of|assignment to|increment of|decrement of|member call on|"
153   "dynamic_cast of|typeid applied to}0 "
154   "dereferenced one-past-the-end pointer is not allowed in a constant expression">;
155 def note_constexpr_access_unsized_array : Note<
156   "%select{read of|assignment to|increment of|decrement of|member call on|"
157   "dynamic_cast of|typeid applied to}0 "
158   "element of array without known bound "
159   "is not allowed in a constant expression">;
160 def note_constexpr_access_inactive_union_member : Note<
161   "%select{read of|assignment to|increment of|decrement of|member call on|"
162   "dynamic_cast of|typeid applied to}0 "
163   "member %1 of union with %select{active member %3|no active member}2 "
164   "is not allowed in a constant expression">;
165 def note_constexpr_access_static_temporary : Note<
166   "%select{read of|assignment to|increment of|decrement of|member call on|"
167   "dynamic_cast of|typeid applied to}0 temporary "
168   "is not allowed in a constant expression outside the expression that "
169   "created the temporary">;
170 def note_constexpr_access_unreadable_object : Note<
171   "%select{read of|assignment to|increment of|decrement of|member call on|"
172   "dynamic_cast of|typeid applied to}0 object '%1' whose value is not known">;
173 def note_constexpr_modify_global : Note<
174   "a constant expression cannot modify an object that is visible outside "
175   "that expression">;
176 def note_constexpr_stmt_expr_unsupported : Note<
177   "this use of statement expressions is not supported in a "
178   "constant expression">;
179 def note_constexpr_calls_suppressed : Note<
180   "(skipping %0 call%s0 in backtrace; use -fconstexpr-backtrace-limit=0 to "
181   "see all)">;
182 def note_constexpr_call_here : Note<"in call to '%0'">;
183 def note_constexpr_inherited_ctor_call_here : Note<
184   "in implicit initialization for inherited constructor of %0">;
185 def note_constexpr_baa_insufficient_alignment : Note<
186   "%select{alignment of|offset of the aligned pointer from}0 the base pointee "
187   "object (%1 %plural{1:byte|:bytes}1) is %select{less than|not a multiple of}0 the "
188   "asserted %2 %plural{1:byte|:bytes}2">;
189 def note_constexpr_baa_value_insufficient_alignment : Note<
190   "value of the aligned pointer (%0) is not a multiple of the asserted %1 "
191   "%plural{1:byte|:bytes}1">;
192 def note_constexpr_unsupported_unsized_array : Note<
193   "array-to-pointer decay of array member without known bound is not supported">;
194 def note_constexpr_unsized_array_indexed : Note<
195   "indexing of array without known bound is not allowed "
196   "in a constant expression">;
197 def note_constexpr_memcpy_null : Note<
198   "%select{source|destination}2 of "
199   "'%select{%select{memcpy|wmemcpy}1|%select{memmove|wmemmove}1}0' "
200   "is %3">;
201 def note_constexpr_memcpy_type_pun : Note<
202   "cannot constant evaluate '%select{memcpy|memmove}0' from object of "
203   "type %1 to object of type %2">;
204 def note_constexpr_memcpy_nontrivial : Note<
205   "cannot constant evaluate '%select{memcpy|memmove}0' between objects of "
206   "non-trivially-copyable type %1">;
207 def note_constexpr_memcpy_incomplete_type : Note<
208   "cannot constant evaluate '%select{memcpy|memmove}0' between objects of "
209   "incomplete type %1">;
210 def note_constexpr_memcpy_overlap : Note<
211   "'%select{memcpy|wmemcpy}0' between overlapping memory regions">;
212 def note_constexpr_memcpy_unsupported : Note<
213   "'%select{%select{memcpy|wmemcpy}1|%select{memmove|wmemmove}1}0' "
214   "not supported: %select{"
215   "size to copy (%4) is not a multiple of size of element type %3 (%5)|"
216   "source is not a contiguous array of at least %4 elements of type %3|"
217   "destination is not a contiguous array of at least %4 elements of type %3}2">;
218 def note_constexpr_bit_cast_unsupported_type : Note<
219   "constexpr bit_cast involving type %0 is not yet supported">;
220 def note_constexpr_bit_cast_unsupported_bitfield : Note<
221   "constexpr bit_cast involving bit-field is not yet supported">;
222 def note_constexpr_bit_cast_invalid_type : Note<
223   "bit_cast %select{from|to}0 a %select{|type with a }1"
224   "%select{union|pointer|member pointer|volatile|reference}2 "
225   "%select{type|member}1 is not allowed in a constant expression">;
226 def note_constexpr_bit_cast_invalid_subtype : Note<
227   "invalid type %0 is a %select{member|base}1 of %2">;
228 def note_constexpr_bit_cast_indet_dest : Note<
229   "indeterminate value can only initialize an object of type 'unsigned char'"
230   "%select{, 'char',|}1 or 'std::byte'; %0 is invalid">;
231
232 def warn_integer_constant_overflow : Warning<
233   "overflow in expression; result is %0 with type %1">,
234   InGroup<DiagGroup<"integer-overflow">>;
235
236 // This is a temporary diagnostic, and shall be removed once our
237 // implementation is complete, and like the preceding constexpr notes belongs
238 // in Sema.
239 def note_unimplemented_constexpr_lambda_feature_ast : Note<
240     "unimplemented constexpr lambda feature: %0 (coming soon!)">;
241
242 // inline asm related.
243 let CategoryName = "Inline Assembly Issue" in {
244   def err_asm_invalid_escape : Error<
245     "invalid %% escape in inline assembly string">;
246   def err_asm_unknown_symbolic_operand_name : Error<
247     "unknown symbolic operand name in inline assembly string">;
248
249   def err_asm_unterminated_symbolic_operand_name : Error<
250     "unterminated symbolic operand name in inline assembly string">;
251   def err_asm_empty_symbolic_operand_name : Error<
252     "empty symbolic operand name in inline assembly string">;
253   def err_asm_invalid_operand_number : Error<
254     "invalid operand number in inline asm string">;
255 }
256
257 // vtable related.
258 let CategoryName = "VTable ABI Issue" in {
259   def err_vftable_ambiguous_component : Error<
260     "ambiguous vftable component for %0 introduced via covariant thunks; "
261     "this is an inherent limitation of the ABI">;
262   def note_covariant_thunk : Note<
263     "covariant thunk required by %0">;
264 }
265
266 // Importing ASTs
267 def err_odr_variable_type_inconsistent : Error<
268   "external variable %0 declared with incompatible types in different "
269   "translation units (%1 vs. %2)">;
270 def warn_odr_variable_type_inconsistent : Warning<
271   "external variable %0 declared with incompatible types in different "
272   "translation units (%1 vs. %2)">,
273   InGroup<ODR>;
274 def err_odr_variable_multiple_def : Error<
275   "external variable %0 defined in multiple translation units">;
276 def warn_odr_variable_multiple_def : Warning<
277   "external variable %0 defined in multiple translation units">,
278   InGroup<ODR>;
279 def note_odr_value_here : Note<"declared here with type %0">;
280 def note_odr_defined_here : Note<"also defined here">;
281 def err_odr_function_type_inconsistent : Error<
282   "external function %0 declared with incompatible types in different "
283   "translation units (%1 vs. %2)">;
284 def warn_odr_function_type_inconsistent : Warning<
285   "external function %0 declared with incompatible types in different "
286   "translation units (%1 vs. %2)">,
287   InGroup<ODR>;
288 def err_odr_tag_type_inconsistent
289     : Error<"type %0 has incompatible definitions in different translation "
290             "units">;
291 def warn_odr_tag_type_inconsistent
292     : Warning<"type %0 has incompatible definitions in different translation "
293               "units">,
294       InGroup<ODR>;
295 def note_odr_tag_kind_here: Note<
296   "%0 is a %select{struct|interface|union|class|enum}1 here">;
297 def note_odr_field : Note<"field %0 has type %1 here">;
298 def note_odr_field_name : Note<"field has name %0 here">;
299 def note_odr_missing_field : Note<"no corresponding field here">;
300 def note_odr_bit_field : Note<"bit-field %0 with type %1 and length %2 here">;
301 def note_odr_not_bit_field : Note<"field %0 is not a bit-field">;
302 def note_odr_base : Note<"class has base type %0">;
303 def note_odr_virtual_base : Note<
304   "%select{non-virtual|virtual}0 derivation here">;
305 def note_odr_missing_base : Note<"no corresponding base class here">;
306 def note_odr_number_of_bases : Note<
307   "class has %0 base %plural{1:class|:classes}0">;
308 def note_odr_enumerator : Note<"enumerator %0 with value %1 here">;
309 def note_odr_missing_enumerator : Note<"no corresponding enumerator here">;
310 def err_odr_field_type_inconsistent : Error<
311   "field %0 declared with incompatible types in different "
312   "translation units (%1 vs. %2)">;
313 def warn_odr_field_type_inconsistent : Warning<
314   "field %0 declared with incompatible types in different "
315   "translation units (%1 vs. %2)">,
316   InGroup<ODR>;
317
318 // Importing Objective-C ASTs
319 def err_odr_ivar_type_inconsistent : Error<
320   "instance variable %0 declared with incompatible types in different "
321   "translation units (%1 vs. %2)">;
322 def warn_odr_ivar_type_inconsistent : Warning<
323   "instance variable %0 declared with incompatible types in different "
324   "translation units (%1 vs. %2)">,
325   InGroup<ODR>;
326 def err_odr_objc_superclass_inconsistent : Error<
327   "class %0 has incompatible superclasses">;
328 def warn_odr_objc_superclass_inconsistent : Warning<
329   "class %0 has incompatible superclasses">,
330   InGroup<ODR>;
331 def note_odr_objc_superclass : Note<"inherits from superclass %0 here">;
332 def note_odr_objc_missing_superclass : Note<"no corresponding superclass here">;
333 def err_odr_objc_method_result_type_inconsistent : Error<
334   "%select{class|instance}0 method %1 has incompatible result types in "
335   "different translation units (%2 vs. %3)">;
336 def warn_odr_objc_method_result_type_inconsistent : Warning<
337   "%select{class|instance}0 method %1 has incompatible result types in "
338   "different translation units (%2 vs. %3)">,
339   InGroup<ODR>;
340 def err_odr_objc_method_num_params_inconsistent : Error<
341   "%select{class|instance}0 method %1 has a different number of parameters in "
342   "different translation units (%2 vs. %3)">;
343 def warn_odr_objc_method_num_params_inconsistent : Warning<
344   "%select{class|instance}0 method %1 has a different number of parameters in "
345   "different translation units (%2 vs. %3)">,
346   InGroup<ODR>;
347 def err_odr_objc_method_param_type_inconsistent : Error<
348   "%select{class|instance}0 method %1 has a parameter with a different types "
349   "in different translation units (%2 vs. %3)">;
350 def warn_odr_objc_method_param_type_inconsistent : Warning<
351   "%select{class|instance}0 method %1 has a parameter with a different types "
352   "in different translation units (%2 vs. %3)">,
353   InGroup<ODR>;
354 def err_odr_objc_method_variadic_inconsistent : Error<
355   "%select{class|instance}0 method %1 is variadic in one translation unit "
356   "and not variadic in another">;
357 def warn_odr_objc_method_variadic_inconsistent : Warning<
358   "%select{class|instance}0 method %1 is variadic in one translation unit "
359   "and not variadic in another">,
360   InGroup<ODR>;
361 def note_odr_objc_method_here : Note<
362   "%select{class|instance}0 method %1 also declared here">;
363 def err_odr_objc_property_type_inconsistent : Error<
364   "property %0 declared with incompatible types in different "
365   "translation units (%1 vs. %2)">;
366 def warn_odr_objc_property_type_inconsistent : Warning<
367   "property %0 declared with incompatible types in different "
368   "translation units (%1 vs. %2)">,
369   InGroup<ODR>;
370 def err_odr_objc_property_impl_kind_inconsistent : Error<
371   "property %0 is implemented with %select{@synthesize|@dynamic}1 in one "
372   "translation but %select{@dynamic|@synthesize}1 in another translation unit">;
373 def warn_odr_objc_property_impl_kind_inconsistent : Warning<
374   "property %0 is implemented with %select{@synthesize|@dynamic}1 in one "
375   "translation but %select{@dynamic|@synthesize}1 in another translation unit">,
376   InGroup<ODR>;
377 def note_odr_objc_property_impl_kind : Note<
378   "property %0 is implemented with %select{@synthesize|@dynamic}1 here">;
379 def err_odr_objc_synthesize_ivar_inconsistent : Error<
380   "property %0 is synthesized to different ivars in different translation "
381   "units (%1 vs. %2)">;
382 def warn_odr_objc_synthesize_ivar_inconsistent : Warning<
383   "property %0 is synthesized to different ivars in different translation "
384   "units (%1 vs. %2)">,
385   InGroup<ODR>;
386 def note_odr_objc_synthesize_ivar_here : Note<
387   "property is synthesized to ivar %0 here">;
388
389 // Importing C++ ASTs
390 def note_odr_friend : Note<"friend declared here">;
391 def note_odr_missing_friend : Note<"no corresponding friend here">;
392 def err_odr_different_num_template_parameters : Error<
393   "template parameter lists have a different number of parameters (%0 vs %1)">;
394 def warn_odr_different_num_template_parameters : Warning<
395   "template parameter lists have a different number of parameters (%0 vs %1)">,
396   InGroup<ODR>;
397 def note_odr_template_parameter_list : Note<
398   "template parameter list also declared here">;
399 def err_odr_different_template_parameter_kind : Error<
400   "template parameter has different kinds in different translation units">;
401 def warn_odr_different_template_parameter_kind : Warning<
402   "template parameter has different kinds in different translation units">,
403   InGroup<ODR>;
404 def note_odr_template_parameter_here : Note<
405   "template parameter declared here">;
406 def err_odr_parameter_pack_non_pack : Error<
407   "parameter kind mismatch; parameter is %select{not a|a}0 parameter pack">;
408 def warn_odr_parameter_pack_non_pack : Warning<
409   "parameter kind mismatch; parameter is %select{not a|a}0 parameter pack">,
410   InGroup<ODR>;
411 def note_odr_parameter_pack_non_pack : Note<
412   "%select{parameter|parameter pack}0 declared here">;
413 def err_odr_non_type_parameter_type_inconsistent : Error<
414   "non-type template parameter declared with incompatible types in different "
415   "translation units (%0 vs. %1)">;
416 def warn_odr_non_type_parameter_type_inconsistent : Warning<
417   "non-type template parameter declared with incompatible types in different "
418   "translation units (%0 vs. %1)">,
419   InGroup<ODR>;
420 def err_unsupported_ast_node: Error<"cannot import unsupported AST node %0">;
421
422 def remark_sanitize_address_insert_extra_padding_accepted : Remark<
423     "-fsanitize-address-field-padding applied to %0">, ShowInSystemHeader,
424     InGroup<SanitizeAddressRemarks>;
425 def remark_sanitize_address_insert_extra_padding_rejected : Remark<
426     "-fsanitize-address-field-padding ignored for %0 because it "
427     "%select{is not C++|is packed|is a union|is trivially copyable|"
428     "has trivial destructor|is standard layout|is in a blacklisted file|"
429     "is blacklisted}1">, ShowInSystemHeader,
430     InGroup<SanitizeAddressRemarks>;
431
432 def warn_npot_ms_struct : Warning<
433   "ms_struct may not produce Microsoft-compatible layouts with fundamental "
434   "data types with sizes that aren't a power of two">,
435   DefaultError, InGroup<IncompatibleMSStruct>;
436
437 // -Wpadded, -Wpacked
438 def warn_padded_struct_field : Warning<
439   "padding %select{struct|interface|class}0 %1 with %2 "
440   "%select{byte|bit}3%s2 to align %4">,
441   InGroup<Padded>, DefaultIgnore;
442 def warn_padded_struct_anon_field : Warning<
443   "padding %select{struct|interface|class}0 %1 with %2 "
444   "%select{byte|bit}3%s2 to align anonymous bit-field">,
445   InGroup<Padded>, DefaultIgnore;
446 def warn_padded_struct_size : Warning<
447   "padding size of %0 with %1 %select{byte|bit}2%s1 to alignment boundary">,
448   InGroup<Padded>, DefaultIgnore;
449 def warn_unnecessary_packed : Warning<
450   "packed attribute is unnecessary for %0">, InGroup<Packed>, DefaultIgnore;
451 }