Home | History | Annotate | Download | only in Basic
      1 //==--- DiagnosticASTKinds.td - libast diagnostics ------------------------===//
      2 //
      3 //                     The LLVM Compiler Infrastructure
      4 //
      5 // This file is distributed under the University of Illinois Open Source
      6 // License. See LICENSE.TXT for details.
      7 //
      8 //===----------------------------------------------------------------------===//
      9 
     10 let Component = "AST" in {
     11 
     12 // Constant expression diagnostics. These (and their users) belong in Sema.
     13 def note_expr_divide_by_zero : Note<"division by zero">;
     14 def note_constexpr_invalid_cast : Note<
     15   "%select{reinterpret_cast|dynamic_cast|cast that performs the conversions of"
     16   " a reinterpret_cast|cast from %1}0 is not allowed in a constant expression">;
     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 virtual function call in a constant expression">;
     36 def note_constexpr_virtual_base : Note<
     37   "cannot construct object of type %0 with virtual base class "
     38   "in a constant expression">;
     39 def note_constexpr_nonliteral : Note<
     40   "non-literal type %0 cannot be used in a constant expression">;
     41 def note_constexpr_non_global : Note<
     42   "%select{pointer|reference}0 to %select{|subobject of }1"
     43   "%select{temporary|%3}2 is not a constant expression">;
     44 def note_constexpr_uninitialized : Note<
     45   "%select{|sub}0object of type %1 is not initialized">;
     46 def note_constexpr_array_index : Note<"cannot refer to element %0 of "
     47   "%select{array of %2 elements|non-array object}1 in a constant expression">;
     48 def note_constexpr_float_arithmetic : Note<
     49   "floating point arithmetic produces %select{an infinity|a NaN}0">;
     50 def note_constexpr_pointer_subtraction_not_same_array : Note<
     51   "subtracted pointers are not elements of the same array">;
     52 def note_constexpr_pointer_subtraction_zero_size : Note<
     53   "subtraction of pointers to type %0 of zero size">;
     54 def note_constexpr_pointer_comparison_base_classes : Note<
     55   "comparison of addresses of subobjects of different base classes "
     56   "has unspecified value">;
     57 def note_constexpr_pointer_comparison_base_field : Note<
     58   "comparison of address of base class subobject %0 of class %1 to field %2 "
     59   "has unspecified value">;
     60 def note_constexpr_pointer_comparison_differing_access : Note<
     61   "comparison of address of fields %0 and %2 of %4 with differing access "
     62   "specifiers (%1 vs %3) has unspecified value">;
     63 def note_constexpr_compare_virtual_mem_ptr : Note<
     64   "comparison of pointer to virtual member function %0 has unspecified value">;
     65 def note_constexpr_past_end : Note<
     66   "dereferenced pointer past the end of %select{|subobject of }0"
     67   "%select{temporary|%2}1 is not a constant expression">;
     68 def note_constexpr_past_end_subobject : Note<
     69   "cannot %select{access base class of|access derived class of|access field of|"
     70   "access array element of|ERROR|call member function on|"
     71   "access real component of|access imaginary component of}0 "
     72   "pointer past the end of object">;
     73 def note_constexpr_null_subobject : Note<
     74   "cannot %select{access base class of|access derived class of|access field of|"
     75   "access array element of|perform pointer arithmetic on|"
     76   "call member function on|access real component of|"
     77   "access imaginary component of}0 null pointer">;
     78 def note_constexpr_var_init_non_constant : Note<
     79   "initializer of %0 is not a constant expression">;
     80 def note_constexpr_typeid_polymorphic : Note<
     81   "typeid applied to expression of polymorphic type %0 is "
     82   "not allowed in a constant expression">;
     83 def note_constexpr_void_comparison : Note<
     84   "comparison between unequal pointers to void has unspecified result">;
     85 def note_constexpr_temporary_here : Note<"temporary created here">;
     86 def note_constexpr_conditional_never_const : Note<
     87   "both arms of conditional operator are unable to produce a "
     88   "constant expression">;
     89 def note_constexpr_depth_limit_exceeded : Note<
     90   "constexpr evaluation exceeded maximum depth of %0 calls">;
     91 def note_constexpr_call_limit_exceeded : Note<
     92   "constexpr evaluation hit maximum call limit">;
     93 def note_constexpr_step_limit_exceeded : Note<
     94   "constexpr evaluation hit maximum step limit; possible infinite loop?">;
     95 def note_constexpr_this : Note<
     96   "%select{|implicit }0use of 'this' pointer is only allowed within the "
     97   "evaluation of a call to a 'constexpr' member function">;
     98 def note_constexpr_lifetime_ended : Note<
     99   "%select{read of|assignment to|increment of|decrement of}0 "
    100   "%select{temporary|variable}1 whose lifetime has ended">;
    101 def note_constexpr_access_uninit : Note<
    102   "%select{read of|assignment to|increment of|decrement of}0 "
    103   "object outside its lifetime is not allowed in a constant expression">;
    104 def note_constexpr_use_uninit_reference : Note<
    105   "use of reference outside its lifetime "
    106   "is not allowed in a constant expression">;
    107 def note_constexpr_modify_const_type : Note<
    108   "modification of object of const-qualified type %0 is not allowed "
    109   "in a constant expression">;
    110 def note_constexpr_access_volatile_type : Note<
    111   "%select{read of|assignment to|increment of|decrement of}0 "
    112   "volatile-qualified type %1 is not allowed in a constant expression">;
    113 def note_constexpr_access_volatile_obj : Note<
    114   "%select{read of|assignment to|increment of|decrement of}0 volatile "
    115   "%select{temporary|object %2|member %2}1 is not allowed in "
    116   "a constant expression">;
    117 def note_constexpr_ltor_mutable : Note<
    118   "read of mutable member %0 is not allowed in a constant expression">;
    119 def note_constexpr_ltor_non_const_int : Note<
    120   "read of non-const variable %0 is not allowed in a constant expression">;
    121 def note_constexpr_ltor_non_constexpr : Note<
    122   "read of non-constexpr variable %0 is not allowed in a constant expression">;
    123 def note_constexpr_access_null : Note<
    124   "%select{read of|assignment to|increment of|decrement of}0 "
    125   "dereferenced null pointer is not allowed in a constant expression">;
    126 def note_constexpr_access_past_end : Note<
    127   "%select{read of|assignment to|increment of|decrement of}0 "
    128   "dereferenced one-past-the-end pointer is not allowed in a constant expression">;
    129 def note_constexpr_access_inactive_union_member : Note<
    130   "%select{read of|assignment to|increment of|decrement of}0 "
    131   "member %1 of union with %select{active member %3|no active member}2 "
    132   "is not allowed in a constant expression">;
    133 def note_constexpr_access_static_temporary : Note<
    134   "%select{read of|assignment to|increment of|decrement of}0 temporary "
    135   "is not allowed in a constant expression outside the expression that "
    136   "created the temporary">;
    137 def note_constexpr_modify_global : Note<
    138   "a constant expression cannot modify an object that is visible outside "
    139   "that expression">;
    140 def note_constexpr_stmt_expr_unsupported : Note<
    141   "this use of statement expressions is not supported in a "
    142   "constant expression">;
    143 def note_constexpr_calls_suppressed : Note<
    144   "(skipping %0 call%s0 in backtrace; use -fconstexpr-backtrace-limit=0 to "
    145   "see all)">;
    146 def note_constexpr_call_here : Note<"in call to '%0'">;
    147 def note_constexpr_inherited_ctor_call_here : Note<
    148   "in implicit initialization for inherited constructor of %0">;
    149 def note_constexpr_baa_insufficient_alignment : Note<
    150   "%select{alignment of|offset of the aligned pointer from}0 the base pointee "
    151   "object (%1 %plural{1:byte|:bytes}1) is %select{less than|not a multiple of}0 the "
    152   "asserted %2 %plural{1:byte|:bytes}2">;
    153 def note_constexpr_baa_value_insufficient_alignment : Note<
    154   "value of the aligned pointer (%0) is not a multiple of the asserted %1 "
    155   "%plural{1:byte|:bytes}1">;
    156 
    157 def warn_integer_constant_overflow : Warning<
    158   "overflow in expression; result is %0 with type %1">,
    159   InGroup<DiagGroup<"integer-overflow">>;
    160 
    161 // This is a temporary diagnostic, and shall be removed once our 
    162 // implementation is complete, and like the preceding constexpr notes belongs
    163 // in Sema.
    164 def note_unimplemented_constexpr_lambda_feature_ast : Note<
    165     "unimplemented constexpr lambda feature: %0 (coming soon!)">;
    166 
    167 // inline asm related.
    168 let CategoryName = "Inline Assembly Issue" in {
    169   def err_asm_invalid_escape : Error<
    170     "invalid %% escape in inline assembly string">;
    171   def err_asm_unknown_symbolic_operand_name : Error<
    172     "unknown symbolic operand name in inline assembly string">;
    173 
    174   def err_asm_unterminated_symbolic_operand_name : Error<
    175     "unterminated symbolic operand name in inline assembly string">;
    176   def err_asm_empty_symbolic_operand_name : Error<
    177     "empty symbolic operand name in inline assembly string">;
    178   def err_asm_invalid_operand_number : Error<
    179     "invalid operand number in inline asm string">;
    180 }
    181 
    182 // vtable related.
    183 let CategoryName = "VTable ABI Issue" in {
    184   def err_vftable_ambiguous_component : Error<
    185     "ambiguous vftable component for %0 introduced via covariant thunks; "
    186     "this is an inherent limitation of the ABI">;
    187   def note_covariant_thunk : Note<
    188     "covariant thunk required by %0">;
    189 }
    190 
    191 // Importing ASTs
    192 def err_odr_variable_type_inconsistent : Error<
    193   "external variable %0 declared with incompatible types in different "
    194   "translation units (%1 vs. %2)">;
    195 def err_odr_variable_multiple_def : Error<
    196   "external variable %0 defined in multiple translation units">;
    197 def note_odr_value_here : Note<"declared here with type %0">;
    198 def note_odr_defined_here : Note<"also defined here">;
    199 def err_odr_function_type_inconsistent : Error<
    200   "external function %0 declared with incompatible types in different "
    201   "translation units (%1 vs. %2)">;
    202 def warn_odr_tag_type_inconsistent : Warning<
    203   "type %0 has incompatible definitions in different translation units">,
    204   InGroup<DiagGroup<"odr">>;
    205 def note_odr_tag_kind_here: Note<
    206   "%0 is a %select{struct|interface|union|class|enum}1 here">;
    207 def note_odr_field : Note<"field %0 has type %1 here">;
    208 def note_odr_missing_field : Note<"no corresponding field here">;
    209 def note_odr_bit_field : Note<"bit-field %0 with type %1 and length %2 here">;
    210 def note_odr_not_bit_field : Note<"field %0 is not a bit-field">;
    211 def note_odr_base : Note<"class has base type %0">;
    212 def note_odr_virtual_base : Note<
    213   "%select{non-virtual|virtual}0 derivation here">;
    214 def note_odr_missing_base : Note<"no corresponding base class here">;
    215 def note_odr_number_of_bases : Note<
    216   "class has %0 base %plural{1:class|:classes}0">;
    217 def note_odr_enumerator : Note<"enumerator %0 with value %1 here">;
    218 def note_odr_missing_enumerator : Note<"no corresponding enumerator here">;
    219 
    220 def err_odr_field_type_inconsistent : Error<
    221   "field %0 declared with incompatible types in different "
    222   "translation units (%1 vs. %2)">;
    223 
    224 // Importing Objective-C ASTs
    225 def err_odr_ivar_type_inconsistent : Error<
    226   "instance variable %0 declared with incompatible types in different "
    227   "translation units (%1 vs. %2)">;
    228 def err_odr_objc_superclass_inconsistent : Error<
    229   "class %0 has incompatible superclasses">;
    230 def note_odr_objc_superclass : Note<"inherits from superclass %0 here">;
    231 def note_odr_objc_missing_superclass : Note<"no corresponding superclass here">;
    232 def err_odr_objc_method_result_type_inconsistent : Error<
    233   "%select{class|instance}0 method %1 has incompatible result types in "
    234   "different translation units (%2 vs. %3)">;
    235 def err_odr_objc_method_num_params_inconsistent : Error<
    236   "%select{class|instance}0 method %1 has a different number of parameters in "
    237   "different translation units (%2 vs. %3)">;
    238 def err_odr_objc_method_param_type_inconsistent : Error<
    239   "%select{class|instance}0 method %1 has a parameter with a different types "
    240   "in different translation units (%2 vs. %3)">;
    241 def err_odr_objc_method_variadic_inconsistent : Error<
    242   "%select{class|instance}0 method %1 is variadic in one translation unit "
    243   "and not variadic in another">;
    244 def note_odr_objc_method_here : Note<
    245   "%select{class|instance}0 method %1 also declared here">;
    246 def err_odr_objc_property_type_inconsistent : Error<
    247   "property %0 declared with incompatible types in different "
    248   "translation units (%1 vs. %2)">;
    249 def err_odr_objc_property_impl_kind_inconsistent : Error<
    250   "property %0 is implemented with %select{@synthesize|@dynamic}1 in one "
    251   "translation but %select{@dynamic|@synthesize}1 in another translation unit">;
    252 def note_odr_objc_property_impl_kind : Note<
    253   "property %0 is implemented with %select{@synthesize|@dynamic}1 here">;
    254 def err_odr_objc_synthesize_ivar_inconsistent : Error<
    255   "property %0 is synthesized to different ivars in different translation "
    256   "units (%1 vs. %2)">;
    257 def note_odr_objc_synthesize_ivar_here : Note<
    258   "property is synthesized to ivar %0 here">;
    259 
    260 // Importing C++ ASTs
    261 def err_odr_different_num_template_parameters : Error<
    262   "template parameter lists have a different number of parameters (%0 vs %1)">;
    263 def note_odr_template_parameter_list : Note<
    264   "template parameter list also declared here">;
    265 def err_odr_different_template_parameter_kind : Error<
    266   "template parameter has different kinds in different translation units">;
    267 def note_odr_template_parameter_here : Note<
    268   "template parameter declared here">;
    269 def err_odr_parameter_pack_non_pack : Error<
    270   "parameter kind mismatch; parameter is %select{not a|a}0 parameter pack">;
    271 def note_odr_parameter_pack_non_pack : Note<
    272   "%select{parameter|parameter pack}0 declared here">;
    273 def err_odr_non_type_parameter_type_inconsistent : Error<
    274   "non-type template parameter declared with incompatible types in different "
    275   "translation units (%0 vs. %1)">;
    276 def err_unsupported_ast_node: Error<"cannot import unsupported AST node %0">;
    277 }
    278