PR jit/64721: toplev: don't install signal-handlers when running within libgccjit
[official-gcc.git] / gcc / ChangeLog
blob4931136ed64b256b9fceecfed78a390a56b5c131
1 2015-01-23  David Malcolm  <dmalcolm@redhat.com>
3         PR jit/64721
4         * main.c (main): Construct toplev instances with init_signals=true.
5         * toplev.c (general_init): Add param "init_signals", and use it to
6         conditionalize the calls to signal and host_hooks.extra_signals.
7         (toplev::toplev): Add param "init_signals".
8         (toplev::main): When invoking general_init, pass m_init_signals
9         to control whether signal-handlers are installed.
10         * toplev.h (toplev::toplev): Add param "init_signals".
11         (toplev::m_init_signals): New field.
13 2015-01-23  David Malcolm  <dmalcolm@redhat.com>
15         PR jit/64722
16         * emit-rtl.c (init_emit_regs): Set pic_offset_table_rtx to
17         NULL_RTX before testing PIC_OFFSET_TABLE_REGNUM, since the
18         latter may be affected by the former (e.g. on i686).
20 2015-01-23  Martin Liska  <mliska@suse.cz>
22         * tree.h (tree_vec_elt_check): Workaround -Wstrict-overflow
23         false positive during profiledbootstrap.
25 2015-01-23  Tom de Vries  <tom@codesourcery.com>
27         PR libgomp/64672
28         * lto-opts.c (lto_write_options): Output non-explicit conservative
29         -fno-openacc.
30         * lto-wrapper.c (merge_and_complain): Handle merging -fopenacc.
31         (append_compiler_options): Pass -fopenacc through.
33 2015-01-23  Tom de Vries  <tom@codesourcery.com>
35         PR libgomp/64707
36         * lto-opts.c (lto_write_options): Output non-explicit conservative
37         -fno-openmp.
38         * lto-wrapper.c (merge_and_complain): Handle merging -fopenmp.
39         (append_compiler_options): Pass -fopenmp through.
41 2015-01-23  Jakub Jelinek  <jakub@redhat.com>
43         PR debug/64511
44         * dwarf2out.c (struct dw_loc_descr_node): Add chain_next
45         GTY markup.
47         * diagnostic-core.h (internal_error_no_backtrace): New prototype.
48         * diagnostic.def (DK_ICE_NOBT): New kind.
49         * diagnostic.c (diagnostic_action_after_output): Handle DK_ICE_NOBT
50         like DK_ICE, but never print backtrace.
51         (diagnostic_report_diagnostic): Handle DK_ICE_NOBT like DK_ICE.
52         (internal_error_no_backtrace): New function.
53         * gcc.c (execute): Use internal_error_no_backtrace instead of
54         internal_error.
56 2015-01-22  Jeff Law  <law@redhat.com>
58         PR target/52076
59         * config/m68k/m68k.md (xorsi3_internal): Twiddle constraints to
60         improve code density for small immediate to memory case.
61         (insv): Better handle bitfield assignments when the field is
62         being set to all ones.
63         * config/m68k/predicates.md (reg_or_pow2_m1_operand): New
64         operand predicate.
66 2015-01-22  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
67             Jakub Jelinek  <jakub@redhat.com>
69         * gcc.c (LINK_SSP_SPEC): Handle -fstack-protector-explicit
70         for !TARGET_LIBC_PROVIDES_SSP version and
71         -fstack-protector-{all,strong,explicit} otherwise.
72         * config/freebsd.h (LINK_SSP_SPEC): Handle
73         -fstack-protector-{strong,explicit}.
75 2015-01-22  Jan Hubicka  <hubicka@ucw.cz>
76             H.J. Lu  <hongjiu.lu@intel.com>
78         PR ipa/64694
79         * ipa-inline.c (inline_small_functions): Fix thinko in maintenance of
80         heap.
82 2015-01-22  Wei Mi  <wmi@google.com>
84         PR rtl-optimization/64557
85         * dse.c (record_store): Call get_addr for mem_addr.
86         (check_mem_read_rtx): Likewise.
88 2015-01-22  Eric Botcazou  <ebotcazou@adacore.com>
90         * fold-const.c (const_binop): Add early return for non-tcc_binary.
92 2015-01-22  Chen Gang  <gang.chen.5i5j@gmail.com>
94         * toplev.c (init_local_tick): Process the failure when read
95         fails for random_seed.
97         * ubsan.c (ubsan_type_descriptor): Use 'pretty_print' for
98         'pretty_name' to avoid memory overflow.
100 2015-01-22  Richard Biener  <rguenther@suse.de>
102         PR middle-end/64728
103         * tree-ssa-coalesce.c (coalesce_partitions): Do not perform
104         abnormal coalescing on undefined SSA names.
106 2015-22-01  Uros Bizjak  <ubizjak@gmail.com>
108         PR target/64688
109         PR target/64477
110         * config/i386/sse.md (vec_set<mode>_0): Use (Yi/r/C) constraints
111         for alternative 3.
112         (*vec_dup<mode>): Use (Yi/$r) constraints for alternative 1.
114 2015-01-22  Trevor Saunders  <tsaunders@mozilla.com>
116         PR middle-end/63325
117         * fold-const.c (fold_checksum_tree): Don't include value of
118         expr->decl_with_vis.symtab_node in the checksum.
120 2015-01-22  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
122         * config/s390/s390.md (atomic code attribute): Fix typo "ior" ->
123         "or".
125 2015-01-22  Max Ostapenko  <m.ostapenko@partner.samsung.com>
127         PR driver/64690
128         * gcc.c (insert_comments): New function.
129         (try_generate_repro): Call it.
130         (append_text): Removed.
132 2015-01-22  Richard Biener  <rguenther@suse.de>
134         * ipa-inline.c (can_inline_edge_p): Disable inlining of edges
135         with IL incompatible options.  Properly honor user optimize
136         attributes.
138 2015-01-21  Segher Boessenkool  <segher@kernel.crashing.org>
140         PR rtl-optimization/64682
141         * combine.c (distribute_notes): When moving a death note for
142         a register that is set in the new I2, make sure to put it
143         before that new I2.
145 2015-01-21  David Edelsohn  <dje.gcc@gmail.com>
147         * config/rs6000/rs6000.c (rs6000_file_start): Use rs6000_isa_flags
148         not TARGET_DEFAULT.
150 2015-01-21  Jakub Jelinek  <jakub@redhat.com>
152         PR debug/64511
153         * simplify-rtx.c (simplify_relational_operation_1): Don't try to
154         optimize (eq/ne (and (side_effects) (const_int 0)) (const_int 0))
155         into (eq/ne (and (not (side_effects)) (const_int 0)) (const_int 0)).
157         PR sanitizer/64706
158         * doc/invoke.texi (-fsanitize=vptr): Document.
160         PR rtl-optimization/62078
161         * dse.c: Include cfgcleanup.h.
162         (rest_of_handle_dse): For -fnon-call-exceptions, if DSE removed
163         anything call purge_all_dead_edges and cleanup_cfg at the end
164         of the pass.
166 2015-01-21  Jan Hubicka  <hubicka@ucw.cz>
168         * ipa-utils.c (ipa_merge_profiles): Avoid ICE on mismatch in indirect
169         edges.
171 2015-01-21  Bernd Edlinger  <bernd.edlinger@hotmail.de>
173         * gimplify.c (gimplify_function_tree): Check the no_sanitize_thread
174         decl attribute.
176 2015-01-21  David Sherwood  <david.sherwood@arm.com>
177             Tejas Belagod <Tejas.Belagod@arm.com>
179         * config/aarch64/aarch64.h (CANNOT_CHANGE_MODE_CLASS): Removed.
180         * config/aarch64/aarch64.c (aarch64_cannot_change_mode_class): Removed.
181         * config/aarch64/aarch64-protos.h (aarch64_cannot_change_mode_class):
182         Removed.
184 2015-01-21  David Sherwood  <david.sherwood@arm.com>
185             Tejas Belagod <Tejas.Belagod@arm.com>
187         * config/aarch64/aarch64-protos.h (aarch64_simd_attr_length_rglist)
188         (aarch64_reverse_mask): New decls.
189         * config/aarch64/iterators.md (UNSPEC_REV_REGLIST): New enum.
190         (insn_count): New mode_attr.
191         * config/aarch64/aarch64-simd.md (vec_store_lanesoi, vec_store_lanesci)
192         (vec_store_lanesxi, vec_load_lanesoi, vec_load_lanesci)
193         (vec_load_lanesxi): Made ABI compliant for Big Endian targets.
194         (aarch64_rev_reglist, aarch64_simd_ld2, aarch64_simd_ld3)
195         (aarch64_simd_ld4, aarch64_simd_st2, aarch64_simd_st3)
196         (aarch64_simd_st4): New patterns.
197         * config/aarch64/aarch64.c (aarch64_simd_attr_length_rglist)
198         (aarch64_reverse_mask): New functions.
200 2015-01-21  Richard Sandiford  <richard.sandiford@arm.com>
202         * config/aarch64/aarch64-protos.h (aarch64_simd_disambiguate_copy):
203         Declare.
204         * config/aarch64/aarch64.c (aarch64_classify_address): Allow extra
205         addressing modes for BE.
206         (aarch64_print_operand): Add 'R' specifier.
207         (aarch64_simd_disambiguate_copy): Delete.
208         (aarch64_simd_emit_reg_reg_move): New function.
209         * config/aarch64/aarch64-simd.md: Use aarch64_simd_emit_reg_reg_move
210         in define_splits for structural moves.
211         (mov<mode>): Use less restrictive predicates.
212         (*aarch64_mov<mode>): Simplify and only allow for LE.
213         (*aarch64_be_movoi, *aarch64_be_movci, *aarch64_be_movxi): New.
215 2015-01-21  Alan Hayward  <alan.hayward@arm.com>
217         * rtlanal.c (subreg_get_info): Exit early for simple and common
218         cases.
220 2015-01-21  Richard Henderson  <rth@redhat.com>
222         PR target/64669
223         * ccmp.c (used_in_cond_stmt_p): Remove.
224         (expand_ccmp_expr): Don't use it.
226 2015-01-21  Nick Clifton  <nickc@redhat.com>
228         * config/rl78/rl78.c (rl78_calculate_death_notes): Look inside
229         PARALLELs.
231 2015-01-21  Richard Biener  <rguenther@suse.de>
233         PR middle-end/64313
234         * tree-core.h (builtin_info, builtin_info_type): Turn from
235         an object with two arrays into an array of an object with
236         decl and two flags, implicit_p and declared_p.
237         * tree.h (builtin_decl_explicit, builtin_decl_implicit,
238         set_builtin_decl, set_builtin_decl_implicit_p,
239         builtin_decl_explicit_p, builtin_decl_implicit_p): Adjust.
240         (set_builtin_decl_declared_p, builtin_decl_declared_p): New functions.
241         * builtins.c (builtin_info): Adjust.
242         * gimplify.c (gimplify_addr_expr): References to builtins
243         that have been declared by the user makes them eligible for
244         use by the compiler.  Call set_builtin_decl_implicit_p on them.
246 2015-01-20  Jeff Law  <law@redhat.com>
248         PR target/59946
249         * config/m68k/m68k.md (Comparison expanders and patterns): Do not
250         allow pc-relative addresses in operand predicates or constraints.
252 2015-01-21  Bin Cheng  <bin.cheng@arm.com>
254         * config/arm/arm.c (arm_cortex_a53_tune, arm_cortex_a57_tune): Prefer
255         neon on aarch32 processors for stringops.
257 2015-01-19  Jan Hubicka  <hubicka@ucw.cz>
259         PR ipa/63576
260         * ipa-utils.c (ipa_merge_profiles): Merge speculative edges.
262 2015-01-19  Jan Hubicka  <hubicka@ucw.cz>
264         PR lto/45375
265         * ipa-inline.c: Include lto-streamer.h
266         (report_inline_failed_reason): Output source file differences and
267         flags on optimization/target node mismatch.
268         (can_inline_edge_p): Consider caller to be the outer inline function;
269         be less restrictive about matching opimize and optimize_size attributes.
270         (inline_account_function_p): Break out from ...
271         (inline_small_functions): ... here.
272         * ipa-inline-transform.c (clone_inlined_nodes): Use
273         inline_account_function_p.
274         (inline_call): Use optimize attribution; use inline_account_function_p.
275         (inline_transform): Use opt_for_fn.
276         * ipa-inline.h (inline_account_function_p): Declare.
278 2015-01-20  Jakub Jelinek  <jakub@redhat.com>
280         PR debug/64663
281         * dwarf2out.c (decl_piece_node): Don't put bitsize into
282         mode if bitsize <= 0.
283         (decl_piece_bitsize, adjust_piece_list, add_var_loc_to_decl,
284         dw_sra_loc_expr): Use HOST_WIDE_INT instead of int for bit
285         sizes and positions.
287 2015-01-20  Chung-Lin Tang  <cltang@codesourcery.com>
289         * config/nios2/nios2.c (nios2_asm_file_end): Implement
290         TARGET_ASM_FILE_END hook for adding .note.GNU-stack section when
291         needed.
292         (TARGET_ASM_FILE_END): Define.
294 2015-01-20  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
296         * config/arm/arm-protos.h (enum arm_sched_autopref): New constants.
297         (struct tune_params): Use the enum.
298         * arm.c (arm_*_tune): Update.
299         (arm_option_override): Update.
301 2015-01-20  Richard Biener  <rguenther@suse.de>
303         PR ipa/64684
304         * ipa-reference.c (add_static_var): Inline ...
305         (analyze_function): ... here after splitting out from ...
306         (is_proper_for_analysis): ... this.
308 2015-01-20  Matthew Wahab  <matthew.wahab@arm.com>
310         PR target/64149
311         * config/arm/arm.opt: Remove lra option and arm_lra_flag variablesle.
312         * config/arm/arm.h (MODE_BASE_REG_CLASS): Remove use of arm_lra_flagag,
313         replace the conditional with it's true branch.
314         * config/arm/arm.config (TARGET_LRA_P): Set to hook_bool_void_true.
315         (arm_lra_p): Remove.
317 2015-01-20  Eric Botcazou  <ebotcazou@adacore.com>
319         * config/visium/visium.h (LIB_SPEC): Adjust in default case.
321 2015-01-20  Prathamesh Kulkarni  <prathamesh.kulkarni@linaro.org>
323         * config/tilegx/mul-tables.c: Move symtab.h include after coretypes.h include.
324         * config/tilepro/mul-tables.c: Add includes hashtab.h, hash-set.h, vec.h,
325         machmode.h, tm.h, hard-reg-set.h, input.h, function.h, rtl.h, flags.h, statistics.h,
326         double-int.h, real.h, fixed-value.h, alias.h, wide-int.h, inchash.h, tree.h,
327         insn-config.h, expmed.h, dojump.h, explow.h, calls.h, emit-rtl.h, varasm.h, stmt.h.
329 2015-01-20  Igor Zamyatin  <igor.zamyatin@intel.com>
331         PR bootstrap/64676
332         Revert:
333         2015-01-19  Igor Zamyatin  <igor.zamyatin@intel.com>
335         PR rtl-optimization/64081
336         * loop-iv.c (def_pred_latch_p): New function.
337         (latch_dominating_def): Allow specific cases with non-single
338         definitions.
339         (iv_get_reaching_def): Likewise.
340         (check_complex_exit_p): New function.
341         (check_simple_exit): Use check_complex_exit_p to allow certain cases
342         with exits not executing on any iteration.
344 2015-01-19  Jan Hubicka  <hubicka@ucw.cz>
346         PR lto/45375
347         * i386.c (ix86_option_override_internal): Use ix86_tune_cost
348         to set branch cost.
350 2015-01-19  Jan Hubicka  <hubicka@ucw.cz>
352         PR lto/45375
353         * i386.c (gate): Check flag_expensive_optimizations and
354         optimize_size.
355         (ix86_option_override_internal): Drop optimize_size condition
356         on MASK_ACCUMULATE_OUTGOING_ARGS, MASK_VZEROUPPER,
357         MASK_AVX256_SPLIT_UNALIGNED_LOAD, MASK_AVX256_SPLIT_UNALIGNED_STORE,
358         MASK_PREFER_AVX128.
359         (ix86_avx256_split_vector_move_misalign,
360         ix86_avx256_split_vector_move_misalign): Check optimize_insn_for_speed.
361         * sse.md (all uses of TARGET_PREFER_AVX128): Add
362         optimize_insn_for_speed_p check.
364 2015-01-19  Matthew Fortune  <matthew.fortune@imgtec.com>
366         * config/mips/mips.h (FP_ASM_SPEC): New define.
367         (ASM_SPEC): Remove floating-point options and use FP_ASM_SPEC
368         instead.
370 2015-01-19  Oleg Endo  <olegendo@gcc.gnu.org>
372         PR target/53988
373         * config/sh/sh-protos.h (sh_find_set_of_reg): Make sure not to return
374         nullptr for insn when reaching the first insn.
375         * config/sh/sh.c (sh_unspec_insn_p): Rewrite using subrtx_iterator.
376         (sh_insn_operands_modified_between_p): Add nullptr check.
377         (sh_find_extending_set_of_reg): Fix log message.  Don't accept
378         sign extending mem load if the insn contains any UNSPEC or
379         UNSPEC_VOLATILE.
381 2015-01-19  Jan Hubicka  <hubicka@ucw.cz>
383         * params.def (inline-unit-growth): Drop to 15%.
384         * invoke.texi (inline-unit-growth): Document change.
386 2015-01-19  Martin Liska  <mliska@suse.cz>
388         PR ipa/64668
389         * ipa-icf-gimple.c (func_checker::compare_operand): Call proper
390         function for second argument of OBJ_TYPE_REF.
392 2015-01-19  Jan Hubicka  <hubicka@ucw.cz>
394         PR ipa/64218
395         * ipa-inline.c (want_inline_function_to_all_callers_p): Fix check
396         whether function is an alias.
398 2015-01-19  Jan Hubicka  <hubicka@ucw.cz>
400         * ipa-devirt.c (ipa_devirt): Drop polymorphic call info in hopeless
401         cases.
403 2015-01-19  Vladimir Makarov  <vmakarov@redhat.com>
405         PR rtl-optimization/64671
406         * lra-remat.c (operand_to_remat): Don't consider jump and call
407         insns.
409 2015-01-19  David Edelsohn  <dje.gcc@gmail.com>
411         * config/rs6000/default64.h: Include rs6000-cpus.def.
412         (TARGET_DEFAULT) [LITTLE_ENDIAN]: Use ISA 2.7 (POWER8).
413         (TARGET_DEFAULT) [BIG_ENDIAN]: Use POWER4.
414         * config/rs6000/driver-rs6000.c (detect_processor_aix): Add POWER7
415         and POWER8.
416         * config/rs6000/linux64.h (PROCESSOR_DEFAULT64): Always default to
417         POWER8.
418         * config/rs6000/rs6000.c (rs6000_file_start): Emit .machine
419         pseudo-op to specify assembler dialect.
421 2015-01-19  Martin Liska  <mliska@suse.cz>
423         PR ipa/64664
424         * ipa-icf.c (sem_item_optimizer::filter_removed_items):
425         Handle safe potentially removed nodes during filtering.
427 2015-01-19  Martin Liska  <mliska@suse.cz>
429         * doc/extend.texi (no_icf): Add new attribute description.
430         * ipa-icf.c (sem_item_optimizer::merge_classes): Handle cases
431         where the pass attempts to merge a function with no_icf attribute.
433 2015-01-19  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
435         PR target/64532
436         * doc/md.texi (ARM Options): Document register constraints.
438 2015-01-19  Jiong Wang  <jiong.wang@arm.com>
439             Andrew Pinski  <apinski@cavium.com>
441         PR target/64304
442         * config/aarch64/aarch64.md (define_insn "*ashl<mode>3_insn"): Deleted.
443         (ashl<mode>3): Don't expand if operands[2] is not constant.
445 2015-01-19  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
447         PR target/64448
448         * config/aarch64/aarch64-simd.md (aarch64_simd_bsl<mode>_internal):
449         Match xor-and-xor RTL pattern.
451 2015-01-19  Igor Zamyatin  <igor.zamyatin@intel.com>
453         PR rtl-optimization/64081
454         * loop-iv.c (def_pred_latch_p): New function.
455         (latch_dominating_def): Allow specific cases with non-single
456         definitions.
457         (iv_get_reaching_def): Likewise.
458         (check_complex_exit_p): New function.
459         (check_simple_exit): Use check_complex_exit_p to allow certain cases
460         with exits not executing on any iteration.
462 2015-01-19  Jakub Jelinek  <jakub@redhat.com>
464         * common.opt (fgraphite): Fix a typo.
466 2015-01-19  Felix Yang  <felix.yang@huawei.com>
468         * config/aarch64/aarch64-simd.md (aarch64_<maxmin_uns>p<mode>): New
469         pattern.
470         * config/aarch64/aarch64-simd-builtins.def (smaxp, sminp, umaxp,
471         uminp, smax_nanp, smin_nanp): New builtins.
472         * config/aarch64/arm_neon.h (vpmax_s8, vpmax_s16, vpmax_s32,
473         vpmax_u8, vpmax_u16, vpmax_u32, vpmaxq_s8, vpmaxq_s16, vpmaxq_s32,
474         vpmaxq_u8, vpmaxq_u16, vpmaxq_u32, vpmax_f32, vpmaxq_f32, vpmaxq_f64,
475         vpmaxqd_f64, vpmaxs_f32, vpmaxnm_f32, vpmaxnmq_f32, vpmaxnmq_f64,
476         vpmaxnmqd_f64, vpmaxnms_f32, vpmin_s8, vpmin_s16, vpmin_s32, vpmin_u8,
477         vpmin_u16, vpmin_u32, vpminq_s8, vpminq_s16, vpminq_s32, vpminq_u8,
478         vpminq_u16, vpminq_u32, vpmin_f32, vpminq_f32, vpminq_f64, vpminqd_f64,
479         vpmins_f32, vpminnm_f32, vpminnmq_f32, vpminnmq_f64, vpminnmqd_f64,
480         vpminnms_f32): Rewrite using builtin functions.
482 2015-01-19  Thomas Schwinge  <thomas@codesourcery.com>
484         PR libgomp/64625
485         * omp-low.c (offload_symbol_decl): Remove variable.
486         (get_offload_symbol_decl): Remove function.
487         (expand_omp_target): For BUILT_IN_GOMP_TARGET,
488         BUILT_IN_GOMP_TARGET_DATA, BUILT_IN_GOMP_TARGET_UPDATE pass NULL
489         instead of &__OFFLOAD_TABLE__, for BUILT_IN_GOACC_DATA_START,
490         BUILT_IN_GOACC_ENTER_EXIT_DATA, BUILT_IN_GOACC_PARALLEL,
491         BUILT_IN_GOACC_UPDATE don't pass it at all.
493 2015-01-19  Ilya Enkovich  <ilya.enkovich@intel.com>
495         * tree-sra.c (some_callers_have_mismatched_arguments_p): Allow thunk
496         callers.
498 2015-01-19  Ilya Enkovich  <ilya.enkovich@intel.com>
500         * ipa-chkp.c (chkp_produce_thunks): Add early param
501         to split thunks production into two passes.  Keep
502         'always_inline' function bodies after the first pass.
503         (pass_data_ipa_chkp_early_produce_thunks): New.
504         (pass_ipa_chkp_early_produce_thunks): New.
505         (pass_ipa_chkp_produce_thunks::execute): Adjust to new
506         chkp_produce_thunks signature.
507         (make_pass_ipa_chkp_early_produce_thunks): New.
508         * passes.def (pass_ipa_chkp_early_produce_thunks): New.
509         (pass_ipa_chkp_produce_thunks): Move after local optimizations.
510         * tree-pass.h (make_pass_ipa_chkp_early_produce_thunks): New.
512 2015-01-18  Jan Hubicka  <hubicka@ucw.cz>
514         * cgraph.c (cgraph_node::dump): Dump profile flags.
516 2015-01-18  Oleg Endo  <olegendo@gcc.gnu.org>
518         PR target/64652
519         * config/sh/sh.md (udivsi3_i4, divsi3_i4): Make use of sfunc address
520         reg appear first in the parallel.
522 2015-01-18  Jan Hubicka  <hubicka@ucw.cz>
524         * ipa-reference.c (set_reference_optimization_summary,
525         ipa_reference_get_not_written_global): Do nothing if ipa-reference is
526         disabled.
527         (ignore_module_statics): New static var.
528         (propagate_bits): If ipa-reference is disabled, do not look into local
529         properties.
530         (analyze_function): Disable analysis when ipa_reference is disabled.
531         (generate_summary): Do not dump when reference is disabled;
532         collect vars accessed from functions with ipa-reference disabled.
533         (get_read_write_all_from_node): When ipa-reference is disabled, use the
534         node flags.
535         (gate): Enable for LTO.
536         (ignore_edge_p): New function.
537         (propagate): Skip functions w/o ipa-reference analysis.
538         * optc-save-gen.awk: Handle optimize_debug correctly.
539         * opth-gen.awk: Likewise.
540         * common.opt (fauto-inc-dec, fdelete-dead-exceptions, ffunction-cse,
541         fgraphite, fstrict-volatile-bitfields, fira-algorithm, fira-region,
542         fira-share-save-slots, fira-share-spill-slots,
543         fmodulo-sched-allow-regmoves, fpartial-inlining,
544         sched-stalled-insns, fsched-stalled-insns-dep, fstrict-overflow,
545         ftracer, ftree-parallelize-loops, fassociative-math,
546         freciprocal-math, fvect-cost-model, fsimd-cost-model): Mark as
547         Optimization
548         (fauto-profile, fcommon, fdata-sections, fipa-icf-variables,
549         ftoplevel-reorder, funit-at-a-time, fwhole-program): Do not mark as
550         Optimization.
551         * ipa-icf.c (gate, sem_item_optimizer::filter_removed_items):
552         Fix for IPA.
554 2015-01-18  Jan Hubicka  <hubicka@ucw.cz>
556         PR ipa/64378
557         * ipa-prop.c (try_make_edge_direct_virtual_call): Clear speculative
558         flag correctly.
559         * ipa-cp.c (ipa_get_indirect_edge_target_1): Handle speculation.
561 2015-01-18  Sandra Loosemore  <sandra@codesourcery.com>
563         * doc/invoke.texi ([-funroll-loops], [-funroll-all-loops]):
564         Remove duplicate option listings.
566 2015-01-18  Felix Yang  <felix.yang@huawei.com>
568         * auto-profile.c (afdo_find_equiv_class): Remove unnecessary test.
569         (autofdo_source_profile::get_callsite_total_count,
570         function_instance::get_function_instance_by_decl,
571         string_table::get_index, string_table::get_index_by_decl,
572         afdo_vpt_for_early_inline, afdo_callsite_hot_enough_for_early_inline):
573         Fix comment typos. Reformatting and minor code rearrangement.
575 2015-01-17  Segher Boessenkool  <segher@kernel.crashing.org>
577         * config/rs6000/rs6000.md (probe_stack): Delete.
578         (probe_stack_address): New.
580 2015-01-17  Segher Boessenkool  <segher@kernel.crashing.org>
582         * config/rs6000/rs6000.c (rs6000_gimplify_va_arg): Use TARGET_32BIT
583         to test for 32-bit ABIs, not !TARGET_POWERPC64.
585 2015-01-17  Segher Boessenkool  <segher@kernel.crashing.org>
587         * config/rs6000/rs6000.c (rs6000_parallel_return): New function.
588         (rs6000_function_value): Use it.  Handle SCmode and TCmode as well,
589         for TARGET_32BIT && TARGET_POWERPC64.  Fix another BITS_PER_WORD
590         snafu.
591         (rs6000_libcall_value): Use the new function.
593 2015-01-17  Sandra Loosemore  <sandra@codesourcery.com>
595         * doc/invoke.texi ([-ftracer]): Remove duplicate option listing.
597 2015-01-17  Eric Botcazou  <ebotcazou@adacore.com>
599         * reorg.c (fill_simple_delay_slots): If TARGET_FLAGS_REGNUM is valid,
600         implement a more precise life analysis for it during backward scan.
602 2015-01-17  Jan Kratochvil  <jan.kratochvil@redhat.com>
604         * dwarf2out.c (gen_producer_string): Ignore also OPT_fpreprocessed.
606 2015-01-17  Bernd Schmidt  <bernds@codesourcery.com>
608         PR rtl-optimization/52773
609         * calls.c (emit_library_call_value): When pushing arguments use
610         stack_pointer_rtx rather than virtual_outgoing_args_rtx in
611         CALL_INSN_FUNCTION_USAGE.  Only emit one of use of the magic
612         stack pointer reference into CALL_INSN_FUNCTION_USAGE.
614 2015-01-17  Jeff Law  <law@redhat.com>
616         PR rtl-optimization/32790
617         * reginfo.c (reg_scan_mark_refs): Look for ZERO_EXTRACT,
618         not ZERO_EXTEND in SET_DESTs.
620 2015-01-17  Alan Modra  <amodra@gmail.com>
622         * cprop.c (do_local_cprop): Revert last change.
624 2015-01-16  DJ Delorie  <dj@redhat.com>
625             Nick Clifton  <nickc@redhat.com>
627         * config/rl78/rl78-real.md (addqi3_real): Allow volatiles.
628         (addhi3_real): Likewise.  Fix [HL+0] syntax.
629         (subqi3_real): Likewise.
630         (subhi3_real): Likewise.
631         (cbranchqi4_real): Likewise.  Allow saddr,#imm.
632         (cbranchhi4_real): Likewise.
633         (cbranchhi4_real_inverted): Likewise.
634         (cbranchsi4_real_lt): Likewise.
635         (cbranchsi4_real_ge): Likewise.
636         (cbranchsi4_real_ge): Likewise.
637         * config/rl78/rl78-virt.md (add<mode>3_virt): Likewise.
638         (sub<mode>3_virt): Likewise.
639         (cbranchqi4_virt): Likewise.
640         (cbranchhi4_virt): Likewise.
641         * config/rl78/rl78.c (rl78_print_operand_1): 'p' modifier means
642         always use '[reg+imm]' even when imm is zero.
643         * config/rl78/predicates.md (rl78_volatile_memory_operand): New.
644         (rl78_general_operand): New.
645         (rl78_nonimmediate_operand): New.
646         (rl78_nonfar_operand): Use them.
647         (rl78_nonfar_nonimm_operand): Likewise.
648         (rl78_stack_based_mem): Fix.
649         * config/rl78/constraints.md (Ibqi): New.
650         (IBqi): New.
651         (Wsa): New.
652         (Wsf): New.
653         (Cs1): Fix.
654         * config/rl78/rl78-expand.md (andqi3): Accept volatiles.
655         (iorqi3): Likewise.
656         (xorqi3): Likewise.
657         * config/rl78/rl78-protos.h (rl78_sfr_p): New.
659         * config/rl78/constrains (Qs8): New constraint.
660         * config/rl78/rl78.c (rl78_flags_already_set): New function.
661         * config/rl78/rl78-protos.h (rl78_flags_already_set): New prototype.
662         * config/rl78/rl78-real.md (update_Z): New attribute.
663         Update patterns to set it.
664         (cbranchqi4_real): Call rl78_flags_already_set() to determine if a
665         shorter compare and branch sequence can be used.
666         (cbranchhi4_real): Likewise.
667         (cbranchhi4_real_inverted): Likewise.
669         * config/rl78/predicates.md (uword_operand): Allow symbol_refs.
670         * config/rl78/rl78-c.c (rl78_register_pragmas): Register __near
671         address space.
672         * config/rl78/rl78.c (rl78_get_name_encoding): New.
673         (rl78_option_override): Allow -mes0 only if C.
674         (characterize_address): Support subregs of symbol_refs.
675         (rl78_addr_space_address_mode): Move.  Add __near.
676         (rl78_far_p): Likewise.
677         (rl78_addr_space_pointer_mode): Likewise.
678         (rl78_as_legitimate_address): Likewise.
679         (rl78_addr_space_subset_p): Likewise.
680         (rl78_addr_space_convert): Likewise.
681         (rl78_print_operand_1): Support 16-bit addressing of 32-bit
682         symbols with -mes0.
683         (transcode_memory_rtx): Don't copy ES if -mes0.  Allow symbol[BC]
684         addressing.
685         (rl78_alloc_physical_registers_op1): Change logic to prefer
686         symbol[BC] addressing.
687         (frodata_section): New.
688         (rl78_asm_init_sections): Initialize it.
689         (rl78_select_section): Put __far readonly symbols in .frodata.
690         (rl78_make_type_far): New.
691         (rl78_insert_attributes): Force all readonly symbols to be __far when -mes0.
692         (rl78_asm_out_integer): New.
693         * config/rl78/rl78.h (ADDR_SPACE_NEAR): New.
694         * config/rl78/rl78.opt (-mes0): New.
696         * config/rl78/rl78.h (ASM_OUTPUT_LABELREF): New.
697         (ASM_OUTPUT_ALIGNED_DECL_COMMON): New.
698         (ASM_OUTPUT_ALIGNED_DECL_LOCAL): New.
699         * config/rl78/rl78-protos.h (rl78_output_labelref): New.
700         (rl78_saddr_p): New.
701         (rl78_output_aligned_common): New.
702         * config/rl78/rl78.c (rl78_output_symbol_ref): Strip encodings.
703         (rl78_handle_saddr_attribute): New.
704         (rl78_handle_naked_attribute): New.
705         (rl78_attribute_table): Add saddr.
706         (rl78_print_operand_1): Don't print '!' on saddr operands.
707         (rl78_print_operand_1): Strip encodings.
708         (rl78_sfr_p): New.
709         (rl78_strip_name_encoding): New.
710         (rl78_attrlist_to_encoding): New.
711         (rl78_encode_section_info): New.
712         (rl78_asm_init_sections): New.
713         (rl78_select_section): New.
714         (rl78_output_labelref): New.
715         (rl78_output_aligned_common): New.
716         (rl78_asm_out_integer): New.
717         (rl78_asm_ctor_dtor): New.
718         (rl78_asm_constructor): New.
719         (rl78_asm_destructor): New.
721         * config/rl78/rl78-real.md (movqi_es): Rename to movqi_to_es.
722         * config/rl78/rl78.c (rl78_expand_epilogue): Update.
723         (transcode_memory_rtx): Update.
724         (rl78_expand_epilogue): Use A_REG instead of 0.
726 2015-01-17  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
728         * config/arm/arm-protos.h (struct tune_params): New field
729         sched_autopref_queue_depth.
730         * config/arm/arm.c (sched-int.h): Include header.
731         (arm_first_cycle_multipass_dfa_lookahead_guard,)
732         (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD_GUARD): Define hook.
733         (arm_slowmul_tune, arm_fastmul_tune, arm_strongarm_tune,)
734         (arm_xscale_tune, arm_9e_tune, arm_v6t2_tune, arm_cortex_tune,)
735         (arm_cortex_a8_tune, arm_cortex_a7_tune, arm_cortex_a15_tune,)
736         (arm_cortex_a53_tune, arm_cortex_a57_tune, arm_xgene1_tune,)
737         (arm_cortex_a5_tune, arm_cortex_a9_tune, arm_cortex_a12_tune,)
738         (arm_v7m_tune, arm_cortex_m7_tune, arm_v6m_tune, arm_fa726te_tune):
739         Specify sched_autopref_queue_depth value.  Enabled for A15 and A57.
740         * config/arm/t-arm (arm.o): Update.
741         * haifa-sched.c (update_insn_after_change): Update.
742         (rank_for_schedule): Use auto-prefetcher model, if requested.
743         (autopref_multipass_init): New static function.
744         (autopref_rank_for_schedule): New rank_for_schedule heuristic.
745         (autopref_multipass_dfa_lookahead_guard_started_dump_p): New static
746         variable for debug dumps.
747         (autopref_multipass_dfa_lookahead_guard_1): New static helper function.
748         (autopref_multipass_dfa_lookahead_guard): New global function that
749         implements TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD_GUARD hook.
750         (init_h_i_d): Update.
751         * params.def (PARAM_SCHED_AUTOPREF_QUEUE_DEPTH): New tuning knob.
752         * sched-int.h (enum autopref_multipass_data_status): New const enum.
753         (autopref_multipass_data_): Structure for auto-prefetcher data.
754         (autopref_multipass_data_def, autopref_multipass_data_t): New typedefs.
755         (struct _haifa_insn_data:autopref_multipass_data): New field.
756         (INSN_AUTOPREF_MULTIPASS_DATA): New access macro.
757         (autopref_multipass_dfa_lookahead_guard): Declare.
759 2015-01-17  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
761         * rtlanal.c (get_base_term): Handle SCRATCH.
763 2015-01-17  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
765         * config/aarch64/aarch64.c
766         (aarch64_sched_first_cycle_multipass_dfa_lookahead): Implement hook.
767         (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD): Define.
768         * config/arm/arm.c
769         (arm_first_cycle_multipass_dfa_lookahead): Implement hook.
770         (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD): Define.
772 2015-01-17  Alan Modra  <amodra@gmail.com>
774         * cprop.c (do_local_cprop): Disallow replacement of fixed
775         hard registers.
777 2015-01-16  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
779         PR target/62066
780         * config/arm/arm-builtins.c (arm_expand_neon_args): Call va_end before
781         early return 0.
783 2015-01-16  Bernd Edlinger  <bernd.edlinger@hotmail.de>
785         * sanitizer.def (BUILT_IN_TSAN_VPTR_UPDATE): Fixed parameters.
786         * tsan.c (instrument_expr): Fixed parameters of __tsan_vptr_update.
788 2015-01-16  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
790         * config/arm/arm.md: Move comment about splitting Thumb1 patterns to...
791         * config/arm/thumb1.md: ... Here.
793 2015-01-16  Segher Boessenkool  <segher@kernel.crashing.org>
795         * config/rs6000/rs6000.c (rs6000_scalar_mode_supported_p): Disallow
796         TImode for TARGET_32BIT.
798 2015-01-16  Segher Boessenkool  <segher@kernel.crashing.org>
800         * config/rs6000/rs6000.c (TARGET_LIBGCC_CMP_RETURN_MODE,
801         TARGET_LIBGCC_SHIFT_COUNT_MODE, TARGET_UNWIND_WORD_MODE): Implement
802         as ...
803         (rs6000_abi_word_mode): New function.
805 2015-01-16  Segher Boessenkool  <segher@kernel.crashing.org>
807         * config/rs6000/rs6000.c (rs6000_va_start): Use MIN_UNITS_PER_WORD
808         instead of UNITS_PER_WORD to describe the size of stack slots.
810 2015-01-16  Segher Boessenkool  <segher@kernel.crashing.org>
812         * config/rs6000/rs6000.c (TARGET_PROMOTE_FUNCTION_MODE): Implement
813         as rs6000_promote_function_mode.  Move comment to there.
814         (rs6000_promote_function_mode): New function.
816 2015-01-16  Segher Boessenkool  <segher@kernel.crashing.org>
818         * config/rs6000/rs6000.h (PROMOTE_MODE): Correct test for when -m32
819         -mpowerpc64 is active.
821 2015-01-16  Ilya Enkovich  <ilya.enkovich@intel.com>
823         PR middle-end/64353
824         * tree-cfg.c (pass_data_fixup_cfg): Update SSA for
825         virtuals on start.
827 2015-01-16  James Greenhalgh  <james.greenhalgh@arm.com>
829         * config/arm/cortex-a57.md: Remove duplicate of file accidentally
830         introduced in revision 219724.
832 2015-01-16  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
833             Ramana Radhakrishnan <ramana.radhakrishnan@arm.com>
835         PR target/64263
836         * config/aarch64/aarch64.md (*movsi_aarch64): Don't split if the
837         destination is not a GP reg.
838         (*movdi_aarch64): Likewise.
840 2015-01-16  David Edelsohn  <dje.gcc@gmail.com>
842         PR target/64623
843         * config/rs6000/default64.h: Revert ISA change.
845 2015-01-16  Richard Biener  <rguenther@suse.de>
847         PR middle-end/64614
848         * tree-ssa-uninit.c: Include tree-cfg.h.
849         (MAX_SWITCH_CASES): New define.
850         (convert_control_dep_chain_into_preds): Handle switch statements.
851         (is_pred_expr_subset_of): Handle x == CST vs. (x & CST) != 0.
852         (normalize_one_pred_1): Do not split bit-manipulations.
853         Record (x & CST).
855 2015-01-16  Richard Biener  <rguenther@suse.de>
857         PR tree-optimization/64568
858         * tree-ssa-forwprop.c (pass_forwprop::execute): Guard
859         complex load rewriting for TARGET_MEM_REFs.
861 2015-01-16  Uros Bizjak  <ubizjak@gmail.com>
863         * builtins.c (expand_builtin_acc_on_device): Check target for NULL.
865 2015-01-16  Matthew Wahab  <matthew.wahab@arm.com>
867         PR target/64149
868         * config/aarch64/aarch64.opt: Remove lra option and aarch64_lra_flag
869         variable.
870         * config/aarch64/aarch64.c (TARGET_LRA_P): Set to hook_bool_void_true.
871         (aarch64_lra_p): Remove.
873 2015-01-16  Ilya Enkovich  <ilya.enkovich@intel.com>
875         PR target/64363
876         * ipa-chkp.h (chkp_instrumentable_p): New.
877         * ipa-chkp.c: Include tree-inline.h.
878         (chkp_instrumentable_p): New.
879         (chkp_maybe_create_clone): Use chkp_instrumentable_p.
880         Fix processing of not instrumentable functions.
881         (chkp_versioning): Use chkp_instrumentable_p. Warn about
882         not instrumentable functions.
883         * tree-chkp.c (chkp_add_bounds_to_call_stmt): Use
884         chkp_instrumentable_p.
885         * tree-inline.h (copy_forbidden): New.
886         * tree-inline.c (copy_forbidden): Not static anymore.
888 2015-01-16  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
890         * optc-save-gen.awk (cl_target_option_print_diff): Mark indent,
891         ptr1, ptr2 unused.
893 2015-01-16  Robert Suchanek  <robert.suchanek@imgtec.com>
895         * lra-constraints.c (curr_insn_transform): Change a reload pseudo of
896         type OP_OUT to OP_INOUT.
898 2015-01-16  Robert Suchanek  <robert.suchanek@imgtec.com>
900         * simplify-rtx.c (simplify_replace_fn_rtx): Simplify (lo_sum
901         (high x) y) to y if x and y have the same base.
903 2015-01-16  James Greenhalgh  <james.greenhalgh@arm.com>
905         * config/arm/cortex-a57.md: New.
906         * config/aarch64/aarch64.md: Include it.
907         * config/aarch64/aarch64-cores.def (cortex-a57): Tune for it.
908         * config/aarch64/aarch64-tune.md: Regenerate.
910 2015-01-16  Zhenqiang Chen  <zhenqiang.chen@arm.com>
912         PR target/64015
913         * ccmp.c (expand_ccmp_next): New function.
914         (expand_ccmp_expr_1, expand_ccmp_expr): Handle operand insn sequence
915         and compare insn sequence.
916         * config/aarch64/aarch64.c (aarch64_code_to_ccmode,
917         aarch64_gen_ccmp_first, aarch64_gen_ccmp_next): New functions.
918         (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): New MICRO.
919         * config/aarch64/aarch64.md (*ccmp_and): Changed to ccmp_and<mode>.
920         (*ccmp_ior): Changed to ccmp_ior<mode>.
921         (cmp<mode>): New pattern.
922         * doc/tm.texi (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): Update
923         parameters.
924         * target.def (gen_ccmp_first, gen_ccmp_next): Update parameters.
926 2015-01-16  Ilya Tocar  <ilya.tocar@intel.com>
928         * config/i386/avx2intrin.h (_mm256_bslli_epi128,
929         _mm256_bsrli_epi128): New.
930         * config/i386/emmintrin.h (_mm_bsrli_si128, _mm_bslli_si128): Ditto.
932 2015-01-15  Jiong Wang  <jiong.wang@arm.com>
934         * expmed.c (store_bit_field_using_insv): Improve warning message.
935         Use %wu instead of HOST_WIDE_INT_PRINT_UNSIGNED.
937 2015-01-15  Jiong Wang  <jiong.wang@arm.com>
939         PR rtl-optimization/64011
940         * expmed.c (store_bit_field_using_insv): Warn and truncate bitsize when
941         there is partial overflow.
943 2015-01-16  Chung-Ju Wu  <jasonwucj@gmail.com>
945         * config/nds32/nds32-protos.h (nds32_expand_epilogue): Change
946         prototype.
947         (nds32_expand_epilogue_v3pop): Likewise.
948         * config/nds32/nds32.md (sibcall): Define this for sibling call
949         optimization.
950         (sibcall_register): Likewise.
951         (sibcall_immediate): Likewise.
952         (sibcall_value): Likewise.
953         (sibcall_value_register): Likewise.
954         (sibcall_value_immediate): Likewise.
955         (sibcall_epilogue): Likewise.
956         (epilogue): Pass false to indicate this is not a sibcall epilogue.
957         * config/nds32/nds32.c (nds32_expand_epilogue): Consider sibcall case.
958         (nds32_expand_epilogue_v3pop): Likewise.
960 2015-01-16  Chung-Ju Wu  <jasonwucj@gmail.com>
962         * config/nds32/nds32-protos.h (nds32_can_use_return_insn): New.
963         * config/nds32/nds32.md (unspec_volatile_func_return): Remove.
964         (return_internal): New.
965         (return): Define this named pattern.
966         (simple_return): Define this named pattern.
967         * config/nds32/nds32.c (nds32_expand_epilogue): Emit return_internal
968         pattern instead of unspec_volatile_func_return.
969         (nds32_expand_epilogue_v3pop): Likewise.
970         (nds32_can_use_return_insn): New function.
972 2015-01-16  Chung-Ju Wu  <jasonwucj@gmail.com>
974         * config/nds32/constants.md (UNSPEC_VOLATILE_POP25_RETURN): New.
975         * config/nds32/nds32.md (pop25return): New.
976         * config/nds32/nds32.c (nds32_expand_epilogue_v3pop): Emit
977         pop25return pattern.
979 2015-01-16  Chung-Ju Wu  <jasonwucj@gmail.com>
981         * doc/invoke.texi (NDS32 Options): Remove -mforce-fp-as-gp,
982         -mforbid-fp-as-gp, and -mex9 options.
984 2015-01-16  Chung-Ju Wu  <jasonwucj@gmail.com>
986         * doc/invoke.texi (NDS32 Options): Add -mcmodel= option and
987         remove -mgp-direct option.
989 2015-01-15  Jan Hubicka  <hubicka@ucw.cz>
990         
991         * doc/invoke.texi (--param early-inlining-insns): Update default value.
992         * params.def (PARAM_EARLY_INLINING_INSNS): Set to 14.
994 2015-01-15  Jan Hubicka  <hubicka@ucw.cz>
996         * ipa-inline.c (inline_small_functions): Work around hints
997         cache issue.
999 2015-01-15  Sandra Loosemore  <sandra@codesourcery.com>
1001         PR target/59710
1002         * doc/invoke.texi (Option Summary): Document new Nios II
1003         -mgpopt= syntax.
1004         (Nios II Options): Likewise.
1005         * config/nios2/nios2.opt: Add -mgpopt= option support.
1006         Modify existing -mgpopt and -mno-gpopt options to be aliases.
1007         * config/nios2/nios2-opts.h (enum nios2_gpopt_type): New.
1008         * config/nios2/nios2.c (nios2_option_override): Adjust
1009         -mgpopt defaulting.
1010         (nios2_in_small_data_p): Return true for explicit small data
1011         sections even with -G0.
1012         (nios2_symbol_ref_in_small_data_p): Adjust to handle new -mgpopt=
1013         option choices.
1015 2015-01-15  Jan Hubicka  <hubicka@ucw.cz>
1017         PR ipa/64612
1018         * ipa-inline-transform.c (can_remove_node_now_p): Fix handling
1019         of comdat locals.
1020         (inline_call): Fix removal of aliases.
1022 2015-01-15  Jakub Jelinek  <jakub@redhat.com>
1024         * flag-types.h (enum sanitize_code): Add SANITIZE_VPTR,
1025         include SANITIZE_VPTR in SANITIZE_UNDEFINED.
1026         * opts.c (common_handle_option): Add -fsanitize=vptr.
1027         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_DYNAMIC_TYPE_CACHE_MISS,
1028         BUILT_IN_UBSAN_HANDLE_DYNAMIC_TYPE_CACHE_MISS_ABORT): New.
1029         * ubsan.h (enum ubsan_null_ckind): Add UBSAN_DOWNCAST_POINTER,
1030         UBSAN_DOWNCAST_REFERENCE, UBSAN_UPCAST and UBSAN_CAST_TO_VBASE.
1031         (ubsan_expand_vptr_ifn): New prototype.
1032         * internal-fn.c (expand_ANNOTATE, expand_GOMP_SIMD_LANE,
1033         expand_GOMP_SIMD_VF, expand_GOMP_SIMD_LAST_LANE, expand_UBSAN_NULL,
1034         expand_UBSAN_BOUNDS, expand_UBSAN_OBJECT_SIZE, expand_ASAN_CHECK,
1035         expand_LOOP_VECTORIZED): Make argument nameless, remove
1036         ATTRIBUTE_UNUSED.
1037         (expand_UBSAN_VPTR): New function.
1038         * internal-fn.def (UBSAN_NULL, ASAN_CHECK): Use R instead of W
1039         in fn spec.
1040         (UBSAN_VPTR): New internal function.
1041         * sanopt.c (tree_map_traits): Renamed to ...
1042         (sanopt_tree_map_traits): ... this.
1043         (sanopt_tree_triplet, sanopt_tree_triplet_map_traits): New classes.
1044         (sanopt_ctx): Adjust asan_check_map type for tree_map_traits
1045         to sanopt_tree_map_traits renaming.  Add vptr_check_map field.
1046         (maybe_optimize_ubsan_vptr_ifn): New function.
1047         (sanopt_optimize_walker): Handle IFN_UBSAN_VPTR.
1048         (pass_sanopt::execute): Likewise.  Call sanopt_optimize even for
1049         -fsanitize=vptr.
1050         * tree-ssa-alias.c (call_may_clobber_ref_p_1): Handle certain
1051         internal calls like pure functions for aliasing, even when they
1052         have other side-effects that prevent making them ECF_PURE.
1053         * ubsan.c (ubsan_vptr_type_cache_decl): New variable.
1054         (ubsan_expand_vptr_ifn): New function.
1056 2015-01-15  Vladimir Makarov  <vmakarov@redhat.com>
1058         PR rtl-optimization/64110
1059         * stmt.c (parse_output_constraint): Process '^' and '$'.
1060         (parse_input_constraint): Ditto.
1061         * lra-constraints.c (process_alt_operands): Process the new
1062         constraints.
1063         * ira-costs.c (record_reg_classes): Process the new constraint
1064         '^'.
1065         * genoutput.c (indep_constraints): Add '^' and '$'.
1066         * config/i386/sse.md (*vec_dup<mode>): Use '$' instead of '!'.
1067         * doc/md.texi: Add description of the new constraints.
1069 2015-01-15  Thomas Schwinge  <thomas@codesourcery.com>
1070             Bernd Schmidt  <bernds@codesourcery.com>
1071             Cesar Philippidis  <cesar@codesourcery.com>
1072             James Norris  <jnorris@codesourcery.com>
1073             Tom de Vries  <tom@codesourcery.com>
1074             Ilmir Usmanov  <i.usmanov@samsung.com>
1075             Dmitry Bocharnikov  <dmitry.b@samsung.com>
1076             Evgeny Gavrin  <e.gavrin@samsung.com>
1077             Jakub Jelinek  <jakub@redhat.com>
1079         * builtin-types.def (BT_FN_VOID_INT_INT_VAR)
1080         (BT_FN_VOID_INT_PTR_SIZE_PTR_PTR_PTR_INT_INT_VAR)
1081         (BT_FN_VOID_INT_OMPFN_PTR_SIZE_PTR_PTR_PTR_INT_INT_INT_INT_INT_VAR):
1082         New function types.
1083         * builtins.c: Include "gomp-constants.h".
1084         (expand_builtin_acc_on_device): New function.
1085         (expand_builtin, is_inexpensive_builtin): Handle
1086         BUILT_IN_ACC_ON_DEVICE.
1087         * builtins.def (DEF_GOACC_BUILTIN, DEF_GOACC_BUILTIN_COMPILER):
1088         New macros.
1089         * cgraph.c (cgraph_node::create): Consider flag_openacc next to
1090         flag_openmp.
1091         * config.gcc <nvptx-*> (tm_file): Add nvptx/offload.h.
1092         <*-intelmic-* | *-intelmicemul-*> (tm_file): Add
1093         i386/intelmic-offload.h.
1094         * gcc.c (LINK_COMMAND_SPEC, GOMP_SELF_SPECS): For -fopenacc, link
1095         to libgomp and its dependencies.
1096         * config/arc/arc.h (LINK_COMMAND_SPEC): Likewise.
1097         * config/darwin.h (LINK_COMMAND_SPEC_A): Likewise.
1098         * config/i386/mingw32.h (GOMP_SELF_SPECS): Likewise.
1099         * config/ia64/hpux.h (LIB_SPEC): Likewise.
1100         * config/pa/pa-hpux11.h (LIB_SPEC): Likewise.
1101         * config/pa/pa64-hpux.h (LIB_SPEC): Likewise.
1102         * doc/generic.texi: Update for OpenACC changes.
1103         * doc/gimple.texi: Likewise.
1104         * doc/invoke.texi: Likewise.
1105         * doc/sourcebuild.texi: Likewise.
1106         * gimple-pretty-print.c (dump_gimple_omp_for): Handle
1107         GF_OMP_FOR_KIND_OACC_LOOP.
1108         (dump_gimple_omp_target): Handle GF_OMP_TARGET_KIND_OACC_KERNELS,
1109         GF_OMP_TARGET_KIND_OACC_PARALLEL, GF_OMP_TARGET_KIND_OACC_DATA,
1110         GF_OMP_TARGET_KIND_OACC_UPDATE,
1111         GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA.
1112         Dump more data.
1113         * gimple.c: Update comments for OpenACC changes.
1114         * gimple.def: Likewise.
1115         * gimple.h: Likewise.
1116         (enum gf_mask): Add GF_OMP_FOR_KIND_OACC_LOOP,
1117         GF_OMP_TARGET_KIND_OACC_PARALLEL, GF_OMP_TARGET_KIND_OACC_KERNELS,
1118         GF_OMP_TARGET_KIND_OACC_DATA, GF_OMP_TARGET_KIND_OACC_UPDATE,
1119         GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA.
1120         (gimple_omp_for_cond, gimple_omp_for_set_cond): Sort in the
1121         appropriate place.
1122         (is_gimple_omp_oacc, is_gimple_omp_offloaded): New functions.
1123         * gimplify.c: Include "gomp-constants.h".
1124         Update comments for OpenACC changes.
1125         (is_gimple_stmt): Handle OACC_PARALLEL, OACC_KERNELS, OACC_DATA,
1126         OACC_HOST_DATA, OACC_DECLARE, OACC_UPDATE, OACC_ENTER_DATA,
1127         OACC_EXIT_DATA, OACC_CACHE, OACC_LOOP.
1128         (gimplify_scan_omp_clauses, gimplify_adjust_omp_clauses): Handle
1129         OMP_CLAUSE__CACHE_, OMP_CLAUSE_ASYNC, OMP_CLAUSE_WAIT,
1130         OMP_CLAUSE_NUM_GANGS, OMP_CLAUSE_NUM_WORKERS,
1131         OMP_CLAUSE_VECTOR_LENGTH, OMP_CLAUSE_GANG, OMP_CLAUSE_WORKER,
1132         OMP_CLAUSE_VECTOR, OMP_CLAUSE_DEVICE_RESIDENT,
1133         OMP_CLAUSE_USE_DEVICE, OMP_CLAUSE_INDEPENDENT, OMP_CLAUSE_AUTO,
1134         OMP_CLAUSE_SEQ.
1135         (gimplify_adjust_omp_clauses_1, gimplify_adjust_omp_clauses): Use
1136         GOMP_MAP_* instead of OMP_CLAUSE_MAP_*.  Use
1137         OMP_CLAUSE_SET_MAP_KIND.
1138         (gimplify_oacc_cache): New function.
1139         (gimplify_omp_for): Handle OACC_LOOP.
1140         (gimplify_omp_workshare): Handle OACC_KERNELS, OACC_PARALLEL,
1141         OACC_DATA.
1142         (gimplify_omp_target_update): Handle OACC_ENTER_DATA,
1143         OACC_EXIT_DATA, OACC_UPDATE.
1144         (gimplify_expr): Handle OACC_LOOP, OACC_CACHE, OACC_HOST_DATA,
1145         OACC_DECLARE, OACC_KERNELS, OACC_PARALLEL, OACC_DATA,
1146         OACC_ENTER_DATA, OACC_EXIT_DATA, OACC_UPDATE.
1147         (gimplify_body): Consider flag_openacc next to flag_openmp.
1148         * lto-streamer-out.c: Include "gomp-constants.h".
1149         * omp-builtins.def (BUILT_IN_ACC_GET_DEVICE_TYPE)
1150         (BUILT_IN_GOACC_DATA_START, BUILT_IN_GOACC_DATA_END)
1151         (BUILT_IN_GOACC_ENTER_EXIT_DATA, BUILT_IN_GOACC_PARALLEL)
1152         (BUILT_IN_GOACC_UPDATE, BUILT_IN_GOACC_WAIT)
1153         (BUILT_IN_GOACC_GET_THREAD_NUM, BUILT_IN_GOACC_GET_NUM_THREADS)
1154         (BUILT_IN_ACC_ON_DEVICE): New builtins.
1155         * omp-low.c: Include "gomp-constants.h".
1156         Update comments for OpenACC changes.
1157         (struct omp_context): Add reduction_map, gwv_below, gwv_this
1158         members.
1159         (extract_omp_for_data, use_pointer_for_field, install_var_field)
1160         (new_omp_context, delete_omp_context, scan_sharing_clauses)
1161         (create_omp_child_function, scan_omp_for, scan_omp_target)
1162         (check_omp_nesting_restrictions, lower_reduction_clauses)
1163         (build_omp_regions_1, diagnose_sb_0, make_gimple_omp_edges):
1164         Update for OpenACC changes.
1165         (scan_sharing_clauses): Handle OMP_CLAUSE_NUM_GANGS:
1166         OMP_CLAUSE_NUM_WORKERS: OMP_CLAUSE_VECTOR_LENGTH,
1167         OMP_CLAUSE_ASYNC, OMP_CLAUSE_WAIT, OMP_CLAUSE_GANG,
1168         OMP_CLAUSE_WORKER, OMP_CLAUSE_VECTOR, OMP_CLAUSE_DEVICE_RESIDENT,
1169         OMP_CLAUSE_USE_DEVICE, OMP_CLAUSE__CACHE_, OMP_CLAUSE_INDEPENDENT,
1170         OMP_CLAUSE_AUTO, OMP_CLAUSE_SEQ.  Use GOMP_MAP_* instead of
1171         OMP_CLAUSE_MAP_*.
1172         (expand_omp_for_static_nochunk, expand_omp_for_static_chunk):
1173         Handle GF_OMP_FOR_KIND_OACC_LOOP.
1174         (expand_omp_target, lower_omp_target): Handle
1175         GF_OMP_TARGET_KIND_OACC_PARALLEL, GF_OMP_TARGET_KIND_OACC_KERNELS,
1176         GF_OMP_TARGET_KIND_OACC_UPDATE,
1177         GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA,
1178         GF_OMP_TARGET_KIND_OACC_DATA.
1179         (pass_expand_omp::execute, execute_lower_omp)
1180         (pass_diagnose_omp_blocks::gate): Consider flag_openacc next to
1181         flag_openmp.
1182         (offload_symbol_decl): New variable.
1183         (oacc_get_reduction_array_id, oacc_max_threads)
1184         (get_offload_symbol_decl, get_base_type, lookup_oacc_reduction)
1185         (maybe_lookup_oacc_reduction, enclosing_target_ctx)
1186         (oacc_loop_or_target_p, oacc_lower_reduction_var_helper)
1187         (oacc_gimple_assign, oacc_initialize_reduction_data)
1188         (oacc_finalize_reduction_data, oacc_process_reduction_data): New
1189         functions.
1190         (is_targetreg_ctx): Remove function.
1191         * tree-core.h (enum omp_clause_code): Add OMP_CLAUSE__CACHE_,
1192         OMP_CLAUSE_DEVICE_RESIDENT, OMP_CLAUSE_USE_DEVICE,
1193         OMP_CLAUSE_GANG, OMP_CLAUSE_ASYNC, OMP_CLAUSE_WAIT,
1194         OMP_CLAUSE_AUTO, OMP_CLAUSE_SEQ, OMP_CLAUSE_INDEPENDENT,
1195         OMP_CLAUSE_WORKER, OMP_CLAUSE_VECTOR, OMP_CLAUSE_NUM_GANGS,
1196         OMP_CLAUSE_NUM_WORKERS, OMP_CLAUSE_VECTOR_LENGTH.
1197         * tree.c (omp_clause_code_name, walk_tree_1): Update accordingly.
1198         * tree.h (OMP_CLAUSE_GANG_EXPR, OMP_CLAUSE_GANG_STATIC_EXPR)
1199         (OMP_CLAUSE_ASYNC_EXPR, OMP_CLAUSE_WAIT_EXPR)
1200         (OMP_CLAUSE_VECTOR_EXPR, OMP_CLAUSE_WORKER_EXPR)
1201         (OMP_CLAUSE_NUM_GANGS_EXPR, OMP_CLAUSE_NUM_WORKERS_EXPR)
1202         (OMP_CLAUSE_VECTOR_LENGTH_EXPR): New macros.
1203         * tree-core.h: Update comments for OpenACC changes.
1204         (enum omp_clause_map_kind): Remove.
1205         (struct tree_omp_clause): Change type of map_kind member from enum
1206         omp_clause_map_kind to unsigned char.
1207         * tree-inline.c: Update comments for OpenACC changes.
1208         * tree-nested.c: Likewise.  Include "gomp-constants.h".
1209         (convert_nonlocal_reference_stmt, convert_local_reference_stmt)
1210         (convert_tramp_reference_stmt, convert_gimple_call): Update for
1211         OpenACC changes.  Use GOMP_MAP_* instead of OMP_CLAUSE_MAP_*.  Use
1212         OMP_CLAUSE_SET_MAP_KIND.
1213         * tree-pretty-print.c: Include "gomp-constants.h".
1214         (dump_omp_clause): Handle OMP_CLAUSE_DEVICE_RESIDENT,
1215         OMP_CLAUSE_USE_DEVICE, OMP_CLAUSE__CACHE_, OMP_CLAUSE_GANG,
1216         OMP_CLAUSE_ASYNC, OMP_CLAUSE_AUTO, OMP_CLAUSE_SEQ,
1217         OMP_CLAUSE_WAIT, OMP_CLAUSE_WORKER, OMP_CLAUSE_VECTOR,
1218         OMP_CLAUSE_NUM_GANGS, OMP_CLAUSE_NUM_WORKERS,
1219         OMP_CLAUSE_VECTOR_LENGTH, OMP_CLAUSE_INDEPENDENT.  Use GOMP_MAP_*
1220         instead of OMP_CLAUSE_MAP_*.
1221         (dump_generic_node): Handle OACC_PARALLEL, OACC_KERNELS,
1222         OACC_DATA, OACC_HOST_DATA, OACC_DECLARE, OACC_UPDATE,
1223         OACC_ENTER_DATA, OACC_EXIT_DATA, OACC_CACHE, OACC_LOOP.
1224         * tree-streamer-in.c: Include "gomp-constants.h".
1225         (unpack_ts_omp_clause_value_fields) Use GOMP_MAP_* instead of
1226         OMP_CLAUSE_MAP_*.  Use OMP_CLAUSE_SET_MAP_KIND.
1227         * tree-streamer-out.c: Include "gomp-constants.h".
1228         (pack_ts_omp_clause_value_fields): Use GOMP_MAP_* instead of
1229         OMP_CLAUSE_MAP_*.
1230         * tree.def (OACC_PARALLEL, OACC_KERNELS, OACC_DATA)
1231         (OACC_HOST_DATA, OACC_LOOP, OACC_CACHE, OACC_DECLARE)
1232         (OACC_ENTER_DATA, OACC_EXIT_DATA, OACC_UPDATE): New tree codes.
1233         * tree.c (omp_clause_num_ops): Update accordingly.
1234         * tree.h (OMP_BODY, OMP_CLAUSES, OMP_LOOP_CHECK, OMP_CLAUSE_SIZE):
1235         Likewise.
1236         (OACC_PARALLEL_BODY, OACC_PARALLEL_CLAUSES, OACC_KERNELS_BODY)
1237         (OACC_KERNELS_CLAUSES, OACC_DATA_BODY, OACC_DATA_CLAUSES)
1238         (OACC_HOST_DATA_BODY, OACC_HOST_DATA_CLAUSES, OACC_CACHE_CLAUSES)
1239         (OACC_DECLARE_CLAUSES, OACC_ENTER_DATA_CLAUSES)
1240         (OACC_EXIT_DATA_CLAUSES, OACC_UPDATE_CLAUSES)
1241         (OACC_KERNELS_COMBINED, OACC_PARALLEL_COMBINED): New macros.
1242         * tree.h (OMP_CLAUSE_MAP_KIND): Cast it to enum gomp_map_kind.
1243         (OMP_CLAUSE_SET_MAP_KIND): New macro.
1244         * varpool.c (varpool_node::get_create): Consider flag_openacc next
1245         to flag_openmp.
1246         * config/i386/intelmic-offload.h: New file.
1247         * config/nvptx/offload.h: Likewise.
1249 2015-01-15  Prathamesh Kulkarni  <prathamesh.kulkarni@linaro.org>
1251         * explow.h: Remove duplicate contents.
1252         * dojump.h: Likewise.
1254 2015-01-15  Richard Earnshaw  <rearnsha@arm.com>
1256         * arm.c (arm_xgene_tune): Add default initializer for instruction
1257         fusion.
1259 2015-01-15  Jan Hubicka  <hubicka@ucw.cz>
1261         PR ipa/64068
1262         PR ipa/64559
1263         * ipa.c (symbol_table::remove_unreachable_nodes):
1264         Do not put abstract origins into boundary.
1266 2015-01-15  Evgeny Stupachenko  <evstupac@gmail.com>
1268         * config/i386/gnu-user.h (CRT_GET_RFIB_DATA): Remove EBX register usage.
1269         * config/i386/sysv4.h (CRT_GET_RFIB_DATA): Ditto.
1271 2015-01-15  Steve Ellcey  <sellcey@mips.com>
1273         * Makefile.in (PLUGIN_HEADERS): Add dominance.h, cfg.h, cfgrtl.h,
1274         cfganal.h, cfgbuild.h, cfgcleanup.h, lcm.h, cfgloopmanip.h,
1275         builtins.def, and chkp-builtins.def.
1277 2015-01-15  David Edelsohn  <dje.gcc@gmail.com>
1279         * config/rs6000/default64.h (TARGET_DEFAULT) [LITTLE_ENDIAN]: Use
1280         ISA 2.7 (POWER8).
1282 2015-01-15  Richard Biener  <rguenther@suse.de>
1284         PR tree-optimization/61743
1285         * tree-ssa-pre.c (insert_into_preds_of_block): Preserve range
1286         information on PHIs for some simple cases.
1288 2015-01-15  Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
1290         * config/arm/arm.md (generic_sched): Specify xgene1 in 'no' list.
1291         Include xgene1.md.
1292         * config/arm/arm.c (arm_issue_rate): Specify 4 for xgene1.
1293         * config/arm/arm-cores.def (xgene1): New entry.
1294         * config/arm/arm-tables.opt: Regenerate.
1295         * config/arm/arm-tune.md: Regenerate.
1296         * config/arm/bpabi.h (BE8_LINK_SPEC): Specify mcpu=xgene1.
1298 2015-01-15  Yuri Rumyantsev  <ysrumyan@gmail.com>
1300         * tree-if-conv.c: Include hash-map.h.
1301         (aggressive_if_conv): New variable.
1302         (fold_build_cond_expr): Add simplification of non-zero condition.
1303         (add_to_dst_predicate_list): Invoke add_to_predicate_list if edge
1304         destination block is not always executed.
1305         (if_convertible_phi_p): Fix commentary, allow phi nodes have more
1306         than two predecessors if AGGRESSIVE_IF_CONV is true.
1307         (if_convertible_stmt_p): Fix commentary.
1308         (all_preds_critical_p): New function.
1309         (has_pred_critical_p): New function.
1310         (if_convertible_bb_p): Fix commentary, if AGGRESSIVE_IF_CONV is true
1311         BB can have more than two predecessors and all incoming edges can be
1312         critical.
1313         (predicate_bbs): Skip predication for loop exit block, use build2_loc
1314         to compute predicate for true edge.
1315         (find_phi_replacement_condition): Delete this function.
1316         (is_cond_scalar_reduction): Add arguments ARG_0, ARG_1 and EXTENDED.
1317         Allow interchange PHI arguments if EXTENDED is false.
1318         Change check that block containing reduction statement candidate
1319         is predecessor of phi-block since phi may have more than two arguments.
1320         (phi_args_hash_traits): New helper structure.
1321         (struct phi_args_hash_traits): New type.
1322         (phi_args_hash_traits::hash): New function.
1323         (phi_args_hash_traits::equal_keys): New function.
1324         (gen_phi_arg_condition): New function.
1325         (predicate_scalar_phi): Add handling of phi nodes with more than two
1326         arguments, delete COND and TRUE_BB arguments, insert body of
1327         find_phi_replacement_condition to predicate ordinary phi nodes.
1328         (predicate_all_scalar_phis): Skip blocks with the only predecessor,
1329         delete call of find_phi_replacement_condition and invoke
1330         predicate_scalar_phi with two arguments.
1331         (insert_gimplified_predicates): Add assert that non-predicated block
1332         don't have statements to insert.
1333         (ifcvt_split_critical_edges): New function.
1334         (ifcvt_split_def_stmt): Likewise.
1335         (ifcvt_walk_pattern_tree): Likewise.
1336         (stmt_is_root_of_bool_pattern): Likewise.
1337         (ifcvt_repair_bool_pattern): Likewise.
1338         (ifcvt_local_dce): Likewise.
1339         (tree_if_conversion): Add initialization of AGGRESSIVE_IF_CONV which
1340         is copy of inner or outer loop force_vectorize field, invoke
1341         ifcvt_split_critical_edges, ifcvt_local_dce and
1342         ifcvt_repair_bool_pattern for aggressive if-conversion.
1344 2015-01-15  Philipp Tomsich  <ptomsich@theobroma-systems.com>
1346         * config/aarch64/aarch64.md: Include xgene1.md.
1347         * config/aarch64/xgene1.md: New file.
1349 2015-01-15  Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
1351         * config/aarch64/aarch64-cores.def (xgene1): Update/add the
1352         xgene1 (APM XGene-1) core definition.
1353         * gcc/config/aarch64/aarch64.c: Add cost tables for APM XGene-1
1354         * config/arm/aarch-cost-tables.h: Add cost tables for APM XGene-1
1355         * doc/invoke.texi: Document -mcpu=xgene1.
1357 2015-10-15  Prathamesh Kulkarni  <prathamesh.kulkarni@linaro.org>
1359         * dojump.h: New header file.
1360         * explow.h: Likewise.
1361         * expr.h: Remove includes.
1362         Move expmed.c prototypes to expmed.h.
1363         Move dojump.c prototypes to dojump.h.
1364         Move alias.c prototypes to alias.h.
1365         Move explow.c prototypes to explow.h.
1366         Move calls.c prototypes to calls.h.
1367         Move emit-rtl.c prototypes to emit-rtl.h.
1368         Move varasm.c prototypes to varasm.h.
1369         Move stmt.c prototypes to stmt.h.
1370         (saved_pending_stack_adjust): Move to dojump.h.
1371         (adjust_address): Move to explow.h.
1372         (adjust_address_nv): Move to emit-rtl.h.
1373         (adjust_bitfield_address): Likewise.
1374         (adjust_bitfield_address_size): Likewise.
1375         (adjust_bitfield_address_nv): Likewise.
1376         (adjust_automodify_address_nv): Likewise.
1377         * explow.c (expr_size): Move to expr.c.
1378         (int_expr_size): Likewise.
1379         (tree_expr_size): Likewise.
1380         Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1381         fixed-value.h hashtab.h statistics.h stmt.h varasm.h.
1382         * genemit.c (main): Generate includes statistics.h, real.h, fixed-value.h,
1383         insn-config.h, expmed.h, dojump.h, explow.h, emit-rtl.h, stmt.h.
1384         * genopinit.c (main): Generate includes hashtab.h, hard-reg-set.h, function.h,
1385         statistics.h, real.h, fixed-value.h, expmed.h, dojump.h, explow.h, emit-rtl.h,
1386         stmt.h.
1387         * genoutput.c (main): Generate includes hashtab.h, statistics.h, real.h,
1388         fixed-value.h, expmed.h, dojump.h, explow.h, emit-rtl.h, stmt.h.
1389         * genemit.c (open_base_files): Generate includes flags.h, statistics.h, real.h,
1390         fixed-value.h, tree.h, expmed.h, dojump.h, explow.h, calls.h, emit-rtl.h, varasm.h,
1391         stmt.h.
1392         * config/tilepro/gen-mul-tables.cc: Generate includes hashtab.h, hash-set.h, vec.h,
1393         machmode.h, tm.h, hard-reg-set.h, input.h, function.h, rtl.h, flags.h, statistics.h,
1394         double-int.h, real.h, fixed-value.h, alias.h, wide-int.h, inchash.h, tree.h,
1395         insn-config.h, expmed.h, dojump.h, explow.h, calls.h, emit-rtl.h, varasm.h, stmt.h.
1396         * config/tilegx/mul-tables.c: Include alias.h calls.h dojump.h
1397         double-int.h emit-rtl.h explow.h expmed.h fixed-value.h flags.h
1398         function.h hard-reg-set.h hash-set.h hashtab.h inchash.h input.h
1399         insn-config.h machmode.h real.h rtl.h statistics.h stmt.h symtab.h
1400         tm.h tree.h varasm.h vec.h wide-int.h.
1401         * rtlhooks.c: Include alias.h calls.h dojump.h double-int.h emit-rtl.h
1402         explow.h expmed.h fixed-value.h flags.h function.h hard-reg-set.h
1403         hash-set.h hashtab.h inchash.h input.h insn-config.h machmode.h
1404         real.h statistics.h stmt.h tree.h varasm.h vec.h wide-int.h.
1405         * cfgloopanal.c: Include alias.h calls.h dojump.h double-int.h emit-rtl.h
1406         explow.h expmed.h fixed-value.h flags.h inchash.h insn-config.h
1407         real.h statistics.h stmt.h tree.h varasm.h wide-int.h.
1408         * loop-iv.c: Likewise.
1409         * lra-assigns.c: Include alias.h calls.h dojump.h double-int.h emit-rtl.h
1410         explow.h expmed.h fixed-value.h flags.h inchash.h real.h
1411         statistics.h stmt.h tree.h varasm.h wide-int.h.
1412         * lra-constraints.c: Likewise.
1413         * lra-eliminations.c: Likewise.
1414         * lra-lives.c: Likewise.
1415         * lra-remat.c: Likewise.
1416         * bt-load.c: Include alias.h calls.h dojump.h double-int.h emit-rtl.h
1417         explow.h expmed.h fixed-value.h inchash.h insn-config.h real.h
1418         statistics.h stmt.h tree.h varasm.h wide-int.h.
1419         * hw-doloop.c: Likewise.
1420         * ira-color.c: Likewise.
1421         * ira-emit.c: Likewise.
1422         * loop-doloop.c: Likewise.
1423         * loop-invariant.c: Likewise.
1424         * reload.c: Include alias.h calls.h dojump.h double-int.h emit-rtl.h
1425         explow.h expmed.h fixed-value.h inchash.h real.h rtl.h
1426         statistics.h stmt.h tree.h varasm.h wide-int.h.
1427         * caller-save.c: Include alias.h calls.h dojump.h double-int.h emit-rtl.h
1428         explow.h expmed.h fixed-value.h inchash.h real.h statistics.h
1429         stmt.h tree.h varasm.h wide-int.h.
1430         * combine-stack-adj.c: Likewise.
1431         * cse.c: Likewise.
1432         * ddg.c: Likewise.
1433         * ifcvt.c: Likewise.
1434         * ira-costs.c: Likewise.
1435         * jump.c: Likewise.
1436         * lra-coalesce.c: Likewise.
1437         * lra-spills.c: Likewise.
1438         * profile.c: Include alias.h calls.h dojump.h double-int.h emit-rtl.h
1439         explow.h expmed.h fixed-value.h insn-config.h real.h statistics.h
1440         stmt.h varasm.h wide-int.h.
1441         * lra.c: Include alias.h calls.h dojump.h double-int.h emit-rtl.h
1442         explow.h expmed.h fixed-value.h real.h statistics.h stmt.h
1443         varasm.h.
1444         * config/sh/sh_treg_combine.cc: Include alias.h calls.h dojump.h
1445         double-int.h explow.h expmed.h fixed-value.h flags.h real.h
1446         statistics.h stmt.h varasm.h wide-int.h.
1447         * reorg.c: Include alias.h calls.h dojump.h double-int.h explow.h
1448         expmed.h fixed-value.h inchash.h real.h statistics.h stmt.h tree.h
1449         varasm.h wide-int.h.
1450         * reload1.c: Include alias.h calls.h dojump.h double-int.h explow.h
1451         expmed.h fixed-value.h real.h rtl.h statistics.h stmt.h varasm.h.
1452         * config/tilegx/tilegx.c: Include alias.h dojump.h double-int.h
1453         emit-rtl.h explow.h expmed.h fixed-value.h flags.h real.h
1454         statistics.h stmt.h.
1455         * config/tilepro/tilepro.c: Likewise.
1456         * config/mmix/mmix.c: Include alias.h dojump.h double-int.h emit-rtl.h
1457         explow.h expmed.h fixed-value.h real.h statistics.h stmt.h.
1458         * config/pdp11/pdp11.c: Likewise.
1459         * config/xtensa/xtensa.c: Likewise.
1460         * config/lm32/lm32.c: Include alias.h dojump.h double-int.h emit-rtl.h
1461         explow.h expmed.h fixed-value.h real.h statistics.h stmt.h
1462         varasm.h.
1463         * tree-chkp.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1464         fixed-value.h flags.h function.h hard-reg-set.h hashtab.h
1465         insn-config.h real.h rtl.h statistics.h stmt.h tm.h.
1466         * cilk-common.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1467         fixed-value.h flags.h function.h hard-reg-set.h hashtab.h
1468         insn-config.h real.h rtl.h statistics.h stmt.h tm.h varasm.h.
1469         * rtl-chkp.c: Likewise.
1470         * tree-chkp-opt.c: Likewise.
1471         * config/arm/arm-builtins.c: Include calls.h dojump.h emit-rtl.h explow.h
1472         expmed.h fixed-value.h flags.h function.h hard-reg-set.h hashtab.h
1473         insn-config.h real.h statistics.h stmt.h varasm.h.
1474         * ipa-icf.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1475         fixed-value.h flags.h hashtab.h insn-config.h real.h rtl.h
1476         statistics.h stmt.h.
1477         * tree-vect-data-refs.c: Likewise.
1478         * graphite-sese-to-poly.c: Include calls.h dojump.h emit-rtl.h explow.h
1479         expmed.h fixed-value.h flags.h hashtab.h insn-config.h real.h
1480         rtl.h statistics.h stmt.h varasm.h.
1481         * internal-fn.c: Likewise.
1482         * ipa-icf-gimple.c: Likewise.
1483         * lto-section-out.c: Likewise.
1484         * tree-data-ref.c: Likewise.
1485         * tree-nested.c: Likewise.
1486         * tree-outof-ssa.c: Likewise.
1487         * tree-predcom.c: Likewise.
1488         * tree-pretty-print.c: Likewise.
1489         * tree-scalar-evolution.c: Likewise.
1490         * tree-ssa-strlen.c: Likewise.
1491         * tree-vect-loop.c: Likewise.
1492         * tree-vect-patterns.c: Likewise.
1493         * tree-vect-slp.c: Likewise.
1494         * tree-vect-stmts.c: Likewise.
1495         * tsan.c: Likewise.
1496         * targhooks.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1497         fixed-value.h flags.h hashtab.h insn-config.h real.h statistics.h
1498         stmt.h.
1499         * config/sh/sh-mem.cc: Include calls.h dojump.h emit-rtl.h explow.h
1500         expmed.h fixed-value.h flags.h hashtab.h insn-config.h real.h
1501         statistics.h stmt.h varasm.h.
1502         * loop-unroll.c: Likewise.
1503         * ubsan.c: Likewise.
1504         * tree-ssa-loop-prefetch.c: Include calls.h dojump.h emit-rtl.h explow.h
1505         expmed.h fixed-value.h flags.h hashtab.h real.h rtl.h statistics.h
1506         stmt.h varasm.h.
1507         * dse.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1508         fixed-value.h function.h hashtab.h statistics.h stmt.h varasm.h.
1509         * tree-switch-conversion.c: Include calls.h dojump.h emit-rtl.h explow.h
1510         expmed.h fixed-value.h hashtab.h insn-config.h real.h rtl.h
1511         statistics.h stmt.h.
1512         * generic-match-head.c: Include calls.h dojump.h emit-rtl.h explow.h
1513         expmed.h fixed-value.h hashtab.h insn-config.h real.h rtl.h
1514         statistics.h stmt.h varasm.h.
1515         * gimple-match-head.c: Likewise.
1516         * lto-cgraph.c: Likewise.
1517         * lto-section-in.c: Likewise.
1518         * lto-streamer-in.c: Likewise.
1519         * lto-streamer-out.c: Likewise.
1520         * tree-affine.c: Likewise.
1521         * tree-cfg.c: Likewise.
1522         * tree-cfgcleanup.c: Likewise.
1523         * tree-if-conv.c: Likewise.
1524         * tree-into-ssa.c: Likewise.
1525         * tree-ssa-alias.c: Likewise.
1526         * tree-ssa-copyrename.c: Likewise.
1527         * tree-ssa-dse.c: Likewise.
1528         * tree-ssa-forwprop.c: Likewise.
1529         * tree-ssa-live.c: Likewise.
1530         * tree-ssa-math-opts.c: Likewise.
1531         * tree-ssa-pre.c: Likewise.
1532         * tree-ssa-sccvn.c: Likewise.
1533         * tree-tailcall.c: Likewise.
1534         * tree-vect-generic.c: Likewise.
1535         * tree-sra.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1536         fixed-value.h hashtab.h insn-config.h real.h rtl.h stmt.h varasm.h.
1537         * stor-layout.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1538         fixed-value.h hashtab.h insn-config.h real.h statistics.h stmt.h.
1539         * varasm.c: Likewise.
1540         * coverage.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1541         fixed-value.h hashtab.h insn-config.h real.h statistics.h stmt.h
1542         varasm.h.
1543         * init-regs.c: Likewise.
1544         * ira.c: Likewise.
1545         * omp-low.c: Likewise.
1546         * stack-ptr-mod.c: Likewise.
1547         * tree-ssa-reassoc.c: Likewise.
1548         * tree-complex.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1549         fixed-value.h hashtab.h insn-config.h rtl.h statistics.h stmt.h
1550         varasm.h.
1551         * dwarf2cfi.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1552         fixed-value.h hashtab.h insn-config.h statistics.h stmt.h varasm.h.
1553         * shrink-wrap.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1554         fixed-value.h hashtab.h real.h rtl.h statistics.h stmt.h.
1555         * recog.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1556         fixed-value.h hashtab.h real.h rtl.h statistics.h stmt.h varasm.h.
1557         * tree-ssa-phiopt.c: Likewise.
1558         * config/darwin.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1559         fixed-value.h hashtab.h real.h statistics.h stmt.h.
1560         * config/fr30/fr30.c: Likewise.
1561         * config/frv/frv.c: Likewise.
1562         * expr.c: Likewise.
1563         * final.c: Likewise.
1564         * optabs.c: Likewise.
1565         * passes.c: Likewise.
1566         * simplify-rtx.c: Likewise.
1567         * stmt.c: Likewise.
1568         * toplev.c: Likewise.
1569         * var-tracking.c: Likewise.
1570         * gcse.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1571         fixed-value.h hashtab.h real.h statistics.h stmt.h varasm.h.
1572         * lower-subreg.c: Likewise.
1573         * postreload-gcse.c: Likewise.
1574         * ree.c: Likewise.
1575         * reginfo.c: Likewise.
1576         * store-motion.c: Likewise.
1577         * combine.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1578         fixed-value.h hashtab.h real.h stmt.h varasm.h.
1579         * emit-rtl.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1580         fixed-value.h hashtab.h statistics.h stmt.h.
1581         * dojump.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1582         fixed-value.h hashtab.h statistics.h stmt.h varasm.h.
1583         * except.c: Likewise.
1584         * explow.c: Likewise.
1585         * tree-dfa.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1586         fixed-value.h insn-config.h real.h rtl.h statistics.h stmt.h
1587         varasm.h.
1588         * gimple-fold.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1589         fixed-value.h insn-config.h real.h rtl.h statistics.h varasm.h.
1590         * tree-ssa-structalias.c: Likewise.
1591         * cfgexpand.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1592         fixed-value.h insn-config.h real.h statistics.h.
1593         * calls.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1594         fixed-value.h insn-config.h real.h statistics.h stmt.h.
1595         * bb-reorder.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1596         fixed-value.h insn-config.h real.h statistics.h stmt.h varasm.h.
1597         * cfgbuild.c: Likewise.
1598         * function.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1599         fixed-value.h real.h rtl.h statistics.h stmt.h.
1600         * cfgrtl.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1601         fixed-value.h real.h rtl.h statistics.h stmt.h varasm.h.
1602         * dbxout.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1603         fixed-value.h real.h statistics.h stmt.h.
1604         * auto-inc-dec.c: Include calls.h dojump.h emit-rtl.h explow.h expmed.h
1605         fixed-value.h real.h statistics.h stmt.h varasm.h.
1606         * cprop.c: Likewise.
1607         * modulo-sched.c: Likewise.
1608         * postreload.c: Likewise.
1609         * ccmp.c: Include calls.h dojump.h emit-rtl.h explow.h fixed-value.h
1610         flags.h function.h hard-reg-set.h hashtab.h insn-config.h real.h
1611         statistics.h stmt.h varasm.h.
1612         * gimple-ssa-strength-reduction.c: Include calls.h dojump.h emit-rtl.h
1613         explow.h fixed-value.h flags.h hashtab.h insn-config.h real.h
1614         rtl.h statistics.h stmt.h varasm.h.
1615         * tree-ssa-loop-ivopts.c: Include calls.h dojump.h emit-rtl.h explow.h
1616         fixed-value.h flags.h hashtab.h real.h rtl.h statistics.h stmt.h
1617         varasm.h.
1618         * expmed.c: Include calls.h dojump.h emit-rtl.h explow.h fixed-value.h
1619         function.h hard-reg-set.h hashtab.h real.h statistics.h stmt.h
1620         varasm.h.
1621         * target-globals.c: Include calls.h dojump.h emit-rtl.h explow.h
1622         fixed-value.h function.h hashtab.h real.h statistics.h stmt.h
1623         varasm.h.
1624         * tree-ssa-address.c: Include calls.h dojump.h emit-rtl.h explow.h
1625         fixed-value.h hashtab.h real.h statistics.h stmt.h varasm.h.
1626         * cfgcleanup.c: Include calls.h dojump.h explow.h expmed.h fixed-value.h
1627         function.h real.h statistics.h stmt.h varasm.h.
1628         * alias.c: Include calls.h dojump.h explow.h expmed.h fixed-value.h
1629         insn-config.h real.h statistics.h stmt.h.
1630         * dwarf2out.c: Include calls.h dojump.h explow.h expmed.h fixed-value.h
1631         statistics.h stmt.h.
1632         * config/nvptx/nvptx.c: Include dojump.h emit-rtl.h explow.h expmed.h
1633         fixed-value.h flags.h hard-reg-set.h insn-config.h real.h
1634         statistics.h stmt.h varasm.h.
1635         * gimplify.c: Include dojump.h emit-rtl.h explow.h expmed.h fixed-value.h
1636         flags.h hashtab.h insn-config.h real.h rtl.h statistics.h.
1637         * asan.c: Include dojump.h emit-rtl.h explow.h expmed.h fixed-value.h
1638         flags.h hashtab.h insn-config.h real.h rtl.h statistics.h stmt.h.
1639         * ipa-devirt.c: Include dojump.h emit-rtl.h explow.h expmed.h
1640         fixed-value.h flags.h hashtab.h insn-config.h real.h rtl.h
1641         statistics.h stmt.h varasm.h.
1642         * ipa-polymorphic-call.c: Likewise.
1643         * config/aarch64/aarch64.c: Include dojump.h emit-rtl.h explow.h expmed.h
1644         fixed-value.h flags.h hashtab.h insn-config.h real.h statistics.h
1645         stmt.h.
1646         * config/c6x/c6x.c: Likewise.
1647         * config/aarch64/aarch64-builtins.c: Include dojump.h emit-rtl.h explow.h
1648         expmed.h fixed-value.h flags.h hashtab.h insn-config.h real.h
1649         statistics.h stmt.h varasm.h.
1650         * ipa-prop.c: Include dojump.h emit-rtl.h explow.h expmed.h fixed-value.h
1651         hashtab.h insn-config.h real.h rtl.h statistics.h stmt.h varasm.h.
1652         * ipa-split.c: Likewise.
1653         * tree-eh.c: Likewise.
1654         * tree-ssa-dce.c: Likewise.
1655         * tree-ssa-loop-niter.c: Likewise.
1656         * tree-vrp.c: Likewise.
1657         * config/nds32/nds32-cost.c: Include dojump.h emit-rtl.h explow.h
1658         expmed.h fixed-value.h hashtab.h insn-config.h real.h statistics.h
1659         stmt.h.
1660         * config/nds32/nds32-fp-as-gp.c: Likewise.
1661         * config/nds32/nds32-intrinsic.c: Likewise.
1662         * config/nds32/nds32-isr.c: Likewise.
1663         * config/nds32/nds32-md-auxiliary.c: Likewise.
1664         * config/nds32/nds32-memory-manipulation.c: Likewise.
1665         * config/nds32/nds32-pipelines-auxiliary.c: Likewise.
1666         * config/nds32/nds32-predicates.c: Likewise.
1667         * config/nds32/nds32.c: Likewise.
1668         * config/cris/cris.c: Include dojump.h emit-rtl.h explow.h expmed.h
1669         fixed-value.h hashtab.h real.h statistics.h.
1670         * config/alpha/alpha.c: Include dojump.h emit-rtl.h explow.h expmed.h
1671         fixed-value.h hashtab.h real.h statistics.h stmt.h.
1672         * config/arm/arm.c: Likewise.
1673         * config/avr/avr.c: Likewise.
1674         * config/bfin/bfin.c: Likewise.
1675         * config/h8300/h8300.c: Likewise.
1676         * config/i386/i386.c: Likewise.
1677         * config/ia64/ia64.c: Likewise.
1678         * config/iq2000/iq2000.c: Likewise.
1679         * config/m32c/m32c.c: Likewise.
1680         * config/m32r/m32r.c: Likewise.
1681         * config/m68k/m68k.c: Likewise.
1682         * config/mcore/mcore.c: Likewise.
1683         * config/mep/mep.c: Likewise.
1684         * config/mips/mips.c: Likewise.
1685         * config/mn10300/mn10300.c: Likewise.
1686         * config/moxie/moxie.c: Likewise.
1687         * config/pa/pa.c: Likewise.
1688         * config/rl78/rl78.c: Likewise.
1689         * config/rx/rx.c: Likewise.
1690         * config/s390/s390.c: Likewise.
1691         * config/sh/sh.c: Likewise.
1692         * config/sparc/sparc.c: Likewise.
1693         * config/spu/spu.c: Likewise.
1694         * config/stormy16/stormy16.c: Likewise.
1695         * config/v850/v850.c: Likewise.
1696         * config/vax/vax.c: Likewise.
1697         * config/cr16/cr16.c: Include dojump.h emit-rtl.h explow.h expmed.h
1698         fixed-value.h hashtab.h real.h statistics.h stmt.h varasm.h.
1699         * config/msp430/msp430.c: Likewise.
1700         * predict.c: Likewise.
1701         * value-prof.c: Likewise.
1702         * config/epiphany/epiphany.c: Include dojump.h emit-rtl.h explow.h
1703         expmed.h fixed-value.h hashtab.h statistics.h stmt.h.
1704         * config/microblaze/microblaze.c: Likewise.
1705         * config/nios2/nios2.c: Likewise.
1706         * config/rs6000/rs6000.c: Likewise.
1707         * tree.c: Include dojump.h emit-rtl.h explow.h expmed.h fixed-value.h
1708         insn-config.h real.h rtl.h statistics.h stmt.h.
1709         * cgraph.c: Include dojump.h emit-rtl.h explow.h expmed.h fixed-value.h
1710         insn-config.h real.h statistics.h stmt.h.
1711         * fold-const.c: Include dojump.h emit-rtl.h explow.h expmed.h
1712         fixed-value.h insn-config.h real.h statistics.h stmt.h varasm.h.
1713         * tree-inline.c: Include dojump.h emit-rtl.h explow.h expmed.h
1714         fixed-value.h real.h rtl.h statistics.h stmt.h varasm.h.
1715         * builtins.c: Include dojump.h emit-rtl.h explow.h expmed.h fixed-value.h
1716         real.h statistics.h stmt.h.
1717         * config/arc/arc.c: Include dojump.h emit-rtl.h explow.h expmed.h
1718         fixed-value.h statistics.h stmt.h.
1719         * config/visium/visium.c: Include dojump.h emit-rtl.h explow.h expmed.h
1720         stmt.h.
1722 2015-01-15  Jakub Jelinek  <jakub@redhat.com>
1724         * gengtype.c (create_user_defined_type): Workaround
1725         -Wmaybe-uninitialized false positives.
1726         * cse.c (fold_rtx): Likewise.
1727         * loop-invariant.c (gain_for_invariant): Likewise.
1729 2015-01-15  Eric Botcazou  <ebotcazou@adacore.com>
1731         * expr.c (expand_expr_real_1) <normal_inner_ref>: Use the expression to
1732         set the memory attributes in all cases but clear MEM_EXPR if need be.
1734 2015-01-15  Yuri Rumyantsev  <ysrumyan@gmail.com>
1736         PR tree-optimization/64434
1737         * cfgexpand.c (reorder_operands): New function.
1738         (expand_gimple_basic_block): Insert call of reorder_operands if
1739         optimized is true.
1741 2015-01-15  Matthew Fortune  <matthew.fortune@imgtec.com>
1743         * config/mips/micromips.md (*swp): Remove explicit parallel.
1744         (jraddiusp, *movep<MOVEP1:mode><MOVEP2:mode>): Likewise.
1745         * config/mips/mips-dsp.md (add<DSPV:mode>3): Likewise.
1746         (mips_add<DSP:dspfmt1>_s_<DSP:dspfmt2>, sub<DSPV:mode>3): Likewise.
1747         (mips_sub<DSP:dspfmt1>_s_<DSP:dspfmt2>, mips_addsc): Likewise.
1748         (mips_addwc, mips_absq_s_<DSPQ:dspfmt2>): Likewise.
1749         (mips_precrq_rs_ph_w, mips_precrqu_s_qb_ph): Likewise.
1750         (mips_shll_<DSPV:dspfmt2>, mips_shll_s_<DSPQ:dspfmt2>): Likewise.
1751         (mips_muleu_s_ph_qbl, mips_muleu_s_ph_qbr): Likewise.
1752         (mips_mulq_rs_ph, mips_muleq_s_w_phl, mips_muleq_s_w_phr): Likewise.
1753         (mips_dpaq_s_w_ph, mips_dpsq_s_w_ph, mips_mulsaq_s_w_ph): Likewise.
1754         (mips_dpaq_sa_l_w, mips_dpsq_sa_l_w, mips_maq_s_w_phl): Likewise.
1755         (mips_maq_s_w_phr, mips_maq_sa_w_phl, mips_maq_sa_w_phr): Likewise.
1756         (mips_extr_w, mips_extr_r_w, mips_extr_rs_w): Likewise.
1757         (mips_extr_s_h, mips_extp, mips_extpdp, mips_mthlip): Likewise.
1758         (mips_wrdsp): Likewise.
1759         * config/mips/mips-dspr2.md (mips_absq_s_qb): Remove explicit
1760         parallel.
1761         (mips_addu_ph, mips_addu_s_ph, mips_cmpgdu_eq_qb): Likewise.
1762         (mips_cmpgdu_lt_qb, mips_cmpgdu_le_qb, mulv2hi3): Likewise.
1763         (mips_mul_s_ph, mips_mulq_rs_w, mips_mulq_s_ph): Likewise.
1764         (mips_mulq_s_w, mips_subu_ph, mips_subu_s_ph): Likewise.
1765         (mips_dpaqx_s_w_ph, mips_dpaqx_sa_w_ph): Likewise.
1766         (mips_dpsqx_s_w_ph, mips_dpsqx_sa_w_ph): Likewise.
1767         * config/mips/mips-fixed.md (usadd<mode>3): Remove explicit parallel.
1768         (ssadd<mode>3, ussub<mode>3, sssub<mode>3, ssmul<mode>3): Likewise.
1769         (ssmaddsqdq4, ssmsubsqdq4): Likewise.
1771 2015-01-14  Matthew Fortune  <matthew.fortune@imgtec.com>
1773         * config/mips/mips.c (mips_rtx_costs): Set costs for LSA/DLSA.
1774         (mips_print_operand): Support 'y' to print exact log2 in decimal
1775         of a const_int.
1776         * config/mips/mips.h (ISA_HAS_LSA): New define.
1777         (ISA_HAS_DLSA): Likewise.
1778         * config/mips/mips.md (<GPR:d>lsa): New define_insn.
1779         * config/mips/predicates.md (const_immlsa_operand): New predicate.
1781 2015-01-15  Martin Liska  <mliska@suse.cz>
1783         PR target/64377
1784         * optc-save-gen.awk: Add support for array types.
1786 2015-01-15  Richard Biener  <rguenther@suse.de>
1788         PR middle-end/64365
1789         * tree-data-ref.c (dr_analyze_indices): Make sure that accesses
1790         for MEM_REF access functions with the same base can never partially
1791         overlap.
1793 2015-01-14  Marcos Diaz <marcos.diaz@tallertechnologies.com>
1795         * common.opt: New option -fstack-protector-explicit.
1796         * cfgexpand.c (SPCT_FLAG_EXPLICIT): New enum.
1797         (stack_protect_decl_phase): Handle stack_protect attribute for
1798         explicit stack protection requests.
1799         (expand_used_vars): Similarly.
1800         * doc/cpp.texi (__SSP_EXPLICIT__): Document predefined macro.
1801         * doc/extend.texi: Add documentation for "stack_protect" attribute.
1802         * doc/invoke.texi: Add documentation for -fstack-protector-explicit.
1804 2015-01-14  Oleg Endo  <olegendo@gcc.gnu.org>
1806         PR target/53988
1807         * config/sh/sh-protos.h (sh_find_set_of_reg): Add option to ignore
1808         reg-reg copies.
1809         (sh_extending_set_of_reg): New struct.
1810         (sh_find_extending_set_of_reg, sh_split_tst_subregs,
1811         sh_remove_reg_dead_or_unused_notes): New Declarations.
1812         * config/sh/sh.c (sh_remove_reg_dead_or_unused_notes,
1813         sh_find_extending_set_of_reg, sh_split_tst_subregs,
1814         sh_extending_set_of_reg::use_as_extended_reg): New functions.
1815         * config/sh/sh.md (*tst<mode>_t_zero): Rename to *tst<mode>_t_subregs,
1816         convert to insn_and_split and use new function sh_split_tst_subregs.
1818 2015-01-14  Sandra Loosemore  <sandra@codesourcery.com>
1820         * doc/invoke.texi (Option Summary): Reclassify -fuse-ld as a linker
1821         option.
1822         (Optimization Options): Move -fuse-ld documentation to...
1823         (Link Options): ...here.
1825 2015-01-14  Matthew Fortune  <matthew.fortune@imgtec.com>
1827         * config/mips/constraints.md (ZC): Add support for R6 LL/SC
1828         offsets.
1829         (ZD): Update to use ISA_HAS_9BIT_DISPLACEMENT.
1830         * config/mips/mips.h (ISA_HAS_PREFETCH_9BIT): Rename to...
1831         (ISA_HAS_9BIT_DISPLACEMENT): ... this. New macro.
1832         * config/mips/sync.md (sync_compare_and_swap<mode>): Use ZC
1833         instead of ZR for the memory operand of LL/SC.
1834         (compare_and_swap_12, sync_add<mode>): Likewise.
1835         (sync_<optab>_12, sync_old_<optab>_12): Likewise.
1836         (sync_new_<optab>_12, sync_nand_12): Likewise.
1837         (sync_old_nand_12, sync_new_nand_12): Likewise.
1838         (sync_sub<mode>, sync_old_add<mode>): Likewise.
1839         (sync_old_sub<mode>, sync_new_add<mode>): Likewise.
1840         (sync_new_sub<mode>, sync_<optab><mode>): Likewise.
1841         (sync_old_<optab><mode>, sync_new_<optab><mode>"): Likewise.
1842         (sync_nand<mode>, sync_old_nand<mode>): Likewise.
1843         (sync_new_nand<mode>, sync_lock_test_and_set<mode>): Likewise.
1844         (test_and_set_12, atomic_compare_and_swap<mode>): Likewise.
1845         (atomic_exchange<mode>_llsc, atomic_fetch_add<mode>_llsc): Likewise.
1846         * doc/md.texi (ZC): Update description.
1848 2015-01-14  Andrew MacLeod  <amacleod@redhat.com>
1850         * builtins.c (expand_builtin_atomic_exchange): Remove error when
1851         memory model is CONSUME.
1852         (expand_builtin_atomic_compare_exchange, expand_builtin_atomic_load,
1853         expand_builtin_atomic_store): Change invalid memory model errors to
1854         warnings.
1855         (expand_builtin_atomic_clear): Change invalid model errors to warnings
1856         and issue warning for CONSUME.
1858 2015-01-14  Aldy Hernandez  <aldyh@redhat.com>
1860         * lto-cgraph: Update function comments for
1861         lto_symtab_encoder_encode_*.
1863 2015-01-14  Ilya Verbin  <ilya.verbin@intel.com>
1865         * Makefile.in (site.exp): Do not set ENABLE_LTO.
1867 2015-01-14  Ilya Verbin  <ilya.verbin@intel.com>
1869         * cgraphunit.c (ipa_passes): Remove argument from ipa_write_summaries.
1870         * lto-cgraph.c (select_what_to_stream): Remove argument, use
1871         lto_stream_offload_p instead.
1872         * lto-streamer.h (select_what_to_stream): Remove argument.
1873         * passes.c (ipa_write_summaries): Likewise.
1874         * tree-pass.h (ipa_write_summaries): Likewise.
1876 2015-01-14  Richard Biener  <rguenther@suse.de>
1878         PR tree-optimization/59354
1879         * tree-vect-slp.c (vect_build_slp_tree_1): Treat loads from
1880         groups larger than the slp group size as having gaps.
1882 2015-01-14  Andrew MacLeod  <amacleod@redhat.com>
1884         PR middle-end/59448
1885         * builtins.c (get_memmodel): Promote consume to acquire always.
1887 2015-01-14  Ilya Tocar  <ilya.tocar@intel.com>
1889         PR target/64386
1890         * config/i386/i386.c (ix86_expand_sse_cmp): Handle V64QImode,
1891         V32HImode. 
1893 2015-01-14  Ilya Tocar  <ilya.tocar@intel.com>
1895         PR target/64393
1896         * common/config/i386/i386-common.c (OPTION_MASK_ISA_AVX512VBMI_SET):
1897         Enable AVX512BW.
1898         (OPTION_MASK_ISA_AVX512BW_UNSET): Disable AVX512VBMI.
1899         * config/i386/i386.c (ix86_hard_regno_mode_ok): Don't check
1900         AVX512VBMI, as it implies AVX512BW.
1902 2015-01-14  Ilya Tocar  <ilya.tocar@intel.com>
1904         PR target/64387
1905         * config/i386/sse.md (vec_unpacks_hi_v8sf): Fix predicate.
1906         (vec_unpacks_hi_v16sf): Ditto.
1908 2015-01-14  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
1910         * config/aarch64/arm_neon.h: Error out if AdvancedSIMD
1911         is not available.
1913 2015-01-14  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
1915         * doc/invoke.texi (mapcs): Mention deprecation.
1916         (mapcs-frame): Likewise.
1918 2015-01-14  Thomas Preud'homme  <thomas.preudhomme@arm.com>
1920         PR target/64453
1921         * config/arm/arm.c (callee_saved_reg_p): Define.
1922         (arm_compute_save_reg0_reg12_mask): Use callee_saved_reg_p to check if
1923         register is callee saved instead of !call_used_regs[reg].
1924         (thumb1_compute_save_reg_mask): Likewise.
1926 2015-01-14  Hale Wang  <hale.wang@arm.com>
1928         * config/arm/arm.c: Tune the max_cond_insns/branch_cost for
1929         Cortex-M7.
1931 2015-01-14  Richard Biener  <rguenther@suse.de>
1933         PR lto/64415
1934         * tree-inline.c (insert_debug_decl_map): Check destination
1935         function MAY_HAVE_DEBUG_STMTS.
1936         (insert_init_debug_bind): Likewise.
1937         (insert_init_stmt): Remove redundant check.
1938         (remap_gimple_stmt): Drop debug stmts if the destination
1939         function has var-tracking assignments disabled.
1941 2015-01-14  Martin Liska  <mliska@suse.cz>
1943         * ipa-icf-gimple.c (func_checker::compare_operand): Add support for
1944         IMAGPART_EXPR and REALPART_EXPR and fix BIT_FIELD_REF comparison.
1946 2015-01-14  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
1948         PR target/64460
1949         * config/arm/arm.md (*<arith_shift_insn>_multsi): Set 'shift' to 2.
1950         (*<arith_shift_insn>_shiftsi): Set 'shift' attr to 3.
1952 2015-01-14  Matthew Fortune  <matthew.fortune@imgtec.com>
1954         * config/mips/mips.h (MIPS_ISA_LEVEL_SPEC): Only infer an ISA
1955         level from an ARCH; do not inject the default.
1956         (MIPS_DEFAULT_ISA_LEVEL_SPEC): New macro split out from
1957         MIPS_ISA_LEVEL_SPEC.
1958         (MIPS_ISA_NAN2008_SPEC): Update comment.
1959         (BASE_DRIVER_SELF_SPECS): Likewise.
1960         * config/mips/elfoabi.h (DRIVER_SELF_SPECS): Add
1961         MIPS_DEFAULT_ISA_LEVEL_SPEC.
1962         * config/mips/mti-elf.h (DRIVER_SELF_SPECS): Likewise.
1963         * config/mips/mti-linux.h (DRIVER_SELF_SPECS): Likewise.
1964         * config/mips/sde.h (DRIVER_SELF_SPECS): Likewise.
1966 2015-01-14  Richard Biener  <rguenther@suse.de>
1968         PR tree-optimization/64493
1969         PR tree-optimization/64495
1970         * tree-vect-loop.c (vect_finalize_reduction): For double-reductions
1971         assign the proper vectorized PHI to the inner loop exit PHIs.
1973 2015-01-14  Joey Ye  <joey.ye@arm.com>
1975         * config/arm/arm.c (arm_compute_save_reg_mask):
1976         Do not save lr in case of tail call.
1977         * config/arm/thumb2.md (*thumb2_pop_single): New pattern.
1979 2015-01-14  Martin Uecker <uecker@eecs.berkeley.edu>
1981         * tree-vrp.c (check_array_ref): Emit more warnings
1982         for warn_array_bounds >= 2.
1983         * common.opt: New option -Warray-bounds=.
1984         * doc/invoke.texi: Document -Warray-bounds=.
1986 2015-01-14  Chung-Ju Wu  <jasonwucj@gmail.com>
1988         * config/nds32/nds32.opt (mforce-fp-as-gp): Remove.
1989         (mforbid-fp-as-gp): Remove.
1990         (mex9): Remove.
1991         * config/nds32/nds32-fp-as-gp.c (nds32_have_prologue_p): Remove.
1992         (nds32_symbol_load_store_p): Remove.
1993         (nds32_fp_as_gp_check_available): Clean up implementation.
1994         * config/nds32/nds32.h (LINK_SPEC): Remove -mforce-as-gp and -mex9
1995         cases.
1996         * config/nds32/nds32.c (nds32_asm_file_start): No need to consider
1997         fp-as-gp and ex9 cases.
1999 2015-01-13  Jan Hubicka  <hubicka@ucw.cz>
2001         * tree-profile.c (init_ic_make_global_vars): Drop workaround
2002         for bintuils bug 14342.
2003         (init_ic_make_global_vars): Likewise.
2004         (gimple_init_edge_profiler): Likewise.
2005         (gimple_gen_ic_func_profiler): Likewise.
2007 2015-01-13  Naveen H.S  <Naveen.Hurugalawadi@caviumnetworks.com>
2009         * ipa-inline.c (inline_small_functions): Swap the operands in
2010         enum.
2012 2015-01-13  Jan Hubicka  <hubicka@ucw.cz>
2014         PR ipa/64481
2015         * ipa-inline-analysis.c (node_growth_cache): Remove.
2016         (initialize_growth_caches): Do not initialize it.
2017         (free_growth_caches): Do not free it.
2018         (do_estimate_growth): Rename to ...
2019         (estimate_growth): ... this one; drop growth cache code.
2020         (growth_likely_positive): Always go the heuristics way.
2021         * ipa-inline.c (can_inline_edge_p): Walk through aliases.
2022         (reset_edge_caches): Do not reset node growth.
2023         (heap_edge_removal_hook): Do not maintain cache.
2024         (inline_small_functions): Likewise; strenghten sanity check.
2025         (ipa_inline): Do not maintain caches.
2026         * ipa-inline.h (node_growth_cache): Remove.
2027         (do_estimate_growth): Remove to ...
2028         (estimate_growth): this one; remove inline version.
2029         (reset_node_growth_cache): Remove.
2031 2015-01-13  Jan Hubicka  <hubicka@ucw.cz>
2033         PR ipa/64565
2034         * ipa-inline.c (inline_small_functions): Update callee keys after
2035         resolving speculation
2036         (inline_small_functions): Always check monotonicity of the queue.
2038 2015-01-13  Marek Polacek  <polacek@redhat.com>
2040         PR middle-end/64391
2041         * trans-mem.c (get_attrs_for): Return NULL_TREE if X is NULL_TREE.
2043 2015-01-13  Jakub Jelinek  <jakub@redhat.com>
2045         PR rtl-optimization/64286
2046         * ree.c (combine_reaching_defs): Move part of comment earlier,
2047         remove !SCALAR_INT_MODE_P check.
2048         (add_removable_extension): Don't add vector mode
2049         extensions if all uses of the source register aren't the same
2050         vector extensions.
2052 2015-01-13  Renlin Li  <renlin.li@arm.com>
2054         * config/arm/arm.h (CLZ_DEFINED_VALUE_AT_ZERO): Return 2.
2055         (CTZ_DEFINED_VALUE_AT_ZERO): Ditto.
2057 2015-01-13  Martin Liska  <mliska@suse.cz>
2059         * ipa-icf.c (sem_function::equals_private): Call new functions
2060         cl_target_option_print_diff and cl_optimization_print_diff.
2061         * optc-save-gen.awk (cl_target_option_print_diff): New function.
2062         (cl_optimization_print_diff): Likewise.
2063         * opth-gen.awk: Likewise.
2065 2015-01-13  Richard Sandiford  <richard.sandiford@arm.com>
2067         * config/aarch64/aarch64.md (subsi3, *subsi3_uxtw, subdi3)
2068         (*sub_<optab><ALLX:mode>_<GPI:mode>, *sub_<optab><SHORT:mode>_si_uxtw)
2069         (*sub_<optab><ALLX:mode>_shft_<GPI:mode>)
2070         (*sub_<optab><SHORT:mode>_shft_si_uxtw, *sub_<optab><mode>_multp2)
2071         (*sub_<optab>si_multp2_uxtw, *sub_uxt<mode>_multp2)
2072         (*sub_uxtsi_multp2_uxtw): Add stack pointer sources.
2074 2015-01-13  Andrew Pinski   <apinski@cavium.com>
2076         * config/aarch64/aarch64.c (fusion_load_store): Check dest mode
2077         instead of src mode.    
2079 2015-01-13  Richard Biener  <rguenther@suse.de>
2081         PR lto/64373
2082         * lto-streamer-out.c (tree_is_indexable): Guard for NULL
2083         DECL_CONTEXT.
2085 2015-01-13  Andrew Pinski   <apinski@cavium.com>
2087         * config/aarch64/aarch64.c (aarch64_operands_ok_for_ldpstp): Reject
2088         volatile mems.
2089         (aarch64_operands_adjust_ok_for_ldpstp): Likewise.
2091 2015-01-13  Jakub Jelinek  <jakub@redhat.com>
2093         PR middle-end/63974
2094         * cfgexpand.c (expand_computed_goto): Don't call
2095         convert_memory_address here.
2097 2015-01-13  Richard Biener  <rguenther@suse.de>
2099         PR tree-optimization/64406
2100         * tree-loop-distibution.c (pass_loop_distribution::execute):
2101         Reset the SCEV hashtable if we distributed anything.
2103 2015-01-13  Richard Biener  <rguenther@suse.de>
2105         PR tree-optimization/64404
2106         * tree-vect-stmts.c (vectorizable_load): Reject conflicting
2107         SLP types for CSEd loads.
2109 2015-01-13  Thomas Preud'homme  <thomas.preudhomme@arm.com>
2111         PR tree-optimization/64436
2112         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Move code performing the
2113         merge of two symbolic numbers for a bitwise OR to ...
2114         (perform_symbolic_merge): This. Also fix computation of the range and
2115         end of the symbolic number corresponding to the result of a bitwise OR.
2117 2015-01-13  Richard Biener  <rguenther@suse.de>
2119         PR tree-optimization/64568
2120         * tree-ssa-forwprop.c (pass_forwprop::execute): Properly
2121         release defs of removed stmts, avoid splitting TARGET_MEM_REFs.
2123 2015-01-13  Chung-Ju Wu  <jasonwucj@gmail.com>
2125         * config/nds32/nds32.c (nds32_legitimate_address_p): Consider
2126         TARGET_CMODEL_LARGE and TARGET_CMODEL_MEDIUM cases.
2128 2015-01-13  Chung-Ju Wu  <jasonwucj@gmail.com>
2130         * config/nds32/nds32.h (NDS32_SYMBOL_FLAG_RODATA): Define our own
2131         target-specific symbol_ref flag.
2132         (NDS32_SYMBOL_REF_RODATA_P): Define it to check if the symbol_ref
2133         resides in rodata section.
2134         * config/nds32/nds32.c (TARGET_ENCODE_SECTION_INFO): Define.
2135         (nds32_encode_section_info): New function.
2137 2015-01-13  Chung-Ju Wu  <jasonwucj@gmail.com>
2139         * config/nds32/nds32.md (call): Use pseudo instruction bal which
2140         clobbers TA_REGNUM if large code model is specified.
2141         (call_register): Likewise.
2142         (call_immediate): Likewise.
2143         (call_value): Likewise.
2144         (call_value_register): Likewise.
2145         (call_value_immediate): Likewise.
2147 2015-01-13  Chung-Ju Wu  <jasonwucj@gmail.com>
2149         * config/nds32/nds32.h (TARGET_CMODEL_SMALL): New macro.
2150         (TARGET_CMODEL_MEDIUM): New macro.
2151         (TARGET_CMODEL_LARGE): New macro.
2152         * config/nds32/nds32.c (nds32_asm_file_start): Display corresponding
2153         code model setting in assembly code.
2155 2015-01-13  Chung-Ju Wu  <jasonwucj@gmail.com>
2157         * common/config/nds32/nds32-common.c (TARGET_DEFAULT_TARGET_FLAGS):
2158         Remove MASK_GP_DIRECT flag.
2159         * config/nds32/nds32.h (MULTILIB_DEFAULTS): Have -mcmodel=medium as
2160         one of the multilib default options.
2161         * config/nds32/nds32.opt (mgp-direct): Remove.
2162         * config/nds32/t-mlibs (MULTILIB_OPTIONS): Use -mcmodel instead of
2163         -mgp-direct.  We also remove unnecessary -mlittle-endian/-mbig-endian.
2165 2015-01-13  Chung-Ju Wu  <jasonwucj@gmail.com>
2167         * config/nds32/nds32.opt (mcmodel): Add new option.
2168         * config/nds32/nds32-opts.h (nds32_cmodel_type): Add new enum type
2169         to describe code model.
2171 2015-01-13  Oleg Endo  <olegendo@gcc.gnu.org>
2173         PR target/64479
2174         * rtlanal.c (set_reg_p): Handle SEQUENCE constructs.
2176 2015-01-12  Kaz Kojima  <kkojima@gcc.gnu.org>
2178         * config/sh/sh.c (sh_atomic_assign_expand_fenv): New function.
2179         (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): Define.
2180         (sh_builtin_get_fpscr, sh_builtin_set_fpscr): New variables.
2181         (sh_init_builtins): Record decls for __builtin_sh_get_fpscr and
2182         __builtin_sh_set_fpscr.
2184 2015-01-12  Sandra Loosemore  <sandra@codesourcery.com>
2186         * doc/invoke.texi ([-Wsuggest-attribute=]): Don't use parentheses
2187         after a funtion name just to indicate it is a function.
2188         ([-fsanitize-undefined-trap-on-error]): Likewise.
2189         ([-fdbg-cnt=]): Likewise.
2190         ([-mmemcpy]): Likewise.
2191         ([-mflush-func]): Likewise.
2192         ([-msynci]): Likewise.
2194 2015-01-12  Sandra Loosemore  <sandra@codesourcery.com>
2196         * doc/invoke.texi ([-Wbad-function-cast]): Rewrite to avoid confusing
2197         example.
2198         
2199 2015-01-12  Jakub Jelinek  <jakub@redhat.com>
2201         PR tree-optimization/64563
2202         * tree-vrp.c (vrp_evaluate_conditional): Check for VR_RANGE
2203         instead of != VR_VARYING.
2205         PR target/64513
2206         * config/i386/i386.c (ix86_expand_prologue): Add
2207         REG_FRAME_RELATED_EXPR to %rax and %r10 pushes.
2209         PR tree-optimization/64454
2210         * tree-vrp.c (simplify_div_or_mod_using_ranges): Optimize
2211         op0 % op1 into op0 if op0 is in range [-op1 + 1, op1 - 1]
2212         for signed or [0, op1 - 1] for unsigned modulo.
2213         (simplify_stmt_using_ranges): Call simplify_div_or_mod_using_ranges
2214         even if op1 does not satisfy integer_pow2p.
2216         PR other/64370
2217         * sreal.c (sreal::to_double): Use ldexp instead of scalbnl.
2219 2015-01-12  Jeff Law  <law@redhat.com>
2221         PR target/64461
2222         * config/m68k/m68k.md (truncsiqi2): Disable for TARGET_COLDFIRE.
2223         (trunchiqi2, truncsihi2): Similarly.
2225         * config/h8300/h8300.c (Fpa): Use RTX_FRAME_RELATED_P directly
2226         rather than calling F.
2228 2015-01-12  Bernd Edlinger  <bernd.edlinger@hotmail.de>
2230         * tsan.c (instrument_expr): Use force_gimple_operand.
2231         Use may_be_nonaddressable_p instead of is_gimple_addressable.
2233 2015-01-12  Richard Biener  <rguenther@suse.de>
2235         PR tree-optimization/64530
2236         * tree-loop-distribution.c (pg_add_dependence_edges): Shuffle
2237         back dr1.
2239 2015-01-12  Richard Biener  <rguenther@suse.de>
2241         PR middle-end/64357
2242         * tree-cfg.c (gimple_can_merge_blocks_p): Protect simple
2243         latches properly.
2245 2015-01-12  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
2247         * config/arm/arm.c (arm_cortex_a12_tune): Update entries to match
2248         Cortex-A17 tuning parameters.
2249         * config/arm/arm-cores.def (cortex-a12): Schedule for cortex-a17.
2251 2015-01-12  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
2253         * config/arm/arm-protos.h (tune_params): Add fuseable_ops field.
2254         * config/arm/arm.c (arm_macro_fusion_p): New function.
2255         (arm_macro_fusion_pair_p): Likewise.
2256         (TARGET_SCHED_MACRO_FUSION_P): Define.
2257         (TARGET_SCHED_MACRO_FUSION_PAIR_P): Likewise.
2258         (ARM_FUSE_NOTHING): Likewise.
2259         (ARM_FUSE_MOVW_MOVT): Likewise.
2260         (arm_slowmul_tune, arm_fastmul_tune, arm_strongarm_tune,
2261         arm_xscale_tune, arm_9e_tune, arm_v6t2_tune, arm_cortex_tune,
2262         arm_cortex_a8_tune, arm_cortex_a7_tune, arm_cortex_a15_tune,
2263         arm_cortex_a53_tune, arm_cortex_a57_tune, arm_cortex_a9_tune,
2264         arm_cortex_a12_tune, arm_v7m_tune, arm_v6m_tune, arm_fa726te_tune
2265         arm_cortex_a5_tune): Specify fuseable_ops value.
2267 2015-01-12  H.J. Lu  <hongjiu.lu@intel.com>
2269         PR bootstrap/64561
2270         * configure.ac (HAVE_LD_PIE_COPYRELOC): Update Linux/x86-64 linker
2271         test for PIE with copy reloc.
2272         * configure: Regenerated.
2274 2015-01-12  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
2276         * config/arm/arm.c (arm_load_tp): Use R0_REGNUM instead of constant 0
2277         in gen_rtx_REG.
2278         (arm_tls_descseq_addr): Likewise.
2279         (arm_gen_movmemqi): Likewise.
2280         (arm_expand_epilogue_apcs_frame): Likewise.
2281         (arm_expand_epilogue): Likewise.
2282         (arm_expand_prologue): Likewise.  Use R1_REGNUM instead of constant 1
2283         in gen_rtx_REG.
2285 2015-01-12  Martin Liska  <mliska@suse.cz>
2287         PR ipa/64550
2288         * ipa-icf-gimple.c (func_checker::compare_memory_operand): Compare
2289         volatility for correct operands.
2291 2015-01-12  Martin Liska  <mliska@suse.cz>
2293         * ipa-icf.c (sem_function::equals_wpa): Add indirect_calls as indication
2294         that a function is not leaf.
2295         (sem_function::compare_polymorphic_p): Likewise.
2297 2015-01-12  Martin Liska  <mliska@suse.cz>
2299         * ipa-icf.c (sem_function::equals_wpa): Add indirect_calls as indication
2300         that a function is not leaf.
2301         (sem_function::compare_polymorphic_p): Likewise.
2303 2015-01-12  Prathamesh Kulkarni  <prathamesh.kulkarni@linaro.org>
2305         * config/visium/visium.c: Add includes hashtab.h, hash-set.h,
2306         machmode.h, input.h, statistics.h, vec.h, double-int.h, real.h,
2307         fixed-value.h, alias.h, symtab.h, tree-core.h, wide-int.h, inchash.h,
2308         fold-const.h, tree-check.h.
2310 2015-01-12  Jan Hubicka  <hubicka@ucw.cz>
2312         PR ipa/63967
2313         PR ipa/64425
2314         * ipa-inline.c (compute_uninlined_call_time,
2315         compute_inlined_call_time): Use counts for extra precision when
2316         needed possible.
2317         (big_speedup_p): Fix formating.
2318         (RELATIVE_TIME_BENEFIT_RANGE): Remove.
2319         (relative_time_benefit): Remove.
2320         (edge_badness): Turn DECL_DISREGARD_INLINE_LIMITS into hint;
2321         merge guessed and read profile paths.
2322         (inline_small_functions): Count only !optimize_size functions into
2323         initial size; be more lax about sanity check when profile is used;
2324         be sure to update inlined function profile when profile is read.
2326 2015-01-12  Jan Hubicka  <hubicka@ucw.cz>
2328         PR ipa/63470
2329         * ipa-inline-analysis.c (inline_edge_duplication_hook): Adjust
2330         cost when edge becomes direct.
2331         * ipa-prop.c (make_edge_direct): Do not adjust when speculation
2332         is resolved or when introducing new speculation.
2334 2015-01-12  Chen Gang  <gang.chen.5i5j@gmail.com>
2336         PR ipa/64551
2337         PR ipa/64552
2338         * ipa-icf.c (sem_function::equals_private): Use '&&' instead of
2339         '||' to fix typo issue.
2341         * gcc/tree.h (target_opts_for_fn): Check NULL_TREE since it can
2342         accept and return NULL.
2344 2015-01-12  Martin Liska  <mliska@suse.cz>
2346         * cgraph.c (cgraph_edge::remove_callee): Move function to header
2347         file for being inlined.
2348         (cgraph_set_edge_callee): Delete.
2349         (cgraph_edge::redirect_callee): Move function to header file
2350         for being inlined.
2351         (cgraph_edge::make_direct): Use new function.
2352         (cgraph_edge::dump_edge_flags): New function created from
2353         static dump_edge_flags function.
2354         (cgraph_node::dump): Use new function.
2355         (cgraph_edge::verify_count_and_frequency): New function created
2356         from verify_edge_count_and_frequency.
2357         (cgraph_edge::verify_corresponds_to_fndecl): New function created
2358         from verify_edge_corresponds_to_fndecl.
2359         (verify_edge_corresponds_to_fndecl): Delete.
2360         (cgraph_node::verify_node): Use new function.
2361         * cgraph.h (cgraph_edge::set_callee): New function.
2362         (cgraph_edge::dump_edge_flags): Likewise.
2363         (cgraph_edge::verify_corresponds_to_fndecl): Likewise.
2365 2015-01-11  Jan Hubicka  <hubicka@ucw.cz>
2367         * ipa-utils.c (estimate_function_body_sizes): Do not
2368         free node params when called late with early=true.
2370 2015-01-11  James Greenhalgh  <james.greenhalgh@arm.com>
2372         * doc/md.texi (Instruction Patterns): Rewrite text for
2373         clarity.
2374         (Example): Likewise.
2376 2015-01-10  Sandra Loosemore  <sandra@codesourcery.com>
2378         * doc/invoke.texi (Option Summary): Break long lines.
2379         [(-fdiagnostics-color)]: Put long literal in @smallexample
2380         instead of inline.
2381         [(-fsanitize-recover)]: Likewise.
2382         [(-fdump-rtl-split*)]: Rewrite to fix over-full hbox.
2383         [(-ffast-math)]: Likewise.
2384         [(--param max-inline-insns-recursive)]: Likewise.
2385         [(--param max-inline-recursive-depth)]: Likewise.
2386         [(-mno-text-section-literals)]: Likewise.
2387         
2388 2015-01-10  Thomas Schwinge  <thomas@codesourcery.com>
2390         * doc/install.texi: Update for libgomp being renamed from "GNU
2391         OpenMP Runtime Library" to "GNU Offloading and Multi Processing
2392         Runtime Library".
2393         * doc/sourcebuild.texi: Likewise.
2395 2015-01-10  Anthony Green  <green@moxielogic.com>
2397         * config/moxie/moxie.c (moxie_option_override): Fix forcing of
2398         mul.x availability for moxiebox configuration.
2400 2015-01-09  Anthony Green  <green@moxielogic.com>
2402         * config/moxie/moxie.md: Tabify assembly output.
2404 2015-01-09  Anthony Green  <green@moxielogic.com>
2406         * config/moxie/moxie.md (CC_REG): Correct register definition.
2408 2015-01-09  Sandra Loosemore  <sandra@codesourcery.com>
2410         * doc/invoke.texi ([-fvtable-verify]): Copy-edit and fix markup.
2411         ([-fvtv-debug], [-fvtv-counts]): Likewise.  Correct location
2412         of log files.
2414 2015-01-09  Andreas Tobler  <andreast@gcc.gnu.org>
2416         * config/arm/arm.h (MAX_SYNC_LIBFUNC_SIZE): Delete semicolon.
2418 2015-01-09  Bernd Schmidt  <bernds@codesourcery.com>
2419             Jakub Jelinek  <jakub@redhat.com>
2421         PR middle-end/64412
2422         * lto-streamer.h (lto_stream_offload_p): New declaration.
2423         * lto-streamer.c (lto_stream_offload_p): New variable.
2424         * cgraphunit.c (ipa_passes): Set lto_stream_offload_p
2425         at the same time as section_name_prefix.
2426         * lto-streamer-out.c (hash_tree): Don't hash TREE_TARGET_OPTION
2427         if lto_stream_offload_p.
2428         * tree-streamer-out.c (streamer_pack_tree_bitfields): Don't
2429         stream TREE_TARGET_OPTION if lto_stream_offload_p.
2430         (write_ts_function_decl_tree_pointers): Don't
2431         stream DECL_FUNCTION_SPECIFIC_TARGET if lto_stream_offload_p.
2432         * tree-streamer-in.c (unpack_value_fields): Don't stream
2433         TREE_TARGET_OPTION in if ACCEL_COMPILER.
2434         (lto_input_ts_function_decl_tree_pointers): Don't stream
2435         DECL_FUNCTION_SPECIFIC_TARGET in if ACCEL_COMPILER.
2436         * lto-opts.c (lto_write_options): Use lto_stream_offload_p
2437         instead of section_name_prefix string comparisons.
2439 2015-01-09  Jakub Jelinek  <jakub@redhat.com>
2441         PR rtl-optimization/64536
2442         * cfgrtl.c (rtl_tidy_fallthru_edge): Handle removal of degenerate
2443         tablejumps.
2445 2015-01-09  Michael Collison  <michael.collison@linaro.org>
2447         PR tree-optimization/64322
2448         * tree-vrp.c (extract_range_from_binary_expr_1): Attempt to derive
2449         range for RSHIFT_EXPR even if vr0 range is not VR_RANGE or is symbolic.
2451 2015-01-09  Tom de Vries  <tom@codesourcery.com>
2453         PR rtl-optimization/64539
2454         * regcprop.c (kill_clobbered_values): Factor out of ...
2455         (copyprop_hardreg_forward_1): ... here.  Use kill_clobbered_values
2456         instead of note_stores with kill_clobbered_value.
2458 2015-01-09  Andreas Tobler  <andreast@gcc.gnu.org>
2460          * ginclude/unwind-arm-common.h: Revert previous commit.
2462 2015-01-09  Andreas Tobler  <andreast@gcc.gnu.org>
2464         * config.gcc (arm*-*-freebsd*): New configuration.
2465         * config/arm/freebsd.h: New file.
2466         * config.host: Add extra components for arm*-*-freebsd*.
2467         * config/arm/arm.h: Introduce MAX_SYNC_LIBFUNC_SIZE.
2468         * config/arm/arm.c (arm_init_libfuncs): Use MAX_SYNC_LIBFUNC_SIZE.
2470 2015-01-09  Sebastian Huber  <sebastian.huber@embedded-brains.de>
2472         * config/rs6000/rtems.h (CPP_OS_RTEMS_SPEC): Define __PPC_CPU_E6500__
2473         for -mcpu=e6500.
2474         * config/rs6000/t-rtems: Add e6500 multilibs.
2476 2015-01-09  Sebastian Huber  <sebastian.huber@embedded-brains.de>
2478         * config/rs6000/t-rtems: Add -mno-spe to soft-float multilib for
2479         MPC8540.
2481 2015-01-09  Sebastian Huber  <sebastian.huber@embedded-brains.de>
2483         * config/rs6000/t-rtems: Use MULTILIB_REQUIRED instead of
2484         MULTILIB_EXCEPTIONS.
2486 2015-01-09  Sebastian Huber  <sebastian.huber@embedded-brains.de>
2488         * config/arm/t-rtems: Use MULTILIB_REQUIRED instead of
2489         MULTILIB_EXCEPTIONS.
2491 2015-01-09  Sebastian Huber  <sebastian.huber@embedded-brains.de>
2493         * config/arm/t-rtems-eabi: Rename to...
2494         * config/arm/t-rtems: ...this.
2495         * config/arm/rtems-eabi.h: Rename to...
2496         * config/arm/rtems.h: ...this.
2497         * config.gcc (arm*-*-rtems*): Reflect changes above.
2499 2015-01-09  Richard Biener  <rguenther@suse.de>
2501         PR tree-optimization/64410
2502         * tree-ssa.c (non_rewritable_lvalue_p): Allow REALPART/IMAGPART_EXPR
2503         on the LHS.
2504         (execute_update_addresses_taken): Deal with that.
2505         * tree-ssa-forwprop.c (pass_forwprop::execute): Use component-wise
2506         loads/stores for complex variables.
2508 2015-01-09  Martin Liska  <mliska@suse.cz>
2510         * ipa-icf-gimple.c (func_checker::compare_ssa_name): Enhance SSA
2511         name comparison.
2512         (func_checker::compare_memory_operand): New function.
2513         (func_checker::compare_operand): Split case to newly
2514         added functions.
2515         (func_checker::compare_cst_or_decl): New function.
2516         (func_checker::compare_gimple_call): Identify
2517         memory operands.
2518         (func_checker::compare_gimple_assign): Likewise.
2519         * ipa-icf-gimple.h: New function.
2521 2015-01-09  Martin Liska  <mliska@suse.cz>
2523         PR ipa/64503
2524         * sreal.c (sreal::dump): Change unsigned format to signed for
2525         m_exp value.
2526         (sreal::to_double): Replace exp2 with scalbln.
2528 2015-01-09  Martin Liska  <mliska@suse.cz>
2530         * cgraphunit.c (cgraph_node::create_wrapper): Fix level of indentation.
2531         * ipa-icf.c (sem_function::equals_private): Add support for target and
2532         (sem_item_optimizer::merge_classes): Remove redundant function
2533         optimization flags comparison.
2534         * tree.h (target_opts_for_fn): New function.
2536 2015-01-09  Tom de Vries  <tom@codesourcery.com>
2538         * omp-low.c (expand_omp_for_static_chunk): Fix assert.
2540 2015-01-09  Kito Cheng  <kito@0xlab.org>
2542         PR rtl-optimization/64348
2543         * lra-constraints.c (split_reg): Fix caller-save store/restore
2544         instruction generation.
2546 2015-01-08  John David Anglin  <danglin@gcc.gnu.org>
2548         PR gcov-profile/61790
2549         * gcov-tool.c (do_rewrite): Use strtoll instead of atoll if host has
2550         long long.  Fallback to int64_t if host doesn't have long long and
2551         use strtol if int64_t is long.  Otherwise, use sscanf for conversion.
2553 2015-01-08  Jakub Jelinek  <jakub@redhat.com>
2555         PR tree-optimization/63989
2556         * params.def (PARAM_MAX_TRACKED_STRLENS): Increment default
2557         from 1000 to 10000.
2558         * tree-ssa-strlen.c (get_strinfo): Moved earlier.
2559         (get_stridx): If we don't have a record for certain SSA_NAME,
2560         but it is POINTER_PLUS_EXPR of some SSA_NAME we do with
2561         constant offset, call get_stridx_plus_constant.
2562         (get_stridx_plus_constant): New function.
2563         (zero_length_string): Don't use get_stridx here.
2565         PR target/55023
2566         PR middle-end/64388
2567         * dse.c (struct insn_info): Mention frame_read set also
2568         before reload for tail calls on some targets.
2569         (scan_insn): Revert 2014-12-22 change.  Set frame_read
2570         also before reload for tail calls if
2571         HARD_FRAME_POINTER_IS_ARG_POINTER.  Call add_wild_read
2572         instead of add_non_frame_wild_read for non-const/memset
2573         tail calls after reload.
2575 2015-01-08  Jason Merrill  <jason@redhat.com>
2577         * ubsan.c (do_ubsan_in_current_function): New.
2578         (pass_ubsan::gate): Use it.
2579         * ubsan.h: Declare it.
2580         * convert.c (convert_to_integer): Use it.
2582 2015-01-08  Jakub Jelinek  <jakub@redhat.com>
2584         PR target/64338
2585         * config/i386/i386.c (ix86_expand_int_movcc): Don't reverse
2586         compare_code when it is unconditionally overwritten afterwards.
2587         Use ix86_reverse_condition instead of reverse_condition.  Don't
2588         change code if *reverse_condition* returned UNKNOWN and don't
2589         swap ct/cf and negate diff in that case.
2591 2015-01-08  Mike Stump  <mikestump@comcast.net>
2593         * tsan.c (pass_tsan::gate): Add no_sanitize_thread support.
2594         (pass_tsan_O0::gate): Likewise.
2595         * extend.texi (Function Attributes): Add no_sanitize_thread
2596         documentation.
2598 2015-01-08  Thomas Schwinge  <thomas@codesourcery.com>
2600         * builtins.def (DEF_GOMP_BUILTIN): Also consider flag_offload_abi
2601         for registering builtins.
2602         * config/i386/intelmic-mkoffload.c (prepare_target_image): Don't
2603         add -fopenmp to the argv_obstack used when invoking
2604         compile_for_target.
2606         * config/i386/intelmic-mkoffload.c (compile_for_target): Always
2607         add "-m32" or "-m64" to argv_obstack.
2608         (generate_host_descr_file): Likewise, when invoking host_compiler.
2609         (main): Always add "-m elf_i386" or "-m elf_x86_64" when invoking
2610         ld.
2612 2015-01-08  Oleg Endo  <olegendo@gcc.gnu.org>
2614         * config/sh/sh-mem.cc: Use constant as second operand when emitting
2615         tstsi_t insns.
2617 2015-01-08  Oleg Endo  <olegendo@gcc.gnu.org>
2619         PR target/55212
2620         * config/sh/sh.md (*addsi3_compact): Emit reg-reg copy instead of
2621         constant load if constant operand fits into I08.
2623 2015-01-08  Jakub Jelinek  <jakub@redhat.com>
2625         PR sanitizer/64336
2626         * tree.c (build2_stat): Fix up initialization of TREE_READONLY
2627         and TREE_THIS_VOLATILE for MEM_REFs.
2628         (build5_stat): Fix up initialization of TREE_READONLY and
2629         TREE_THIS_VOLATILE for TARGET_MEM_REFs.
2631 2015-01-08  Kaz Kojima  <kkojima@gcc.gnu.org>
2633         PR target/64533
2634         * config/sh/sh.md (*addsi3_compact): Use u constraint instead
2635         of r for the second alternative of the destination operand.
2637 2015-01-07  Segher Boessenkool  <segher@kernel.crashing.org>
2639         PR target/36557
2640         * config/rs6000/rs6000.md (*eqsi3_ext<mode>, *nesi3_ext<mode>): New.
2642 2015-01-07  Sandra Loosemore  <sandra@codesourcery.com>
2644         * doc/invoke.texi ([-fvtable-verify]): Fix markup on option
2645         keywords.
2646         ([-fivar-visibility], [-fvisibility]): Likewise.
2648 2015-01-07  Sandra Loosemore  <sandra@codesourcery.com>
2650         * doc/invoke.texi: Fix incorrect uses of @samp markup throughout
2651         the file where @code, @command, etc is more appropriate.
2653 2015-01-06  Sandra Loosemore  <sandra@codesourcery.com>
2655         * doc/invoke.texi (RS/6000 and PowerPC Options): Tidy formatting
2656         of -mrecip= documentation.
2658 2015-01-06  Michael Meissner  <meissner@linux.vnet.ibm.com>
2660         PR target/64505
2661         * config/rs6000/rs6000.c (rs6000_secondary_reload): Return the
2662         correct reload handler if -m32 -mpowerpc64 is used.
2664 2015-01-06  Tom de Vries  <tom@codesourcery.com>
2666         * tree-ssa-tail-merge.c: Fix typo in struct same_succ_def comment.
2668 2015-01-08  Christian Bruel  <christian.bruel@st.com>
2670         PR target/64507
2671         * config/sh/sh-mem.cc (sh_expand_cmpnstr): Check 0 length.
2673 2015-01-06  Thomas Preud'homme  <thomas.preudhomme@arm.com>
2675         PR tree-optimization/63259
2676         * tree-ssa-math-opts.c (pass_optimize_bswap::execute): Stop checking
2677         if optab exists for 16bit byteswap.
2679 2015-01-06  Jakub Jelinek  <jakub@redhat.com>
2681         * opts.c (common_handle_option): Add support for
2682         -fno-sanitize=all and -f{,no-}sanitize-recover=all.
2683         * doc/invoke.texi: Document -fno-sanitize=all,
2684         -f{,no-}sanitize-recover=all.  Document that
2685         -fsanitize=float-cast-overflow is not enabled
2686         by -fsanitize=undefined.  Fix up documentation
2687         of -f{,no-}sanitize-recover.
2689 2015-01-06  Eric Botcazou  <ebotcazou@adacore.com>
2691         * config.gcc: Add Visium support.
2692         * configure.ac: Likewise.
2693         * configure: Regenerate.
2694         * doc/extend.texi (interrupt attribute): Add Visium.
2695         * doc/invoke.texi: Document Visium options.
2696         * doc/install.texi: Document Visium target.
2697         * doc/md.texi: Document Visium constraints.
2698         * common/config/visium: New directory.
2699         * config/visium: Likewise.
2701 2015-01-05  Segher Boessenkool  <segher@kernel.crashing.org>
2703         * simplify-rtx.c (simplify_binary_operation_1): Handle more cases
2704         for the "(and X (ior (not X) Y) -> (and X Y)" transform.
2706 2015-01-05  Segher Boessenkool  <segher@kernel.crashing.org>
2708         * combine.c (combine_validate_cost): Do not count the cost of a
2709         split I2 twice.  Do not display it twice in the dump, either.
2711 2015-01-05  Sandra Loosemore  <sandra@codesourcery.com>
2713         Revert parts of r219199.
2714         * doc/invoke.texi ([-Wliteral-suffix]): Restore markup on
2715         <inttypes.h>.
2716         ([-Wtraditional]): Restore markup on <limits.h>.
2718 2015-01-05  Trevor Saunders  <tsaunders@mozilla.com>
2720         PR c++/31397
2721         * doc/invoke.texi: Document -Wsuggest-override.
2723 2015-01-05  Radovan Obradovic  <radovan.obradovic@imgtec.com>
2725         PR rtl-optimization/64287
2726         * toplev.c (HAVE_epilogue, HAVE_prologue): Provide default.
2727         (process_options): Disable flag_ipa_ra if profiling.
2729 2015-01-05  Eric Botcazou  <ebotcazou@adacore.com>
2731         * config/nds32/nds32-peephole2.md: Do not mention define_peephole.
2733 2015-01-05  Max Filippov  <jcmvbkbc@gmail.com>
2735         * config/xtensa/xtensa.c (hwloop_optimize, hwloop_fail,
2736         hwloop_pattern_reg, xtensa_doloop_hooks, xtensa_reorg_loops):
2737         put under #if TARGET_LOOPS guard.
2739 2015-01-05  Uros Bizjak  <ubizjak@gmail.com>
2741         * config/i386/i386.c (output_387_binary_op): Use std::swap.
2743 2015-01-05  Oleg Endo  <olegendo@gcc.gnu.org>
2745         * rtlanal.c (refers_to_regno_p): Change return value from int to bool.
2746         * rtl.h (refers_to_regno_p): Add overload.
2747         * cse.c: Use it.
2748         * bt-load.c: Likewise.
2749         * combine.c: Likewise.
2750         * df-scan.c: Likewise.
2751         * sched-deps.c: Likewise.
2752         * config/s390/s390.c: Likewise.
2753         * config/m32r/m32r.c: Likewise.
2754         * config/rs6000/spe.md: Likewise.
2755         * config/rs6000/rs6000.c: Likewise.
2756         * config/pa/pa.c: Likewise.
2757         * config/stormy16/stormy16.c: Likewise.
2758         * config/cris/cris.c: Likewise.
2759         * config/arc/arc.md: Likewise.
2760         * config/arc/arc.c: Likewise.
2761         * config/sh/sh.md: Likewise.
2762         * config/sh/sh.c: Likewise.
2763         * config/frv/frv.c: Likewise.
2765 2015-01-05  Jakub Jelinek  <jakub@redhat.com>
2767         PR sanitizer/64265
2768         * gimplify.c (gimplify_function_tree): Add TSAN_FUNC_EXIT internal
2769         call as cleanup of the whole body.
2770         * internal-fn.def (TSAN_FUNC_EXIT): New internal call.
2771         * tsan.c (replace_func_exit): New function.
2772         (instrument_func_exit): Moved earlier.
2773         (instrument_memory_accesses): Adjust TSAN_FUNC_EXIT internal calls.
2774         Call instrument_func_exit if no TSAN_FUNC_EXIT internal calls have
2775         been found.
2776         (tsan_pass): Don't call instrument_func_exit.
2777         * internal-fn.c (expand_TSAN_FUNC_EXIT): New function.
2778         * tree-inline.c (copy_bb): Drop TSAN_FUNC_EXIT internal calls during
2779         inlining.
2781         PR sanitizer/64344
2782         * ubsan.h (ubsan_instrument_float_cast): Add ARG argument.
2783         * ubsan.c (ubsan_instrument_float_cast): Add ARG argument, pass
2784         it to libubsan handler instead of EXPR.  Fold comparisons earlier,
2785         if the result is integer_zerop, return NULL_TREE.
2786         * convert.c (convert_to_integer): Pass expr as ARG.
2788         PR tree-optimization/64465
2789         * tree-inline.c (redirect_all_calls): During inlining
2790         clean up EH stmts and EH edges if redirect_call_stmt_to_callee
2791         changed the stmt to a non-throwing call.
2793 2015-01-05  Sandra Loosemore  <sandra@codesourcery.com>
2795         * doc/invoke.texi: Fix incorrect uses of @code, @option, @samp,
2796         etc markup throughout the file.
2798 2015-01-05  Bernd Edlinger  <bernd.edlinger@hotmail.de>
2800         Enable experimental TSAN support for Ada.
2801         * tsan.c (instrument_expr): Handle VIEW_CONVERT_EXPR.
2803 2015-01-05  Jakub Jelinek  <jakub@redhat.com>
2805         PR tree-optimization/64494
2806         * tree-ssa-loop-im.c (move_computations_dom_walker::before_dom): Also
2807         clear SSA_NAME_ANTI_RANGE_P flag.
2809 2015-01-05  Marek Polacek  <polacek@redhat.com>
2811         * doc/extend.texi (Arrays of Length Zero): Add missing comma.
2813 2015-01-05  Jakub Jelinek  <jakub@redhat.com>
2815         Update copyright years.
2817         * gcc.c (process_command): Update copyright notice dates.
2818         * gcov-dump.c: Ditto.
2819         * gcov.c: Ditto.
2820         * doc/cpp.texi: Bump @copying's copyright year.
2821         * doc/cppinternals.texi: Ditto.
2822         * doc/gcc.texi: Ditto.
2823         * doc/gccint.texi: Ditto.
2824         * doc/gcov.texi: Ditto.
2825         * doc/install.texi: Ditto.
2826         * doc/invoke.texi: Ditto.
2828         * auto-profile.c, auto-profile.h: Fix up Copyright line.
2830 2015-01-04  Sandra Loosemore  <sandra@codesourcery.com>
2832         * doc/invoke.texi ([-fsized-deallocation]): Copy-edit to fix
2833         verb tense, etc.
2834         ([-fvtable-verify], [-fvtv-debug]): Likewise.
2835         ([-Wabi]): Likewise.
2836         ([-fmessage-length]): Likewise.
2837         ([-Wsuggest-final-types], [-Wsuggest-final-methods]): Likewise.
2838         ([-Wno-discarded-qualifiers]): Likewise.
2839         ([-Wnodiscarded-array-qualifiers]): Likewise.
2840         ([-Wno-virtual-move-assign]): Likewise.
2841         ([-fsanitize=address], [-fsanitize=thread]): Likewise.
2842         ([-fsanitize=leak], [-fsanitize=undefined]): Likewise.
2843         ([-fsanitize=unreachable], [-fsanitize-recover]): Likewise.
2844         ([-fsanitize-undefined-trap-on-error]): Likewise.
2845         ([-floop-interchange]): Likewise.
2846         ([-ftree-coalesce-inlined-vars]): Likewise.
2847         ([-fvect-cost-model]): Likewise.
2848         ([-flto]): Likewise.
2849         ([--param]): Likewise.
2850         (Spec Files): Likewise.
2851         ([-mstrict-align]): Likewise.
2852         ([-mfix-cortex-a53-835769]): Likewise.
2853         ([-march], [-mtune]): Likewise.
2854         ([-mpic-register]): Likewise.
2855         ([-munaligned-access]): Likewise.
2856         ([-msp8]): Likewise.
2857         (EIND and Devices with more than 128 Ki Bytes of Flash): Likewise.
2858         (AVR Built-in Macros): Likewise.
2859         ([-mpreferred-stack-boundary]): Likewise.
2860         ([-mtune-crtl]): Likewise.
2861         ([-mashf]): Likewise.
2862         ([-mmcu=]): Likewise.
2863         ([-minrt]): Likewise.
2864         ([-maltivec], [-maltivec=be], [-maltivec=le]): Likewise.
2865         ([-mupper-regs]): Likewise.
2866         ([-matomic-model]): Likewise.
2867         ([-mdiv]): Likewise.
2868         ([-mzdcbranch]): Likewise.
2869         ([-mdisable-callt]): Likewise.
2870         ([-msoft-float]): Likewise.
2871         ([-m8byte-align]): Likewise.
2872         ([-fstack-reuse]): Likewise.
2874 2015-01-03  Sandra Loosemore  <sandra@codesourcery.com>
2876         * doc/invoke.texi ([-fprofile-generate], [-fprofile-use]):
2877         Fix markup, light copy-editing.
2878         ([-fauto-profile]): Rewrite to fix formatting and content
2879         problems.
2881 2015-01-03  Sandra Loosemore  <sandra@codesourcery.com>
2883         * doc/invoke.texi ([-fisolate-erroneous-paths-dereference]):
2884         Copy-edit description.
2885         ([-fisolate-erroneous-paths-attribute]): Likewise.
2886         * common.opt (fisolate-erroneous-paths-dereference):
2887         Copy-edit description.
2888         (fisolate-erroneous-paths-attribute): Likewise.
2890 2015-01-03  Sandra Loosemore  <sandra@codesourcery.com>
2892         * doc/invoke.texi ([-fsemantic-interposition]): Fix typos and
2893         tidy grammar.
2895 2015-01-03  Sandra Loosemore  <sandra@codesourcery.com>
2897         * doc/invoke.texi ([-fplan9-extensions]): Add/fix @opindex.
2898         ([-fvtv-debug]): Likewise.
2899         ([-Wc++-compat]): Likewise.
2900         ([-Wc++11-compat]): Likewise.
2901         ([-Wc++14-compat]): Likewise.
2902         ([-Wno-sized-deallocation]): Likewise.
2903         ([-femit-class-debug-always]): Likewise.
2904         ([-femit-struct-debug-detailed]): Likewise.
2905         ([-fno-keep-inline-dllexport]): Likewise.
2906         ([-fira-algorithm]): Likewise.
2907         ([-fira-region]): Likewise.
2908         ([-flra-remat]): Likewise.
2909         ([-fipa-ra]): Likewise.
2910         ([-fhoist-adjacent-loads]): Likewise.
2911         ([-fisolate-erroneous-paths-dereference]): Likewise.
2912         ([-fisolate-erroneous-paths-attribute]): Likewise.
2913         ([-ftree-switch-conversion]): Likewise.
2914         ([-ftree-tail-merge]): Likewise.
2915         ([-ftree-loop-if-convert]): Likewise.
2916         ([-ftree-loop-if-convert-stores]): Likewise.
2917         ([-ftree-loop-distribution]): Likewise.
2918         ([-ftree-loop-distribute-patterns]): Likewise.
2919         ([-flto-compression-level]): Likewise.
2920         ([-flto-report]): Likewise.
2921         ([-flto-report-wpa]): Likewise.
2922         ([-fuse-linker-plugin]): Likewise.
2923         ([-mfix-cortex-a53-835769]): Likewise.
2924         ([-mno-fix-cortex-a53-835769]): Likewise.
2925         ([-mmmx]...[-mno-3dnow]): Remove the -mno- forms from the
2926         explicit listing; add a note to the discussion indicating they
2927         exist.  Reorder table to group similar options.  Add missing
2928         @opindex entries.  Add @need commands throughout the table to
2929         allow it to be split across multiple pages.
2930         ([-m8bit-idiv]): Fix @opindex.
2931         ([-mavx256-split-unaligned-load]): Likewise.
2932         ([-mavx256-split-unaligned-store]): Likewise.
2933         ([-mstack-protector-guard]): Likewise.
2934         ([-mcpu=]): Likewise.
2935         ([-mcpu]): Likewise.
2936         ([-mpointer-size=]): Likewise.
2938 2015-01-03  John David Anglin  <danglin@gcc.gnu.org>
2940         * config/pa/pa.md (decrement_and_branch_until_zero): Use `Q' constraint
2941         instead of `m' constraint.  Likewise for unnamed movb comparison
2942         patterns using reg_before_reload_operand predicate.
2943         * config/pa/predicates.md (reg_before_reload_operand): Tighten
2944         predicate to reject register index and LO_SUM DLT memory forms
2945         after reload.
2947 2015-01-02  Sandra Loosemore  <sandra@codesourcery.com>
2949         * doc/invoke.texi (Option Summary): Fix spelling of
2950         -fdevirtualize-at-ltrans.
2951         ([-fdevirtualize]): Fix markup.
2952         ([-fdevirtualize-speculatively]): Fix typo.
2953         ([-fdevirtualize-at-ltrans]): Likewise.  Make description less
2954         implementor-speaky.
2955         * common.opt (fdevirtualize-at-ltrans): Likewise.
2956         * ipa-devirt.c: Fix typos in comments throughout the file.
2957         (ipa_devirt): Fix typos in format strings for dump output.
2959 2015-01-02  Sandra Loosemore  <sandra@codesourcery.com>
2961         * doc/invoke.texi ([-fopt-info]): Fix markup, consolidate
2962         discussion of defaults, light copy-editing.
2964 2015-01-02  Bernd Edlinger  <bernd.edlinger@hotmail.de>
2966         * tsan.c (instrument_expr): corrected previous checkin.
2968 2015-01-02  Bernd Edlinger  <bernd.edlinger@hotmail.de>
2970         Instrument bit field and unaligned accesses for TSAN.
2971         * sanitizer.def (BUILT_IN_TSAN_READ_RANGE): New built-in function.
2972         (BUILT_IN_TSAN_WRITE_RANGE): New built-in function.
2973         * tsan.c (instrument_expr): Handle COMPONENT_REF and BIT_FIELD_REF.
2974         Use BUILT_IN_TSAN_READ_RANGE and BUILT_IN_TSAN_WRITE_RANGE for
2975         unaligned memory regions.
2977 2015-01-01  Anthony Green  <green@moxielogic.com>
2979         * config/moxie/predicates.md (moxie_general_movsrc_operand):
2980         Restrict move source register offsets to 16 bits.
2982 Copyright (C) 2015 Free Software Foundation, Inc.
2984 Copying and distribution of this file, with or without modification,
2985 are permitted in any medium without royalty provided the copyright
2986 notice and this notice are preserved.