PR c++/77338
[official-gcc.git] / gcc / cp / ChangeLog
blob0c7d35140bfb4745d50d8e7d820ae67b031f0a54
1 2016-09-16  Jakub Jelinek  <jakub@redhat.com>
3         PR c++/77338
4         * constexpr.c (cxx_eval_constant_expression) <case PARM_DECL>: Only
5         call is_really_empty_class on complete types.
7         PR c++/77375
8         * class.c (check_bases): Set CLASSTYPE_HAS_MUTABLE if any
9         TYPE_HAS_MUTABLE_P for any bases.
11 2016-09-16  Jason Merrill  <jason@redhat.com>
13         * class.c (check_bases, set_one_vmethod_tm_attributes): Use
14         least_bit_hwi.
15         * decl.c (cxx_init_decl_processing): Use pow2p_hwi.
16         * parser.c (cp_parser_cilk_simd_vectorlength): Use pow2p_hwi.
18 2016-09-14  Jakub Jelinek  <jakub@redhat.com>
20         PR c++/77549
21         * name-lookup.c (consider_binding_level): Look through TREE_LIST
22         and OVERLOAD.
24 2016-09-14  Marek Polacek  <polacek@redhat.com>
26         * typeck.c (cp_build_unary_op): Diagnose incrementing boolean
27         expressions.  Tweak an error message.
29 2016-09-14  Marek Polacek  <polacek@redhat.com>
31         * cp-tree.h (cp_build_unary_op): Change nonconvert parameter type to
32         bool.
33         * decl2.c (one_static_initialization_or_destruction): Use true instead
34         of 1.
35         * init.c (build_vec_init): Use false instead of 0.
36         * pt.c (tsubst_copy_and_build): Likewise.
37         * semantics.c (simplify_loop_decl_cond): Likewise.
38         * typeck.c (rationalize_conditional_expr): Likewise.
39         (cp_build_binary_op): Use true instead of 1.
40         (cp_build_unary_op): Change nonconvert parameter type to bool.  Use true
41         instead of 1.
42         (build_unary_op): Change nonconvert parameter type to bool.
43         (unary_complex_lvalue): Use false instead of 0.
45 2016-09-13  Jakub Jelinek  <jakub@redhat.com>
47         Implement P0028R4, C++17 using attribute namespaces without repetition
48         * parser.c (cp_parser_std_attribute): Add ATTR_NS argument.  Diagnose
49         non-NULL ATTR_NS with scoped attribute token.  Handle non-NULL
50         ATTR_NS with non-scoped attribute tokens.  Allow named ops in
51         identifier after ::.
52         (cp_parser_std_attribute_list): Add ATTR_NS argument, pass it down
53         to cp_parser_std_attribute calls.
54         (cp_parser_std_attribute_spec): Parse optional C++17
55         attribute-using-prefix, adjust grammar in function comment.
57         PR c++/77553
58         * constexpr.c (cxx_fold_pointer_plus_expression): New function.
59         (cxx_eval_binary_expression): Use it for POINTER_PLUS_EXPR.
60         (cxx_eval_pointer_plus_expression): Remove.
61         (cxx_eval_constant_expression) <case POINTER_PLUS_EXPR>: Don't
62         call cxx_eval_pointer_plus_expression.
64 2016-09-13  David Malcolm  <dmalcolm@redhat.com>
66         * parser.c (cp_parser_class_specifier_1): Update for renaming of
67         add_fixit_insert to add_fixit_insert_before.
68         (cp_parser_class_head): Likewise.
70 2016-09-12  Bernd Edlinger  <bernd.edlinger@hotmail.de>
72         PR c++/77496
73         * call.c (build_conditional_expr_1): Call warn_for_omitted_condop.
74         * class.c (instantiate_type): Look through the SAVE_EXPR.
76 2016-09-09  Jason Merrill  <jason@redhat.com>
78         Implement P0035R4, C++17 new of over-aligned types.
79         * cp-tree.h (enum cp_tree_index): Add CPTI_ALIGN_TYPE.
80         (align_type_node): New macro.
81         * call.c (build_operator_new_call): Handle C++17 aligned new.
82         (second_parm_is_size_t, build_op_delete_call): Likewise.
83         (non_placement_deallocation_fn_p): Likewise. Rename to
84         usual_deallocation_fn_p.
85         (aligned_allocation_fn_p, aligned_deallocation_fn_p): New.
86         * decl.c (cxx_init_decl_processing): Add aligned new support.
87         * init.c (type_has_new_extended_alignment): New.
88         (build_new_1): Handle aligned new.
89         * tree.c (vec_copy_and_insert): New.
91 2016-09-02  Jakub Jelinek  <jakub@redhat.com>
93         PR sanitizer/77396
94         * decl2.c (do_static_initialization_or_destruction): Only
95         call asan_dynamic_init_call if INITP is true.
97 2016-09-01  Martin Sebor  <msebor@redhat.com>
99         * mangle.c: Increase buffer size to guarantee it fits the output
100         of the formatted function regardless of its arguments.
102 2016-09-01  Marek Polacek  <polacek@redhat.com>
104         PR c/7652
105         * error.c (dump_type): Fix falls through comment.
106         (dump_decl): Likewise.
107         (dump_expr): Likewise.
109 2016-08-30  David Malcolm  <dmalcolm@redhat.com>
111         * parser.c (cp_parser_enclosed_template_argument_list): Add fix-it
112         hint to ">>" within nested template argument list error.
114 2016-08-30  David Malcolm  <dmalcolm@redhat.com>
116         * name-lookup.c (suggest_alternatives_for): Use add_fixit_replace
117         rather than add_fixit_misspelled_id.
118         * parser.c (cp_parser_diagnose_invalid_type_name): Likewise.
120 2016-08-29  Jason Merrill  <jason@redhat.com>
122         PR c++/77379
123         * mangle.c (maybe_check_abi_tags): Add version parm, handle thunks.
124         (mangle_thunk): Add thunk parameter.
125         * method.c (finish_thunk): Pass it.
126         * cp-tree.h: Declare it.
128 2016-08-15  Jason Merrill  <jason@redhat.com>
130         Avoid calling a trivial default constructor.
131         * class.c (default_ctor_p): New.
132         (in_class_defaulted_default_constructor): Use it.
133         (type_has_non_user_provided_default_constructor): Use it.
134         * call.c (build_over_call): Handle trivial default constructor.
135         * cp-tree.h: Declare default_ctor_p.
137         PR c++/57728
138         * pt.c (do_type_instantiation): Don't mess with non-user-provided
139         member functions.
141 2016-08-25  Marek Polacek  <polacek@redhat.com>
143         * parser.c (cp_parser_binary_expression): Pass LHS to
144         warn_logical_not_parentheses.
146 2016-08-18  Marek Polacek  <polacek@redhat.com>
148         PR c/7652
149         * call.c (add_builtin_candidate): Add gcc_fallthrough.
150         * cxx-pretty-print.c (pp_cxx_unqualified_id): Likewise.
151         * parser.c (cp_parser_skip_to_end_of_statement): Likewise.
152         (cp_parser_cache_defarg): Likewise.
154 2016-08-12  Marek Polacek  <polacek@redhat.com>
156         PR c/7652
157         * call.c (add_builtin_candidate): Add FALLTHRU.
158         (build_integral_nontype_arg_conv): Adjust fall through comment.
159         (build_new_op_1): Add FALLTHRU.
160         (convert_like_real): Adjust fall through comment.
161         * class.c (fixed_type_or_null): Likewise.
162         * constexpr.c (cxx_eval_constant_expression): Likewise.
163         (potential_constant_expression_1): Likewise.  Add FALLTHRU.
164         * cp-gimplify.c (cp_gimplify_expr): Adjust fall through comment.
165         (cp_fold): Add FALLTHRU.
166         * cvt.c (build_expr_type_conversion): Adjust fall through comment.
167         * cxx-pretty-print.c (pp_cxx_unqualified_id): Add FALLTHRU.
168         (pp_cxx_qualified_id): Likewise.
169         (cxx_pretty_printer::constant): Adjust fall through comment.
170         (cxx_pretty_printer::primary_expression): Add FALLTHRU.
171         (pp_cxx_pm_expression): Adjust fall through comment.
172         (cxx_pretty_printer::expression): Add FALLTHRU.
173         (cxx_pretty_printer::declaration_specifiers): Reformat code.
174         (pp_cxx_type_specifier_seq): Adjust fall through comment.
175         (pp_cxx_ptr_operator): Likewise.  Add FALLTHRU.
176         * error.c (dump_type): Adjust fall through comment.
177         (dump_decl): Likewise.
178         * mangle.c (write_type): Likewise.
179         * method.c (synthesized_method_walk): Add FALLTHRU.
180         * name-lookup.c (arg_assoc_type): Likewise.
181         * parser.c (cp_lexer_print_token): Adjust fall through comment.
182         (cp_parser_primary_expression): Add FALLTHRU.
183         (cp_parser_operator): Likewise.
184         * pt.c (find_parameter_packs_r): Likewise.
185         (tsubst_aggr_type): Adjust fall through comment.
186         * semantics.c (finish_omp_clauses): Add FALLTHRU.
187         * tree.c (lvalue_kind): Likewise.
189 2016-08-12  Alexandre Oliva  <aoliva@redhat.com>
191         PR debug/63240
192         * cp-objcp-common.c (cp_function_decl_defaulted): New.
193         (cp_function_decl_explicit_p): Const_tree-ify.
194         (cp_function_decl_deleted_p): Likewise.
195         * cp-objcp-common.h (cp_function_decl_defaulted): Declare.
196         (cp_function_decl_explicit_p): Const_tree-ify.
197         (cp_function_decl_deleted_p): Likewise.
198         (LANG_HOOKS_FUNCTION_DECL_DEFAULTED): Redefine.
200 2016-08-11  Jakub Jelinek  <jakub@redhat.com>
202         PR c++/72868
203         * constexpr.c (label_matches): Handle case range expressions.
205 2016-08-11  Jason Merrill  <jason@redhat.com>
207         PR c++/73456
208         * logic.cc (non_atomic_constraint_p): Handle EXPR_PACK_EXPANSION.
210 2016-08-10  Jason Merrill  <jason@redhat.com>
212         Implement C++17 constexpr if.
213         * cp-tree.h (IF_STMT_CONSTEXPR_P): New.
214         * name-lookup.c (push_to_top_level, pop_from_top_level_1): Handle it.
215         * parser.h (struct cp_parser): Add in_discarded_stmt field.
216         * parser.c (cp_parser_selection_statement): Handle 'if constexpr'.
217         (cp_parser_jump_statement): Avoid deducing from a discarded return.
218         * pt.c (tsubst_expr): Only instantiate taken branch of constexpr if.
219         * semantics.c (begin_if_stmt): Set the binding level this_entity.
220         (finish_if_stmt_cond): Require the condition of a
221         constexpr if to be constant.
222         * decl.c (level_for_constexpr_if): New.
223         (named_label_entry): Add in_constexpr_if field.
224         (poplevel_named_label_1): Set it.
225         (check_goto): Check it.
226         (check_previous_goto_1): Check level_for_constexpr_if.
228 2016-08-09  Jason Merrill  <jason@redhat.com>
230         PR c++/68703
231         * decl2.c (any_dependent_type_attributes_p): New.
232         * pt.c (dependent_type_p_r, type_dependent_expression_p): Check it.
233         * semantics.c (finish_id_expression): Check it.
234         * typeck.c (finish_class_member_access_expr): Check it.
236         PR c++/71712
237         * class.c (check_abi_tags): Don't duplicate tags for conversion ops.
239         Adjust mangling of ABI tags on class template member functions.
240         * class.c (missing_abi_tags): New.
241         (check_abi_tags): Don't check template. Add just_checking mode.
242         * mangle.c (abi_flag_at_least, any_abi_below, equal_abi_tags): New.
243         (sorted_abi_tags): Split out from write_abi_tags.
244         (struct releasing_vec): New.
245         (write_unqualified_name): Only look for the primary
246         template for types.  Implement backward compatibility.
248         PR c++/72849
249         * constexpr.c (cxx_eval_constant_expression): Check
250         COMPLETE_TYPE_P before calling is_really_empty_class.
251         * class.c (is_really_empty_class): Don't call complete_type.
253         PR c++/56701
254         * typeck.c (cp_build_addr_expr_1): Remove special *this handling.
256 2016-08-09  Jakub Jelinek  <jakub@redhat.com>
258         PR c++/72809
259         * rtti.c (get_pseudo_ti_index): Return TK_CLASS_TYPE for
260         builtin aggregate types without TYPE_BINFO.
262 2016-08-08  Jason Merrill  <jason@redhat.com>
264         Implement C++17 constexpr lambda.
265         * class.c (finalize_literal_type_property): Handle lambdas.
266         * constexpr.c (is_valid_constexpr_fn): Likewise.  No longer static.
267         (explain_invalid_constexpr_fn, cxx_eval_call_expression): Handle
268         lambdas.
269         (cxx_eval_constant_expression): Handle capture proxy.
270         (var_in_constexpr_fn): Don't check for C++14.
271         (var_in_maybe_constexpr_fn): New.
272         (potential_constant_expression_1): Use it.  Check DECL_EXPR for
273         declarations not allowed in constexpr function.  Handle
274         STATIC_ASSERT, RANGE_FOR_STMT.
275         * decl.c (make_rtl_for_nonlocal_decl): Use var_in_maybe_constexpr_fn.
276         (finish_function): Set DECL_DECLARED_CONSTEXPR_P on lambda members.
277         * lambda.c (begin_lambda_type): Set CLASSTYPE_LITERAL_P.
278         (maybe_add_lambda_conv_op): Clear thunk CALL_EXPR location.
279         (lambda_static_thunk_p): New.
280         * parser.c (cp_keyword_starts_decl_specifier_p): Add RID_CONSTEXPR.
281         (CP_PARSER_FLAGS_ONLY_MUTABLE_OR_CONSTEXPR): New enumerator.
282         (cp_parser_decl_specifier_seq): Handle it.
283         (cp_parser_lambda_declarator_opt): Use cp_parser_decl_specifier_seq.
284         * pt.c (instantiate_class_template_1): Set CLASSTYPE_LITERAL_P.
285         (tsubst_copy_and_build) [CALL_EXPR]: Propagate CALL_FROM_THUNK_P.
286         * error.c (dump_function_decl): Check TFF_NO_TEMPLATE_BINDINGS.
287         (dump_expr) [FUNCTION_DECL]: Pass it.
289 2016-08-08  Jason Merrill  <jason@redhat.com>
291         PR c++/67131
292         * class.c (is_really_empty_class): Call complete_type.
293         * constexpr.c (cxx_eval_constant_expression): Check
294         is_really_empty_class.
295         (potential_constant_expression_1): Likewise.  Check for error type.
297 2016-08-08  Jakub Jelinek  <jakub@redhat.com>
299         PR c++/58706
300         * parser.c: Include tree-iterator.h.
301         (cp_parser_omp_for_loop_init): Move lambda DECL_EXPRs from init
302         to FOR_BLOCK.
303         (cp_parser_omp_for_loop): Handle non-STATEMENT_LIST FOR_BLOCK
304         entries.
306 2016-08-06  Jonathan Wakely  <jwakely@redhat.com>
308         * call.c (convert_like_real): Harmonize diagnostics for invalid
309         reference binding.
311 2016-08-05  Martin Sebor  <msebor@redhat.com>
313         * constexpr.c (cxx_eval_store_expression): Remove hyphen from
314         the spelling of "constant-expression" in diagnostic messages
315         for consistency.
316         (cxx_eval_constant_expression): Same.
317         (cxx_eval_outermost_constant_expr): Same.
318         (potential_constant_expression_1): Same.
320 2016-08-05  Nathan Sidwell  <nathan@acm.org>
322         PR c++/68724
323         * pt.c (unify): TRAIT_EXPR is an expr.
325 2016-08-04  Paolo Carlini  <paolo.carlini@oracle.com>
327         PR c++/72800
328         * lambda.c (add_capture): Check lambda_capture_field_type return
329         value for error_mark_node.
331 2016-08-04  Patrick Palka  <ppalka@gcc.gnu.org>
333         PR c++/72759
334         * pt.c (tsubst_qualified_id): Return error_mark_node if
335         template_args is error_mark_node.
337 2016-08-04  Jason Merrill  <jason@redhat.com>
339         PR c++/72415
340         * pt.c (tsubst_pack_expansion): Pull a single pack expansion out
341         of the TREE_VEC.
343         * cp-tree.h (TYPE_UNNAMED_P): Rename from TYPE_ANONYMOUS_P.
344         (TYPE_WAS_UNNAMED): Rename from TYPE_WAS_ANONYMOUS.
345         * class.c, decl.c, decl2.c, error.c, lambda.c, mangle.c,
346         name-lookup.c, parser.c, pt.c, semantics.c, tree.c: Adjust.
348         PR c++/72796
349         * typeck.c (finish_class_member_access_expr): Avoid stripping
350         SCOPE_REF to dependent base.
352 2016-08-04  Thomas Schwinge  <thomas@codesourcery.com>
354         * parser.c (cp_ensure_no_oacc_routine): Improve diagnostics.
355         (cp_parser_late_parsing_cilk_simd_fn_info): Fix diagnostics.
356         (cp_parser_late_parsing_oacc_routine, cp_finalize_oacc_routine):
357         Simplify code, and improve diagnostics.
358         (cp_parser_oacc_routine): Likewise.  Move pragma context
359         checking...
360         (cp_parser_pragma): ... here.
362         * parser.h (struct cp_omp_declare_simd_data): New.
363         (struct cp_parser): Use it for oacc_routine member.
364         * parser.c (cp_ensure_no_oacc_routine, cp_parser_oacc_routine)
365         (cp_parser_late_parsing_oacc_routine, cp_finalize_oacc_routine):
366         Use it.  Simplify code.
367         (cp_parser_new): Initialize all members pointing to special
368         parsing data structures.
369         (cp_parser_cilk_simd_fn_vector_attrs): Initialize
370         parser->cilk_simd_fn_info->clauses.
371         (cp_parser_omp_declare_simd): Initialize
372         parser->omp_declare_simd->clauses.
373         (cp_parser_late_parsing_omp_declare_simd): Simplify code.
375 2016-08-04  Marek Polacek  <polacek@redhat.com>
377         PR c++/70229
378         * constexpr.c (check_constexpr_ctor_body_1): Allow typedef
379         declarations.
381 2016-08-01  Jason Merrill  <jason@redhat.com>
383         * mangle.c (mangle_decl): Warn about mangled name change even if
384         DECL_REALLY_EXTERN.
386         * mangle.c (get_abi_tags): New.
387         (find_substitution, write_unqualified_name, write_abi_tags)
388         (maybe_check_abi_tags): Use it.
390         * mangle.c (mangle_decl): Fix mangled name change warning.
392         PR c++/72766
393         * constexpr.c (cxx_eval_pointer_plus_expression): Check constancy
394         of nelts.
395         * cp-gimplify.c (cp_fully_fold): Only maybe_constant_value in
396         C++11 and up.
398 2016-07-30  Martin Sebor  <msebor@redhat.com>
400         PR c++/60760
401         PR c++/71091
402         * constexpr.c (cxx_eval_binary_expression): Reject invalid expressions
403         involving null pointers.
404         (cxx_eval_component_reference): Reject null pointer dereferences.
405         (cxx_eval_indirect_ref): Reject indirecting through null pointers.
406         (cxx_eval_constant_expression): Reject invalid expressions involving
407         null pointers.
409 2016-07-29  Marek Polacek  <polacek@redhat.com>
411         PR c/71926
412         * semantics.c (maybe_convert_cond): Use the location of COND for the
413         parentheses warning.
415 2016-07-29  Jason Merrill  <jason@redhat.com>
417         * decl.c (build_enumerator): Tweak diagnostic.
419         PR c++/72457
420         * init.c (expand_aggr_init_1): Only handle value-init of bases.
421         * constexpr.c (build_data_member_initialization): Handle multiple
422         initializers for the same field.
424 2016-07-28  Paolo Carlini  <paolo.carlini@oracle.com>
426         PR c++/71665
427         * decl.c (build_enumerator): Check the type of the enumerator before
428         calling cxx_constant_value.
430 2016-07-27  Jason Merrill  <jason@redhat.com>
432         PR c++/71747
433         * pt.c (get_partial_spec_bindings): Replace tparms and spec_args
434         parameters with spec_tmpl.  Call push_tinst_level.
435         (most_specialized_partial_spec): Adjust.
436         (more_specialized_partial_spec): Adjust.
438 2016-07-25  Jason Merrill  <jason@redhat.com>
440         PR c++/65970
441         * cp-gimplify.c (genericize_cp_loop): Revert location change.
443         PR c++/71837
444         * lambda.c (add_capture): Leave a pack expansion in a TREE_LIST.
445         (build_lambda_object): Call build_x_compound_expr_from_list.
446         * pt.c (tsubst) [DECLTYPE_TYPE]: Likewise.
448         PR c++/71833
449         PR c++/54440
450         * pt.c (coerce_template_parameter_pack): Fix logic for
451         pack index.
453         PR c++/65970
454         * constexpr.c (cxx_eval_loop_expr): Count iterations.
455         * cp-gimplify.c (genericize_cp_loop): Use start_locus even for
456         infinite loops.
458         PR c++/71972
459         * constexpr.c (cxx_eval_array_reference): Handle looking for the
460         value of an element we're currently modifying.
462 2016-07-24  Jason Merrill  <jason@redhat.com>
464         PR c++/71515
465         * pt.c (resolve_typename_type): Try to avoid calling
466         currently_open_class.
468 2016-07-23  Jason Merrill  <jason@redhat.com>
470         PR c++/66617
471         * call.c (add_list_candidates): Handle VTT parm.
472         (build_new_method_call_1): Likewise.
474         PR c++/55922
475         PR c++/63151
476         * init.c (expand_aggr_init_1): Handle list-initialization from {}.
478         PR c++/70709
479         * class.c (walk_subobject_offsets): Handle 0-length array.
481         PR c++/70778
482         * pt.c (tsubst): Also substitute into the template of a
483         BOUND_TEMPLATE_TEMPLATE_PARM.
485         PR c++/71738
486         * pt.c (lookup_template_class_1): Handle getting template from tsubst.
488         PR c++/71350
489         * decl.c (reshape_init_r): Check complain for missing braces warning.
491 2016-07-22  Jason Merrill  <jason@redhat.com>
493         PR c++/71576
494         * call.c (convert_like_real): Use lvalue_kind.
496         PR c++/71748
497         PR c++/52746
498         * pt.c (tsubst_baselink): Call
499         adjust_result_of_qualified_name_lookup for unqualified
500         destructors.
502 2016-07-21  Jason Merrill  <jason@redhat.com>
504         PR c++/69223
505         * semantics.c (apply_deduced_return_type): Call
506         complete_type_or_else before building the new RESULT_DECL.
508         PR c++/71274
509         * decl2.c (maybe_instantiate_decl): Split out from mark_used.
510         (decl_constant_var_p): Use it instead.
512         PR c++/71630
513         * pt.c (instantiate_decl): Fix pattern_defined for namespace scope
514         variable templates.
516         PR c++/71913
517         * call.c (unsafe_copy_elision_p): It's OK to elide when
518         initializing an unknown object.
520         * call.c (build_over_call): Check unsafe_copy_elision_p even for
521         trivial constructors.
522         * method.c (do_build_copy_constructor): Don't copy tail padding
523         even in a trivial constructor.
525 2016-07-21  Jakub Jelinek  <jakub@redhat.com>
527         PR c++/71728
528         * constexpr.c (potential_constant_expression_1) <case GOTO_EXPR>:
529         Replace assert with test, return false if the goto isn't break
530         or continue.  Formatting fix.
532 2016-07-21  Richard Biener  <rguenther@suse.de>
534         * vtable-class-hierarchy.c (vtv_generate_init_routine): Set
535         DECL_IGNORED_P.
537 2016-07-21  Jakub Jelinek  <jakub@redhat.com>
539         PR c++/71941
540         * cp-gimplify.c (cp_genericize): For nested cp_genericize calls
541         save/restore bc_label array.
543 2016-07-21  Jason Merrill  <jason@redhat.com>
545         PR c++/70781
546         * parser.c (cp_parser_lambda_expression): Unset OK if there was an
547         error parsing the lambda-declarator.
549         PR c++/71896
550         * constexpr.c (cxx_eval_binary_expression): Handle comparison
551         between lowered and unlowered PTRMEM_CST.
553         PR c++/65168
554         * typeck.c (cp_truthvalue_conversion): Compare pointers to nullptr.
555         Don't set c_inhibit_evaluation_warnings.
557         PR c++/71121
558         * cp-gimplify.c (cp_fully_fold): First call maybe_constant_value.
560 2016-07-21  Andrew Sutton  <andrew.n.sutton@gmail.com>
561             Jason Merrill  <jason@redhat.com>
563         Improving concepts performance and diagnostics.
564         PR c++/67565
565         PR c++/67579
566         PR c++/71843
567         * cp-tree.def (CHECK_CONSTR): New.
568         * cp-tree.h (CHECK_CONSTR_CONCEPT): New.
569         (CHECK_CONSTR_ARGS): New.
570         * constraint.cc (make_predicate_constraint): Remove in favor of
571         normalize_expression.
572         (resolve_constraint_check): Actually return error_mark_node when
573         resolution fails.
574         (resolve_variable_concept_check): Perform coercion as if processing
575         a template. Also return errors on resolution failure.
576         (lift_*): Remove all of these functions. Don't unnecessarily inline
577         concepts.
578         (learn_*): Add facilities to memoize implications for subsumption
579         during normalization.
580         (expanding_concept): New.
581         (expand_concept): New. Return the inlined and normalized definition
582         of a concept when needed.
583         (transform_*, xform_*): Rename to normalize_* to better reflect the
584         responsibility of those functions.
585         (normalize_template_id_expression): Check for non-boolean operands
586         when possible. Generate check constraints instead of normal variable
587         references.
588         (normalize_call_expression): Report errors when resolution fails.
589         (check_for_logical_overloads): Rewrite this check to more accurately
590         report the error.
591         (normalize_atom): Check for overloaded calls and invalid types before
592         determining if the expression refers to a concept.
593         (build_constraints): Don't cache normalized constraints or decomposed
594         assumptions.
595         (finish_shorthand_constraint): Return a normalized expression instead
596         of a predicate constraint.
597         (finish_template_introduction): Same.
598         (placeholder_extract_concept_and_args): Rewrite this since we only
599         ever get check constraints here.
600         (equivalent_placeholder_constraints): Rewrite in terms of check
601         constraints, and handle error_mark_nodes correctly.
602         (tsubst_check_constraint, tsubst_expr_constr, tsubst_type_constr)
603         (tsubst_implicit_conversion_constr)
604         (tsubst_argument_deduction_constr, tsubst_exception_constr)
605         (tsubst_parameterized_constraint, tsubst_constraint): New.
606         (tsbust_conjunection): Replace with tsubst_logical_operator and
607         actually generate the right kind of constraint.
608         (tsubst_requirement_body): Reverse the order of substituted arguments
609         so that they appear in the order written (helps diagnostics).
610         (satisfy_check_constraint): New.
611         (satisfy_conjunction): Simplify.
612         (satisfy_disjunction): Same.
613         (satisfy_constraint_1): Handle check constraints.
614         (eval_constr): New (private) global state.
615         (evaluating_constraints_sentinel): New. Manages eval_constr.
616         (satisfy_constraint): Add timing variables.
617         (satisfy_associated_constraints): Add hooks for memoization.
618         (evaluate_function_concept): Build a check constraint instead of
619         normalizing its definition.
620         (evaluate_variable_concept): Same.
621         (evaluate_constraint_expression): Normalize, but in the current
622         declaration processing context.
623         (evaluating_constraints_p): New.
624         (elide_constraint_failure_p): Actually emit constraint_thresh errors.
625         (diagnose_*): Remove artificial indentation. Add a new parameter to
626         each that tracks the current (complete) constraint prior to any
627         substitutions.
628         (diagnose_expression): Removed.
629         (diagnose_call_expression): Same.
630         (diagnose_template_id): Same.
631         (diagnose_template_id): New.
632         (diagnose_logical_constraint): New.
633         (diagnose_expression_constraint): Show the original expression.
634         (diagnose_type_constraint): Show the original type.
635         (diagnose_implicit_conversion_constraint): Be specific about
636         failures, don't re-diagnose a known-to-be-failed substitutions,
637         and manage elisions properly.
638         (diagnose_argument_deduction_constraint): Same.
639         (diagnose_exception_constraint): Same.
640         (diagnose_parameterized_constraint): Same.
641         (constraint_p): Allow EXPR_PACK_EXPANSION.
642         * logic.cc (next_by_distance): Removed. No longer used.
643         (any_p): Renamed from any_of.
644         (term_entry, term_hasher): New.
645         (term_list): Rewrite to include a hash table for quick lookup.
646         Also, make less stateful.
647         (proof_state): Extend to allow goals to be discharged once
648         satisfied.
649         (non_atomic_constraint_p): New.
650         (any_non_atomic_constraints_p): New.
651         (...rest...): Previous implementation completely replaced with an
652         iterative algorithm that opportunistically prunes the search space
653         before committing to using more memory.
654         * parser.c: (cp_parser_type_parameter): Normalize constraints.
655         (cp_parser_explicit_template_declaration): Same.
656         * pt.c: (finish_template_variable): Be less redundant with this error
657         message.
658         (template_args_equal): No longer static.
659         (tsubst_decl): Don't try to find specializations of variables that
660         have already been instantiated.
661         (build_non_dependent_expr): Avoid infinite recursion during concept
662         expansion.
663         (make_constrained_auto): Normalize constraints.
664         (do_auto_deduction): When doing auto deduction from a
665         partial-concept-id, be sure to include the explicit args checking
666         the constraints.
667         (constraint_sat_*): New. Memoize satisfied constraints.
668         (concept_spec_*): New. Memoize expressions associated with a concept
669         specialization.
670         (constraint_memos, concept_memos): New.
671         (lookup_constraint_satisfaction, memoize_constraint_satisfaction): New.
672         (lookup_concept_satisfaction, memoize_concept_satisfaction): New.
673         (get_concept_expansion, save_concept_expansion): New.
674         (hash_subsumption_args): New.
675         (comp_subsumption_args): New.
676         (subsumption_*): New. Memoize parts of the subsumption relation.
677         (lookup_subsumption_result, save_subsumption_result): New.
678         (init_constraint_processing): Initialize memo tables.
679         (get_constraints): Shortcut if !flag_concepts.
680         * decl.c (grokfndecl): Normalize constraints.
681         * error.c (dump_simple_decl): Print "concept" when appropriate.
682         (dump_function_decl): Same.
683         (dump_template_decl): Don't write requirements when we're not
684         printing the header.
685         (dump_expr): Handle fold expressions.
686         * cxx-pretty-print.c (cxx_pretty_printer::expression): Handle
687         fold expressions.
688         (get_fold_operator): New.
689         (pp_cxx_unary_left_fold_expression): New.
690         (pp_cxx_unary_right_fold_expression): New.
691         (pp_cxx_binary_fold_expression): New.
692         (pp_cxx_check_constraint): New.
693         (pp_cxx_*_constraint): Rewrite the grammar of internal constraints
694         to make them easier to read when debugging.
695         * search.c (accessible_p): Don't shortcut when evaluating constraints.
696         * tree.c (cp_tree_equal): Handle CHECK_CONSTR.
698 2016-07-20  David Malcolm  <dmalcolm@redhat.com>
700         PR c/70339
701         PR c/71858
702         * name-lookup.c: Include gcc-rich-location.h, spellcheck-tree.h,
703         and parser.h.
704         (suggest_alternatives_for): If no candidates are found, try
705         lookup_name_fuzzy and report if if finds a suggestion.
706         (consider_binding_level): New function.
707         (lookup_name_fuzzy) New function.
708         * parser.c: Include gcc-rich-location.h.
709         (cp_lexer_next_token_is_decl_specifier_keyword): Move most of
710         logic into...
711         (cp_keyword_starts_decl_specifier_p): ...this new function.
712         (cp_parser_diagnose_invalid_type_name): When issuing
713         "does not name a type" errors, attempt to make a suggestion using
714         lookup_name_fuzzy.
715         * parser.h (cp_keyword_starts_decl_specifier_p): New prototype.
716         * search.c (lookup_field_fuzzy_info::fuzzy_lookup_field): Reject
717         types that are not CLASS_TYPE_P, rather than rejecting individual
718         tree codes.
720 2016-07-20  Jakub Jelinek  <jakub@redhat.com>
722         PR c++/71909
723         * parser.c (cp_parser_save_member_function_body): Consume
724         __transaction_relaxed or __transaction_atomic with optional
725         attribute.  Only skip catch with block if try keyword is seen.
727         PR c++/50060
728         * constexpr.c (cxx_eval_builtin_function_call): Pass false as lval
729         when evaluating call arguments.  Use fold_builtin_call_array instead
730         of fold_build_call_array_loc, return t if it returns NULL.  Otherwise
731         check the result with potential_constant_expression and call
732         cxx_eval_constant_expression on it.
734 2016-07-19  Jason Merrill  <jason@redhat.com>
736         PR c++/67164
737         * pt.c (iterative_hash_template_arg, template_args_equal): Don't
738         handle ARGUMENT_PACK_SELECT.
740 2016-07-18  Jakub Jelinek  <jakub@redhat.com>
742         PR c++/70869
743         PR c++/71054
744         * cp-gimplify.c (cp_genericize_r): Revert the 2016-07-07 change.
745         * tree.c (cp_walk_subtrees): For DECL_EXPR on DECL_ARTIFICIAL
746         non-static VAR_DECL, walk the decl's DECL_INITIAL, DECL_SIZE and
747         DECL_SIZE_UNIT.
749         PR c++/71835
750         * call.c (build_op_call_1): Use convert_like_with_context only
751         if cand->fn is a decl.
753         PR c++/71828
754         * constexpr.c (cxx_eval_constant_expression) <case REALPART_EXPR>:
755         For lval don't use cxx_eval_unary_expression and instead recurse
756         and if needed rebuild the reference.
758         PR c++/71826
759         * pt.c (tsubst_baselink): Only set BASELINK_OPTYPE for BASELINK_P.
761         PR c++/71822
762         * cp-gimplify.c (cp_gimplify_expr) <case VEC_INIT_EXPR>: Recursively
763         fold *expr_p before genericizing it.
765         PR c++/71871
766         * typeck.c (build_x_conditional_expr): Revert the 2012-10-25 change.
768 2016-07-15  Jason Merrill  <jason@redhat.com>
770         PR c++/71495
771         * call.c (convert_like_real): Mask complain.
772         * semantics.c (perform_koenig_lookup): Likewise.
774         PR c++/71092
775         * constexpr.c (cxx_eval_call_expression): Fail quietly when cgraph
776         threw away DECL_SAVED_TREE.
778         PR c++/71117
779         Core 2189
780         * call.c (add_template_conv_candidate): Disable if there are
781         viable candidates.
783         PR c++/71511
784         * typeck2.c (cxx_incomplete_type_diagnostic): Handle DECLTYPE_TYPE.
786         PR c++/71513
787         * pt.c (tsubst_attributes): Fix loop logic.
789         PR c++/71604
790         PR c++/54430
791         * parser.c (cp_parser_range_for): Modify IDENTIFIER_BINDING directly.
792         (cp_parser_simple_declaration): Diagnose type definition in
793         for-range-declaration.
795         PR c++/71711
796         * operators.def: Add *_FOLD_EXPR.
797         * cp-tree.h (FOLD_EXPR_P): Parenthesize.
798         * mangle.c (write_expression): Handle fold-expressions.
799         * pt.c (tsubst_unary_left_fold, tsubst_binary_left_fold)
800         (tsubst_unary_right_fold, tsubst_binary_right_fold): Handle
801         partial instantiation.
803         PR c++/71814
804         * mangle.c (write_expression): Handle sizeof... an argument pack.
806         PR c++/71718
807         * pt.c (push_tinst_level_loc): Set at_eof before fatal_error.
809         PR c++/70824
810         * init.c (constant_value_1): Don't instantiated DECL_INITIAL of
811         artificial variables.
813 2016-07-15  Cesar Philippidis  <cesar@codesourcery.com>
815         * parser.c (cp_parser_oacc_declare): Don't scan for
816         GOMP_MAP_POINTER.
817         * semantics.c (handle_omp_array_sections): Mark data clauses with
818         GOMP_MAP_FORCE_{PRESENT,TO,FROM,TOFROM} as potentially having
819         zero-length subarrays.
821 2016-07-11  Jason Merrill  <jason@redhat.com>
823         * decl.c (store_parm_decls): Remove check for void parm.
825 2016-07-08  Jason Merrill  <jason@redhat.com>
827         * cp-tree.h: Unpoison lvalue_p.
828         * call.c, class.c, constexpr.c, cvt.c, init.c, lambda.c, pt.c,
829         tree.c, typeck.c, typeck2.c: Use lvalue_p instead of
830         real_lvalue_p.
832         * tree.c (obvalue_p): Rename from lvalue_p.
833         (lvalue_p): Define for c-common.
834         * call.c, cp-tree.h, cvt.c, init.c: Adjust.
835         * typeck.c: Adjust.
836         (cp_build_addr_expr_1): Remove obsolete code.
838         * tree.c (glvalue_p): Rename from lvalue_or_rvalue_with_address_p.
839         * call.c, cp-tree.h, typeck.c: Adjust.
841         * lambda.c (maybe_add_lambda_conv_op): Fix null object argument.
843         P0145R2: Refining Expression Order for C++.
844         * cp-gimplify.c (lvalue_has_side_effects): New.
845         (cp_gimplify_expr): Implement assignment ordering.
846         * call.c (op_is_ordered, build_over_call): Adjust for
847         -fargs-in-order renaming to -fstrong-eval-order.
848         * cp-gimplify.c (cp_gimplify_expr): Likewise.
850 2016-07-07  Jakub Jelinek  <jakub@redhat.com>
851             Kai Tietz  <ktietz70@googlemail.com>
853         PR c++/70869
854         PR c++/71054
855         * cp-gimplify.c (cp_genericize_r): For DECL_EXPR for non-static
856         artificial vars, genericize their initializers.
858 2016-07-05  David Malcolm  <dmalcolm@redhat.com>
860         PR c++/62314
861         * parser.c (cp_parser_class_specifier_1): When reporting
862         missing semicolons, use a fixit-hint to suggest insertion
863         of a semicolon immediately after the closing brace,
864         offsetting the reported column accordingly.
866 2016-07-04  Jan Beulich  <jbeulich@suse.com>
868         * lang-specs.h ("@c++-header"): Conditionalize "-o".
870 2016-06-29  Thomas Schwinge  <thomas@codesourcery.com>
872         * parser.c (cp_parser_pragma) <PRAGMA_OMP_CANCELLATION_POINT>:
873         Move pragma context checking into...
874         (cp_parser_omp_cancellation_point): ... here, and improve
875         diagnostic messages.
876         * semantics.c (finish_omp_cancel, finish_omp_cancellation_point):
877         Improve diagnostic messages.
879 2016-06-28  Jakub Jelinek  <jakub@redhat.com>
881         * Make-lang.in: Don't cat ../stage_current if it does not exist.
883 2016-06-24  Jason Merrill  <jason@redhat.com>
885         P0145R2: Refining Expression Order for C++.
886         * typeck.c (cp_build_modify_expr): Leave COMPOUND_EXPR on LHS.
888         * tree.c (get_target_expr_sfinae): Handle bit-fields.
889         (build_target_expr): Call mark_rvalue_use.
891 2016-06-24  Jakub Jelinek  <jakub@redhat.com>
893         * call.c (magic_varargs_p): Return 3 for __builtin_*_overflow_p.
894         (build_over_call): For magic == 3, do no conversion only on 3rd
895         argument.
897 2016-06-23  Andi Kleen  <ak@linux.intel.com>
899         * Make-lang.in: Add support for autofdo.
901 2016-06-21  Jason Merrill  <jason@redhat.com>
903         * constraint.cc (constraints_satisfied_p): Keep as many levels of
904         args as our template has levels of parms.
906         * pt.c (template_parm_outer_level, uses_outer_template_parms): New.
907         (type_dependent_expression_p): Use uses_outer_template_parms.
909 2016-06-20  David Malcolm  <dmalcolm@redhat.com>
911         * parser.c (cp_parser_string_literal): Convert non-standard
912         concatenation error to directly use a rich_location, and
913         use that to add the location of the first literal to the
914         diagnostic.
916 2016-06-17  Paolo Carlini  <paolo.carlini@oracle.com>
918         * decl.c (validate_constexpr_redeclaration): Change pair of errors
919         to error + inform.
920         * error.c (dump_function_decl): Save the constexpr specifier too.
922 2016-06-17  Jakub Jelinek  <jakub@redhat.com>
924         * tree.c (builtin_valid_in_constant_expr_p): Test for
925         DECL_BUILT_IN_CLASS equal to BUILT_IN_NORMAL instead of just
926         DECL_BUILT_IN.
927         (bot_manip): Likewise.
928         * call.c (magic_varargs_p): Likewise.
930 2016-06-17  Paolo Carlini  <paolo.carlini@oracle.com>
932         * decl.c (grokfndecl): Change pair of errors to error + inform.
934 2016-06-17  Jason Merrill  <jason@redhat.com>
936         PR c++/71209
937         * typeck.c (finish_class_member_access_expr): Avoid "not a base"
938         warning when there are dependent bases.
940 2016-06-17  Jakub Jelinek  <jakub@redhat.com>
942         * semantics.c (handle_omp_array_sections_1): Don't ICE when
943         processing_template_decl when checking for bitfields and unions.
944         Look through REFERENCE_REF_P as base of COMPONENT_REF.
945         (finish_omp_clauses): Look through REFERENCE_REF_P even for
946         array sections with COMPONENT_REF bases.
948 2016-06-16  Jakub Jelinek  <jakub@redhat.com>
950         * parser.c (cp_parser_omp_var_list_no_open): Call
951         convert_from_reference before cp_parser_postfix_dot_deref_expression.
952         * semantics.c (finish_omp_clauses): Don't ICE when
953         processing_template_decl when checking for bitfields and unions.
954         Look through REFERENCE_REF_P as base of COMPONENT_REF.
956 2016-06-15  Paolo Carlini  <paolo.carlini@oracle.com>
958         * decl.c (wrapup_globals_for_namespace): Use DECL_SOURCE_LOCATION and
959         "%qF" in warning_at instead of "%q+F" in warning.
960         (check_redeclaration_exception_specification): Likewise in pedwarn
961         (and error, inform, for consistency).
962         * call.c (joust): Likewise.
964 2016-06-15  Paolo Carlini  <paolo.carlini@oracle.com>
966         PR c++/70202
967         * decl.c (xref_basetypes): Revert r117839 changes; add fix-up
968         code at the end of the for loop; also revert r159637 changes,
969         add back the gcc_assert.
970         * cp-tree.h (xref_basetypes): Adjust declaration.
971         * parser.c (cp_parser_class_head): Adjust xref_basetypes call.
973 2016-06-14  David Malcolm  <dmalcolm@redhat.com>
975         * search.c: Include spellcheck-tree.h rather than spellcheck.h.
977 2016-06-14  David Malcolm  <dmalcolm@redhat.com>
979         * typeck.c: Include "gcc-rich-location.h".
980         (finish_class_member_access_expr): Simplify fixit code by
981         using gcc_rich_location::add_fixit_misspelled_id.
983 2016-06-14  Jason Merrill  <jason@redhat.com>
985         P0145R2: Refining Expression Order for C++.
986         * cp-tree.h (CALL_EXPR_OPERATOR_SYNTAX, CALL_EXPR_ORDERED_ARGS)
987         (CALL_EXPR_REVERSE_ARGS): New.
988         * call.c (build_new_op_1): Set them.
989         (extract_call_expr, op_is_ordered): New.
990         (build_over_call): Set CALL_EXPR_ORDERED_ARGS.
991         * cp-gimplify.c (cp_gimplify_expr) [CALL_EXPR]: Handle new flags.
992         * pt.c (tsubst_copy_and_build): Copy new flags.
993         * semantics.c (simplify_aggr_init_expr): Likewise.
994         * tree.c (build_aggr_init_expr): Likewise.
995         (build_min_non_dep_op_overload): Likewise.
997 2016-06-14  Jakub Jelinek  <jakub@redhat.com>
999         PR c++/71528
1000         * decl.c (duplicate_decls): For DECL_INITIALIZED_P non-external
1001         olddecl vars, preserve their TREE_READONLY bit.
1003         PR c++/71516
1004         * decl.c (complete_vars): Handle gracefully type == error_mark_node.
1006 2016-06-14  Paolo Carlini  <paolo.carlini@oracle.com>
1008         * typeck2.c (digest_init_r): Use EXPR_LOC_OR_LOC on init.
1010 2016-06-13  Paolo Carlini  <paolo.carlini@oracle.com>
1012         * decl.c (grokdeclarator): Fix typo in pedwarn text.
1014 2016-06-10  Thomas Schwinge  <thomas@codesourcery.com>
1016         PR c/71381
1017         * parser.c (cp_parser_omp_var_list_no_open) <OMP_CLAUSE__CACHE_>:
1018         Loosen checking.
1020 2016-06-09  Paolo Carlini  <paolo.carlini@oracle.com>
1022         PR c++/71465
1023         Revert:
1024         2016-06-04  Paolo Carlini  <paolo.carlini@oracle.com>
1026         PR c++/70202
1027         * parser.c (cp_parser_class_head): When xref_basetypes fails and
1028         emits an error do not zero the type.
1030 2016-06-08  Paolo Carlini  <paolo.carlini@oracle.com>
1032         * decl.c (maybe_deduce_size_from_array_init): Use
1033         DECL_SOURCE_LOCATION in error_at.
1034         (layout_var_decl): Likewise.
1035         (check_array_initializer): Likewise.
1036         (check_initializer): Likewise.
1037         (duplicate_decls, check_elaborated_type_specifier): Tidy.
1039 2016-06-08  Martin Sebor  <msebor@redhat.com>
1040             Jakub Jelinek  <jakub@redhat.com>
1042         PR c++/70507
1043         PR c/68120
1044         * constexpr.c: Include gimple-fold.h.
1045         (cxx_eval_internal_function): New function.
1046         (cxx_eval_call_expression): Call it.
1047         (potential_constant_expression_1): Handle integer arithmetic
1048         overflow built-ins.
1049         * tree.c (builtin_valid_in_constant_expr_p): Handle
1050         BUILT_IN_{ADD,SUB,MUL}_OVERFLOW_P.
1052 2016-06-08  Paolo Carlini  <paolo.carlini@oracle.com>
1054         * pt.c (tsubst, case TYPENAME_TYPE): Don't delay checking the
1055         return value of tsubst_aggr_type for error_mark_node.
1057 2016-06-08  Jakub Jelinek  <jakub@redhat.com>
1059         PR c++/71442
1060         * pt.c (tsubst_copy): Only set TREE_USED on DECLs.
1062 2016-06-06  Jakub Jelinek  <jakub@redhat.com>
1063             Patrick Palka  <ppalka@gcc.gnu.org>
1065         PR c++/70847
1066         PR c++/71330
1067         PR c++/71393
1068         * cp-gimplify.c (cp_fold_r): Set *walk_subtrees = 0 and return NULL
1069         right after cp_fold call if cp_fold has returned the same stmt
1070         already in some earlier cp_fold_r call.
1071         (cp_fold_function): Add pset automatic variable, pass its address
1072         to cp_walk_tree.
1074 2016-06-04  Paolo Carlini  <paolo.carlini@oracle.com>
1076         PR c++/70202
1077         * parser.c (cp_parser_class_head): When xref_basetypes fails and
1078         emits an error do not zero the type.
1080 2016-06-03  Patrick Palka  <ppalka@gcc.gnu.org>
1082         PR c++/27100
1083         * decl.c (duplicate_decls): Properly copy the
1084         DECL_PENDING_INLINE_P, DECL_PENDING_INLINE_INFO and
1085         DECL_SAVED_FUNCTION_DATA fields from OLDDECL to NEWDECL.
1087 2016-06-03  Chung-Lin Tang  <cltang@codesourcery.com>
1089         * semantics.c (finish_omp_clauses): Mark OpenACC reduction
1090         arguments as addressable when async clause exists.
1092 2016-06-02  Jan Hubicka  <jh@suse.cz>
1094         * cp-gimplify.c (genericize_continue_stmt): Force addition of
1095         predict stmt.
1097 2016-06-02  Paolo Carlini  <paolo.carlini@oracle.com>
1099         * decl.c (xref_tag_1): Change pairs of errors to error + inform.
1100         (start_enum): Likewise.
1101         * parser.c (cp_parser_class_head): Likewise.
1103 2016-06-02  Jakub Jelinek  <jakub@redhat.com>
1105         PR c++/71372
1106         * cp-gimplify.c (cp_fold): For INDIRECT_REF, if the folded expression
1107         is INDIRECT_REF or MEM_REF, copy over TREE_READONLY, TREE_SIDE_EFFECTS
1108         and TREE_THIS_VOLATILE flags.  For ARRAY_REF and ARRAY_RANGE_REF, copy
1109         over TREE_READONLY, TREE_SIDE_EFFECTS and TREE_THIS_VOLATILE flags
1110         to the newly built tree.
1112 2016-05-31  Jason Merrill  <jason@redhat.com>
1114         * pt.c (instantiate_decl): Avoid recalculation.
1116         PR c++/60095
1117         PR c++/69515
1118         PR c++/69009
1119         * pt.c (instantiate_template_1): Don't put the partial
1120         specialization in DECL_TI_TEMPLATE.
1121         (partial_specialization_p, impartial_args): Remove.
1122         (regenerate_decl_from_template): Add args parm.
1123         (instantiate_decl): Look up the partial specialization again.
1125         PR c++/71227
1126         * pt.c (check_explicit_specialization): Give better diagnostic about
1127         specializing a hidden friend.
1129 2016-05-31  Paolo Carlini  <paolo.carlini@oracle.com>
1131         PR c++/71248
1132         * decl.c (check_static_variable_definition): Use DECL_SOURCE_LOCATION
1133         to obtain correct locations; avoid redundant diagnostics on
1134         out-of-class definitions.
1136 2016-05-30  Martin Sebor  <msebor@redhat.com>
1138         PR c++/71306
1139         * init.c (warn_placement_new_too_small): Handle placement new arguments
1140         that are elements of arrays more carefully.  Remove a pointless loop.
1142 2016-05-30  Jakub Jelinek  <jakub@redhat.com>
1144         PR c++/71349
1145         * parser.c (cp_parser_omp_for): Don't disallow nowait clause
1146         when combined with target construct.
1147         (cp_parser_omp_parallel): Pass cclauses == NULL as last argument
1148         to cp_parser_omp_all_clauses.
1150 2016-05-30  Paolo Carlini  <paolo.carlini@oracle.com>
1152         PR c++/71238
1153         * lex.c (unqualified_name_lookup_error): Take a location too.
1154         (unqualified_fn_lookup_error): Take a cp_expr.
1155         * cp-tree.h (unqualified_name_lookup_error,
1156         unqualified_fn_lookup_error): Adjust declarations.
1157         * semantics.c (perform_koenig_lookup): Adjust
1158         unqualified_fn_lookup_error call, pass the location of
1159         the identifier too as part of a cp_expr.
1161 2016-05-30  Paolo Carlini  <paolo.carlini@oracle.com>
1163         PR c++/71099
1164         * parser.c (cp_parser_function_specifier_opt): Use current_class_type
1165         to improve the diagnostic about wrong uses of 'virtual'.
1167 2016-05-29  Paolo Carlini  <paolo.carlini@oracle.com>
1169         PR c++/71105
1170         * lambda.c (maybe_add_lambda_conv_op): Early return also when
1171         LAMBDA_EXPR_DEFAULT_CAPTURE_MODE != CPLD_NONE.
1173 2016-05-28  Ville Voutilainen  <ville.voutilainen@gmail.com>
1175         Revert:
1176         PR c++/69855
1177         * name-lookup.c (pushdecl_maybe_friend_1): Push local function
1178         decls into the global scope after stripping template bits
1179         and setting DECL_ANTICIPATED.
1181 2016-05-27  Paolo Carlini  <paolo.carlini@oracle.com>
1183         PR c++/60385
1184         * name-lookup.c (push_namespace): Return bool, false when pushdecl
1185         fails.
1186         * name-lookup.h (push_namespace): Adjust declaration.
1187         * parser.c (cp_parser_namespace_definition): Check push_namespace
1188         return value.
1190 2016-05-27  Ville Voutilainen  <ville.voutilainen@gmail.com>
1192         PR c++/69855
1193         * name-lookup.c (pushdecl_maybe_friend_1): Push local function
1194         decls into the global scope after stripping template bits
1195         and setting DECL_ANTICIPATED.
1197 2016-05-26  Jakub Jelinek  <jakub@redhat.com>
1199         * semantics.c (finish_omp_clauses) <case OMP_CLAUSE_SCHEDULE>: Warn
1200         if OMP_CLAUSE_SCHEDULE_CHUNK_EXPR is known not to be positive.
1202 2016-05-26  Patrick Palka  <ppalka@gcc.gnu.org>
1204         PR c++/70822
1205         PR c++/70106
1206         * cp-tree.h (REF_PARENTHESIZED_P): Make this flag apply to
1207         SCOPE_REFs too.
1208         * pt.c (tsubst_qualified_id): If REF_PARENTHESIZED_P is set
1209         on the qualified_id then propagate it to the resulting
1210         expression.
1211         (do_auto_deduction): Check REF_PARENTHESIZED_P on SCOPE_REFs
1212         too.
1213         * semantics.c (force_paren_expr): If given a SCOPE_REF, just set
1214         its REF_PARENTHESIZED_P flag.
1216 2016-05-25  Jason Merrill  <jason@redhat.com>
1218         PR c++/71173
1219         PR c++/70522
1220         * cp-tree.h (enum tag_types): Add scope_type.
1221         * parser.c (cp_parser_class_name): Use scope_type.
1222         (prefer_type_arg): Handle scope_type.
1223         (cp_parser_lookup_name): Use prefer_type_arg.
1224         * name-lookup.c (lookup_qualified_name): Change bool is_type_p to
1225         int prefer_type, use lookup_flags.
1226         * name-lookup.h: Adjust.
1228 2016-05-24  Cesar Philippidis  <cesar@codesourcery.com>
1230         * parser.c (cp_parser_oacc_declare): Add support for
1231         GOMP_MAP_FIRSTPRIVATE_POINTER.
1232         * semantics.c (handle_omp_array_sections_1): Replace bool is_omp
1233         argument with enum c_omp_region_type ort.  Don't privatize OpenACC
1234         non-static members.
1235         (handle_omp_array_sections): Replace bool is_omp argument with enum
1236         c_omp_region_type ort.  Update call to handle_omp_array_sections_1.
1237         (finish_omp_clauses): Add specific errors and warning messages for
1238         OpenACC.  Use firsrtprivate pointers for OpenACC subarrays.  Update
1239         call to handle_omp_array_sections.
1241 2016-05-24  Jason Merrill  <jason@redhat.com>
1243         PR c++/70584
1244         * cp-gimplify.c (cp_fold_maybe_rvalue): Loop in case cp_fold
1245         returns a decl.
1246         (cp_fold) [INDIRECT_REF]: Don't fold to an rvalue.
1248 2016-05-24  Martin Sebor  <msebor@redhat.com>
1250         PR c++/71147
1251         * decl.c (layout_var_decl, grokdeclarator): Use complete_or_array_type_p.
1252         * pt.c (instantiate_class_template_1): Try to complete the element
1253         type of a flexible array member.
1254         (can_complete_type_without_circularity): Handle arrays of unknown bound.
1255         * typeck.c (complete_type): Also complete the type of the elements of
1256         arrays with an unspecified bound.
1258 2016-05-24  Paolo Carlini  <paolo.carlini@oracle.com>
1260         PR c++/69872
1261         * typeck2.c (check_narrowing): Check pedwarn return value.
1263 2016-05-24  Jakub Jelinek  <jakub@redhat.com>
1265         PR c++/71257
1266         * semantics.c (finish_omp_clauses) <case OMP_CLAUSE_LINEAR>:
1267         For OMP_CLAUSE_LINEAR_REF don't require type to be
1268         integral or pointer.
1270 2016-05-24  Richard Biener  <rguenther@suse.de>
1272         PR middle-end/70434
1273         PR c/69504
1274         * expr.c (mark_exp_read): Handle VIEW_CONVERT_EXPR.
1275         * constexpr.c (cxx_eval_array_reference): Handle indexed
1276         vectors.
1277         * typeck.c (cp_build_array_ref): Adjust.
1279 2016-05-23  Jason Merrill  <jason@redhat.com>
1281         PR c++/70344
1282         * constexpr.c (cxx_eval_call_expression): Check for
1283         fun == current_function_decl again.
1285         PR c++/70584
1286         * cp-gimplify.c (cp_fold) [INDIRECT_REF]: Call
1287         maybe_undo_parenthesized_ref.
1289         PR c++/70735
1290         * pt.c (tsubst_copy): Just return a local variable from
1291         non-template context.  Don't call rest_of_decl_compilation for
1292         duplicated static locals.
1293         (tsubst_decl): Set DECL_CONTEXT of local static from another
1294         function.
1296 2016-05-23  Paolo Carlini  <paolo.carlini@oracle.com>
1298         PR c++/70972
1299         * method.c (forward_parm): Use cp_build_reference_type.
1301 2016-05-23  Paolo Carlini  <paolo.carlini@oracle.com>
1303         PR c++/69095
1304         * parser.c (cp_parser_initializer): Use check_for_bare_parameter_packs.
1306 2016-05-23  Paolo Carlini  <paolo.carlini@oracle.com>
1308         * pt.c (check_for_bare_parameter_packs): Improve error message
1309         location for expressions.
1311 2016-05-20  Nathan Sidwell  <nathan@acm.org>
1313         * constexpr.c (cxx_bind_parameters_in_call): Avoid gratuitous if
1314         ... goto.
1315         (cxx_eval_call_expression): Fix comment grammar.
1317 2016-05-20  Paolo Carlini  <paolo.carlini@oracle.com>
1319         PR c++/70572
1320         * decl.c (cp_finish_decl): Check do_auto_deduction return value
1321         and return immediately in case of erroneous code.
1323 2016-05-19  Marek Polacek  <polacek@redhat.com>
1325         PR c++/71075
1326         * pt.c (unify_template_argument_mismatch): Use %qE instead of %qD.
1328 2016-05-19  Jason Merrill  <jason@redhat.com>
1330         PR c++/10200
1331         * pt.c (fn_type_unification): Add outer template args if needed.
1332         (type_unification_real): Handle getting full args.
1334 2016-05-19  David Malcolm  <dmalcolm@redhat.com>
1336         PR c++/71184
1337         * parser.c (cp_parser_operator): For array new/delete, check that
1338         cp_parser_require returned a non-NULL token before dereferencing
1339         it.
1341 2016-05-19  Bernd Edlinger  <bernd.edlinger@hotmail.de>
1343         * decl.c (finish_enum_value_list): Use the specified mode.
1345 2016-05-18  Jason Merrill  <jason@redhat.com>
1347         * pt.c (value_dependent_expression_p): Tweak new cases to better
1348         match the wording in the standard.
1350 2016-05-18  Paolo Carlini  <paolo.carlini@oracle.com>
1352         PR c++/69793
1353         * parser.c (cp_parser_template_id): Don't call cp_lexer_peek_nth_token
1354         when the previous cp_lexer_peek_token returns CPP_EOF.
1356 2016-05-18  Paolo Carlini  <paolo.carlini@oracle.com>
1358         PR c++/70466
1359         * call.c (convert_like_real): Check that we are actually converting
1360         from an init list.
1362 2016-05-16  Matthew Wahab  <matthew.wahab@arm.com>
1364         * decl.c (grokdeclarator): Remove errmsg and use of
1365         targetm.invalid_return_type.
1366         (grokparms): Remove errmsg and use of
1367         targetm.invalid_parameter_type.
1369 2016-05-13  Jason Merrill  <jason@redhat.com>
1371         PR c++/10200
1372         PR c++/69753
1373         * pt.c (tsubst_decl): Use uses_template_parms.
1374         (instantiate_template_1): Handle non-dependent calls in templates.
1375         (value_dependent_expression_p): Handle BASELINK, FUNCTION_DECL.
1376         (type_dependent_expression_p): Only consider innermost template args.
1377         (dependent_template_arg_p): Check enclosing class of a template here.
1378         (dependent_template_p): Not here.
1379         (type_dependent_object_expression_p): New.
1380         * typeck.c (finish_class_member_access_expr): Use it.
1381         * parser.c (cp_parser_postfix_expression): Use it.
1382         (cp_parser_postfix_dot_deref_expression): Use it.  Use comptypes
1383         to detect the current instantiation.
1384         (cp_parser_lookup_name): Really implement DR 141.
1385         * search.c (lookup_field_r): Prefer a dependent using-declaration.
1386         (any_dependent_bases_p): Split out from...
1387         * name-lookup.c (do_class_using_decl): ...here.
1388         * call.c (build_new_method_call_1): Use it.
1389         * semantics.c (finish_call_expr): 'this' doesn't make a call dependent.
1390         * tree.c (non_static_member_function_p): Remove.
1391         * typeck2.c (build_x_arrow): Use dependent_scope_p.
1393         * parser.c (cp_parser_postfix_dot_deref_expression): Use
1394         complete_type_or_else for unknown_type_node, too.
1396 2016-05-12  Marek Polacek  <polacek@redhat.com>
1398         PR c/70756
1399         * call.c (build_new_op_1): Pass LOC to cp_build_modify_expr.
1400         * cp-tree.h (cp_build_modify_expr): Update declaration.
1401         (cxx_incomplete_type_error, cxx_incomplete_type_diagnostic): New inline
1402         overloads.
1403         * cp-ubsan.c (cp_ubsan_dfs_initialize_vtbl_ptrs): Pass INPUT_LOCATION to
1404         cp_build_modify_expr.
1405         * decl2.c (set_guard): Likewise.
1406         (handle_tls_init): Likewise.
1407         * init.c (perform_member_init): Likewise.
1408         (expand_virtual_init): Likewise.
1409         (build_new_1): Likewise.
1410         (build_vec_delete_1): Likewise.
1411         (get_temp_regvar): Likewise.
1412         (build_vec_init): Likewise.
1413         * method.c (do_build_copy_assign): Likewise.
1414         (assignable_expr): Likewise.
1415         * semantics.c (finish_omp_for): Likewise.
1416         * typeck.c (cp_build_binary_op): Pass LOCATION to pointer_diff and
1417         cp_pointer_int_sum.
1418         (cp_pointer_int_sum): Add location parameter.  Pass it down to
1419         pointer_int_sum.
1420         (pointer_diff): Add location parameter.  Use it.
1421         (build_modify_expr): Pass location down to cp_build_modify_expr.
1422         (cp_build_modify_expr): Add location parameter.  Use it.
1423         (build_x_modify_expr): Pass location down to cp_build_modify_expr.
1424         * typeck2.c (cxx_incomplete_type_diagnostic,
1425         cxx_incomplete_type_error): Add location parameter.
1427 2016-05-11  Marek Polacek  <polacek@redhat.com>
1429         PR c++/71024
1430         * decl.c (duplicate_decls): Call diagnose_mismatched_decls.
1432 2016-05-05  Jakub Jelinek  <jakub@redhat.com>
1434         * parser.c (cp_parser_selection_statement): For RID_SWITCH,
1435         pass if_p instead of NULL to cp_parser_implicitly_scoped_statement.
1437 2016-05-04  Marek Polacek  <polacek@redhat.com>
1439         * parser.c (cp_parser_selection_statement): Replace OPT_Wparentheses
1440         with OPT_Wdangling_else.
1442 2016-05-03  Martin Sebor  <msebor@redhat.com>
1444         PR c++/66561
1445         * tree.c (builtin_valid_in_constant_expr_p): Treat BUILT_IN_FILE,
1446         BUILT_IN_FUNCTION, and BUILT_IN_LINE as constant expressions.
1448 2016-05-03  Marek Polacek  <polacek@redhat.com>
1450         PR c/70859
1451         * call.c (build_cxx_call): Pass location and vNULL down to
1452         check_builtin_function_arguments.
1454 2016-05-03  Richard Biener  <rguenther@suse.de>
1456         * Make-lang.in (cc1plus-checksum.c): For stage-final re-use
1457         the checksum from the previous stage.
1459 2016-05-02  David Malcolm  <dmalcolm@redhat.com>
1461         PR c++/62314
1462         * typeck.c (finish_class_member_access_expr): When
1463         giving a hint about a possibly-misspelled member name,
1464         add a fix-it replacement hint.
1466 2016-05-02  Cesar Philippidis  <cesar@codesourcery.com>
1468         * cp-tree.h (finish_omp_clauses): Update prototype.
1469         * parser.c (cp_parser_oacc_all_clauses): Update call to
1470         finish_omp_clauses.
1471         (cp_parser_omp_all_clauses): Likewise.
1472         (cp_parser_omp_for_loop): Likewise.
1473         (cp_omp_split_clauses): Likewise.
1474         (cp_parser_oacc_cache): Likewise.
1475         (cp_parser_oacc_loop): Likewise.
1476         (cp_parser_omp_declare_target):
1477         (cp_parser_cilk_simd_all_clauses): Likewise.
1478         (cp_parser_cilk_for): Likewise.
1479         * pt.c (tsubst_omp_clauses): Replace allow_fields and declare_simd
1480         arguments with enum c_omp_region_type ort.
1481         (tsubst_omp_clauses): Update calls to finish_omp_clauses.
1482         (tsubst_omp_attribute): Update calls to tsubst_omp_clauses.
1483         (tsubst_omp_for_iterator): Update calls to finish_omp_clauses.
1484         (tsubst_expr): Update calls to tsubst_omp_clauses.
1485         * semantics.c (finish_omp_clauses): Replace bool arguments
1486         allow_fields, declare_simd, and is_cilk with bitmask ort.
1487         (finish_omp_for): Update call to finish_omp_clauses.
1489 2016-05-02  David Malcolm  <dmalcolm@redhat.com>
1491         PR c++/62314
1492         * parser.c (cp_parser_class_head): Capture the start location;
1493         use it to emit a fix-it insertion hint when complaining
1494         about missing "template <> " in explicit specializations.
1496 2016-05-02  Richard Sandiford  <richard.sandiford@arm.com>
1498         * init.c (build_new_1): Use shift operators instead of wi:: shifts.
1500 2016-05-02  Richard Biener  <rguenther@suse.de>
1502         * decl.c (grokdeclarator): Properly insert a DECL_EXPR for
1503         anonymous VLAs.
1505 2016-04-29  Paolo Carlini  <paolo.carlini@oracle.com>
1507         PR c++/66644
1508         * class.c (check_field_decl): Remove final int* parameter, change
1509         the return type to bool; fix logic in order not to reject multiple
1510         initialized fields in anonymous struct.
1511         (check_field_decls): Adjust call.
1513 2016-04-29  Cesar Philippidis  <cesar@codesourcery.com>
1515         PR middle-end/70626
1516         * parser.c (cp_parser_oacc_loop): Don't augment mask with
1517         OACC_LOOP_CLAUSE_MASK.
1518         (cp_parser_oacc_kernels_parallel): Update call to
1519         c_oacc_split_loop_clauses.
1521 2016-04-28  Jason Merrill  <jason@redhat.com>
1523         Implement C++17 [[nodiscard]] attribute.
1524         PR c++/38172
1525         PR c++/54379
1526         * parser.c (cp_parser_std_attribute): Handle [[nodiscard]].
1527         * tree.c (handle_nodiscard_attribute): New.
1528         (cxx_attribute_table): Add [[nodiscard]].
1529         * cvt.c (cp_get_fndecl_from_callee, cp_get_callee_fndecl): New.
1530         (maybe_warn_nodiscard): New.
1531         (convert_to_void): Call it.
1533         * cvt.c (cp_get_callee): New.
1534         * constexpr.c (get_function_named_in_call): Use it.
1535         * cxx-pretty-print.c (postfix_expression): Use it.
1536         * except.c (check_noexcept_r): Use it.
1537         * method.c (check_nontriv): Use it.
1538         * tree.c (build_aggr_init_expr): Use it.
1539         * cp-tree.h: Declare it.
1541 2015-04-27  Ryan Burn  <contact@rnburn.com>
1542             Jeff Law  <law@redhat.com>
1544         PR c++/69024
1545         PR c++/68997
1546         * cp-gimplify.c (cp_gimplify_expr): Call cilk_cp_detect_spawn_and_unwrap
1547         instead of cilk_detect_spawn_and_unwrap.
1548         * cp-cilkplus.c (is_conversion_operator_function_decl_p): New.
1549         (find_spawn): New.
1550         (cilk_cp_detect_spawn_and_unwrap): New.
1551         * lambda.c: Include cp-cilkplus.h.
1552         * parser.c: Include cp-cilkplus.h.
1553         * cp-tree.h (cpp_validate_cilk_plus_loop): Move prototype into...
1554         * cp-cilkpus.h: New file.
1556 2016-04-27  Nathan Sidwell  <nathan@acm.org>
1558         * constexpr.c (get_fundef_copy): Use the original function for
1559         non-recursive evaluations.
1560         (save_fundef_copy): Always expect a slot to be available.
1562 2016-04-27  Bernd Schmidt  <bschmidt@redhat.com>
1564         * parser.c (cp_parser_postfix_expression): Call
1565         warn_for_memset instead of warning directly here.
1567 2016-04-26  Patrick Palka  <ppalka@gcc.gnu.org>
1569         PR c++/70241
1570         * decl.c (build_enumerator): Set current_access_specifier when
1571         declaring an enumerator belonging to an in-class enumeration.
1572         * parser.c (cp_parser_check_access_in_redecleration): Also
1573         consider in-class enumerations.
1575 2016-04-26  Marek Polacek  <polacek@redhat.com>
1577         PR c++/70744
1578         * call.c (build_conditional_expr_1): Call cp_stabilize_reference
1579         instead of stabilize_reference.
1580         (build_over_call): Likewise.
1581         * cp-tree.h (cp_stabilize_reference): Declare.
1582         * tree.c (cp_stabilize_reference): New function.
1583         * typeck.c (cp_build_unary_op): Call cp_stabilize_reference instead of
1584         stabilize_reference.
1585         (unary_complex_lvalue): Likewise.
1586         (cp_build_modify_expr): Likewise.
1588 2016-04-26  Jakub Jelinek  <jakub@redhat.com>
1590         PR bootstrap/70704
1591         * pt.c (build_non_dependent_expr): Use flag_checking > 1 instead of
1592         just flag_checking.
1594 2016-04-25  Jason Merrill  <jason@redhat.com>
1596         * tree.c (std_attribute_table): New.
1597         (init_tree): Register it.
1599 2016-04-22  Jason Merrill  <jason@redhat.com>
1601         * parser.c (cp_parser_perform_range_for_lookup): Decay the array.
1603 2016-04-21  Patrick Palka  <ppalka@gcc.gnu.org>
1605         * name-lookup.c (free_saved_scope): New free list of saved_scope
1606         structures.
1607         (push_to_top_level): Attempt to reuse a saved_scope struct
1608         from free_saved_scope instead of allocating a new one each time.
1609         (pop_from_top_level_1): Chain the now-unused saved_scope structure
1610         onto free_saved_scope.
1612 2016-04-21  Paolo Carlini  <paolo.carlini@oracle.com>
1614         PR c++/70540
1615         * semantics.c (process_outer_var_ref): Unconditionally return
1616         error_mark_node when mark_used returns false.
1618 2016-04-21  Marek Polacek  <polacek@redhat.com>
1620         PR c++/70513
1621         * parser.c (cp_parser_enum_specifier): Check and possibly error for
1622         extra qualification.
1624 2016-04-20  Nathan Sidwell  <nathan@acm.org>
1626         PR c++/55635
1627         * init.c (build_vec_delete_1): Protect operator delete call in try
1628         finally.
1629         (build_delete): Likewise.
1630         * optimize.c (build_delete_destructor_body): Likewise.
1632 2016-04-20  Ilya Verbin  <ilya.verbin@intel.com>
1634         PR c++/69363
1635         * cp-tree.h (finish_omp_clauses): Add new default argument.
1636         * parser.c (cp_parser_cilk_simd_all_clauses): Use finish_omp_clauses
1637         instead of c_finish_cilk_clauses.
1638         * semantics.c (finish_omp_clauses): Add new argument.  Allow
1639         floating-point variables in the linear clause for Cilk Plus.
1641 2016-04-20  Nathan Sidwell  <nathan@acm.org>
1643         * semantics.c (finish_compound_lteral): Don't wrap VECTOR_TYPEs in a
1644         TARGET_EXPR.
1646 2016-04-19  Jason Merrill  <jason@redhat.com>
1648         PR c++/66543
1649         * expr.c (mark_exp_read): Handle NON_DEPENDENT_EXPR.
1650         * pt.c (make_pack_expansion): Call mark_exp_read.
1651         * semantics.c (finish_id_expression): Call mark_type_use in
1652         unevaluated context.
1654         DR 2137
1655         * call.c (implicit_conversion): If we choose a copy constructor
1656         for list-initialization from the same type, the conversion is an
1657         exact match.
1659         * constexpr.c (breaks): Handle EXIT_EXPR.
1660         (cxx_eval_loop_expr): Handle COMPOUND_EXPR body.
1661         (cxx_eval_constant_expression): Handle EXIT_EXPR, improve handling
1662         of COMPOUND_EXPR.
1664         PR c++/68206
1665         PR c++/68530
1666         * constexpr.c (potential_constant_expression_1): Handle LOOP_EXPR
1667         and GOTO_EXPR.
1669         * pt.c (tsubst_expr): Remove shadowing declaration.
1670         (tsubst_pack_expansion): Add assert.
1672         * semantics.c (add_decl_expr): Use DECL_SOURCE_LOCATION.
1674         PR c++/70522
1675         * name-lookup.c (qualified_lookup_using_namespace): Look through
1676         hidden names.
1678 2016-04-18  Michael Matz  <matz@suse.de>
1680         * class.c (build_vtable): Use SET_DECL_ALIGN and SET_TYPE_ALIGN.
1681         (layout_class_type): Ditto.
1682         (build_base_field): Use SET_DECL_ALIGN.
1683         (fixup_attribute_variants): Use SET_TYPE_ALIGN.
1684         * decl.c (duplicate_decls): Use SET_DECL_ALIGN.
1685         (record_unknown_type): Use SET_TYPE_ALIGN.
1686         (cxx_init_decl_processing): Ditto.
1687         (copy_type_enum): Ditto.
1688         (grokfndecl): Use SET_DECL_ALIGN.
1689         (copy_type_enum): Use SET_TYPE_ALIGN.
1690         * pt.c (instantiate_class_template_1): Use SET_TYPE_ALIGN.
1691         (tsubst): Ditto.
1692         * tree.c (cp_build_qualified_type_real): Use SET_TYPE_ALIGN.
1693         * lambda.c (maybe_add_lambda_conv_op): Use SET_DECL_ALIGN.
1694         * method.c (implicitly_declare_fn): Use SET_DECL_ALIGN.
1695         * rtti.c (emit_tinfo_decl): Ditto.
1697 2016-04-18  Jason Merrill  <jason@redhat.com>
1699         PR c++/70690
1700         PR c++/70528
1701         * class.c (type_maybe_constexpr_default_constructor): New.
1702         (type_has_constexpr_default_constructor): Revert.
1704 2016-04-16  Sandra Loosemore  <sandra@codesourcery.com>
1706         PR target/1078
1708         * tree.c (cxx_attribute_table): Remove "com_interface" entry.
1709         (handle_com_interface_attribute): Delete.
1711 2016-04-15  Jason Merrill  <jason@redhat.com>
1713         PR c++/70685
1714         * constexpr.c (get_fundef_copy): Handle null *slot.
1716         PR c++/70505
1717         * pt.c (tsubst_baselink): Give the new TEMPLATE_ID_EXPR
1718         unknown_type_node, too.
1720 2016-04-15  Jason Merrill  <jason@redhat.com>
1721             Nathan Sidwell  <nathan@acm.org>
1723         PR c++/70594
1724         * constexpr.c (constexpr_call_table): Preserve in GC.
1725         (struct fundef_copy, struct fundef_copies_table_t):     Delete.
1726         (fundef_copies_table): Preserve in GC. Change to pointer to
1727         tree->tree hash.
1728         (maybe_initialize_fundef_copies_table): Adjust.
1729         (get_fundef_copy): Return a TREE_LIST.  Use non-inserting search.
1730         (save_fundef_copy): Adjust for a TREE_LIST.
1731         (cxx_eval_call_expression): Adjust for a fundef_copy TREE_LIST.
1732         (fini_constexpr): New.
1733         * cp-tree.h (fini_constexpr): Declare.
1734         * decl2.c (c_parse_final_cleanups): Call fini_constexpr.
1736 2016-04-15  Jakub Jelinek  <jakub@redhat.com>
1738         PR c/70436
1739         * parser.c (cp_parser_pragma): Add IF_P argument, pass it down
1740         where needed.
1741         (cp_parser_declaration_seq_opt, cp_parser_member_specification_opt,
1742         cp_parser_objc_interstitial_code, cp_parser_omp_declare_simd,
1743         cp_parser_oacc_routine): Adjust cp_parser_pragma callers.
1744         (cp_parser_statement): Likewise.  Adjust cp_parser_cilk_for caller.
1745         (cp_parser_omp_structured_block): Add IF_P argument, pass it down to
1746         cp_parser_statement.
1747         (cp_parser_oacc_data, cp_parser_oacc_host_data, cp_parser_oacc_loop,
1748         cp_parser_oacc_kernels_parallel, cp_parser_omp_critical,
1749         cp_parser_omp_simd, cp_parser_omp_for, cp_parser_omp_master,
1750         cp_parser_omp_ordered, cp_parser_omp_parallel, cp_parser_omp_single,
1751         cp_parser_omp_task, cp_parser_omp_taskgroup, cp_parser_omp_distribute,
1752         cp_parser_omp_teams, cp_parser_omp_target_data, cp_parser_omp_target,
1753         cp_parser_omp_taskloop, cp_parser_omp_construct,
1754         cp_parser_cilk_grainsize, cp_parser_cilk_simd, cp_parser_cilk_for):
1755         Add IF_P argument, pass it down where needed.
1756         (cp_parser_omp_for_loop): Likewise.  Clear IF_P if nbraces.
1757         (cp_parser_omp_sections_scope): Adjust cp_parser_omp_structured_block
1758         calls.
1760 2016-04-14  Jason Merrill  <jason@redhat.com>
1762         PR c++/70494
1763         * decl.c (cxx_maybe_build_cleanup): Handle non-decls.
1764         * typeck2.c (split_nonconstant_init_1): Use it.
1766         PR c++/70528
1767         * class.c (type_has_constexpr_default_constructor): Return true
1768         for an implicitly declared constructor.
1770         PR c++/70622
1771         * parser.c (cp_parser_init_declarator): Add auto_result parm.
1772         (cp_parser_simple_declaration): Pass it.
1773         (strip_declarator_types): New.
1775         PR c++/70543
1776         * pt.c (value_dependent_expression_p) [VAR_DECL]: A type-dependent
1777         initializer also makes the variable value-dependent.
1779         PR c++/70648
1780         * constexpr.c (cxx_eval_store_expression): Also copy
1781         CONSTRUCTOR_NO_IMPLICIT_ZERO.
1783 2016-04-14  Martin Sebor  <msebor@redhat.com>
1785         PR c++/69517
1786         PR c++/70019
1787         PR c++/70588
1788         * cp-tree.h, decl.c, init.c, typeck2.c: Revert.
1790 2016-04-14  Jason Merrill  <jason@redhat.com>
1792         * call.c, decl.c, error.c, cp-tree.h, decl.c: Revert empty
1793         parameter ABI change.
1795 2016-04-13  Martin Sebor  <msebor@redhat.com>
1797         PR c++/69517
1798         PR c++/70019
1799         PR c++/70588
1800         * cp-tree.h (throw_bad_array_length, build_vla_check): Declare new
1801         functions.
1802         * decl.c (check_initializer, cp_finish_decl): Call them.
1803         (reshape_init_r): Reject incompletely braced intializer-lists
1804         for VLAs.
1805         * init.c (throw_bad_array_length, build_vla_check)
1806         (build_vla_size_check, build_vla_init_check): Define new functions.
1807         * typeck2.c (split_nonconstant_init_1): Use variably_modified_type_p()
1808         to detect a VLA.
1809         (store_init_value): Same.
1811 2016-04-13  Jason Merrill  <jason@redhat.com>
1813         Warn about empty parameter ABI with -Wabi=9.
1814         * call.c (empty_class_msg, mark_for_abi_warning)
1815         (warn_empty_class_abi): New.
1816         (build_call_a): Use them.
1817         * decl.c (store_parm_decls): Use mark_for_abi_warning.
1818         * error.c (pp_format_to_string): New.
1820         Pass empty class parameters like C.
1821         * call.c (pass_as_empty_struct, empty_class_arg): New.
1822         (type_passed_as, build_x_va_arg): Use pass_as_empty_struct.
1823         (build_call_a): Use empty_class_arg.
1824         * cp-tree.h (CPTI_EMPTY_STRUCT, empty_struct_type): New.
1825         * decl.c (cxx_init_decl_processing): Create empty_struct_type.
1827 2016-04-13  Jason Merrill  <jason@redhat.com>
1829         PR c++/70627
1830         * decl.c (start_enum): Don't change an existing ENUM_UNDERLYING_TYPE.
1832 2016-04-13  Paolo Carlini  <paolo.carlini@oracle.com>
1834         PR c++/70635
1835         * pt.c (resolve_typename_type): Fix typos in infinite recursion
1836         avoidance mechanism.
1838 2016-04-13  Jason Merrill  <jason@redhat.com>
1840         PR c++/70634
1841         * pt.c (instantiation_dependent_uneval_expression_p): Split out
1842         from instantiation_dependent_expression_p.
1843         (value_dependent_expression_p): Use it for unevaluated operands.
1844         (instantiation_dependent_r): Don't check value-dependence.
1845         (instantiation_dependent_expression_p): Check
1846         value-dependence of the expression as a whole.
1847         * cp-tree.h: Declare instantiation_dependent_uneval_expression_p.
1848         * semantics.c (finish_decltype_type): Use it.
1850         * constexpr.c (potential_nondependent_constant_expression): New.
1851         (potential_nondependent_static_init_expression): New.
1852         (maybe_constant_value_1, fold_non_dependent_expr)
1853         (maybe_constant_init): Use them.
1854         * pt.c (instantiate_non_dependent_expr_sfinae)
1855         (instantiate_non_dependent_or_null, convert_nontype_argument): Use
1856         them.
1857         * cp-tree.h: Declare them.
1859 2016-04-13  Jakub Jelinek  <jakub@redhat.com>
1861         PR c++/70594
1862         * decl.c (pop_labels_1): Removed.
1863         (note_label, sort_labels): New functions.
1864         (pop_labels): During named_labels traversal, just push the slot
1865         pointers into a vector, then qsort it by DECL_UID and only then
1866         call pop_label and chain it into BLOCK_VARS.
1868 2016-04-13  Jason Merrill  <jason@redhat.com>
1870         PR c++/70615
1871         * cp-gimplify.c (cp_genericize_r): Expand PTRMEM_CST here.
1872         (cp_gimplify_expr): Not here.
1874 2016-04-12  Patrick Palka  <ppalka@gcc.gnu.org>
1876         PR c++/70610
1877         * tree.c (lvalue_kind) [NON_DEPENDENT_EXPR]: Unconditionally
1878         recurse into it.
1879         * typeck.c (build_x_conditional_expr): Unconditionally remember
1880         that the result is an lvalue or xvalue.
1882 2016-04-12  Jason Merrill  <jason@redhat.com>
1884         * class.c (is_really_empty_class): A zero-length array is empty.
1885         An unnamed bit-field doesn't make a class non-empty.
1887 2016-04-12  Paolo Carlini  <paolo.carlini@oracle.com>
1889         PR c++/68722
1890         * parser.c (cp_parser_cache_defarg): When file ends in default
1891         argument simply return error_mark_node.
1893 2016-04-12  Nathan Sidwell  <nathan@acm.org>
1895         PR c++/70501
1896         * constexpr.c (cxx_eval_bare_aggregate): Handle VECTOR_TYPE
1897         similarly to PMF.
1899 2016-04-11  Jason Merrill  <jason@redhat.com>
1901         * mangle.c (decl_is_template_id): The template itself counts as a
1902         template-id.
1904 2016-04-08  Patrick Palka  <ppalka@gcc.gnu.org>
1906         PR c++/70590
1907         PR c++/70452
1908         * constexpr.c (cxx_eval_outermost_expression): Call unshare_expr
1909         on the result if it's not a CONSTRUCTOR.
1911 2016-04-07  Patrick Palka  <ppalka@gcc.gnu.org>
1913         PR c++/70452
1914         * constexpr.c (find_constructor): New function.
1915         (unshare_constructor): New function.
1916         (cxx_eval_call_expression): Use unshare_constructor instead of
1917         unshare_expr.
1918         (find_array_ctor_elt): Likewise.
1919         (cxx_eval_vec_init_1): Likewise.
1920         (cxx_eval_store_expression): Likewise.
1921         (cxx_eval_constant_expression): Likewise.
1923 2016-04-06  Patrick Palka  <ppalka@gcc.gnu.org>
1925         PR c/70436
1926         * cp-tree.h (FOR_EACH_CLONE): Restructure macro to avoid
1927         potentially generating a future -Wparentheses warning in its
1928         callers.
1930 2016-04-06  Jason Merrill  <jason@redhat.com>
1932         * class.c (check_abi_tags): Fix function template handling.
1934 2016-04-05  Nathan Sidwell  <nathan@acm.org>
1936         PR c++/70512
1937         * class.c (fixup_may_alias): New.
1938         (fixup_attribute_variants): Call it.
1940 2016-04-05  Patrick Palka  <ppalka@gcc.gnu.org>
1942         PR c++/70452
1943         * constexpr.c (struct fundef_copy): New struct.
1944         (struct fundef_copies_table_t): New struct.
1945         (fundef_copies_table): New static variable.
1946         (maybe_initialize_fundef_copies_table): New static function.
1947         (get_fundef_copy): New static function.
1948         (save_fundef_copy): New static function.
1949         (cxx_eval_call_expression): Use get_fundef_copy, and
1950         save_fundef_copy.
1951         (constexpr_call_table): Add "deletable" GTY marker.
1953 2016-04-05  Patrick Palka  <ppalka@gcc.gnu.org>
1955         PR c++/70452
1956         * cp-tree.h (class cache_map): Remove.
1957         * constexpr.c (cv_cache): Change type to
1958         GTY((deletable)) hash_map<tree, tree> *.
1959         (maybe_constant_value): Adjust following the change to cv_cache.
1960         (clear_cv_cache): New static function.
1961         (clear_cv_and_fold_caches): Use it.
1962         * cp-gimplify.c (fold_cache): Change type to
1963         GTY((deletable)) hash_map<tree, tree> *.
1964         (clear_fold_cache): Adjust following the change to fold_cache.
1965         (cp_fold): Likewise.
1967 2016-04-02  Martin Sebor  <msebor@redhat.com>
1969         PR c++/67376
1970         PR c++/70170
1971         PR c++/70172
1972         PR c++/70228
1973         * constexpr.c (diag_array_subscript): New function.
1974         (cxx_eval_array_reference): Detect out of bounds array indices.
1976 2016-04-01  Jason Merrill  <jason@redhat.com>
1978         PR c++/70449
1979         PR c++/70344
1980         * pt.c (instantiate_decl): A function isn't fully defined if
1981         DECL_INITIAL is error_mark_node.
1982         * constexpr.c (cxx_eval_call_expression): Likewise.
1984 2016-04-01  Jakub Jelinek  <jakub@redhat.com>
1985             Marek Polacek  <polacek@redhat.com>
1987         PR c++/70488
1988         * init.c (warn_placement_new_too_small): Test whether
1989         DECL_SIZE_UNIT or TYPE_SIZE_UNIT are integers that fit into uhwi.
1991 2016-04-01  Nathan Sidwell  <nathan@acm.org>
1993         PR c++/68475
1994         * decl.c (check_redeclaration_exception_specification): Check
1995         regardless of -fno-exceptions.
1996         * typeck2.c (merge_exception_specifiers): Relax assert by checking
1997         flag_exceptions too.
1999 2016-03-31  Nathan Sidwell  <nathan@acm.org>
2001         * decl.c (start_preparsed_function): Remove unnecessary bracing.
2002         (finish_destructor_body): Don't emit operator delete here.
2004 2016-03-31  Nathan Sidwell  <nathan@acm.org>
2006         PR c++/70393
2007         * constexpr.c (cxx_eval_store_expression): Keep CONSTRUCTOR
2008         elements in field order.
2010 2016-03-31  Marek Polacek  <polacek@redhat.com>
2012         PR c/70297
2013         * decl.c (duplicate_decls): Also set TYPE_ALIGN and TYPE_USER_ALIGN.
2015 2016-03-31  Richard Biener  <rguenther@suse.de>
2017         PR c++/70430
2018         * typeck.c (cp_build_binary_op): Fix operand order of vector
2019         conditional in truth op handling.
2021 2016-03-29  Jason Merrill  <jason@redhat.com>
2023         PR c++/70353
2024         * decl.c (make_rtl_for_nonlocal_decl): Don't defer local statics
2025         in constexpr functions.
2027 2016-03-28  Jason Merrill  <jason@redhat.com>
2029         PR c++/70422
2030         PR c++/64266
2031         PR c++/70353
2032         * decl.c, pt.c, constexpr.c: Revert last patch.
2034 2016-03-25  Jason Merrill  <jason@redhat.com>
2035             Martin LiÅ¡ka  <mliska@suse.cz>
2037         PR c++/64266
2038         PR c++/70353
2039         Core issue 1962
2040         * decl.c (cp_fname_init): Decay the initializer to pointer.
2041         (cp_make_fname_decl): Set DECL_DECLARED_CONSTEXPR_P,
2042         DECL_VALUE_EXPR, DECL_INITIALIZED_BY_CONSTANT_EXPRESSION_P.
2043         Don't call cp_finish_decl.
2044         * pt.c (tsubst_expr) [DECL_EXPR]: Set DECL_VALUE_EXPR,
2045         DECL_INITIALIZED_BY_CONSTANT_EXPRESSION_P.  Don't call cp_finish_decl.
2046         * constexpr.c (cxx_eval_constant_expression) [VAR_DECL]:
2047         Handle DECL_VALUE_EXPR.
2049 2016-03-24  Jason Merrill  <jason@redhat.com>
2051         PR c++/70386
2052         * constexpr.c (cxx_eval_bare_aggregate): Handle PMFs.
2054         PR c++/70323
2055         * constexpr.c (cxx_eval_call_expression): Don't cache result if
2056         *overflow_p.
2058 2016-03-24  Patrick Palka  <ppalka@gcc.gnu.org>
2060         PR c++/62212
2061         * tree.c (build_cplus_array_type): Determine type-dependentess
2062         with uses_template_parms instead of with dependent_type_p.
2064 2016-03-23  Patrick Palka  <ppalka@gcc.gnu.org>
2066         PR c++/70347
2067         * typeck.c (process_init_constructor_union): If the initializer
2068         is empty, use the union's NSDMI if it has one.
2070 2016-03-23  Patrick Palka  <ppalka@gcc.gnu.org>
2072         PR c++/70332
2073         * pt.c (tsubst_copy) [PARM_DECL]: Handle the use of 'this' in an
2074         NSDMI that's part of an aggregrate initialization.
2076 2016-03-23  Jakub Jelinek  <jakub@redhat.com>
2078         PR c++/70001
2079         * constexpr.c (cxx_eval_vec_init_1): Reuse CONSTRUCTOR initializers
2080         for 1..max even for multi-dimensional arrays.  Call unshare_expr
2081         on it.
2083         PR c++/70323
2084         * constexpr.c (cxx_eval_constant_expression): Diagnose overflow
2085         on TREE_OVERFLOW constants.
2087         PR c++/70376
2088         * cp-gimplify.c (genericize_omp_for_stmt): Don't walk OMP_FOR_CLAUSES
2089         for OMP_TASKLOOP here.
2090         (cp_genericize_r): Handle OMP_TASKLOOP like OMP_TASK, except do call
2091         genericize_omp_for_stmt instead of cp_walk_tree on OMP_BODY.
2093 2016-03-23  Alexandre Oliva  <aoliva@redhat.com>
2094             Jason Merrill  <jason@redhat.com>
2095             Jakub Jelinek  <jakub@redhat.com>
2097         PR c++/69315
2098         * cp-tree.h (defer_mark_used_calls, deferred_mark_used_calls): Remove.
2099         * decl.c (defer_mark_used_calls, deferred_mark_used_calls): Remove.
2100         (finish_function): Don't set or test them.
2101         * decl2.c (mark_used): Don't handle defer_mark_used_calls.
2103 2016-03-23  Jason Merrill  <jason@redhat.com>
2105         PR c++/70344
2106         * constexpr.c (cxx_eval_call_expression): Catch invalid recursion.
2108 2016-03-23  Marek Polacek  <polacek@redhat.com>
2110         PR c++/69884
2111         * pt.c (canonicalize_type_argument): Use OPT_Wignored_attributes.
2113 2016-03-22  Ilya Enkovich  <enkovich.gnu@gmail.com>
2115         * call.c (build_conditional_expr_1): Always use original
2116         condition type for vector type checks and build.
2118 2016-03-22  Patrick Palka  <ppalka@gcc.gnu.org>
2120         PR c++/70096
2121         * pt.c (tsubst_decl): Clear the DECL_MODE of the new decl.
2123 2016-03-22  Patrick Palka  <ppalka@gcc.gnu.org>
2125         PR c++/70204
2126         * constexpr.c (non_const_var_error): Check
2127         DECL_INITIALIZED_BY_CONSTANT_EXPRESSION_P.
2129 2016-03-21  Richard Henderson  <rth@redhat.com>
2131         PR c++/70273
2132         * decl.c (notice_forced_label_r): New.
2133         (cp_finish_decl): Use it.
2135 2016-03-21  Jason Merrill  <jason@redhat.com>
2137         PR c++/70285
2138         * cp-gimplify.c (cp_fold) [COND_EXPR]: Handle bit-fields.
2140 2016-03-18  Jason Merrill  <jason@redhat.com>
2142         PR c++/70139
2143         * constexpr.c (cxx_eval_call_expression): Fix trivial copy.
2145         PR c++/70147
2146         * class.c (vptr_via_virtual_p): New.
2147         (most_primary_binfo): Factor out of build_rtti_vtbl_entries.
2148         * cp-ubsan.c (cp_ubsan_dfs_initialize_vtbl_ptrs): Don't clear
2149         a vptr from any virtual base in a not-in-charge 'structor.
2151         * decl.c (build_clobber_this): Factor out of
2152         start_preparsed_function and begin_destructor_body.  Handle
2153         virtual bases better.
2155         * class.c (build_if_in_charge): Split out from build_base_path.
2156         * init.c (expand_virtual_init, expand_default_init): Use it.
2157         * call.c (build_special_member_call): Use it.
2159 2016-03-18  Jakub Jelinek  <jakub@redhat.com>
2161         PR c++/70267
2162         * init.c (build_new_1): Complain and return error_mark_node
2163         if alloc_fn is not _Jv_AllocObject function returning pointer.
2165 2016-03-18  Patrick Palka  <ppalka@gcc.gnu.org>
2167         PR c++/70205
2168         * search.c (adjust_result_of_qualified_name_lookup): Don't
2169         update the BASELINK_BINFO of DECL if the second call
2170         to lookup_base fails.
2172 2016-03-18  Patrick Palka  <ppalka@gcc.gnu.org>
2174         PR c++/70218
2175         * parser.c (cp_parser_lambda_expression): Move call to
2176         pop_deferring_access_checks ahead of the call to
2177         cp_parser_end_tentative_firewall.
2179 2016-03-17  Jakub Jelinek  <jakub@redhat.com>
2181         PR c++/70144
2182         * cp-tree.h (magic_varargs_p): Return int instead of bool.
2183         * call.c (magic_varargs_p): Return int instead of bool, return 2 for
2184         Cilk+ reductions, otherwise 1 for magic varargs and 0 for normal
2185         varargs.
2186         (build_over_call): If magic_varargs_p == 2, call reject_gcc_builtin,
2187         if magic_varargs_p == 1, call decay_conversion
2188         instead of mark_type_use.  Don't store error_mark_node arguments to
2189         argarray, instead return error_mark_node.
2191         PR c++/70272
2192         * decl.c (begin_destructor_body): Don't insert clobber if
2193         is_empty_class (current_class_type).
2195 2016-03-17  Marek Polacek  <polacek@redhat.com>
2197         PR c++/70194
2198         * typeck.c (warn_for_null_address): New function.
2199         (cp_build_binary_op): Call it.
2201 2016-03-16  Jason Merrill  <jason@redhat.com>
2203         PR c++/70259
2204         * decl.c (start_preparsed_function): Don't clobber an empty base.
2206 2016-03-16  Jakub Jelinek  <jakub@redhat.com>
2208         PR c++/70147
2209         * cp-ubsan.c (cp_ubsan_dfs_initialize_vtbl_ptrs): Conditionalize
2210         BINFO_VIRTUAL_P vtable clearing on current_in_charge_parm.
2212         PR c++/70147
2213         * cp-ubsan.c (cp_ubsan_maybe_initialize_vtbl_ptrs): Temporarily
2214         set in_base_initializer.
2216 2016-03-15  Marek Polacek  <polacek@redhat.com>
2218         PR c++/70209
2219         * tree.c (strip_typedefs): Call strip_typedefs again on the
2220         DECL_ORIGINAL_TYPE result.
2222 2016-03-15  Jason Merrill  <jason@redhat.com>
2224         PR c++/70095
2225         * pt.c (instantiate_decl): Fix call to variable_template_p.
2227         PR c++/70141
2228         * pt.c (for_each_template_parm_r): Always walk into TYPENAME_TYPE.
2230 2016-03-14  Casey Carter  <casey@carter.net>
2231             Jason Merrill  <jason@redhat.com>
2233         P0184R0: Generalizing the Range-Based For Loop
2234         * parser.c (cp_convert_range_for): Set the type of __end separately.
2235         (cp_parser_perform_range_for_lookup): Allow different begin/end
2236         types if they are comparable.
2238 2016-03-12  Patrick Palka  <ppalka@gcc.gnu.org>
2240         PR c++/70106
2241         * semantics.c (force_paren_expr): Just build a PAREN_EXPR when
2242         processing_template_decl and EXPR is a SCOPE_REF.
2244 2016-03-10  Patrick Palka  <ppalka@gcc.gnu.org>
2245             Jakub Jelinek  <jakub@redhat.com>
2247         PR c++/70001
2248         * constexpr.c (cxx_eval_vec_init_1): For pre_init case, reuse
2249         return value from cxx_eval_constant_expression from earlier
2250         elements if it is valid constant initializer requiring no
2251         relocations.
2253 2016-03-10  Marek Polacek  <polacek@redhat.com>
2255         PR c++/70153
2256         * cp-gimplify.c (cp_fold): Handle UNARY_PLUS_EXPR.
2258 2016-03-09  Cesar Philippidis  <cesar@codesourcery.com>
2260         * parser.c (cp_parser_oacc_loop): Update cclauses and clauses
2261         when calling c_finish_omp_clauses.
2263 2016-03-08  Jason Merrill  <jason@redhat.com>
2265         * parser.c (cp_parser_diagnose_invalid_type_name): Give helpful
2266         diagnostic for use of "concept".
2267         (cp_parser_requires_clause_opt): And "requires".
2268         (cp_parser_type_parameter, cp_parser_late_return_type_opt)
2269         (cp_parser_explicit_template_declaration): Adjust.
2270         * Make-lang.in (check-c++-all): Add "concepts" to std list.
2272         P0036R0: Unary Folds and Empty Parameter Packs
2273         * pt.c (expand_empty_fold): Remove special cases for *,+,&,|.
2275 2016-03-08  Jakub Jelinek  <jakub@redhat.com>
2277         PR c++/70135
2278         * constexpr.c (cxx_eval_loop_expr): Forget saved values of SAVE_EXPRs
2279         even after the last iteration of the loop.
2281         * decl.c (duplicate_decls): Fix spelling - becuase -> because.
2283 2016-03-07  Patrick Palka  <ppalka@gcc.gnu.org>
2285         PR c++/66786
2286         * pt.c (get_template_info): Handle PARM_DECL.
2287         (template_class_depth): Check DECL_P instead of
2288         VAR_OR_FUNCTION_DECL_P.
2290 2016-03-05  Jason Merrill  <jason@redhat.com>
2292         PR c++/67364
2293         * constexpr.c (cxx_eval_store_expression): Replace
2294         CONSTRUCTOR_ELTS in nested CONSTRUCTORs, too.
2296 2016-03-05  Patrick Palka  <ppalka@gcc.gnu.org>
2298         PR c++/66786
2299         * pt.c (template_class_depth): Given a lambda type, iterate
2300         into its LAMBDA_TYPE_EXTRA_SCOPE field instead of its
2301         TYPE_CONTEXT.  Given a VAR_DECL, iterate into its
2302         CP_DECL_CONTEXT.
2304 2016-03-04  Jason Merrill  <jason@redhat.com>
2306         PR c++/69203
2307         * cp-tree.h (COND_EXPR_IS_VEC_DELETE): New.
2308         * init.c (build_vec_delete_1): Set it.
2309         * constexpr.c (potential_constant_expression_1) [COND_EXPR]: Check it.
2311 2016-03-04  Jakub Jelinek  <jakub@redhat.com>
2313         * decl.c (start_preparsed_function): Don't emit start clobber at the
2314         start of constructor clones.
2316         PR c++/70035
2317         * cp-tree.h (cp_ubsan_maybe_initialize_vtbl_ptrs): New prototype.
2318         * decl.c (start_preparsed_function): Call
2319         cp_ubsan_maybe_initialize_vtbl_ptrs if needed.
2320         * cp-ubsan.c (cp_ubsan_dfs_initialize_vtbl_ptrs,
2321         cp_ubsan_maybe_initialize_vtbl_ptrs): New functions.
2323 2016-03-04  Jason Merrill  <jason@redhat.com>
2325         PR c++/67364
2326         * constexpr.c (cxx_eval_component_reference): Further tweak.
2328         * constexpr.c (struct constexpr_ctx): Add save_exprs field.
2329         (cxx_eval_loop_expr): Discard SAVE_EXPR values before looping.
2330         (cxx_eval_constant_expression) [SAVE_EXPR]: Add it to the set.
2331         (cxx_eval_outermost_constant_expr, is_sub_constant_expr): Initialize.
2333         PR c++/70067
2334         * tree.c (strip_typedefs): Handle TYPENAME_TYPE lookup finding the
2335         same type.
2337 2016-03-03  Jason Merrill  <jason@redhat.com>
2339         * method.c (synthesized_method_walk): operator= can also be constexpr.
2341         * pt.c (tsubst_copy_and_build) [LAMBDA_EXPR]: Get
2342         LAMBDA_EXPR_RETURN_TYPE from the instantiated closure.
2344         PR c++/67164
2345         * pt.c (copy_template_args): New.
2346         (tsubst_pack_expansion): Use it.
2348         * call.c (build_aggr_conv): Use get_nsdmi.
2350         PR c++/51406
2351         * typeck.c (build_static_cast_1): Avoid folding back to lvalue.
2353         PR c++/67364
2354         * constexpr.c (cxx_eval_component_reference): Just return an empty
2355         CONSTRUCTOR for an empty class.
2357 2016-03-01  Jason Merrill  <jason@redhat.com>
2359         PR c++/70036
2360         * parser.c (cp_parser_requires_clause): Call
2361         check_for_bare_parameter_packs.
2363         PR c++/51489
2364         * constexpr.c (cxx_eval_binary_expression): Don't VERIFY_CONSTANT
2365         the operands.
2367         PR c++/69995
2368         * constexpr.c (cxx_eval_call_expression): Unshare arg.
2369         (cxx_eval_constant_expression) [DECL_EXPR]: Unshare init.
2370         [TARGET_EXPR]: Unshare init.
2372 2016-03-01  Patrick Palka  <ppalka@gcc.gnu.org>
2374         PR c++/68948
2375         PR c++/69961
2376         * pt.c (tsubst_baselink): Reinstate the check for an invalid
2377         constructor call.
2379 2016-02-28  Jason Merrill  <jason@redhat.com>
2381         PR c++/69995
2382         * constexpr.c (cxx_eval_store_expression): Unshare init.
2384 2016-02-26  Jason Merrill  <jason@redhat.com>
2386         PR c++/69958
2387         * pt.c (make_argument_pack): New.
2388         (tsubst_copy) [SIZEOF_EXPR]: Handle partial expansion.
2389         (tsubst_copy_and_build): Likewise.
2391 2016-02-25  Jason Merrill  <jason@redhat.com>
2393         PR c++/69889
2394         * cp-tree.h (AGGR_INIT_FROM_THUNK_P): New.
2395         * tree.c (build_aggr_init_expr): Set it.
2396         * semantics.c (simplify_aggr_init_expr): Check it.
2397         * cp-gimplify.c (cp_genericize_r): Don't walk into
2398         a call/aggr_init from a thunk.
2400         PR c++/69842
2401         * method.c (forward_parm): Handle parameter packs.
2402         * lambda.c (maybe_add_lambda_conv_op): Use it for them.
2404         PR c++/67364
2405         * constexpr.c (cxx_eval_component_reference): Don't complain about
2406         unevaluated empty classes.
2408         PR c++/68049
2409         * tree.c (strip_typedefs): Use DECL_ORIGINAL_TYPE.
2411 2016-02-25  Patrick Palka  <ppalka@gcc.gnu.org>
2413         PR c++/69736
2414         * cp-tree.h (REF_PARENTHESIZED_P): Adjust documentation.
2415         (maybe_undo_parenthesized_ref): Declare.
2416         * semantics.c (maybe_undo_parenthesized_ref): Split out from
2417         check_return_expr.
2418         (finish_call_expr): Use it.
2419         * typeck.c (check_return_expr): Use it.
2420         * pt.c (tsubst_copy_and_build) [INDIRECT_REF]: Retain the
2421         REF_PARENTHESIZED_P flag.
2423 2016-02-24  Jakub Jelinek  <jakub@redhat.com>
2425         PR c++/69922
2426         * class.c (build_base_path): Set TREE_NO_WARNING on the null_test.
2427         Avoid folding it.
2428         * init.c (build_vec_delete_1, build_delete): Don't fold the non-NULL
2429         tests.
2430         * cp-gimplify.c (cp_fold): For TREE_NO_WARNING comparisons with NULL,
2431         unless they are folded into INTEGER_CST, error_mark_node or some
2432         comparison with NULL, avoid folding them and use either the original
2433         comparison or non-folded comparison of folded arguments.
2434         * cp-ubsan.c (cp_ubsan_instrument_vptr): Set TREE_NO_WARNING on the
2435         comparison, don't fold the comparison right away.
2437 2016-02-24  Jason Merrill  <jason@redhat.com>
2439         PR c++/69323
2440         * friend.c (make_friend_class): Likewise.
2441         * decl.c (lookup_and_check_tag): Diagnose invalid dependent friend.
2443 2016-02-24  Jason Merrill  <jason@redhat.com>
2445         PR c++/69323
2446         * pt.c (instantiate_class_template_1): Set
2447         processing_template_decl before substituting friend_type.
2449 016-02-24  Martin Sebor  <msebor@redhat.com>
2451         PR c++/69912
2452         * tree.c (build_ctor_subob_ref): Compare types' main variants
2453         instead of the types as they are.
2455 2016-02-24  Jason Merrill  <jason@redhat.com>
2457         * decl.c (start_preparsed_function): Condition ctor clobber on
2458         flag_lifetime_dse > 1.
2460         * cp-gimplify.c (cp_fold): Don't fold constexpr calls if -fno-inline.
2462 2016-02-19  Jason Merrill  <jason@redhat.com>
2464         PR c++/69743
2465         * call.c (remaining_arguments): No longer static.
2466         * cp-tree.h: Declare it.
2467         * pt.c (more_specialized_fn): Use it.
2469 2016-02-19  Jakub Jelinek  <jakub@redhat.com>
2470             Bernd Edlinger  <bernd.edlinger@hotmail.de>
2472         * Make-lang.in: Invoke gperf with -L C++.
2473         * cfns.gperf: Remove prototypes for hash and libc_name_p
2474         inlines.
2475         * cfns.h: Regenerated.
2476         * except.c (nothrow_libfn_p): Adjust.
2478 2016-02-19  Jakub Jelinek  <jakub@redhat.com>
2480         PR c++/69850
2481         * rtti.c (ifnonnull): Set TREE_NO_WARNING on the condition, use
2482         NE_EXPR instead of EQ_EXPR and swap last two arguments on COND_EXPR.
2484 2016-02-19  Patrick Palka  <ppalka@gcc.gnu.org>
2486         PR c++/68948
2487         * pt.c (tsubst_baselink): Don't diagnose an invalid constructor
2488         call here.
2489         * semantics.c (finish_call_expr): Don't assume a constructor
2490         call is dependent if only the "this" pointer is dependent.  When
2491         building a constructor call, always use a dummy object.
2493 2016-02-19  Jakub Jelinek  <jakub@redhat.com>
2495         PR c++/69850
2496         * init.c (build_vec_delete_1): Set TREE_NO_WARNING on the NE_EXPR
2497         condition.
2498         * cp-gimplify.c (cp_fold): Propagate TREE_NO_WARNING from binary
2499         operators if folding preserved the binop, just with different
2500         arguments.
2502         PR c++/67767
2503         * parser.c (cp_parser_std_attribute_spec_seq): Don't assume
2504         attr_spec is always single element chain, chain all the attributes
2505         properly together in the right order.
2507 2016-02-18  Jason Merrill  <jason@redhat.com>
2509         * mangle.c (maybe_check_abi_tags): Add for_decl parm.  Call
2510         mangle_decl.
2511         (mangle_decl): Call maybe_check_abi_tags for function scope.
2512         (mangle_guard_variable): Call maybe_check_abi_tags here.
2513         (write_guarded_var_name): Not here.
2515 2016-02-17  Jason Merrill  <jason@redhat.com>
2517         PR c++/65985
2518         * constexpr.c (build_constexpr_constructor_member_initializers):
2519         Handle an additional STATEMENT_LIST.
2521         PR c++/68585
2522         * constexpr.c (cxx_eval_bare_aggregate): Fix 'changed' detection.
2524         PR c++/68679
2525         * decl2.c (reset_type_linkage_2): Look through member templates.
2527 2016-02-17  Jakub Jelinek  <jakub@redhat.com>
2529         PR c++/69850
2530         * init.c (build_delete): Set TREE_NO_WARNING on ifexp.
2532 2016-02-17  Jason Merrill  <jason@redhat.com>
2534         PR c++/69842
2535         * method.c (forward_parm): Split out from...
2536         (add_one_base_init): ...here.
2537         * lambda.c (maybe_add_lambda_conv_op): Use it.
2539 2016-02-16  Jason Merrill  <jason@redhat.com>
2541         PR c++/10200
2542         PR c++/69753
2543         * call.c, cp-tree.h, name-lookup.c, pt.c, search.c, semantics.c,
2544         tree.c, typeck2.c: Revert earlier changes.
2545         * parser.c (cp_parser_lookup_name): Ignore namespace-scope
2546         non-type templates after -> or .
2548 2016-02-16  Jakub Jelinek  <jakub@redhat.com>
2550         PR c/69835
2551         * typeck.c (cp_build_binary_op): Revert 2015-09-09 change.
2553 2016-02-16  Jason Merrill  <jason@redhat.com>
2555         PR c++/69657
2556         * name-lookup.c (lookup_qualified_name): Add find_hidden parm.
2557         (set_decl_namespace): Pass it.  Complain about finding a hidden friend.
2558         * name-lookup.h: Adjust.
2560 2016-02-16  James Norris  <jnorris@codesourcery.com>
2562         * parser.c (cp_parser_oacc_data_clause_deviceptr): Remove checking.
2563         * semantics.c (finish_omp_clauses): Add deviceptr checking.
2565 2016-02-15  Jakub Jelinek  <jakub@redhat.com>
2567         PR c++/69658
2568         * init.c (expand_default_init): Only call reshape_init
2569         in the direct-initialization from an initializer list case.
2571 2016-02-15  Jason Merrill  <jason@redhat.com>
2573         PR c++/69753
2574         * semantics.c (finish_call_expr): Implicit 'this' does not make
2575         the call dependent.
2576         * search.c (any_dependent_bases_p): Split out...
2577         * name-lookup.c (do_class_using_decl): ...from here.
2578         * call.c (build_new_method_call_1): Don't complain about missing object
2579         if there are dependent bases.  Tweak error.
2580         * tree.c (non_static_member_function_p): Remove.
2581         * pt.c (type_dependent_expression_p): A member template of a
2582         dependent type is dependent.
2583         * cp-tree.h: Adjust.
2585         PR c++/68890
2586         * constexpr.c (verify_ctor_sanity): Remove CONSTRUCTOR_NELTS check.
2588 2016-02-12  Patrick Palka  <ppalka@gcc.gnu.org>
2590         PR c++/69098
2591         * pt.c (lookup_and_finish_template_variable): New function,
2592         extracted from ...
2593         (tsubst_copy_and_build) [TEMPLATE_ID_EXPR]: ... here.  Use it.
2594         (tsubst_qualified_id): Consider that EXPR might be a variable
2595         template.
2596         * typeck.c (check_template_keyword): Don't emit an error
2597         if DECL is a variable template.
2599 2016-02-12  Jakub Jelinek  <jakub@redhat.com>
2601         * error.c: Spelling fixes - behaviour -> behavior and
2602         neighbour -> neighbor.
2603         * decl.c: Likewise.
2604         * typeck.c (cp_build_binary_op): Fix up behavior spelling in
2605         diagnostics.
2606         * init.c (build_delete): Likewise.
2608 2016-02-11  Jakub Jelinek  <jakub@redhat.com>
2610         PR c/69768
2611         * typeck.c (cp_build_binary_op): cp_fully_fold integer_zerop
2612         arguments for -Waddress warning.  Fix up formatting.
2614 2016-02-11  Paolo Carlini  <paolo.carlini@oracle.com>
2616         PR c++/68726
2617         * pt.c (lookup_template_class_1): Check tsubst return value for
2618         error_mark_node.
2620 2016-02-10  Jason Merrill  <jason@redhat.com>
2622         PR c++/68926
2623         * pt.c (resolve_nondeduced_context): Add complain parm.
2624         (do_auto_deduction): Pass it.
2625         * cvt.c (convert_to_void): Likewise.
2626         * decl.c (cp_finish_decl): Likewise.
2627         * init.c (build_new): Likewise.
2628         * rtti.c (get_tinfo_decl_dynamic): Likewise.
2629         * semantics.c (finish_decltype_type): Likewise.
2630         * typeck.c (decay_conversion): Likewise.
2631         * cp-tree.h: Adjust declaration.
2632         * call.c (standard_conversion): Add complain parm, pass it along.
2633         (implicit_conversion): Pass it.
2635         PR c++/69657
2636         * name-lookup.c (ambiguous_decl): Call remove_hidden_names.
2637         (lookup_name_real_1): Likewise.
2638         (remove_hidden_names): Handle non-functions too.
2640         PR c++/10200
2641         * parser.c (cp_parser_lookup_name): When looking for a template
2642         after . or ->, only consider class templates.
2643         (cp_parser_postfix_dot_deref_expression): Handle the current
2644         instantiation.  Remember a dependent object expression.
2645         * typeck2.c (build_x_arrow): Handle the current instantiation.
2647         * ptree.c (debug_tree): Implement for cp_expr.
2649 2016-02-08  Patrick Palka  <ppalka@gcc.gnu.org>
2651         PR c++/69139
2652         * parser.c (cp_parser_simple_type_specifier): Make the check
2653         for disambiguating between an 'auto' placeholder and an implicit
2654         template parameter more robust.
2656 2016-02-08  Patrick Palka  <ppalka@gcc.gnu.org>
2658         PR c++/69283
2659         PR c++/67835
2660         * decl2.c (mark_used): When given a TEMPLATE_DECL, return after
2661         setting its TREE_USED flag.
2663 2016-02-08  Jason Merrill  <jason@redhat.com>
2665         PR c++/69657
2666         * name-lookup.c (do_nonmember_using_decl): Leave anticipated
2667         built-ins alone.
2669 2016-02-08  Jakub Jelinek  <jakub@redhat.com>
2671         PR c++/59627
2672         * parser.c (cp_parser_omp_declare_reduction): Set assembler name
2673         of the DECL_OMP_DECLARE_REDUCTION_P decls.
2675 2016-02-08  Marek Polacek  <polacek@redhat.com>
2677         PR c++/69688
2678         * constexpr.c (clear_cv_and_fold_caches): Renamed from clear_cv_cache.
2679         Call clear_fold_cache.
2680         * cp-tree.h: Adjust declaration.
2681         * decl.c (finish_enum_value_list): Call clear_cv_and_fold_caches
2682         rather than clear_cv_cache and clear_fold_cache.
2683         * typeck2.c (store_init_value): Call clear_cv_and_fold_caches.
2685 2016-02-08  Jason Merrill  <jason@redhat.com>
2687         * cp-tree.h (CONV_FOLD, CONV_BACKEND_CONVERT): New.
2688         * cvt.c (convert): Pass CONV_BACKEND_CONVERT.
2689         (ocp_convert): Use *_maybe_fold.
2690         (cp_convert_to_pointer): Add dofold parameter.
2691         * cp-gimplify.c (cp_fold) [CONVERT_EXPR]: Call convert.
2693 2016-02-05  Martin Sebor  <msebor@redhat.com>
2695         PR c++/69662
2696         * init.c (find_field_init): New function.
2697         (warn_placement_new_too_small): Call it.  Handle one-element arrays
2698         at ends of structures special.
2700 2016-02-05  Jason Merrill  <jason@redhat.com>
2702         PR c++/68948
2703         * semantics.c (finish_expr_stmt): If expr is error_mark_node,
2704         make sure we've seen_error().
2706 2016-02-05  Patrick Palka  <ppalka@gcc.gnu.org>
2708         PR c++/68948
2709         * pt.c (tsubst_baselink): Diagnose an invalid constructor call
2710         if lookup_fnfields returns NULL_TREE and the name being looked
2711         up has the form A::A.
2713 2016-02-04  Patrick Palka  <ppalka@gcc.gnu.org>
2715         * constexpr.c (cxx_eval_binary_expression): Fold equality
2716         comparisons involving PTRMEM_CSTs.
2718 2016-02-04  Jakub Jelinek  <jakub@redhat.com>
2720         * class.c (find_flexarrays): Don't declare dom variable.
2721         (diagnose_flexarray): Likewise.
2723 2016-02-02  Martain Sebor  <msebor@redhat.com>
2725         PR c++/69251
2726         PR c++/69253
2727         PR c++/69290
2728         PR c++/69277
2729         PR c++/69349
2730         * class.c (walk_subobject_offsets): Avoid testing the upper bound
2731         of a flexible array member for equality to null.
2732         (find_flexarrays): Remove spurious whitespace introduced in r231665.
2733         (diagnose_flexarrays): Avoid checking the upper bound of arrays.
2734         (check_flexarrays): Same.
2735         * decl.c (compute_array_index_type): Avoid special case for flexible
2736         array members.
2737         (grokdeclarator): Avoid calling compute_array_index_type for flexible
2738         array members.
2739         * error.c (dump_type_suffix): Revert changes introduced in r231665
2740         and rendered unnecessary by the changes above.
2741         * pt.c (tsubst):  Same.
2742         * tree.c (build_ctor_subob_ref): Handle flexible array members.
2743         * typeck2.c (digest_init_r): Revert changes introduced in r231665.
2744         (process_init_constructor_array): Same.
2745         (process_init_constructor_record): Same.
2747 2016-02-03  Patrick Palka  <ppalka@gcc.gnu.org>
2749         PR c++/69056
2750         * pt.c (try_one_overload): Handle comparing argument packs so
2751         that there is no conflict if we deduced more arguments of an
2752         argument pack than were explicitly specified.
2754 2016-01-31  Jakub Jelinek  <jakub@redhat.com>
2755             Jason Merrill  <jason@redhat.com>
2757         PR c++/68763
2758         * tree.c (strip_typedefs) [FUNCTION_TYPE]: Avoid building a new
2759         function type if nothing is changing.
2761 2016-01-31  Jason Merrill  <jason@redhat.com>
2763         PR c++/69009
2764         * pt.c (partial_specialization_p, impartial_args): New.
2765         (instantiate_decl): Call impartial_args.
2767         * mangle.c (maybe_check_abi_tags): New.
2768         (write_guarded_var_name): Call it.
2769         (mangle_ref_init_variable): Call check_abi_tags.
2771         * pt.c (lookup_template_class_1): Don't share TYPE_ATTRIBUTES
2772         between template and instantiation.
2774 2016-01-29  Jakub Jelinek  <jakub@redhat.com>
2776         PR debug/66869
2777         * decl.c (wrapup_globals_for_namespace): Warn about unused static
2778         function declarations.
2780 2016-01-29  Marek Polacek  <polacek@redhat.com>
2782         PR c++/69509
2783         PR c++/69516
2784         * constexpr.c (cxx_eval_array_reference): Give the "array subscript
2785         out of bound" error earlier.
2786         * init.c (build_vec_init): Change NE_EXPR into GT_EXPR.  Update the
2787         commentary.
2789 2016-01-29  Patrick Palka  <ppalka@gcc.gnu.org>
2791         * name-lookup.c (begin_scope): After reusing a cp_binding_level
2792         structure, update free_binding_level before the structure's
2793         level_chain field gets cleared, not after.
2795 2016-01-28  Jason Merrill  <jason@redhat.com>
2797         PR c++/67407
2798         * search.c (dfs_walk_once, dfs_walk_once_r)
2799         (dfs_walk_once_accessible_r, dfs_walk_once_accessible): Use
2800         hash_set instead of BINFO_MARKED.
2801         (dfs_unmark_r): Remove.
2803 2016-01-28  Patrick Palka  <ppalka@gcc.gnu.org>
2805         PR c++/24208
2806         * parser.c (LEXER_DEBUGGING_ENABLED_P): New macro.
2807         (cp_lexer_debugging_p): Use it.
2808         (cp_lexer_start_debugging): Likewise.
2809         (cp_lexer_stop_debugging): Likewise.
2811 2016-01-27  Marek Polacek  <polacek@redhat.com>
2813         PR c/68062
2814         * typeck.c (cp_build_binary_op): Promote operand to unsigned, if
2815         needed.  Add -Wsign-compare warning.
2817 2016-01-27  Ryan Burn  <contact@rnburn.com>
2819         PR cilkplus/69267
2820         * cp-gimplify.c (cilk_cp_gimplify_call_params_in_spawned_fn): Removed
2821         superfluous post_p argument in call to
2822         cilk_gimplify_call_params_in_spawned_fn.
2824 2016-01-27  Marek Polacek  <polacek@redhat.com>
2826         PR c++/69379
2827         * constexpr.c (cxx_eval_constant_expression): Handle PTRMEM_CSTs
2828         wrapped in NOP_EXPRs.
2830 2016-01-27  Martin Sebor  <msebor@redhat.com>
2832         PR c++/69317
2833         * mangle.c (mangle_decl): Reference the correct (saved) version
2834         of the ABI in -Wabi diagnostics.
2836 2016-01-27  Marek Polacek  <polacek@redhat.com>
2838         PR c++/69496
2839         * constexpr.c (cxx_eval_array_reference): Evaluate the number of
2840         elements of the array.
2842 2016-01-26  Jason Merrill  <jason@redhat.com>
2844         PR c++/68949
2845         * constexpr.c (register_constexpr_fundef): Keep the un-massaged body.
2846         (cxx_eval_call_expression): Don't look through clones.
2847         * optimize.c (maybe_clone_body): Clear DECL_SAVED_TREE of the alias.
2848         * semantics.c (expand_or_defer_fn_1): Keep DECL_SAVED_TREE of
2849         maybe-in-charge *tor.
2851 2016-01-26  Jason Merrill  <jason@redhat.com>
2853         PR c++/68782
2854         * constexpr.c (cxx_eval_bare_aggregate): Update TREE_CONSTANT
2855         and TREE_SIDE_EFFECTS.
2856         (cxx_eval_constant_expression) [CONSTRUCTOR]: Call
2857         verify_constructor_flags.
2859 2016-01-26  Jakub Jelinek  <jakub@redhat.com>
2861         PR c++/68357
2862         * cp-gimplify.c (cp_fold): If some operand folds to error_mark_node,
2863         return error_mark_node instead of building trees with error_mark_node
2864         operands.
2866 2016-01-26  David Malcolm  <dmalcolm@redhat.com>
2868         PR other/69006
2869         * error.c (print_instantiation_partial_context_line): Add missing
2870         newlines from output for the t == NULL case.
2871         (print_instantiation_partial_context): Remove call to pp_newline.
2873 2016-01-24  Patrick Palka  <ppalka@gcc.gnu.org>
2875         Revert:
2876         2016-01-18  Patrick Palka  <ppalka@gcc.gnu.org>
2878         PR c++/11858
2879         PR c++/24663
2880         PR c++/24664
2881         * decl.c (grokdeclarator): Don't decay array parameter type to
2882         a pointer type if it's dependent.
2883         (grokparms): Invoke strip_top_quals instead of directly invoking
2884         cp_build_qualified_type.
2885         * pt.c (decay_dependent_array_parm_type): New static function.
2886         (type_unification_real): Call decay_dependent_array_parm_type
2887         to decay a dependent array parameter type to its corresponding
2888         pointer type before unification.
2889         (more_specialized_fn): Likewise.
2890         (get_bindings): Likewise.
2891         * tree.c (cp_build_qualified_type): Trivial typofix in
2892         documentation.
2894 2016-01-23  Martin Sebor  <msebor@redhat.com>
2896         PR c++/58109
2897         PR c++/69022
2898         * decl2.c (is_late_template_attribute): Handle dependent argument
2899         to attribute align and attribute vector_size.
2901 2016-01-21  Jason Merrill  <jason@redhat.com>
2903         PR c++/69392
2904         * lambda.c (lambda_capture_field_type): Handle 'this' specially
2905         for init-capture, too.
2907         PR c++/65687
2908         * decl.c (type_is_deprecated): Don't look into a typedef.
2910         PR c++/40751
2911         PR c++/64987
2912         * decl.c (copy_type_enum): Respect TYPE_USER_ALIGN.
2914         PR c++/43407
2915         * decl.c (start_enum): Add attributes parameter.
2916         * parser.c (cp_parser_enum_specifier): Pass it.
2917         * pt.c (lookup_template_class_1): Pass it.
2918         * cp-tree.h: Adjust.
2920 2016-01-19  Jason Merrill  <jason@redhat.com>
2922         PR c++/59759
2923         * pt.c (convert_template_argument): Handle VAR_DECL properly.
2925 2016-01-19  Marek Polacek  <polacek@redhat.com>
2927         PR c++/68586
2928         * constexpr.c (clear_cv_cache): New.
2929         * cp-gimplify.c (clear_fold_cache): New.
2930         * cp-tree.h (clear_cv_cache, clear_fold_cache): Declare.
2931         * decl.c (finish_enum_value_list): Call them.
2933         PR c++/68965
2934         * pt.c (tsubst_copy): Mark elements in expanded vector as used.
2936 2016-01-18  Patrick Palka  <ppalka@gcc.gnu.org>
2938         PR c++/11858
2939         PR c++/24663
2940         PR c++/24664
2941         * decl.c (grokdeclarator): Don't decay array parameter type to
2942         a pointer type if it's dependent.
2943         (grokparms): Invoke strip_top_quals instead of directly invoking
2944         cp_build_qualified_type.
2945         * pt.c (decay_dependent_array_parm_type): New static function.
2946         (type_unification_real): Call decay_dependent_array_parm_type
2947         to decay a dependent array parameter type to its corresponding
2948         pointer type before unification.
2949         (more_specialized_fn): Likewise.
2950         (get_bindings): Likewise.
2951         * tree.c (cp_build_qualified_type): Trivial typofix in
2952         documentation.
2954 2016-01-18  Jason Merrill  <jason@redhat.com>
2956         * cp-gimplify.c (cp_fold) [CONSTRUCTOR]: Don't clobber the input.
2958         * cp-gimplify.c (cp_fold): Remove unnecessary special cases.
2960         PR c++/68767
2961         * cp-gimplify.c (cp_fold) [COND_EXPR]: Simplify.  Do fold COND_EXPR.
2962         (contains_label_1, contains_label_p): Remove.
2964 2016-01-16  Patrick Palka  <ppalka@gcc.gnu.org>
2966         PR c++/69091
2967         * pt.c (type_dependent_expression_p): For a function template
2968         specialization, a type is dependent iff any of its template
2969         arguments are.
2971 2016-01-16  Patrick Palka  <ppalka@gcc.gnu.org>
2973         * cp-array-notation.c (cp_expand_cond_array_notations): Return
2974         error_mark_node only if find_rank failed, not if it was
2975         successful.
2977 2016-01-16  Patrick Palka  <ppalka@gcc.gnu.org>
2979         PR c++/68936
2980         * tree.c (build_min_non_dep_call_vec): Don't retain the
2981         KOENIG_LOOKUP_P flag of the non-dependent expression that's
2982         been built.
2983         (build_min_non_dep_op_overload): Instead, do it here.
2985 2016-01-15  Jakub Jelinek  <jakub@redhat.com>
2987         PR bootstrap/68271
2988         * parser.h (cp_token): Remove pragma_kind field.  Add comment
2989         with number of unused bits.
2990         * parser.c (eof_token): Remove pragma_kind field initializer.
2991         (cp_lexer_get_preprocessor_token): Don't set pragma_kind
2992         field, don't clear CPP_PRAGMA u.value.
2993         (cp_parser_pragma_kind): New function.
2994         (cp_parser_omp_sections_scope, cp_parser_oacc_kernels_parallel,
2995         cp_parser_omp_construct, cp_parser_initial_pragma,
2996         cp_parser_pragma): Use cp_parser_pragma_kind instead of accessing
2997         pragma_kind field.
2999 2016-01-15  Jason Merrill  <jason@redhat.com>
3001         PR c++/68847
3002         * call.c (build_cxx_call): Use fold_non_dependent_expr.
3004         * typeck2.c (cxx_incomplete_type_diagnostic): Use the location of
3005         value.
3007         PR c++/69257
3008         * typeck.c (decay_conversion): Don't call mark_rvalue_use for
3009         array/function-to-pointer conversion.  Call
3010         complete_type_or_maybe_complain for lvalue-to-rvalue conversion.
3011         * call.c (convert_like_real): Print call context if
3012         decay_conversion errors.
3014 2016-01-14  Tom de Vries  <tom@codesourcery.com>
3016         PR tree-optimization/68773
3017         * parser.c (cp_parser_oacc_declare, cp_parser_omp_declare_target): Don't
3018         set force_output.
3020 2016-01-14  Jason Merrill  <jason@redhat.com>
3022         PR c++/69261
3023         * constexpr.c (find_array_ctor_elt): Handle splitting RANGE_EXPR.
3025 2016-01-12  Marek Polacek  <polacek@redhat.com>
3027         PR c++/68979
3028         * constexpr.c (cxx_eval_check_shift_p): Use permerror rather than
3029         error_at and adjust the return value.
3031 2016-01-12  Jakub Jelinek  <jakub@redhat.com>
3033         PR objc++/68511
3034         PR c++/69213
3035         * cp-gimplify.c (cp_gimplify_expr) <case INIT_EXPR>: Don't return
3036         GS_ERROR whenever seen_error (), only if *expr_p contains
3037         cilk spawn stmt, but cilk_detect_spawn_and_unwrap failed.
3039         PR c++/66808
3040         PR c++/69000
3041         * pt.c (tsubst_decl): If not local_p, clear DECL_TEMPLATE_INFO.
3043 2016-01-11  Jason Merrill  <jason@redhat.com>
3045         PR c++/69131
3046         * method.c (walk_field_subobs): Add dtor_from_ctor parm.
3047         (process_subob_fn): Likewise.  Don't consider triviality if true.
3048         (synthesize_method_walk): Pass it.
3050 2016-01-11  David Malcolm  <dmalcolm@redhat.com>
3052         PR c++/68795
3053         * parser.c (cp_parser_postfix_expression): Initialize
3054         close_paren_loc to UNKNOWN_LOCATION; only use it if
3055         it has been written to by
3056         cp_parser_parenthesized_expression_list.
3057         (cp_parser_parenthesized_expression_list): Document the behavior
3058         with respect to the CLOSE_PAREN_LOC param.
3060 2016-01-11  Jakub Jelinek  <jakub@redhat.com>
3062         PR c++/69211
3063         * cp-gimplify.c (cp_fold): If COMPOUND_EXPR or MODIFY_EXPR
3064         folded operands have side-effects, but folding changed any of them,
3065         build a new tree with the folded operands instead of returning the
3066         unfolded tree.
3068 2016-01-09  Marek Polacek  <polacek@redhat.com>
3070         PR c++/69113
3071         * decl2.c (comdat_linkage): Only set DECL_COMDAT if TREE_PUBLIC is set.
3073 2016-01-09  Jakub Jelinek  <jakub@redhat.com>
3075         PR c++/69164
3076         * class.c (layout_class_type): Use copy_node to copy FIELD_DECLs.
3078 2016-01-08  Jason Merrill  <jason@redhat.com>
3080         PR c++/69158
3081         * constexpr.c (cxx_fold_indirect_ref): Handle array type differing
3082         in completion.
3084 2016-01-08  Marek Polacek  <polacek@redhat.com>
3086         PR c++/68449
3087         * constexpr.c (cxx_eval_constant_expression): Handle NULL initializer.
3089 2016-01-08  Jason Merrill  <jason@redhat.com>
3091         * constexpr.c (cxx_eval_call_expression): Remove convert_to_void
3092         workaround.
3094         PR c++/68983
3095         PR c++/67557
3096         * cvt.c (convert_to_void): Don't strip a TARGET_EXPR of
3097         TREE_ADDRESSABLE type.
3099         PR c++/68983
3100         PR c++/67557
3101         * call.c (unsafe_copy_elision_p): Look through COMPOUND_EXPR.
3103 2016-01-05  Nathan Sidwell  <nathan@acm.org>
3105         PR c++/58583
3106         * pt.c (build_non_dependent_expr): Don't try a checking fold when
3107         parsing an nsdmi.
3109 2016-01-04  Jakub Jelinek  <jakub@redhat.com>
3111         Update copyright years.
3113 Copyright (C) 2016 Free Software Foundation, Inc.
3115 Copying and distribution of this file, with or without modification,
3116 are permitted in any medium without royalty provided the copyright
3117 notice and this notice are preserved.