ipa-inline.c (max_count_real, [...]): Remove.
[official-gcc.git] / gcc / ChangeLog
blob4d3bf5fb1465a46e29d9f99e4190d99763702e93
1 2014-12-27  Jan hubicka  <hubicka@ucw.cz>
3         * ipa-inline.c (max_count_real, max_relbenefit_real,
4         half_int_min_real): Remove.
5         (cgraph_freq_base_rec, percent_rec): New.
6         (compute_uninlined_call_time, compute_inlined_call_time,
7         big_speedup_p, relative_time_benefit, edge_badness): Use sreals.
8         (update_edge_key): Update dumping.
9         (inline_small_functions): Speedup maintainance of the heap.
10         (ipa_inline): Initialize cgraph_freq_base_rec and
11         percent_rec.
13 2014-12-27  Jan hubicka  <hubicka@ucw.cz>
15         * sreal.h (sreal::shift): Fix sanity check.
17 2014-12-27  Uros Bizjak  <ubizjak@gmail.com>
19         * config/i386/mmx.md (*vec_extractv2sf_1): Do not emit unpckhps.
20         Emit movshdup for SSE3 and shufps otherwise.
21         (*vec_extractv2si_1): Do not emit punpckhdq and unpckhps.
22         Emit pshufd for SSE2 and shufps otherwise.
24 2014-12-24  Oleg Endo  <olegendo@gcc.gnu.org>
26         PR target/51244
27         * config/sh/sh.md (*mov_t_msb_neg): Convert split into insn_and_split.
29 2014-12-24  Uros Bizjak  <ubizjak@gmail.com>
31         * gengtype.h (xasprintf): Remove declaration.
32         * gengtype.c (xasprintf): Remove.
34 2014-12-24  Nick Clifton  <nickc@redhat.com>
36         PR target/64160
37         * config/msp430/msp430.md (addsi splitter): Do not split when the
38         destination partially overlaps the source.
40 2014-12-22  Zhouyi Zhou <yizhouzhou@ict.ac.cn>
42         * ira-build.c (ira_flattening): Add the current
43         object to OBJECTS_LIVE after traversing OBJECTS_LIVE.
45 2014-12-23  Martin Liska  <mliska@suse.cz>
47         PR ipa/63851
48         PR ipa/63852
49         * ipa-icf.c (sem_function::merge): Ignore merge operation
50         for a thunk created from static chain.
51         * ipa-icf-gimple.c (func_checker::compatible_types_p): Verify that
52         types have same restrict flag.
54 2014-12-22  John David Anglin  <danglin@gcc.gnu.org>
56         PR target/55023
57         * dse.c (scan_insn): Treat sibling call as though it does a wild read.
59 2014-12-22  Bin Cheng  <bin.cheng@arm.com>
61         PR rtl-optimization/62151
62         * combine.c (try_combine): New local variables local_elim_i1
63         and local_elim_i0.  Set elim_i1 and elim_i0 using the local
64         version variables.  Distribute notes from i0notes or i1notes
65         using the local variables.
67 2014-12-22  Martin Liska  <mliska@suse.cz>
69         * cgraphunit.c (symbol_table::process_new_functions): New inline_summaries
70         is used.
71         * ipa-cp.c (ipcp_cloning_candidate_p): Likewise.
72         (devirtualization_time_bonus): Likewise.
73         (estimate_local_effects): Likewise.
74         (ipcp_propagate_stage): Likewise.
75         * ipa-inline-analysis.c (evaluate_conditions_for_known_args): Likewise.
76         (evaluate_properties_for_edge): Likewise.
77         (inline_summary_alloc): Likewise.
78         (reset_inline_summary): New inline_summary argument is introduced.
79         (inline_summary_t::remove): New function.
80         (inline_summary_t::duplicate): Likewise.
81         (dump_inline_edge_summary): New inline_summaries is used.
82         (dump_inline_summary): Likewise.
83         (estimate_function_body_sizes): Likewise.
84         (compute_inline_parameters): Likewise.
85         (estimate_edge_devirt_benefit): Likewise.
86         (estimate_node_size_and_time): Likewise.
87         (inline_update_callee_summaries): Likewise.
88         (inline_merge_summary): Likewise.
89         (inline_update_overall_summary): Likewise.
90         (simple_edge_hints): Likewise.
91         (do_estimate_edge_time): Likewise.
92         (estimate_time_after_inlining): Likewise.
93         (estimate_size_after_inlining): Likewise.
94         (do_estimate_growth): Likewise.
95         (growth_likely_positive): Likewise.
96         (inline_generate_summary): Likewise.
97         (inline_read_section): Likewise.
98         (inline_read_summary): Likewise.
99         (inline_write_summary): Likewise.
100         (inline_free_summary): Likewise.
101         * ipa-inline-transform.c (clone_inlined_nodes): Likewise.
102         (inline_call): Likewise.
103         * ipa-inline.c (caller_growth_limits): Likewise.
104         (can_inline_edge_p): Likewise.
105         (want_early_inline_function_p): Likewise.
106         (compute_uninlined_call_time): Likewise.
107         (compute_inlined_call_time): Likewise.
108         (big_speedup_p): Likewise.
109         (want_inline_small_function_p): Likewise.
110         (edge_badness): Likewise.
111         (update_caller_keys): Likewise.
112         (update_callee_keys): Likewise.
113         (recursive_inlining): Likewise.
114         (inline_small_functions): Likewise.
115         (inline_to_all_callers): Likewise.
116         (dump_overall_stats): Likewise.
117         (early_inline_small_functions): Likewise.
118         * ipa-inline.h: New class inline_summary_t replaces
119         vec<inline_summary_t>.
120         * ipa-split.c (execute_split_functions): New inline_summaries is used.
121         * ipa.c (walk_polymorphic_call_targets): Likewise.
122         * tree-sra.c (ipa_sra_preliminary_function_checks): Likewise.
124 2014-12-22  Martin Liska  <mliska@suse.cz>
126         * auto-profile.c: Include of symbol-summary.h is added.
127         * cgraph.c: Likewise.
128         * cgraphbuild.c: Likewise.
129         * cgraphclones.c: Likewise.
130         * cgraphunit.c: Likewise.
131         * ipa-cp.c: Likewise.
132         * ipa-devirt.c: Likewise.
133         * ipa-icf.c: Likewise.
134         * ipa-inline-analysis.c (evaluate_properties_for_edge): New
135         ipa_node_params_sum data structure is used.
136         (inline_node_duplication_hook): Likewise.
137         (estimate_function_body_sizes): Likewise.
138         (remap_edge_change_prob): Likewise.
139         (inline_merge_summary): Likewise.
140         * ipa-inline-transform.c: Include of symbol-summary.h is added.
141         * ipa-inline.c (early_inliner): New ipa_node_params_sum data structure
142         is used.
143         * ipa-polymorphic-call.c: Include of symbol-summary.h is added.
144         * ipa-profile.c: Include of symbol-summary.h is added.
145         * ipa-prop.c (ipa_propagate_indirect_call_infos): New ipa_node_params_sum
146         data structure is used.
147         (ipa_node_params::~ipa_node_params): New function.
148         (ipa_free_all_node_params): Destruction is simplified.
149         (ipa_node_removal_hook): Removed.
150         (ipa_add_new_function): Renamed from ipa_node_duplication_hook.
151         (ipa_node_params_t::duplicate): New function.
152         (ipa_register_cgraph_hooks): Few hooks are removed.
153         (ipa_unregister_cgraph_hooks): Likewise.
154         (ipa_prop_write_jump_functions): New ipa_node_params_sum is used.
155         * ipa-prop.h (struct ipa_node_params): Destructor introduced for
156         the structure.
157         (ipa_check_create_node_params): Vector for ipa_node_params is replaced
158         with function_summary.
159         * ipa-split.c: Include of symbol-summary.h is added.
160         * ipa-utils.c: Include of symbol-summary.h is added.
161         * ipa.c: Include of symbol-summary.h is added.
162         * omp-low.c: Include of symbol-summary.h is added.
163         * tree-inline.c: Include of symbol-summary.h is added.
164         * tree-sra.c: Include of symbol-summary.h is added.
165         * tree-ssa-pre.c: Include of symbol-summary.h is added.
167 2014-12-22  Martin Liska  <mliska@suse.cz>
169         * cgraph.h (symbol_table::allocate_cgraph_symbol): Summary UID
170         is filled up.
171         * symbol-summary.h: New file.
172         * gengtype.c (open_base_files): Add symbol-summary.h.
173         * toplev.c (general_init): Call constructor of symbol_table.
175 2014-12-17  Oleg Endo  <olegendo@gcc.gnu.org>
177         PR target/55212
178         * config/sh/sh.md (*addsi3_compact): Add parentheses around &&
179         condition.  Add comments.
181 2014-12-20  Segher Boessenkool  <segher@kernel.crashing.org>
183         PR target/64358
184         * config/rs6000/rs6000.c (rs6000_split_logical_inner): Swap the
185         input operands if only the second is inverted.
186         * config/rs6000/rs6000.md (*boolc<mode>3_internal1 for BOOL_128):
187         Swap BOOL_REGS_OP1 and BOOL_REGS_OP2.  Correct arguments to
188         rs6000_split_logical.
189         (*boolc<mode>3_internal2 for TI2): Swap operands[1] and operands[2].
191 2014-12-20  Martin Uecker <uecker@eecs.berkeley.edu>
193         * doc/invoke.texi: Document -Wdiscarded-array-qualifiers.
194         * doc/extend.texi: Document new behavior for pointers to arrays
195         with qualifiers.
197 2014-12-19  Jan Hubicka  <hubicka@ucw.cz>
199         * hash-table.h (struct pointer_hash): Fix formating.
200         (hash_table_higher_prime_index): Declare pure.
201         (hash_table_mod2, hash_table_mod1, mul_mod): Move inline;
202         assume that uint64_t always exists.
203         (hash_table<Descriptor, Allocator, false>): Use gcc_checking_assert.
204         (hash_table<Descriptor, Allocator, false>::expand ()): Fix formating.
205         (hash_table<Descriptor, Allocator, false>::clear_slot (value_type **slot)):
206         Use checking assert.
207         * hash-table.c: Remove #if 0 code.
208         (hash_table_higher_prime_index): Use gcc_assert.
209         (mul_mod, hash-table_mod1, hash_table_mod2): move to hash-table.h
211 2014-12-19  Matthew Fortune  <matthew.fortune@imgtec.com>
213         * config.gcc: Support mips*-img-linux* and mips*-img-elf*.
214         * config/mips/mti-linux.h: Support mips32r6 as being the default arch.
215         * config/mips/t-img-elf: New.
216         * config/mips/t-img-linux: New.
218 2014-12-19  Matthew Fortune  <matthew.fortune@imgtec.com>
220         * config.gcc: Add mipsisa64r6 and mipsisa32r6 cpu support.
221         * config/mips/constraints.md (ZD): Add r6 restrictions.
222         * config/mips/gnu-user.h (DRIVER_SELF_SPECS): Add MIPS_ISA_LEVEL_SPEC.
223         * config/mips/loongson.md
224         (<u>div<mode>3, <u>mod<mode>3): Move to mips.md.
225         * config/mips/mips-cpus.def (mips32r6, mips64r6): Define.
226         * config/mips/mips-modes.def (CCF): New mode.
227         * config/mips/mips-protos.h
228         (mips_9bit_offset_address_p): New prototype.
229         * config/mips/mips-tables.opt: Regenerate.
230         * config/mips/mips.c (MIPS_JR): Use JALR $, <reg> for R6.
231         (mips_rtx_cost_data): Add pseudo-processors W32 and W64.
232         (mips_9bit_offset_address_p): New function.
233         (mips_rtx_costs): Account for R6 multiply and FMA instructions.
234         (mips_emit_compare): Implement R6 FPU comparisons.
235         (mips_expand_conditional_move): Implement R6 selects.
236         (mips_expand_conditional_trap): Account for removed trap immediate.
237         (mips_expand_block_move): Disable inline move when LWL/LWR are removed.
238         (mips_print_float_branch_condition): Update for R6 FPU branches.
239         (mips_print_operand): Handle CCF mode compares.
240         (mips_interrupt_extra_call_saved_reg_p): Do not attempt to callee-save
241         MD_REGS for R6.
242         (mips_hard_regno_mode_ok_p): Support CCF mode.
243         (mips_mode_ok_for_mov_fmt_p): Likewise.
244         (mips_secondary_reload_class): CCFmode can be loaded directly.
245         (mips_set_fast_mult_zero_zero_p): Account for R6 multiply instructions.
246         (mips_option_override): Ensure R6 is used with fp64.  Set default
247         mips_nan modes.  Check for mips_nan support.  Prevent DSP with R6.
248         (mips_conditional_register_usage): Disable MD_REGS for R6. Disable
249         FPSW for R6.
250         (mips_mulsidi3_gen_fn): Support R6 multiply instructions.
251         * config/mips/mips.h (ISA_MIPS32R6, ISA_MIPS64R6): Define.
252         (TARGET_CPU_CPP_BUILTINS): Rework for mips32/mips64.
253         (ISA_HAS_JR): New macro.
254         (ISA_HAS_HILO): New macro.
255         (ISA_HAS_R6MUL): Likewise.
256         (ISA_HAS_R6DMUL): Likewise.
257         (ISA_HAS_R6DIV): Likewise.
258         (ISA_HAS_R6DDIV): Likewise.
259         (ISA_HAS_CCF): Likewise.
260         (ISA_HAS_SEL): Likewise.
261         (ISA_HAS_COND_TRAPI): Likewise.
262         (ISA_HAS_FP_MADDF_MSUBF): Likewise.
263         (ISA_HAS_LWL_LWR): Likewise.
264         (ISA_HAS_IEEE_754_LEGACY): Likewise.
265         (ISA_HAS_IEEE_754_2008): Likewise.
266         (ISA_HAS_PREFETCH_9BIT): Likewise.
267         (MIPSR6_9BIT_OFFSET_P): New macro.
268         (BASE_DRIVER_SELF_SPECS): Use MIPS_ISA_DRIVER_SELF_SPECS.
269         (DRIVER_SELF_SPECS): Use MIPS_ISA_LEVEL_SPEC.
270         (MULTILIB_ISA_DEFAULT): Handle mips32r6 and mips64r6.
271         (MIPS_ISA_LEVEL_SPEC): Likewise.
272         (MIPS_ISA_SYNCI_SPEC): Likewise.
273         (ISA_HAS_64BIT_REGS): Likewise.
274         (ISA_HAS_BRANCHLIKELY): Likewise.
275         (ISA_HAS_MUL3): Likewise.
276         (ISA_HAS_DMULT): Likewise.
277         (ISA_HAS_DDIV): Likewise.
278         (ISA_HAS_DIV): Likewise.
279         (ISA_HAS_MULT): Likewise.
280         (ISA_HAS_FP_CONDMOVE): Likewise.
281         (ISA_HAS_8CC): Likewise.
282         (ISA_HAS_FP4): Likewise.
283         (ISA_HAS_PAIRED_SINGLE): Likewise.
284         (ISA_HAS_MADD_MSUB): Likewise.
285         (ISA_HAS_FP_RECIP_RSQRT): Likewise.
286         * config/mips/mips.md (processor): Add w32 and w64.
287         (FPCC): New mode iterator.
288         (reg): Add CCF mode.
289         (fpcmp): New mode attribute.
290         (fcond): Add ordered, ltgt and ne codes.
291         (fcond): Update code attribute.
292         (sel): New code attribute.
293         (selinv): Likewise.
294         (ctrap<mode>4): Update condition.
295         (*conditional_trap_reg<mode>): New define_insn.
296         (*conditional_trap<mode>): Update condition.
297         (mul<mode>3): Expand R6 multiply instructions.
298         (<su>mulsi3_highpart): Likewise.
299         (<su>muldi3_highpart): Likewise.
300         (mul<mode>3_mul3_loongson): Rename...
301         (mul<mode>3_mul3_hilo): To this.  Add R6 mul instruction.
302         (<u>mulsidi3_32bit_r6): New expander.
303         (<u>mulsidi3_32bit): Restrict to pre-r6 multiplies.
304         (<u>mulsidi3_32bit_r4000): Likewise.
305         (<u>mulsidi3_64bit): Likewise.
306         (<su>mulsi3_highpart_internal): Likewise.
307         (mulsidi3_64bit_r6dmul): New instruction.
308         (<su>mulsi3_highpart_r6): Likewise.
309         (<su>muldi3_highpart_r6): Likewise.
310         (fma<mode>4): Likewise.
311         (movccf): Likewise.
312         (*sel<code><GPR:mode>_using_<GPR2:mode>): Likewise.
313         (*sel<mode>): Likewise.
314         (<u>div<mode>3): Moved from loongson.md.  Add R6 instructions.
315         (<u>mod<mode>3): Likewise.
316         (extvmisalign<mode>): Require ISA_HAS_LWL_LWR.
317         (extzvmisalign<mode>): Likewise.
318         (insvmisalign<mode>): Likewise.
319         (mips_cache): Account for R6 displacement field sizes.
320         (*branch_fp): Rename...
321         (*branch_fp_<mode>): To this.  Add CCFmode support.
322         (*branch_fp_inverted): Rename...
323         (*branch_fp_inverted_<mode>): To this.  Add CCFmode support.
324         (s<code>_<mode>): Rename...
325         (s<code>_<SCALARF:mode>_using_<FPCC:mode>): To this.  Add FCCmode
326         condition support.
327         (s<code>_<mode> swapped): Rename...
328         (s<code>_<SCALARF:mode>_using_<FPCC:mode> swapped): To this. Add
329         CCFmode condition support.
330         (mov<mode>cc GPR): Expand R6 selects.
331         (mov<mode>cc FPR): Expand R6 selects.
332         (*tls_get_tp_<mode>_split): Do not .set push for >= mips32r2.
333         * config/mips/netbsd.h (TARGET_CPU_CPP_BUILTINS): Update similarly to
334         mips.h.
335         (ASM_SPEC): Add mips32r6, mips64r6.
336         * config/mips/t-isa3264 (MULTILIB_OPTIONS, MULTILIB_DIRNAMES): Update
337         for mips32r6/mips64r6.
338         * doc/invoke.texi: Document -mips32r6,-mips64r6.
339         * doc/md.texi: Update comment for ZD constraint.
341 2014-12-19  Segher Boessenkool  <segher@kernel.crashing.org>
343         PR target/64268
344         * combine.c (try_combine): Immediately return if any of I0,I1,I2
345         are the same insn.
347 2014-12-19  Alan Lawrence  <alan.lawrence@arm.com>
349         * config/aarch64/aarch64.c (<LOGICAL:optab>_one_cmpl<mode>3):
350         Reparameterize to...
351         (<NLOGICAL:optab>_one_cmpl<mode>3): with extra SIMD-register variant.
352         (xor_one_cmpl<mode>3): New define_insn_and_split.
354         * config/aarch64/iterators.md (NLOGICAL): New define_code_iterator.
356 2014-12-19  Alan Lawrence  <alan.lawrence@arm.com>
358         * config/aarch64/aarch64.md (<optab><mode>3, one_cmpl<mode>2):
359         Add SIMD-register variant.
360         * config/aarch64/iterators.md (Vbtype): Add value for SI.
362 2014-12-19  Alan Lawrence  <alan.lawrence@arm.com>
364         * config/aarch64/aarch64.md (subdi3, adddi3_aarch64): Don't penalize
365         SIMD reg variant.
367 2014-12-19  Martin Liska  <mliska@suse.cz>
369         PR ipa/63569
370         * ipa-icf-gimple.c (func_checker::compare_operand): Add missing
371         comparison for volatile flag.
373 2014-12-19  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
375         * doc/invoke.texi (ARM options): Remove mention of Advanced RISC
376         Machines.
378 2014-12-19  Xingxing Pan  <xxingpan@marvell.com>
380         * config/arm/cortex-a9-neon.md (cortex_a9_neon_vmov): Change
381         reservation to cortex_a9_neon_dp.
383 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
385         * config/sh/sh.c (prepare_move_operands): Split HI/QImode load/store
386         to two move insns via r0.
388 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
390         * config/sh/predicates.md (arith_or_int_operand): New predicate.
391         * config/sh/sh.md (addsi3): Use arith_or_int_operand for operand 2.
392         Return fail if operands[0] and operands[1] are overlap when
393         operands[2] is integer constant.
394         (*addsi3_compact): Make it define_insn_and_split which splits
395         reg0 := reg1 + constant to reg0 = constant and reg0 := reg0 + reg1.
397 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
399         * config/sh/sh-protos.h (sh_movsf_ie_ra_split_p): Declare.
400         * config/sh/sh.c (sh_movsf_ie_ra_split_p): New function.
401         * config/sh/sh.md (movsi_ie): Use "mr" constraint for the 8-th
402         altarnative of operand 0.
403         (movesf_ie): Use "X" constraint instead of "Bsc".
404         (movsf_ie_ra): New insn_and_split.
405         (movsf): Use movsfie_ra when lra_in_progress is true.
407 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
409         * config/sh/predicates.md (general_movsrc_operand): Allow only
410         valid plus address expressions.
411         (general_movdst_operand): Likewise.
412         (t_reg_operand): Allow (zero_extend (reg t)).
413         * config/sh/sh-protos.h (sh_hard_regno_caller_save_mode): Declare.
414         * config/sh/sh.c (sh_hard_regno_caller_save_mode): New function.
415         (sh_secondary_reload): Return NO_REGS instead of FPUL_REGS in one
416         case.
417         * config/sh/sh.h (HARD_REGNO_CALLER_SAVE_MODE): Define.
418         * config/sh/sh.md (untyped_call): Clobber function value
419         registers before call.
421 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
423         * config/sh/sh.c (sh_lra_p): New function.
424         (TARGET_LRA_P): Define.
425         (sh_legitimize_reload_address): Return false if sh_lra_p is true.
426         * config/sh/sh.opt (mlra): New option.
428 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
430         * lra-constraints.c (process_address_1): Try if target can split
431         displacement with targetm.legitimize_address_displacement.
432         * target.def (legitimize_address_displacement): New hook.
433         * targhooks.c (default_legitimize_address_displacement): New function.
434         * targhooks.h (default_legitimize_address_displacement): Declare.
435         * config/sh/sh.c (sh_legitimize_address_displacement): New function.
436         (TARGET_LEGITIMIZE_ADDRESS_DISPLACEMENT): Define.
437         * doc/tm.texi.in (TARGET_LEGITIMIZE_ADDRESS_DISPLACEMENT): New hook.
438         * doc/tm.texi: Regenerate.
440 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
442         * lra-constraints.c (get_equiv): Don't return memory equivalence
443         when targetm.cannot_substitute_mem_equiv_p is true.
444         * target.def (cannot_substitute_mem_equiv_p): New hook.
445         * config/sh/sh.c (sh_cannot_substitute_mem_equiv_p): New function.
446         (TARGET_CANNOT_SUBSTITUTE_MEM_EQUIV_P): Define.
447         * doc/tm.texi.in (TARGET_CANNOT_SUBSTITUTE_MEM_EQUIV_P): New hook.
448         * doc/tm.texi: Regenerate.
450 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
452         * lra-constraints.c (process_address_1): Swap base_term and
453         index_term if INDEX_REG_CLASS is assigned to base_term already
454         when INDEX_REG_CLASS is a single register class.
456 2014-12-18  Vladimir Makarov  <vmakarov@redhat.com>
458         * lra-constraints.c (lra-constraints.c): Exchange places of sclass
459         and dclass.
461 2014-12-18  Vladimir Makarov  <vmakarov@redhat.com>
463         PR rtl-optimization/64291
464         * lra-remat.c (bad_for_rematerialization_p): Add UNPSEC_VLOATILE.
465         (create_cands): Process only output reload insn with potential
466         cands.
468 2014-12-18  H.J. Lu  <hongjiu.lu@intel.com>
470         * config/i386/i386.c (ix86_expand_call): Skip setting up RAX
471         register for -mskip-rax-setup when there are no parameters
472         passed in vector registers.
473         * config/i386/i386.opt (mskip-rax-setup): New option.
474         * doc/invoke.texi: Document -mskip-rax-setup.
476 2014-12-18  Alan Lawrence  <alan.lawrence@arm.com>
478         * config/aarch64/aarch64-simd.md (aarch64_lshr_simddi): Handle shift
479         by 64 by moving const0_rtx.
480         (aarch64_ushr_simddi): Delete.
482         * config/aarch64/aarch64.md (enum unspec): Delete UNSPEC_USHR64.
484 2014-12-18  Alan Lawrence  <alan.lawrence@arm.com>
486         * config/aarch64/aarch64.md (enum "unspec"): Remove UNSPEC_SSHR64.
488         * config/aarch64/aarch64-simd.md (aarch64_ashr_simddi): Change shift
489         amount to 63 if was 64.
490         (aarch64_sshr_simddi): Remove.
492 2014-12-18  Wilco Dijkstra  <wilco.dijkstra@arm.com>
494         * gcc/config/aarch64/aarch64.c (TARGET_MIN_DIVISIONS_FOR_RECIP_MUL):
495         Define.
496         (aarch64_min_divisions_for_recip_mul): New function.
498 2014-12-18  Wilco Dijkstra  <wilco.dijkstra@arm.com>
500         * config/aarch64/aarch64-protos.h (tune-params): Add code alignment
501         tuning parameters.
502         * gcc/config/aarch64/aarch64.c (generic_tunings): Add code alignment
503         tuning parameters.
504         (cortexa53_tunings): Likewise.
505         (cortexa57_tunings): Likewise.
506         (thunderx_tunings): Likewise.
507         (aarch64_override_options): Use new alignment tunings.
509 2014-12-18  Martin Liska  <mliska@suse.cz>
511         PR tree-optimization/64330
512         * ipa-icf.c (sem_variable::parse): Add checking
513         for externally visible symbols and do not introduce
514         an alias for an external declaration.
516 2014-12-18  Jan Hubicka  <hubicka@ucw.cz>
518         PR bootstrap/63573
519         * tree-inline.c (remap_gimple_stmt): Handle gimple_call_from_thunk_p
520         predicate.
522 2014-12-18  Martin Liska  <mliska@suse.cz>
524         PR ipa/64146
525         * ipa-icf.c (sem_function::merge): Check for
526         decl_binds_to_current_def_p is newly added to merge operation.
528 2014-12-18  Bin Cheng  <bin.cheng@arm.com>
530         PR tree-optimization/62178
531         * tree-ssa-loop-ivopts.c (cheaper_cost_with_cand): New function.
532         (iv_ca_replace): New function.
533         (try_improve_iv_set): New parameter try_replace_p.
534         Break local optimal fixed-point by calling iv_ca_replace.
535         (find_optimal_iv_set_1): Pass new argument to try_improve_iv_set.
537 2014-12-17  Dehao Chen  <dehao@google.com>
539         * auto-profile.c (afdo_annotate_cfg): Invoke update_ssa in the right
540         place.
541         (auto_profile): Recompute inline summary after processing cgraph node.
543 2014-12-17  Oleg Endo  <olegendo@gcc.gnu.org>
545         PR target/51244
546         * config/sh/sh_treg_combine.cc (is_conditional_insn): New function.
547         (cbranch_trace): Add member rtx* condition_rtx_in_insn, initialize it
548         accordingly in constructor.
549         (cbranch_trace::branch_condition_rtx_ref): New function.
550         (cbranch_trace::branch_condition_rtx): Use branch_condition_rtx_ref.
551         (sh_treg_combine::try_invert_branch_condition): Invert condition rtx
552         in insn using reversed_comparison_code and validate_change instead of
553         invert_jump_1.
554         (sh_treg_combine::execute): Look for conditional insns in basic blocks
555         in addition to conditional branches.
556         * config/sh/sh.md (*movsicc_div0s): Remove combine patterns.
558 2014-12-17  Oleg Endo  <olegendo@gcc.gnu.org>
560         PR target/51244
561         * config/sh/sh_treg_combine.cc (sh_treg_combine::try_optimize_cbranch):
562         Combine ccreg inversion and cbranch into inverted cbranch.
564 2014-12-17  Vladimir Makarov  <vmakarov@redhat.com>
566         * lra-constraints.c (process_alt_operands): Remove non
567         allocatable hard regs when considering
568         ira_prohibited_class_mode_regs.
570 2014-12-17  Jan Hubicka  <hubicka@ucw.cz>
572         * sreal.h (sreal::normalize): Implement inline.
573         (sreal::normalize_up): New function.
574         (sreal::normalize_down): New function.
575         * sreal.c (sreal::normalize): Remove.
577 2014-12-17  James Greenhalgh  <james.greenhalgh@arm.com>
579         * config/aarch64/aarch64.md (generic_sched): Delete it.
581 2014-12-17  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
583         * config/msp430/msp430.c (msp430_asm_output_addr_const_extra): Fix
584         unused argument warning.
586 2014-12-17  Pierre-Marie de Rodat  <derodat@adacore.com>
588         * dwarf2out.h (struct array_descr_info): Remove the base_decl field.
589         * dwarf2out.c (enum dw_scalar_form): New.
590         (struct loc_descr_context): New.
591         (add_scalar_info): New.
592         (add_bound_info): Add a context parameter.  Use add_scalar_info.
593         (loc_list_from_tree): Add a context parameter.  Handle PLACEHOLDER_EXPR
594         nodes for type-related expressions.  Likewise for base declarations.
595         (loc_descriptor_from_tree): Add a context parameter.
596         (subrange_type_die): Update calls to add_bound_info.
597         (tls_mem_loc_descriptor): Likewise.
598         (loc_list_for_address_of_addr_expr_of_indirect_ref): Add a context
599         parameter.  Update calls to loc_list_from_tree.
600         (add_subscript_info): Update calls to add_bound_info.
601         (gen_array_type_die): Update calls to loc_list_from_tree and to
602         add_bound_info.
603         (descr_info_loc): Remove.
604         (add_descr_info_field): Remove.
605         (gen_descr_array_type_die): Switch add_descr_info_field calls into
606         add_scalar_info/add_bound_info ones.
607         (gen_subprogram_die): Update calls to loc_list_from_tree.
608         (gen_variable_die): Likewise.
610 2014-12-17  Pierre-Marie de Rodat  <derodat@adacore.com>
612         * dwarf2out.c (print_loc_descr): New.
613         (print_dw_val): New.
614         (print_attribute): New.
615         (print_loc_descr): New.
616         (print_die): Use print_dw_val.
617         (debug_dwarf_loc_descr): New.
618         * dwarf2out.h (debug_dwarf_loc_descr): New declaration.
620 2014-12-17  Pierre-Marie de Rodat  <derodat@adacore.com>
622         * dwarf2out.c (gen_type_die_with_usage): Enable the array lang-hook
623         even when (dwarf_version < 3 && dwarf_strict).
624         (gen_descr_array_die): Do not output DW_AT_data_locationn,
625         DW_AT_associated, DW_AT_allocated and DW_AT_byte_stride DWARF
626         attributes when (dwarf_version < 3 && dwarf_strict).
628 2014-12-17  Pierre-Marie de Rodat  <derodat@adacore.com>
630         * dwarf2out.h (enum array_descr_ordering): New.
631         (array_descr_dimen): Add a bounds_type structure field.
632         (struct array_descr_info): Add a field to hold index type information
633         and another one to hold ordering information.
634         * dwarf2out.c (gen_type_die_with_usage): Get the main variant before
635         invoking the array descriptor language hook.  Initialize the
636         array_descr_info structure before calling the lang-hook.
637         (gen_descr_array_type_die): Use gen_type_die if not processing the main
638         type variant.  Replace Fortran-specific code with generic one using
639         this new field.  Add a GNAT descriptive type, if any.  Output type
640         information for the array bound subrange, if any.
642 2014-12-17  H.J. Lu  <hongjiu.lu@intel.com>
643             Jakub Jelinek  <jakub@redhat.com>
644             Uros Bizjak  <ubizjak@gmail.com>
646         PR target/61296
647         * config/i386/i386-opts.h (ix86_align_data): New enum.
648         * config/i386/i386.c (ix86_data_alignment): Return the ABI
649         alignment value for -malign-data=abi, the cachine line size
650         for -malign-data=cacheline and the older GCC compatible
651         alignment value for for -malign-data=compat.
652         * config/i386/i386.opt (malign-data=): New.
653         * doc/invoke.texi: Document -malign-data=.
655 2014-12-17  Marek Polacek  <polacek@redhat.com>
657         PR middle-end/63568
658         * match.pd: Add (x & ~m) | (y & m) -> ((x ^ y) & m) ^ x pattern.
660 2014-12-17  Jakub Jelinek  <jakub@redhat.com>
662         PR tree-optimization/64322
663         * tree-vrp.c (extract_range_from_binary_expr_1): Attempt to derive
664         range for RSHIFT_EXPR even if vr0 range is not VR_RANGE or is symbolic.
666 2014-12-17  Tobias Burnus  <burnus@net-b.de>
668         PR fortran/54687
669         * flag-types.h (gfc_init_local_real, gfc_fcoarray,
670         gfc_convert): New enums; moved from fortran/.
672 2014-12-16  Jan Hubicka  <hubicka@ucw.cz>
674         * fibonacci_heap.h (min): Return m_data instead of non-existing data.
676 2014-12-16  Jan Hubicka  <hubicka@ucw.cz>
678         * ipa-inline-analysis.c (will_be_nonconstant_predicate): Consider
679         return values of const calls as constants.
680         (estimate_function_body_sizes): Expect calls to have false predicates.
682 2014-12-16  Jan Hubicka  <hubicka@ucw.cz>
684         * hwint.c (abs_hwi, absu_hwi): Move to ...
685         * hwint.h (abs_hwi, absu_hwi): ... here; make inline.
687 2014-12-16  Marek Polacek  <polacek@redhat.com>
689         PR middle-end/64309
690         * match.pd: Add ((1 << A) & 1) != 0 -> A == 0 and
691         ((1 << A) & 1) == 0 -> A != 0.
693 2014-12-16  Richard Biener  <rguenther@suse.de>
695         * genmatch.c (parser::parser): Initialize capture_ids.
696         (parser::parse_pattern): Properly allocate capture_ids before
697         using them.  Set capture_ids to zero when its lifetime is
698         supposed to finish.
699         (parser::parse_simplify): Allocate capture_ids only if
700         required.
702 2014-12-16  Michael Haubenwallner <michael.haubenwallner@ssi-schaefer.com>
704         * sreal.c: Include math.h later.
706 2014-12-16  Felix Yang  <felix.yang@huawei.com>
708         PR rtl-optimization/64240
709         * ddg.c (mark_mem_use): Check *iter instead of *x.
711 2014-12-16  Martin Liska  <mliska@suse.cz>
713         PR ipa/64278
714         * sreal.c (sreal::operator*): Replace std::abs with absu_hwi.
716 2014-12-16  Igor Zamyatin  <igor.zamyatin@intel.com>
718         * config/i386/i386.c (ix86_address_cost): Add explicit restriction
719         to RTL level for the check for PIC register.
721 2014-12-16  Uros Bizjak  <ubizjak@gmail.com>
723         * config/i386/gnu-user.h (TARGET_CAN_SPLIT_STACK): Move from here ...
724         * config/i386/gnu-user64.h (TARGET_CAN_SPLIT_STACK): ... and here ...
725         * config/i386/gnu-user-common.h (TARGET_CAN_SPLIT_STACK): ... to here.
727 2014-12-16  Chung-Ju Wu  <jasonwucj@gmail.com>
729         PR target/64217
730         * config/nds32/nds32.md (casesi_internal): Add '=r' for clobber
731         register constraint.
733 2014-12-15  DJ Delorie  <dj@redhat.com>
735         * config/rl78/rl78.h: Remove SHORT_IMMEDIATES_SIGN_EXTEND.
737 2014-12-15  Jan Hubicka  <hubicka@ucw.cz>
739         PR lto/64043
740         * tree-streamer.c (preload_common_nodes): Skip preloading
741         of main_identifier_node, pid_type and optimization/option nodes.
743 2014-12-15  Vladimir Makarov  <vmakarov@redhat.com>
745         PR rtl-optimization/63397
746         * ira-int.h (ira_overall_cost, ira_reg_cost, ira_mem_cost): Use
747         int64_t.
748         (ira_load_cost, ira_store_cost, ira_shuffle_cost): Ditto.
749         * ira.c (ira_overall_cost, ira_overall_cost_before): Ditto.
750         (ira_reg_cost, ira_mem_cost): Ditto.
751         (ira_load_cost, ira_store_cost, ira_shuffle_cost): Ditto.
752         (calculate_allocation_cost, do_reload): Use the right
753         format for int64_t values.
755 2014-12-15  Jan Hubicka  <hubicka@ucw.cz>
757         * sreal.h (to_double): New method.
758         (shift): Do not ICE on 0.
759         * sreal.c: Include math.h
760         (sreal::to_double): New.
762 2014-12-15  Jakub Jelinek  <jakub@redhat.com>
764         PR rtl-optimization/64316
765         * simplify-rtx.c (simplify_relational_operation_1): For
766         (eq/ne (and x y) x) and (eq/ne (and x y) y) optimizations use
767         CONST0_RTX instead of const0_rtx.
769 2014-12-15  Vladimir Makarov  <vmakarov@redhat.com>
771         PR target/62642
772         * ira.c (rtx_moveable_p): Prevent UNSPEC_VOLATILE moves.
774 2014-12-15  Vladimir Makarov  <vmakarov@redhat.com>
776         * ira-int.h (ira_prohibited_class_mode_regs): Remove.
777         (struct target_ira_int): Move x_ira_prohibited_class_mode_regs to
778         ...
779         * ira.h (struct target_ira): ... here.
780         (ira_prohibited_class_mode_regs): Define.
781         * lra-constraints.c (process_alt_operands): Add one more condition
782         to refuse alternative when reload pseudo of given class can not
783         hold value of given mode.
785 2014-12-15  Richard Biener  <rguenther@suse.de>
787         PR tree-optimization/64312
788         * tree-ssa-sccvn.c (vn_reference_lookup_pieces): Use
789         vuse_ssa_val as callback to walk_non_aliased_vuses.
790         (vn_reference_lookup): Likewise.
792 2014-12-15  Segher Boessenkool  <segher@kernel.crashing.org>
794         * gcc/config/rs6000/rs6000.md (*add>mode>3_imm_dot,
795         *add<mode>3_imm_dot2): Change the constraint for the second
796         alternative for operand 1 from "r" to "b".
798 2014-12-15  Richard Biener  <rguenther@suse.de>
800         * vec.h (vec::safe_grow): Guard against a grow to zero size.
802 2014-12-15  Richard Biener  <rguenther@suse.de>
804         PR middle-end/64295
805         * match.pd (X / CST -> X * (1 / CST): Use const_binop instead of
806         fold_binary to compute the constant to multiply with.
808 2014-12-15  Richard Biener  <rguenther@suse.de>
810         PR middle-end/64246
811         * cfgloop.c (mark_loop_for_removal): Make safe against multiple
812         invocations on the same loop.
814 2014-12-15  Marek Polacek  <polacek@redhat.com>
816         PR middle-end/64292
817         * fold-const.c (negate_expr_p): Add INTEGRAL_TYPE_P check.
819 2014-12-15  Renlin Li  <renlin.li@arm.com>
821         * config/aarch64/aarch64.h (CLZ_DEFINED_VALUE_AT_ZERO): Return 2.
822         (CTZ_DEFINED_VALUE_AT_ZERO): Update to support more modes.
824 2014-12-15  Jakub Jelinek  <jakub@redhat.com>
826         PR sanitizer/64265
827         * tsan.c (instrument_func_entry): Insert __tsan_func_entry
828         call on edge from entry block to single succ instead
829         of after labels of single succ of entry block.
831 2014-12-15  Richard Biener  <rguenther@suse.de>
833         PR tree-optimization/64284
834         * tree-ssa-threadupdate.c (duplicate_seme_region): Mark
835         the loop for removal if we copied the loop header.
837 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
839         PR ipa/61602
840         * cgraph.h (ipa_discover_readonly_nonaddressable_vars): Return bool.
841         * ipa.c (set_writeonly_bit): Track if reference was removed.
842         (ipa_discover_readonly_nonaddressable_vars): Return true if any
843         references was removed.
844         * ipa-reference.c (propagate): Return TODO_remove_functions if
845         reference was removed.
847 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
849         * ipa.c (process_references): Fix conditoinal on flag_optimize
851 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
853         PR ipa/61558
854         * symtab.c (symbol_table::insert_to_assembler_name_hash
855         symbol_table::unlink_from_assembler_name_hash): Do not ICE when
856         DECL_ASSEMBLER_NAME is NULL.
858 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
860         * cgraphunit.c (analyze_functions): Always analyze targets of aliases.
862 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
864         PR lto/64043
865         * tree.c (virtual_method_call_p): Return false when OTR type has
866         no BINFO.
868 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
870         * cgraphunit.c (analyze_functions): Do not analyze extern inline
871         funtions when not optimizing; skip comdat locals.
873 2014-12-14  H.J. Lu  <hongjiu.lu@intel.com>
875         PR rtl-optimization/64037
876         * combine.c (setup_incoming_promotions): Pass the argument
877         before any promotions happen to promote_function_mode.
879 2014-12-12  Thomas Schwinge  <thomas@codesourcery.com>
881         * config/nvptx/nvptx.h (ASM_OUTPUT_ALIGN): Define as a C statment.
883 2014-12-12  Vladimir Makarov  <vmakarov@redhat.com>
885         PR target/64110
886         * lra-constraints.c (process_alt_operands): Refuse alternative
887         when reload pseudo of given class can not hold value of given
888         mode.
890 2014-12-12  Thomas Schwinge  <thomas@codesourcery.com>
892         * gimple-walk.c (walk_gimple_op) <GIMPLE_OMP_FOR>: Also check
893         intermediate walk_tree results for for_incr.
894         <GIMPLE_OMP_TARGET>: Walk child_fn and data_arg, too.
895         <GIMPLE_OMP_CRITICAL, GIMPLE_OMP_ATOMIC_STORE>: Pretty printing.
897 2014-12-12  Richard Sandiford  <richard.sandiford@arm.com>
899         PR middle-end/64182
900         * wide-int.h (wi::div_round, wi::mod_round): Fix rounding of tied
901         cases.
902         * double-int.c (div_and_round_double): Fix handling of unsigned
903         cases.  Use same rounding approach as wide-int.h.
905 2014-12-12  Marek Polacek  <polacek@redhat.com>
907         PR middle-end/64274
908         * fold-const.c (fold_binary_loc): Add ANY_INTEGRAL_TYPE_P check.
910 2014-12-12  Jakub Jelinek  <jakub@redhat.com>
912         PR tree-optimization/64269
913         * tree-ssa-forwprop.c (simplify_builtin_call): Bail out if
914         len2 or diff are too large.
916 2014-12-12  Richard Biener  <rguenther@suse.de>
918         PR middle-end/64280
919         * tree-cfg.c (replace_uses_by): Guard assert properly.
921 2014-12-12  Anthony Green  <green@moxielogic.com>
923         * config/moxie/moxie.md: Add use of zex instruction.
925 2014-12-12  Marc Glisse  <marc.glisse@inria.fr>
927         * real.h (HONOR_SNANS, HONOR_INFINITIES, HONOR_SIGNED_ZEROS,
928         HONOR_SIGN_DEPENDENT_ROUNDING): Replace macros with 3 overloaded
929         declarations.
930         * real.c (HONOR_NANS): Fix indentation.
931         (HONOR_SNANS, HONOR_INFINITIES, HONOR_SIGNED_ZEROS,
932         HONOR_SIGN_DEPENDENT_ROUNDING): Define three overloads.
933         * builtins.c (fold_builtin_cproj, fold_builtin_signbit,
934         fold_builtin_fmin_fmax, fold_builtin_classify): Simplify argument
935         of HONOR_*.
936         * fold-const.c (operand_equal_p, fold_comparison, fold_binary_loc):
937         Likewise.
938         * gimple-fold.c (gimple_val_nonnegative_real_p): Likewise.
939         * ifcvt.c (noce_try_move, noce_try_minmax, noce_try_abs): Likewise.
940         * omp-low.c (omp_reduction_init): Likewise.
941         * rtlanal.c (may_trap_p_1): Likewise.
942         * simplify-rtx.c (simplify_const_relational_operation): Likewise.
943         * tree-ssa-dom.c (record_equality, record_edge_info): Likewise.
944         * tree-ssa-phiopt.c (value_replacement, abs_replacement): Likewise.
945         * tree-ssa-reassoc.c (eliminate_using_constants): Likewise.
946         * tree-ssa-uncprop.c (associate_equivalences_with_edges): Likewise.
948 2014-12-12  Jan Hubicka  <hubicka@ucw.cz>
950         * ipa-inline.c (ipa_inline): Fix condition on when
951         TODO_remove_unreachable_functions is needed.
953 2014-12-12  Jan Hubicka  <hubicka@ucw.cz>
955         * ipa-devirt.c (possible_polymorphic_call_targets): Return early
956         if otr_type has no BINFO.
958 2014-12-12  Zhenqiang Chen  <zhenqiang.chen@arm.com>
960         PR rtl-optimization/63917
961         * ifcvt.c (cc_in_cond): New function.
962         (end_ifcvt_sequence): Make sure new generated insns do not clobber CC.
963         (noce_process_if_block, check_cond_move_block): Check CC references.
965 2014-12-11  Andrew Pinski  <apinski@cavium.com>
967         * config/aarch64/aarch64-protos.h (tune_params): Add align field.
968         * config/aarch64/aarch64.c (generic_tunings): Specify align.
969         (cortexa53_tunings): Likewise.
970         (cortexa57_tunings): Likewise.
971         (thunderx_tunings): Likewise.
972         (aarch64_override_options): Set align_loops, align_jumps,
973         align_functions based on what the tuning struct.
975 2014-12-11  Eric Botcazou  <ebotcazou@adacore.com>
977         * doc/md.texi (Insn Lengths): Fix description of (pc).
979 2014-12-11  Jan Hubicka  <hubicka@ucw.cz>
981         PR ipa/61324
982         * passes.c (execute_todo): Update call of remove_unreachable_nodes.
983         * ipa-chkp.c (chkp_produce_thunks): Use TODO_remove_functions.
984         * cgraphunit.c (symbol_table::process_new_functions): Add
985         IPA_SSA_AFTER_INLINING.
986         (ipa_passes): Update call of remove_unreachable_nodes.
987         (symbol_table::compile): Remove call of remove_unreachable_nodes.
988         * ipa-inline.c (inline_small_functions): Do not ICE with
989         -flto-partition=none
990         (ipa_inline): Update symtab->state; fix formatting
991         update call of remove_unreachable_nodes.
992         * passes.c (execute_todo): Update call of remove_unreachable_nodes.
993         * cgraphclones.c (symbol_table::materialize_all_clones): Likewise.
994         * cgraph.h (enum symtab_state): Add IPA_SSA_AFTER_INLINING.
995         (remove_unreachable_nodes): Update.
996         * ipa.c (process_references): Keep external references only
997         when optimizing.
998         (walk_polymorphic_call_targets): Keep possible polymorphic call
999         target only when devirtualizing.
1000         (symbol_table::remove_unreachable_nodes): Remove BEFORE_INLINING_P
1001         parameter.
1002         (ipa_single_use): Update comment.
1003         * ipa-pure-const.c (cdtor_p): New function.
1004         (propagate_pure_const): Track if some cdtor was turned pure/const.
1005         (execute): Return TODO_remove_functions if needed.
1006         * ipa-comdats.c (ipa_comdats): Update comment.
1008 2014-12-11  Aldy Hernandez  <aldyh@redhat.com>
1010         * dwarf2out.c (gen_lexical_block_die): Remove unused `depth'
1011         parameter.
1012         (gen_inlined_subroutine_die): Same.
1013         (gen_block_die): Same.
1014         (decls_for_scope): Same.
1016 2014-12-11  Renlin Li  <renlin.li@arm.com>
1018         * config/aarch64/aarch64-cores.def: Change all AARCH64_FL_FPSIMD to
1019         AARCH64_FL_FOR_ARCH8.
1020         * config/aarch64/aarch64.c (all_cores): Use FLAGS from
1021         aarch64-cores.def file only.
1023 2014-12-11  Manuel López-Ibáñez  <manu@gcc.gnu.org>
1025         PR fortran/44054
1026         * diagnostic.c (diagnostic_action_after_output): Make it extern.
1027         Take diagnostic_t argument instead of diagnostic_info. Count also
1028         DK_WERROR towards max_errors.
1029         (diagnostic_report_diagnostic): Update call according to the above.
1030         (error_recursion): Likewise.
1031         * diagnostic.h (diagnostic_action_after_output): Declare.
1032         * pretty-print.c (pp_formatted_text_data): Delete.
1033         (pp_append_r): Call output_buffer_append_r.
1034         (pp_formatted_text): Call output_buffer_formatted_text.
1035         (pp_last_position_in_text): Call output_buffer_last_position_in_text.
1036         * pretty-print.h (output_buffer_formatted_text): New.
1037         (output_buffer_append_r): New.
1038         (output_buffer_last_position_in_text): New.
1040 2014-12-11  Kyrylo Tkachov  kyrylo.tkachov@arm.com
1042         * config/aarch64/aarch64.c (aarch64_parse_extension): Update error
1043         message to say +no only when removing extension.
1045 2014-12-11  Andrew MacLeod  <amacleod@redhat.com>
1047         * config/tilepro/gen-mul-tables.cc: Add insn-codes.h to include list
1048         for generator file.  Add comment indicating it is a generated file.
1049         * config/tilepro/mul-tables.c: Update generated file.
1050         * config/tilegx/mul-tables.c: Likewise.
1052 2014-12-11  Segher Boessenkool  <segher@kernel.crashing.org>
1054         * combine.c (try_combine): Do not allow combining a PARALLEL I2
1055         with a register move I3 if that I2 is an asm.
1057 2014-12-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
1059         * config/arm/arm_neon.h (vrndqn_f32): Rename to...
1060         (vrndnq_f32): ... this.
1061         (vrndqa_f32): Rename to...
1062         (vrndaq_f32): ... this.
1063         (vrndqp_f32): Rename to...
1064         (vrndpq_f32): ... this.
1065         (vrndqm_f32): Rename to...
1066         (vrndmq_f32): ... this.
1067         (vrndx_f32): New intrinsic.
1068         (vrndxq_f32): Likewise.
1070 2014-12-11  Marek Polacek  <polacek@redhat.com>
1072         * fold-const.c (fold_negate_expr): Add ANY_INTEGRAL_TYPE_P check.
1073         (extract_muldiv_1): Likewise.
1074         (maybe_canonicalize_comparison_1): Likewise.
1075         (fold_comparison): Likewise.
1076         (tree_binary_nonnegative_warnv_p): Likewise.
1077         (tree_binary_nonzero_warnv_p): Likewise.
1078         * gimple-ssa-strength-reduction.c (legal_cast_p_1): Likewise.
1079         * tree-scalar-evolution.c (simple_iv): Likewise.
1080         (scev_const_prop): Likewise.
1081         * tree-ssa-loop-niter.c (expand_simple_operations): Likewise.
1082         * tree-vect-generic.c (expand_vector_operation): Likewise.
1083         * tree.h (ANY_INTEGRAL_TYPE_CHECK): Define.
1084         (ANY_INTEGRAL_TYPE_P): Define.
1085         (TYPE_OVERFLOW_WRAPS, TYPE_OVERFLOW_UNDEFINED, TYPE_OVERFLOW_TRAPS):
1086         Add ANY_INTEGRAL_TYPE_CHECK.
1087         (any_integral_type_check): New function.
1089 2014-12-11  Tobias Burnus  <burnus@net-b.de>
1090             Manuel López-Ibáñez  <manu@gcc.gnu.org>
1092         * error.c (gfc_get_terminal_width): Renamed from
1093         get_terminal_width and use same-named common function.
1094         (gfc_error_init_1): Update call.
1096 2014-12-10  Aldy Hernandez  <aldyh@redhat.com>
1098         * gdbhooks.py (class DWDieRefPrinter): New class.
1099         (build_pretty_printer): Register dw_die_ref's.
1101 2014-12-10  Ilya Tocar  <ilya.tocar@intel.com>
1103         * config.gcc: Support "knl".
1104         * config/i386/driver-i386.c (host_detect_local_cpu): Detect "knl".
1105         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
1106         PROCESSOR_KNL.
1107         * config/i386/i386.c (m_KNL): Define.
1108         (processor_target_table): Add "knl".
1109         (PTA_KNL): Define.
1110         (ix86_issue_rate): Add PROCESSOR_KNL.
1111         (ix86_adjust_cost): Ditto.
1112         (ia32_multipass_dfa_lookahead): Ditto.
1113         (get_builtin_code_for_version): Handle "knl".
1114         (fold_builtin_cpu): Ditto.
1115         * config/i386/i386.h (TARGET_KNL): Define.
1116         (processor_type): Add PROCESSOR_KNL.
1117         * config/i386/i386.md (attr "cpu"): Add knl.
1118         * config/i386/x86-tune.def: Add m_KNL.
1120 2014-12-10  Jan Hubicka  <hubicka@ucw.cz>
1122         * doc/invoke.texi: (-devirtualize-at-ltrans): Document.
1123         * lto-cgraph.c (lto_output_varpool_node): Mark initializer as removed
1124         when it is not streamed to the given ltrans.
1125         (compute_ltrans_boundary): Make code adding all polymorphic
1126         call targets conditional with !flag_wpa || flag_ltrans_devirtualize.
1127         * common.opt (fdevirtualize-at-ltrans): New flag.
1129 2014-12-10  Ilya Verbin  <ilya.verbin@intel.com>
1131         * varpool.c (varpool_node::get_create): Force output of vars with
1132         "omp declare target" attribute.
1134 2014-12-10  Marc Glisse  <marc.glisse@inria.fr>
1136         * real.h (HONOR_NANS): Replace macro with 3 overloaded declarations.
1137         * real.c: Include rtl.h and options.h.
1138         (HONOR_NANS): Define three overloads.
1139         * builtins.c (fold_builtin_classify, fold_builtin_unordered_cmp):
1140         Simplify argument of HONOR_NANS.
1141         * fold-const.c (combine_comparisons, fold_truth_not_expr,
1142         fold_cond_expr_with_comparison, merge_truthop_with_opposite_arm,
1143         fold_comparison, fold_binary_loc): Likewise.
1144         * ifcvt.c (noce_try_move, noce_try_minmax): Likewise.
1145         * ipa-inline-analysis.c (add_clause,
1146         set_cond_stmt_execution_predicate): Likewise.
1147         * match.pd: Likewise.
1148         * rtlanal.c (may_trap_p_1): Likewise.
1149         * simplify-rtx.c (simplify_const_relational_operation): Likewise.
1150         * tree-if-conv.c (parse_predicate): Likewise.
1151         * tree-ssa-ccp.c (valid_lattice_transition): Likewise.
1152         * tree-ssa-ifcombine.c (ifcombine_ifandif): Likewise.
1153         * tree-ssa-phiopt.c (minmax_replacement, neg_replacement): Likewise.
1154         * tree-ssa-reassoc.c (eliminate_using_constants): Likewise.
1155         * tree-ssa-tail-merge.c (gimple_equal_p): Likewise.
1157 2014-12-10  Jakub Jelinek  <jakub@redhat.com>
1159         PR tree-optimization/62021
1160         * omp-low.c (simd_clone_adjust_return_type): Use
1161         vector of pointer_sized_int_node types instead vector of pointer
1162         types.
1163         (simd_clone_adjust_argument_types): Likewise.
1165 2014-12-10  Jakub Jelinek  <jakub@redhat.com>
1166             Evgeny Stupachenko  <evstupac@gmail.com>
1168         PR target/64252
1169         * config/i386/i386.c (expand_vec_perm_pblendv): If not testing_p,
1170         set dcopy.target to a new pseudo.
1172 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1174         * config/rs6000/rs6000.md (*add<mode>3): Remove condition.
1176 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1178         * config/rs6000/40x.md (ppc403-compare): Remove "compare".
1179         config/rs6000/440.md (ppc440-compare): Remove "compare".
1180         config/rs6000/476.md (ppc476-compare): Remove "compare".
1181         config/rs6000/601.md (ppc601-compare): Remove "compare".
1182         config/rs6000/603.md (ppc603-compare): Remove "compare".
1183         config/rs6000/6xx.md (ppc604-compare): Remove "compare".
1184         config/rs6000/7450.md (ppc7450-compare): Remove "compare".
1185         config/rs6000/7xx.md (ppc750-compare): Remove "compare".
1186         config/rs6000/8540.md (ppc8540_su): Remove "compare".
1187         config/rs6000/cell.md (cell-fast-cmp, cell-cmp-microcoded): Remove
1188         "compare".
1189         config/rs6000/e300c2c3.md (ppce300c3_cmp): Remove "compare".
1190         config/rs6000/e500mc.md (e500mc_su): Remove "compare".
1191         config/rs6000/e500mc64.md (e500mc64_su2): Remove "compare".
1192         config/rs6000/e5500.md (e5500_sfx2): Remove "compare".
1193         config/rs6000/e6500.md (e6500_sfx2): Remove "compare".
1194         config/rs6000/mpc.md (mpccore-compare): Remove "compare".
1195         config/rs6000/power4.md (power4-compare): Remove "compare".
1196         config/rs6000/power5.md (power5-compare): Remove "compare".
1197         config/rs6000/power6.md (power6-compare): Remove "compare".
1198         config/rs6000/power7.md (power7-compare): Remove "compare".
1199         config/rs6000/power8.md (power8-compare): Remove "compare".  Update
1200         comment.
1201         config/rs6000/rs6000.c (rs6000_adjust_cost) <TYPE_COMPARE>: Remove
1202         (three times).
1203         (is_cracked_insn): Remove TYPE_COMPARE case.
1204         (insn_must_be_first_in_group) <TYPE_COMPARE>: Remove (twice).
1205         config/rs6000/rs6000.md (type): Remove "compare".
1206         (cell_micro): Remove "compare".
1207         config/rs6000/rs64.md (rs64a-compare): Remove "compare".
1209 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1211         * config/rs6000/rs6000.md (*anddi3_2rld_dot, *anddi3_rld_dot2):
1212         Change type from "compare" to "two".
1214 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1216         PR target/64180
1217         * config/rs6000/predicates.md (unsigned_comparison_operator): New.
1218         (signed_comparison_operator): New.
1219         * config/rs6000/rs6000-protos.h (rs6000_emit_eqne): Declare.
1220         * config/rs6000/rs6000.c (rs6000_emit_eqne): New function.
1221         (rs6000_emit_sCOND): Remove ISEL test (move it to the expander).
1222         * config/rs6000/rs6000.md (add<mode>3 for SDI): Expand DImode
1223         add to addc,adde directly, if !TARGET_POWERPC64.
1224         (sub<mode>3 for SDI): Expand DImode sub to subfc,subfe directly,
1225         if !TARGET_POWERPC64.
1226         (neg<mode>2): Delete expander.
1227         (*neg<mode>2): Rename to "neg<mode>2".
1228         (addti3, subti3): Delete.
1229         (addti3, subti3): New expanders.
1230         (*adddi3_noppc64, *subdi3_noppc64, *negdi2_noppc64): Delete.
1231         (cstore<mode>4_unsigned): New expander.
1232         (cstore<mode>4): Allow GPR as output (not just SI).  Rewrite.
1233         (cstore<mode>4 for FP): Remove superfluous quotes.
1234         (*eq<mode>, *eq<mode>_compare, *plus_eqsi and splitter,
1235         *compare_plus_eqsi and splitter, *plus_eqsi_compare and splitter,
1236         *neg_eq0<mode>, *neg_eq<mode>, *ne0_<mode>, plus_ne0_<mode>,
1237         compare_plus_ne0_<mode> and splitter, *compare_plus_ne0_<mode>_1 and
1238         splitter, *plus_ne0_<mode>_compare and splitter, *leu<mode>,
1239         *leu<mode>_compare and splitter, *plus_leu<mode>, *neg_leu<mode>,
1240         *and_neg_leu<mode>, *ltu<mode>, *ltu<mode>_compare, *plus_ltu<mode>,
1241         *plus_ltu<mode>_1, *plus_ltu<mode>compare, *neg_ltu<mode>, *geu<mode>,
1242         *geu<mode>_compare and splitter, *plus_geu<mode>, *neg_geu<mode>,
1243         *and_neg_geu<mode>, *plus_gt0<mode>, *gtu<mode>, *gtu<mode>_compare,
1244         *plus_gtu<mode>, *plus_gtu<mode>_1, *plus_gtu<mode>_compare,
1245         *neg_gtu<mode>, 12 anonymous insns, and 12 anonymous splitters):
1246         Delete.
1247         (eq<mode>3, ne<mode>3): New.
1248         (*neg_eq_<mode>, *neg_ne_<mode>): New.
1249         (*plus_eq_<mode>, *plus_ne_<mode>): New.
1250         (*minus_eq_<mode>, *minus_ne_<mode>): New.
1252 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1254         PR target/64180
1255         * config/rs6000/predicates.md (adde_operand): New.
1256         * config/rs6000/rs6000.md (add<mode>3_carry): New.
1257         (*add<mode>3_imm_carry_pos): New.
1258         (*add<mode>3_imm_carry_0): New.
1259         (*add<mode>3_imm_carry_m1): New.
1260         (*add<mode>3_imm_carry_neg): New.
1261         (add<mode>3_carry_in): New.
1262         (*add<mode>3_carry_in_internal): New.
1263         (add<mode>3_carry_in_0): New.
1264         (add<mode>3_carry_in_m1): New.
1265         (subf<mode>3_carry): New.
1266         (*subf<mode>3_imm_carry_0): New.
1267         (*subf<mode>3_imm_carry_m1): New.
1268         (subf<mode>3_carry_in): New.
1269         (*subf<mode>3_carry_in_internal): New.
1270         (subf<mode>3_carry_in_0): New.
1271         (subf<mode>3_carry_in_m1): New.
1272         (subf<mode>3_carry_in_xx): New.
1274 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1276         PR target/64180
1277         * config/rs6000/rs6000.md (*add<mode>3_internal1): Rename to
1278         "*add<mode>3".
1279         (*add<mode>3_internal2, *add<mode>3_internal3, and (their splitters):
1280         Delete.
1281         (*add<mode>3_dot, *add<mode>3_dot2): New.
1282         (*add<mode>3_imm_dot, *add<mode>3_imm_dot2): New.
1284 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1286         PR target/64180
1287         * config/rs6000/rs6000.md (*add<mode>3_internal1): Remove addic
1288         alternative.
1290 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1292         PR target/64180
1293         * config/rs6000/rs6000.md (*ctr<mode>_internal1, *ctr<mode>_internal2,
1294         *ctr<mode>_internal5, *ctr<mode>_internal6): Change "r" alternatives
1295         to "b".  Increase length.
1296         (splitters for these): Split to cmp+addi instead of addic.
1298 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1300         PR target/64180
1301         * config/rs6000/darwin.md (macho_low_si): Remove "r" alternative.
1302         (macho_low_di): Ditto.
1303         * config/rs6000/rs6000.md (*largetoc_low): Ditto.
1304         (tocref<mode>): Ditto.
1305         (elf_low): Ditto.
1306         * config/rs6000/spe.md (mov_si<mode>_e500_subreg0_elf_low_be): Ditto.
1307         (mov_si<mode>_e500_subreg0_elf_low_le): Ditto.
1308         (mov_si<mode>_e500_subreg4_elf_low_be): Ditto.  Reformat condition.
1309         (mov_si<mode>_e500_subreg4_elf_low_le): Ditto.
1311 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1313         PR target/64180
1314         * config/rs6000/rs6000.c (TARGET_MD_ASM_CLOBBERS): Define.
1315         (rs6000_md_asm_clobbers): New function.
1317 2014-12-10  Felix Yang  <felix.yang@huawei.com>
1319         * config/aarch64/aarch64-protos.h (aarch64_function_profiler): Remove
1320         declaration of removed function.
1322 2014-12-10  Richard Biener  <rguenther@suse.de>
1324         * tree-ssa-loop-im.c
1325         (move_computations_dom_walker::before_dom_children): Clear
1326         SSA_NAME_RANGE_INFO on moved stmts.
1328 2014-12-10  Martin Liska  <mliska@suse.cz>
1330         * sreal.c (sreal::shift_right): New implementation
1331         for int64_t as m_sig.
1332         (sreal::normalize): Likewise.
1333         (sreal::to_int): Likewise.
1334         (sreal::operator+): Likewise.
1335         (sreal::operator-): Likewise.
1336         (sreal::operator*): Likewise.
1337         (sreal::operator/): Likewise.
1338         (sreal::signedless_minus): Removed.
1339         (sreal::signedless_plus): Removed.
1340         (sreal::debug): const keyword is added.
1341         * sreal.h (sreal::operator<): New implementation
1342         for int64_t as m_sig.
1343         * ipa-inline.c (recursive_inlining): LONG_MIN is replaced
1344         with sreal::min ().
1346 2014-12-10  Martin Liska  <mliska@suse.cz>
1348         * gimple-iterator.h (gsi_start_bb_nondebug): New function.
1349         * ipa-icf-gimple.c (func_checker::compare_bb): Correct iteration
1350         replaces loop based on precomputed number of non-debug statements.
1352 2014-12-08  Alexander Ivchenko  <alexander.ivchenko@intel.com>
1354         * config/linux.c (linux_has_ifunc_p): Remove.
1355         * config/linux.h (TARGET_HAS_IFUNC_P): Use default version.
1357 2014-12-10  Mantas Mikaitis  <mantas.mikaitis@arm.com>
1359         * contrib/check_GNU_style.sh (col): Got rid of cut operation
1360         from the pipe chain and instead added cut inside awk command.
1362 2014-12-10  Richard Biener  <rguenther@suse.de>
1364         PR tree-optimization/64191
1365         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Do not
1366         mark clobbers as necessary.
1367         (eliminate_unnecessary_stmts): Keep clobbers live if we can.
1369 2014-12-10  Jakub Jelinek  <jakub@redhat.com>
1371         PR target/63594
1372         * config/i386/sse.md (vec_dupv4sf): Move after
1373         <mask_codefor><avx512>_vec_dup_gpr<mode><mask_name> pattern.
1374         (*vec_dupv4si, *vec_dupv2di): Likewise.
1375         (<mask_codefor><avx512>_vec_dup_mem<mode><mask_name>): Merge into ...
1376         (<mask_codefor><avx512>_vec_dup_gpr<mode><mask_name>): ... this
1377         pattern.
1378         (*vec_dup<mode> AVX2_VEC_DUP_MODE splitter): Disable for
1379         TARGET_AVX512VL (for QI/HI scalar modes only if TARGET_AVX512BW
1380         is set too).
1381         * config/i386/i386.c (enum ix86_builtins): Remove
1382         IX86_BUILTIN_PBROADCASTQ256_MEM_MASK,
1383         IX86_BUILTIN_PBROADCASTQ128_MEM_MASK and
1384         IX86_BUILTIN_PBROADCASTQ512_MEM.
1385         (bdesc_args): Use __builtin_ia32_pbroadcastq512_gpr_mask,
1386         __builtin_ia32_pbroadcastq256_gpr_mask and
1387         __builtin_ia32_pbroadcastq128_gpr_mask instead of *_mem_mask
1388         regardless of OPTION_MASK_ISA_64BIT.
1389         * config/i386/avx512fintrin.h (_mm512_set1_epi64,
1390         _mm512_mask_set1_epi64, _mm512_maskz_set1_epi64): Use *_gpr_mask
1391         builtins regardless of whether TARGET_64BIT is defined or not.
1392         * config/i386/avx512vlintrin.h (_mm256_mask_set1_epi64,
1393         _mm256_maskz_set1_epi64, _mm_mask_set1_epi64, _mm_maskz_set1_epi64):
1394         Likewise.
1396         * config/i386/sse.md (*mov<mode>_internal, *avx512f_gatherdi<mode>_2):
1397         Use <MODE_SIZE> instead of GET_MODE_SIZE (<MODE>mode).
1399 2014-12-10  Oleg Endo  <olegendo@gcc.gnu.org>
1401         PR target/53513
1402         * doc/extend.texi (__builtin_sh_set_fpscr): Fix typo.
1404 2014-12-10  Marek Polacek  <polacek@redhat.com>
1406         PR tree-optimization/61686
1407         * tree-ssa-reassoc.c (range_entry_cmp): Use q->high instead of
1408         p->high.
1410 2014-12-10  Kito Cheng  <kito@0xlab.org>
1412         * doc/libgcc.texi: Update text to match implementation in
1413         libgcc/libgcc2.c
1415 2014-12-09  Trevor Saunders  <tsaunders@mozilla.com>
1417         * plugin.c, plugin.def, ggc.h, ggc-common.c, gengtype.h, gengtype.c,
1418         gengtype-state.c, gengtype-parse.c, gentype-lex.l, gcc-plugin.h,
1419         doc/plugins.texi, doc/gty.texi: Remove support for if_marked and
1420         param_is.
1422 2014-12-10  Oleg Endo  <olegendo@gcc.gnu.org>
1424         PR target/53513
1425         * doc/extend.texi (__builtin_sh_get_fpscr, __builtin_sh_get_fpscr):
1426         Document it.
1428 2014-12-09  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
1430         PR middle-end/64225
1431         * tree-ssa-reassoc.c (acceptable_pow_call): Disable transformation
1432         for BUILT_IN_POW when flag_errno_math is present.
1434 2014-12-09  Ilya Verbin  <ilya.verbin@intel.com>
1436         * lto-wrapper.c (compile_offload_image): Start processing in_argv
1437         from 0 instead of 1.
1438         (run_gcc): Put offload objects into offload_argv, put LTO objects and
1439         possible preceding arguments into lto_argv.
1440         Pass offload_argv to compile_images_for_offload_targets instead of argv.
1441         Use lto_argv for LTO recompilation instead of argv.
1443 2014-12-09  Michael Haubenwallner <michael.haubenwallner@ssi-schaefer.com>
1445         * doc/install.texi: Describe --with-aix-soname option.
1447 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1449         * config/aarch64/aarch64-simd.md (aarch64_get_lanedi): Remove.
1451 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1453         PR target/63870
1454         * config/aarch64/aarch64-simd-builtins.def (be_checked_get_lane):
1455         Delete.
1456         * config/aarch64/aarch64-simd.md (aarch64_be_checked_get_lane<mode\>):
1457         Delete.
1458         * config/aarch64/arm_neon.h (aarch64_vget_lane_any): Use GCC
1459         vector extensions, __aarch64_lane, __builtin_aarch64_im_lane_boundsi.
1460         (__aarch64_vget_lane_f32, __aarch64_vget_lane_f64,
1461         __aarch64_vget_lane_p8, __aarch64_vget_lane_p16,
1462         __aarch64_vget_lane_s8, __aarch64_vget_lane_s16,
1463         __aarch64_vget_lane_s32, __aarch64_vget_lane_s64,
1464         __aarch64_vget_lane_u8, __aarch64_vget_lane_u16,
1465         __aarch64_vget_lane_u32, __aarch64_vget_lane_u64,
1466         __aarch64_vgetq_lane_f32, __aarch64_vgetq_lane_f64,
1467         __aarch64_vgetq_lane_p8, __aarch64_vgetq_lane_p16,
1468         __aarch64_vgetq_lane_s8, __aarch64_vgetq_lane_s16,
1469         __aarch64_vgetq_lane_s32, __aarch64_vgetq_lane_s64,
1470         __aarch64_vgetq_lane_u8, __aarch64_vgetq_lane_u16,
1471         __aarch64_vgetq_lane_u32, __aarch64_vgetq_lane_u64): Delete.
1472         (__aarch64_vdup_lane_any): Use __aarch64_vget_lane_any, remove
1473         'q2' argument.
1474         (__aarch64_vdup_lane_f32, __aarch64_vdup_lane_f64,
1475         __aarch64_vdup_lane_p8, __aarch64_vdup_lane_p16,
1476         __aarch64_vdup_lane_s8, __aarch64_vdup_lane_s16,
1477         __aarch64_vdup_lane_s32, __aarch64_vdup_lane_s64,
1478         __aarch64_vdup_lane_u8, __aarch64_vdup_lane_u16,
1479         __aarch64_vdup_lane_u32, __aarch64_vdup_lane_u64,
1480         __aarch64_vdup_laneq_f32, __aarch64_vdup_laneq_f64,
1481         __aarch64_vdup_laneq_p8, __aarch64_vdup_laneq_p16,
1482         __aarch64_vdup_laneq_s8, __aarch64_vdup_laneq_s16,
1483         __aarch64_vdup_laneq_s32, __aarch64_vdup_laneq_s64,
1484         __aarch64_vdup_laneq_u8, __aarch64_vdup_laneq_u16,
1485         __aarch64_vdup_laneq_u32, __aarch64_vdup_laneq_u64): Remove argument
1486         to __aarch64_vdup_lane_any.
1487         (vget_lane_f32, vget_lane_f64, vget_lane_p8, vget_lane_p16,
1488         vget_lane_s8, vget_lane_s16, vget_lane_s32, vget_lane_s64,
1489         vget_lane_u8, vget_lane_u16, vget_lane_u32, vget_lane_u64,
1490         vgetq_lane_f32, vgetq_lane_f64, vgetq_lane_p8, vgetq_lane_p16,
1491         vgetq_lane_s8, vgetq_lane_s16, vgetq_lane_s32, vgetq_lane_s64,
1492         vgetq_lane_u8, vgetq_lane_u16, vgetq_lane_u32, vgetq_lane_u64,
1493         vdupb_lane_p8, vdupb_lane_s8, vdupb_lane_u8, vduph_lane_p16,
1494         vduph_lane_s16, vduph_lane_u16, vdups_lane_f32, vdups_lane_s32,
1495         vdups_lane_u32, vdupb_laneq_p8, vdupb_laneq_s8, vdupb_laneq_u8,
1496         vduph_laneq_p16, vduph_laneq_s16, vduph_laneq_u16, vdups_laneq_f32,
1497         vdups_laneq_s32, vdups_laneq_u32, vdupd_laneq_f64, vdupd_laneq_s64,
1498         vdupd_laneq_u64, vfmas_lane_f32, vfma_laneq_f64, vfmad_laneq_f64,
1499         vfmas_laneq_f32, vfmss_lane_f32, vfms_laneq_f64, vfmsd_laneq_f64,
1500         vfmss_laneq_f32, vmla_lane_f32, vmla_lane_s16, vmla_lane_s32,
1501         vmla_lane_u16, vmla_lane_u32, vmla_laneq_f32, vmla_laneq_s16,
1502         vmla_laneq_s32, vmla_laneq_u16, vmla_laneq_u32, vmlaq_lane_f32,
1503         vmlaq_lane_s16, vmlaq_lane_s32, vmlaq_lane_u16, vmlaq_lane_u32,
1504         vmlaq_laneq_f32, vmlaq_laneq_s16, vmlaq_laneq_s32, vmlaq_laneq_u16,
1505         vmlaq_laneq_u32, vmls_lane_f32, vmls_lane_s16, vmls_lane_s32,
1506         vmls_lane_u16, vmls_lane_u32, vmls_laneq_f32, vmls_laneq_s16,
1507         vmls_laneq_s32, vmls_laneq_u16, vmls_laneq_u32, vmlsq_lane_f32,
1508         vmlsq_lane_s16, vmlsq_lane_s32, vmlsq_lane_u16, vmlsq_lane_u32,
1509         vmlsq_laneq_f32, vmlsq_laneq_s16, vmlsq_laneq_s32, vmlsq_laneq_u16,
1510         vmlsq_laneq_u32, vmul_lane_f32, vmul_lane_s16, vmul_lane_s32,
1511         vmul_lane_u16, vmul_lane_u32, vmuld_lane_f64, vmuld_laneq_f64,
1512         vmuls_lane_f32, vmuls_laneq_f32, vmul_laneq_f32, vmul_laneq_f64,
1513         vmul_laneq_s16, vmul_laneq_s32, vmul_laneq_u16, vmul_laneq_u32,
1514         vmulq_lane_f32, vmulq_lane_s16, vmulq_lane_s32, vmulq_lane_u16,
1515         vmulq_lane_u32, vmulq_laneq_f32, vmulq_laneq_f64, vmulq_laneq_s16,
1516         vmulq_laneq_s32, vmulq_laneq_u16, vmulq_laneq_u32) : Use
1517         __aarch64_vget_lane_any.
1519 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1521         PR target/63870
1522         * gcc/config/aarch64-builtins.c (aarch64_simd_expand_args): Update error
1523         message for SIMD_ARG_CONSTANT.
1525 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1527         PR target/63870
1528         * config/aarch64/aarch64-builtins.c (aarch64_types_binopv_qualifiers,
1529         TYPES_BINOPV): Delete.
1530         (enum aarch64_builtins): Add AARCH64_BUILTIN_SIMD_LANE_CHECK and
1531         AARCH64_SIMD_PATTERN_START.
1532         (aarch64_init_simd_builtins): Register
1533         __builtin_aarch64_im_lane_boundsi; use  AARCH64_SIMD_PATTERN_START.
1534         (aarch64_simd_expand_builtin): Handle AARCH64_BUILTIN_LANE_CHECK; use
1535         AARCH64_SIMD_PATTERN_START.
1537         * config/aarch64/aarch64-simd.md (aarch64_im_lane_boundsi): Delete.
1538         * config/aarch64/aarch64-simd-builtins.def (im_lane_bound): Delete.
1540         * config/aarch64/arm_neon.h (__AARCH64_LANE_CHECK): New.
1541         (__aarch64_vget_lane_f64, __aarch64_vget_lane_s64,
1542         __aarch64_vget_lane_u64, __aarch64_vset_lane_any, vdupd_lane_f64,
1543         vdupd_lane_s64, vdupd_lane_u64, vext_f32, vext_f64, vext_p8, vext_p16,
1544         vext_s8, vext_s16, vext_s32, vext_s64, vext_u8, vext_u16, vext_u32,
1545         vext_u64, vextq_f32, vextq_f64, vextq_p8, vextq_p16, vextq_s8,
1546         vextq_s16, vextq_s32, vextq_s64, vextq_u8, vextq_u16, vextq_u32,
1547         vextq_u64, vmulq_lane_f64): Use __AARCH64_LANE_CHECK.
1549 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1551         PR target/63950
1552         * config/aarch64/arm_neon.h (__AARCH64_NUM_LANES, __aarch64_lane *2):
1553         New.
1554         (aarch64_vset_lane_any): Redefine using previous, same for BE + LE.
1555         (vset_lane_f32, vset_lane_f64, vset_lane_p8, vset_lane_p16,
1556         vset_lane_s8, vset_lane_s16, vset_lane_s32, vset_lane_s64,
1557         vset_lane_u8, vset_lane_u16, vset_lane_u32, vset_lane_u64): Remove
1558         number of lanes.
1559         (vld1_lane_f32, vld1_lane_f64, vld1_lane_p8, vld1_lane_p16,
1560         vld1_lane_s8, vld1_lane_s16, vld1_lane_s32, vld1_lane_s64,
1561         vld1_lane_u8, vld1_lane_u16, vld1_lane_u32, vld1_lane_u64): Call
1562         __aarch64_vset_lane_any rather than vset_lane_xxx.
1564 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1566         * config/aarch64/aarch64.md (absdi2): Remove scratch operand by
1567         earlyclobbering result operand.
1569         * config/aarch64/aarch64-builtins.c (aarch64_types_unop_qualifiers):
1570         Remove final qualifier_internal.
1571         (aarch64_fold_builtin): Stop folding abs builtins, except on floats.
1573 2014-12-09  Wilco Dijkstra  <wilco.dijkstra@arm.com>
1575         * gcc/config/aarch64/aarch64-protos.h (tune-params): Add reasociation
1576         tuning parameters.
1577         * gcc/config/aarch64/aarch64.c (TARGET_SCHED_REASSOCIATION_WIDTH):
1578         Define.
1579         (aarch64_reassociation_width): New function.
1580         (generic_tunings): Add reassociation tuning parameters.
1581         (cortexa53_tunings): Likewise.
1582         (cortexa57_tunings): Likewise.
1583         (thunderx_tunings): Likewise.
1585 2014-12-09  Andrew Pinski  <apinski@cavium.com>
1586             Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
1588         * config/aarch64/aarch64.c (AARCH64_FUSE_CMP_BRANCH): New define.
1589         (thunderx_tunings): Add AARCH64_FUSE_CMP_BRANCH to fuseable_ops.
1590         (aarch_macro_fusion_pair_p): Handle AARCH64_FUSE_CMP_BRANCH.
1592 2014-12-09  David Malcolm  <dmalcolm@redhat.com>
1594         PR jit/64166
1595         * dumpfile.c (gcc::dump_manager::get_dump_file_info_by_switch):
1596         New function.
1597         (gcc::dump_manager::get_dump_file_name): Split out bulk of
1598         implementation into a new overloaded variant taking a
1599         dump_file_info *.
1600         * dumpfile.h (gcc::dump_manager::get_dump_file_info_by_switch):
1601         New function.
1602         (gcc::dump_manager::get_dump_file_name): New overloaded variant of
1603         this function, taking a dump_file_info *.
1605 2014-12-09  Uros Bizjak  <ubizjak@gmail.com>
1607         PR bootstrap/64213
1608         Revert:
1609         2014-11-28  H.J. Lu  <hongjiu.lu@intel.com>
1611         PR rtl-optimization/64037
1612         * combine.c (setup_incoming_promotions): Pass the argument
1613         before any promotions happen to promote_function_mode.
1615 2014-12-09  Richard Biener  <rguenther@suse.de>
1617         PR tree-optimization/64193
1618         * tree-ssa-alias.c (walk_non_aliased_vuses): Add valueize parameter
1619         and valueize the VUSE before looking up the def stmt.
1620         * tree-ssa-alias.h (walk_non_aliased_vuses): Adjust prototype.
1621         * tree-ssa-sccvn.c (vn_reference_lookup_pieces): Pass vn_valueize
1622         to walk_non_aliased_vuses.
1623         (vn_reference_lookup): Likewise.
1624         * tree-ssa-dom.c (lookup_avail_expr): Pass NULL as valueize
1625         callback to walk_non_aliased_vuses.
1627 2014-12-09  Richard Biener  <rguenther@suse.de>
1629         PR middle-end/64199
1630         * fold-const.c (fold_binary_loc): Use TREE_OVERFLOW_P.
1632 2014-12-09  Richard Biener  <rguenther@suse.de>
1634         PR tree-optimization/64191
1635         * tree-vect-stmts.c (vect_stmt_relevant_p): Clobbers are
1636         not relevant (nor are their uses).
1638 2014-12-09  Ilya Enkovich  <ilya.enkovich@intel.com>
1640         * lto/lto-partition.c (privatize_symbol_name): Correctly
1641         privatize instrumentation clones.
1643 2014-12-09  Ilya Enkovich  <ilya.enkovich@intel.com>
1645         * lto-cgraph.c (input_cgraph_1): Don't break existing
1646         instrumentation clone references.
1647         * lto/lto-symtab.c (lto_cgraph_replace_node): Redirect
1648         instrumented_version references appropriately.
1650 2014-12-09  Ilya Enkovich  <ilya.enkovich@intel.com>
1652         PR bootstrap/63995
1653         * tree-chkp.c (chkp_make_static_bounds): Share bounds var
1654         between nodes sharing assembler name.
1656 2014-12-08  Michael Meissner  <meissner@linux.vnet.ibm.com>
1658         PR target/64204
1659         * config/rs6000/rs6000.c (rs6000_emit_move): Do not split TFmode
1660         constant moves if -mupper-regs-df.
1662         * config/rs6000/rs6000.md (mov<mode>_64bit_dm): Optimize moving
1663         0.0L to TFmode.
1664         (movtd_64bit_nodm): Likewise.
1665         (mov<mode>_32bit, FMOVE128 case): Likewise.
1667 2014-12-08  Sandra Loosemore  <sandra@codesourcery.com>
1669         * simplify-rtx.c (simplify_relational_operation_1): Handle
1670         simplification identities for BICS patterns.
1672 2014-12-08  Trevor Saunders  <tsaunders@mozilla.com>
1674         * config/nvptx/nvptx.c: Convert htabs to hash_table.
1676 2014-12-08  David Edelsohn  <dje.gcc@gmail.com>
1678         PR target/64226
1679         * config/rs6000/rs6000.c (rs6000_secondary_reload_inner)
1680         [SYMBOL_REF]: Do not explicitly call create_TOC_reference for
1681         TARGET_TOC. Always use rs6000_emit_move.
1683 2014-12-08  Mark Wielaard  <mjw@redhat.com>
1685         PR debug/60782
1686         * dwarf2out.c (modified_type_die): Handle TYPE_QUAL_ATOMIC.
1688 2014-11-15  David Wohlferd <dw@LimeGreenSocks.com>
1690         PR target/61692
1691         * cfgexpand.c (expand_asm_operands): Count all inline asm params.
1693 2014-12-08  David Malcolm  <dmalcolm@redhat.com>
1695         PR jit/63854
1696         * cgraph.h (xstrdup_for_dump): New function.
1697         * cgraph.c (cgraph_node::get_create): Replace use of xstrdup
1698         within fprintf with xstrdup_for_dump.
1699         (cgraph_edge::make_speculative): Likewise.
1700         (cgraph_edge::resolve_speculation): Likewise.
1701         (cgraph_edge::redirect_call_stmt_to_callee): Likewise.
1702         (cgraph_node::dump): Likewise.
1703         * cgraphclones.c (symbol_table::materialize_all_clones): Likewise.
1704         * ipa-cp.c (perhaps_add_new_callers): Likewise.
1705         * ipa-inline.c (report_inline_failed_reason): Likewise.
1706         (want_early_inline_function_p): Likewise.
1707         (edge_badness): Likewise.
1708         (update_edge_key): Likewise.
1709         (flatten_function): Likewise.
1710         (inline_always_inline_functions): Likewise.
1711         * ipa-profile.c (ipa_profile): Likewise.
1712         * ipa-prop.c (ipa_print_node_jump_functions): Likewise.
1713         (ipa_make_edge_direct_to_target): Likewise.
1714         (remove_described_reference): Likewise.
1715         (propagate_controlled_uses): Likewise.
1716         * ipa-utils.c (ipa_merge_profiles): Likewise.
1718 2014-12-08  Bernd Edlinger  <bernd.edlinger@hotmail.de>
1720         PR ipa/64049
1721         * ipa-polymorphic-call.c
1722         (pa_polymorphic_call_context::ipa_polymorphic_call): Allow RESULT_DECL.
1724 2014-12-08  Alex Velenko  <Alex.Velenko@arm.com>
1726         * config/aarch64/aarch64.md (and_one_cmpl<mode>3_compare0_no_reuse):
1727         New define_insn.
1728         * (and_one_cmpl_<SHIFT:optab><mode>3_compare0_no_reuse):
1729         Likewise.
1731 2014-12-08  Felix Yang  <felix.yang@huawei.com>
1732             Haijian Zhang  <z.zhanghaijian@huawei.com>
1733             Jiji Jiang  <jiangjiji@huawei.com>
1734             Pengfei Sui  <suipengfei@huawei.com>
1736         * config/aarch64/arm_neon.h (vrecpe_u32, vrecpeq_u32): Rewrite using
1737         builtin functions.
1738         (vfma_f32, vfmaq_f32, vfmaq_f64, vfma_n_f32, vfmaq_n_f32, vfmaq_n_f64,
1739         vfms_f32, vfmsq_f32, vfmsq_f64): Likewise.
1740         (vhsub_s8, vhsub_u8, vhsub_s16, vhsub_u16, vhsub_s32, vhsub_u32,
1741         vhsubq_s8, vhsubq_u8, vhsubq_s16, vhsubq_u16, vhsubq_s32, vhsubq_u32,
1742         vsubhn_s16, vsubhn_u16, vsubhn_s32, vsubhn_u32, vsubhn_s64, vsubhn_u66,
1743         vrsubhn_s16, vrsubhn_u16, vrsubhn_s32, vrsubhn_u32, vrsubhn_s64,
1744         vrsubhn_u64, vsubhn_high_s16, vsubhn_high_u16, vsubhn_high_s32,
1745         vsubhn_high_u32, vsubhn_high_s64, vsubhn_high_u64, vrsubhn_high_s16,
1746         vrsubhn_high_u16, vrsubhn_high_s32, vrsubhn_high_u32, vrsubhn_high_s64,
1747         vrsubhn_high_u64): Likewise.
1748         * config/aarch64/iterators.md (VDQ_SI): New mode iterator.
1749         * config/aarch64/aarch64.md (define_c_enum "unspec"): Add UNSPEC_URECPE.
1750         * config/aarch64/aarch64-simd.md (aarch64_urecpe<mode>): New pattern.
1751         * config/aarch64/aarch64-simd-builtins.def (shsub, uhsub, subhn, rsubhn,
1752         subhn2, rsubhn2, urecpe): New builtins.
1754 2014-12-08  Ilya Tocar  <ilya.tocar@intel.com>
1756         * config/i386/i386.c (ix86_expand_vec_perm_vpermi2): Handle v64qi.
1757         * config/i386/sse.md (VEC_PERM_AVX2): Add v64qi.
1759 2014-12-08  Ilya Tocar  <ilya.tocar@intel.com>
1761         * config/i386/i386.c (expand_vec_perm_broadcast_1): Handle v64qi.
1762         (expand_vec_perm_vpermi2_vpshub2): New.
1763         (ix86_expand_vec_perm_const_1): Use it.
1764         (ix86_vectorize_vec_perm_const_ok): Handle v64qi.
1765         * config/i386/sse.md (VEC_PERM_CONST): Add v64qi.
1767 2014-12-08  Ilya Enkovich  <ilya.enkovich@intel.com>
1769         * tree-chkp.c (chkp_build_returned_bound): Don't predict
1770         return bounds for strchr calls.
1772 2014-12-08  Ilya Enkovich  <ilya.enkovich@intel.com>
1774         * tree-chkp.c (chkp_call_returns_bounds_p): New.
1775         (chkp_build_returned_bound): Use zero bounds as
1776         returned by calls not returning bounds.
1778 2014-12-08  Richard Biener  <rguenther@suse.de>
1780         * builtins.c (fold_builtin_0): Remove unused ignore parameter.
1781         (fold_builtin_1): Likewise.
1782         (fold_builtin_3): Likewise.
1783         (fold_builtin_varargs): Likewise.
1784         (fold_builtin_2): Likewise.  Do not fold stpcpy here.
1785         (fold_builtin_n): Adjust.
1786         (fold_builtin_stpcpy): Move to gimple-fold.c.
1787         (gimple_fold_builtin_stpcpy): Moved and gimplified from builtins.c.
1788         (gimple_fold_builtin): Fold stpcpy here.
1790 2014-12-07  Trevor Saunders  <tsaunders@mozilla.com>
1792         * symtab.c (symtab_node::verify): Check for section attribute before
1793         asserting something isn't in a section and a comdat group.
1795 2014-12-07  Oleg Endo  <olegendo@gcc.gnu.org>
1797         PR target/50751
1798         * config/sh/sh.md (extendqihi2): Allow only for TARGET_SH1.
1800 2014-12-07  Eric Botcazou  <ebotcazou@adacore.com>
1802         * compare-elim.c: Fix head comment.
1803         (conforming_compare): Remove redundant test.
1804         (can_eliminate_compare): New function extracted from...
1805         (before_dom_children): ...here.  Use it, replace direct uses of
1806         flag_non_call_exceptions and tidy up.
1807         (maybe_select_cc_mode): Tidy up.
1809 2014-12-07  Felix Yang  <felix.yang@huawei.com>
1810             Shanyao Chen  <chenshanyao@huawei.com>
1812         * config/aarch64/aarch64-simd.md (clrsb<mode>2, popcount<mode>2): New
1813         patterns.
1814         * config/aarch64/aarch64-simd-builtins.def (clrsb, popcount): New
1815         builtins.
1816         * config/aarch64/arm_neon.h (vcls_s8, vcls_s16, vcls_s32, vclsq_s8,
1817         vclsq_s16, vclsq_s32, vcnt_p8, vcnt_s8, vcnt_u8, vcntq_p8, vcntq_s8,
1818         vcntq_u8): Rewrite using builtin functions.
1820 2014-12-07  Jan Hubicka  <hubicka@ucw.cz>
1822         * symtab.c (symtab_node::equal_address_to): New function.
1823         * cgraph.h (symtab_node::equal_address_to): Declare.
1824         * fold-const.c (fold_comparison, fold_binary_loc): Use it.
1825         * c-family/c-common.c: Refuse weaks for symbols that can not change
1826         visibility.
1828 2014-12-07  Jonathan Wakely  <jwakely@redhat.com>
1830         * doc/invoke.texi (Warning Options): Fix spelling and grammar.
1832 2014-12-06  James Greenhalgh  <james.greenhalgh@arm.com>
1833             Sebastian Pop  <s.pop@samsung.com>
1834             Brian Rzycki  <b.rzycki@samsung.com>
1836         PR tree-optimization/54742
1837         * params.def (max-fsm-thread-path-insns, max-fsm-thread-length,
1838         max-fsm-thread-paths): New.
1840         * doc/invoke.texi (max-fsm-thread-path-insns, max-fsm-thread-length,
1841         max-fsm-thread-paths): Documented.
1843         * tree-cfg.c (split_edge_bb_loc): Export.
1844         * tree-cfg.h (split_edge_bb_loc): Declared extern.
1846         * tree-ssa-threadedge.c (simplify_control_stmt_condition): Restore the
1847         original value of cond when simplification fails.
1848         (fsm_find_thread_path): New.
1849         (fsm_find_control_statement_thread_paths): New.
1850         (thread_through_normal_block): Call find_control_statement_thread_paths.
1852         * tree-ssa-threadupdate.c (dump_jump_thread_path): Pretty print
1853         EDGE_FSM_THREAD.
1854         (verify_seme): New.
1855         (duplicate_seme_region): New.
1856         (thread_through_all_blocks): Generate code for EDGE_FSM_THREAD edges
1857         calling duplicate_seme_region.
1859         * tree-ssa-threadupdate.h (jump_thread_edge_type): Add EDGE_FSM_THREAD.
1861 2014-12-06  H.J. Lu  <hongjiu.lu@intel.com>
1863         PR target/64200
1864         * config/i386/i386.c (decide_alg): Don't assert "alg != libcall"
1865         for TARGET_INLINE_STRINGOPS_DYNAMICALLY.
1867 2014-12-05  Jakub Jelinek  <jakub@redhat.com>
1869         PR sanitizer/64170
1870         * sanopt.c (maybe_optimize_asan_check_ifn): If base_checks is
1871         non-NULL, call maybe_get_dominating_check on it even if g is
1872         non-NULL.
1874 2014-12-05  Jeff Law  <law@redhat.com>
1876         * doc/md.texi: Note problems using function calls to determine
1877         insn lengths and point readers to a potential workaround.
1879 2014-12-05  Andreas Schwab  <schwab@linux-m68k.org>
1881         * combine.c (is_parallel_of_n_reg_sets)
1882         (can_split_parallel_of_n_reg_sets): Only define if !HAVE_cc0.
1884 2014-12-05  Andrew Pinski  <apinski@cavium.com>
1886         * config/aarch64/aarch64-simd-builtins.def (bswap): Use CF2 rather
1887         than CF10 so 2 is appended on the code.
1888         * config/aarch64/aarch64-simd.md (bswap<mode>): Rename to ...
1889         (bswap<mode>2): This so it matches for the optabs.
1891 2014-12-05  Thomas Preud'homme  <thomas.preudhomme@arm.com>
1893         * regrename.c (find_best_rename_reg): Rename to ...
1894         (find_rename_reg): This. Also add a parameter to skip tick check.
1895         * regrename.h: Likewise.
1896         * config/c6x/c6x.c (try_rename_operands): Adapt to above renaming.
1898 2014-12-05  Martin Jambor  <mjambor@suse.cz>
1900         PR ipa/64192
1901         * ipa-prop.c (ipa_compute_jump_functions_for_edge): Convert alignment
1902         from bits to bytes after checking they are byte-aligned.
1904 2014-12-05  Renlin Li  <renlin.li@arm.com>
1906         * config/aarch64/aarch64-opts.h (AARCH64_CORE): Rename IDENT to SCHED.
1907         * config/aarch64/aarch64.h (AARCH64_CORE): Likewise.
1908         * config/aarch64/aarch64.c (AARCH64_CORE): Rename X to IDENT,
1909         IDENT to SCHED.
1911 2014-12-05  Bin Cheng  <bin.cheng@arm.com>
1913         * config/aarch64/aarch64.md (load_pair<mode>): Split to
1914         load_pairsi, load_pairdi, load_pairsf and load_pairdf.
1915         (load_pairsi, load_pairdi, load_pairsf, load_pairdf): Split
1916         from load_pair<mode>.  New alternative to support int/fp
1917         registers in fp/int mode patterns.
1918         (store_pair<mode>:): Split to store_pairsi, store_pairdi,
1919         store_pairsf and store_pairdi.
1920         (store_pairsi, store_pairdi, store_pairsf, store_pairdf): Split
1921         from store_pair<mode>.  New alternative to support int/fp
1922         registers in fp/int mode patterns.
1923         (*load_pair_extendsidi2_aarch64): New pattern.
1924         (*load_pair_zero_extendsidi2_aarch64): New pattern.
1925         (aarch64-ldpstp.md): Include.
1926         * config/aarch64/aarch64-ldpstp.md: New file.
1927         * config/aarch64/aarch64-protos.h (aarch64_gen_adjusted_ldpstp):
1928         New.
1929         (extract_base_offset_in_addr): New.
1930         (aarch64_operands_ok_for_ldpstp): New.
1931         (aarch64_operands_adjust_ok_for_ldpstp): New.
1932         * config/aarch64/aarch64.c (enum sched_fusion_type): New enum.
1933         (TARGET_SCHED_FUSION_PRIORITY): New hook.
1934         (fusion_load_store): New functon.
1935         (extract_base_offset_in_addr): New function.
1936         (aarch64_gen_adjusted_ldpstp): New function.
1937         (aarch64_sched_fusion_priority): New function.
1938         (aarch64_operands_ok_for_ldpstp): New function.
1939         (aarch64_operands_adjust_ok_for_ldpstp): New function.
1941 2014-12-05  Olivier Hainque  <hainque@adacore.com>
1943         * defaults.h: (DWARF_REG_TO_UNWIND_COLUMN): Define default.
1944         * dwarf2cfi.c (init_one_dwarf_reg_size): Honor
1945         DWARF_REG_TO_UNWIND_COLUMN.
1947 2014-12-05  Olivier Hainque  <hainque@adacore.com>
1949         * dwarf2cfi.c (init_one_dwarf_reg_size): New helper, processing
1950         one particular reg for expand_builtin_init_dwarf_reg_sizes.
1951         (expand_builtin_init_dwarf_reg_sizes): Rework to use helper and
1952         account for dwarf register spans.
1954 2014-12-05  Ilya Enkovich  <ilya.enkovich@intel.com>
1956         PR target/64003
1957         * config/i386/i386.md (*jcc_1_bnd): New.
1958         (*jcc_2_bnd): New.
1959         (jump_bnd): New.
1960         (*jcc_1): Remove bnd prefix.
1961         (*jcc_2): Likewise.
1962         (jump): Likewise.
1964 2014-12-05  Renlin Li  <renlin.li@arm.com>
1966         * config/aarch64/aarch64.c (aarch64_parse_cpu): Don't define
1967         selected_tune.
1968         (aarch64_override_options): Use selected_cpu's tuning.
1970 2014-12-05  David Edelsohn  <dje.gcc@gmail.com>
1972         * config/rs6000/xcoff.h (ASM_OUTPUT_ALIGNED_LOCAL): Append
1973         alignment to section name. Increase default alignment to word.
1975 2014-12-05  Martin Jambor  <mjambor@suse.cz>
1977         * cgraph.h (cgraph_node): New method expand_all_artificial_thunks.
1978         (cgraph_edge): New method redirect_callee_duplicating_thunks.
1979         * cgraphclones.c (duplicate_thunk_for_node): Donot expand newly
1980         created thunks.
1981         (redirect_edge_duplicating_thunks): Turned into edge method
1982         redirect_callee_duplicating_thunks.
1983         (cgraph_node::expand_all_artificial_thunks): New method.
1984         (create_clone): Call expand_all_artificial_thunks.
1985         * ipa-cp.c (perhaps_add_new_callers): Call
1986         redirect_callee_duplicating_thunks instead of redirect_callee.
1987         Also call expand_all_artificial_thunks.
1989 2014-12-05  Ilya Enkovich  <ilya.enkovich@intel.com>
1991         PR target/64056
1992         * doc/sourcebuild.texi: Add mempcpy and stpcpy for Effective-Target
1993         Keywords.
1995 2014-12-05  Manuel López-Ibáñez  <manu@gcc.gnu.org>
1997         * diagnostic.h (diagnostic_expand_location): New inline function.
1998         * diagnostic.c (diagnostic_build_prefix): Use it.
1999         (diagnostic_show_locus): Likewise.
2001 2014-12-04  H.J. Lu  <hongjiu.lu@intel.com>
2003         PR bootstrap/64189
2004         * configure.ac (HAVE_LD_PIE_COPYRELOC): Always define.
2005         * configure: Regenerated.
2007 2014-12-04  Manuel López-Ibáñez  <manu@gcc.gnu.org>
2009         * diagnostic.c (diagnostic_color_init): New.
2010         * diagnostic.h: Declare.
2011         * gcc.c (driver::global_initializations): Use it.
2012         (driver_handle_option): Handle -fdiagnostics-color_.
2013         * toplev.c: Do not include diagnostic-color.h.
2014         (process_options): Do not initialize color diagnostics here.
2015         * common.opt (fdiagnostics-color=): Add Driver.
2016         * opts-global.c (init_options_once): Initialize color here.
2017         * opts.c (common_handle_option): Use diagnostics_color_init.
2018         * diagnostic-color.h: Fix comment.
2020 2014-12-04  David Malcolm  <dmalcolm@redhat.com>
2022         * tree-pretty-print.c (INDENT): Rename "buffer" to "pp".
2023         (NIY): Likewise.
2024         (buffer): Rename this variable to...
2025         (tree_pp): ...this.
2027         (do_niy): Rename param from "buffer" to "pp".
2028         (dump_decl_name): Likewise.
2029         (dump_function_name): Likewise.
2030         (dump_function_declaration): Likewise.
2031         (dump_array_domain): Likewise.
2032         (dump_omp_clause): Likewise.
2033         (dump_omp_clauses): Likewise.
2034         (dump_location): Likewise.
2035         (dump_block_node): Likewise.
2036         (dump_generic_node): Likewise.
2037         (print_declaration): Likewise.
2038         (print_struct_decl): Likewise.
2039         (print_call_name): Likewise.
2040         (pretty_print_string): Likewise.
2041         (newline_and_indent): Likewise.
2043         (print_generic_decl): Update for renaming of "buffer" to
2044         "tree_pp".
2045         (print_generic_stmt): Likewise.
2046         (print_generic_stmt_indented): Likewise.
2047         (print_generic_expr): Likewise.
2048         (maybe_init_pretty_print): Likewise.
2050 2014-12-04  David Malcolm  <dmalcolm@redhat.com>
2052         PR jit/63854
2053         * tree-pretty-print.c: Eliminate include of <new>.
2054         (buffer): Convert this variable from a pretty_printer to a
2055         pretty_printer *.
2056         (initialized): Eliminate this variable in favor of the NULL-ness
2057         of "buffer".
2058         (print_generic_decl): Update for "buffer" becoming a pointer.
2059         (print_generic_stmt): Likewise.
2060         (print_generic_stmt_indented): Likewise.
2061         (print_generic_expr): Likewise.
2062         (maybe_init_pretty_print): Likewise, allocating "buffer" on the
2063         heap and using its non-NULL-ness to ensure idempotency.
2065 2014-12-04  David Malcolm  <dmalcolm@redhat.com>
2067         PR jit/63854
2068         * ipa-prop.c (ipa_register_cgraph_hooks): Guard insertion of
2069         ipa_add_new_function on function_insertion_hook_holder being
2070         non-NULL.
2071         * ipa-reference.c (ipa_reference_c_finalize): Remove
2072         node_removal_hook_holder and node_duplication_hook_holder if
2073         they've been added to symtab.
2074         * toplev.c (toplev::finalize): Call ipa_reference_c_finalize
2075         before cgraph_c_finalize so that the former can access "symtab".
2077 2014-12-04  David Malcolm  <dmalcolm@redhat.com>
2079         * doc/cfg.texi (GIMPLE statement iterators): Add note about
2080         gphi_iterator, and use one in the example.
2081         * doc/gimple.texi (Tuple specific accessors): Add missing
2082         GIMPLE_GOTO section and menu item.
2083         (gimple_build_asm, gimple gimple_build_assign_with_ops)
2084         gimple_call_mark_uninlinable, gimple_call_cannot_inline_p): Remove
2085         description of removed functions.
2086         (gimple_build_assign, gimple_build_bind, gimple_build_call,
2087         gimple_build_call_from_tree, gimple_build_call_vec,
2088         gimple_build_catch, gimple_build_cond,
2089         gimple_build_cond_from_tree, gimple_build_debug_bind,
2090         gimple_build_eh_filter, gimple_build_label, gimple_build_goto,
2091         gimple_build_omp_atomic_load, gimple_build_omp_atomic_store,
2092         gimple_build_omp_continue, gimple_build_omp_critical,
2093         gimple_build_omp_for, gimple_build_omp_parallel,
2094         gimple_build_omp_sections, gimple_build_omp_single,
2095         gimple_build_return, gimple_build_resx, gimple_build_switch,
2096         gimple_build_try): Update return type within description to
2097         reflect changes in gimple.h to using gimple subclasses.
2098         (gimple_build_asm_vec): Update return type, params and
2099         description.
2100         (gimple_asm_ninputs): Update param.
2101         (gimple_asm_noutputs, gimple_asm_nclobbers, gimple_asm_input_op
2102         gimple_asm_set_input_op, gimple_asm_output_op
2103         gimple_asm_set_output_op, gimple_asm_clobber_op,
2104         gimple_asm_set_clobber_op, gimple_asm_string,
2105         gimple_asm_volatile_p, gimple_asm_set_volatile, gimple_bind_vars,
2106         gimple_bind_set_vars, gimple_bind_append_vars, gimple_bind_body,
2107         gimple_bind_set_body, gimple_bind_add_stmt, gimple_bind_add_seq,
2108         gimple_bind_block, gimple_bind_set_block, gimple_call_set_fn,
2109         gimple_call_return_type, gimple_call_set_chain,
2110         gimple_call_set_tail, gimple_call_tail_p,
2111         gimple_call_copy_skip_args, gimple_catch_types,
2112         gimple_catch_types_ptr, gimple_catch_handler,
2113         gimple_catch_set_types, gimple_catch_set_handler,
2114         gimple_cond_set_code, gimple_cond_set_lhs, gimple_cond_set_rhs,
2115         gimple_cond_true_label, gimple_cond_set_true_label,
2116         gimple_cond_set_false_label, gimple_cond_false_label,
2117         gimple_cond_make_false, gimple_cond_make_true,
2118         gimple_eh_filter_set_types, gimple_eh_filter_set_failure,
2119         gimple_eh_must_not_throw_fndecl,
2120         gimple_eh_must_not_throw_set_fndecl, gimple_label_label,
2121         gimple_label_set_label, gimple_goto_set_dest,
2122         gimple_omp_atomic_load_set_lhs, gimple_omp_atomic_load_lhs,
2123         gimple_omp_atomic_load_set_rhs, gimple_omp_atomic_load_rhs,
2124         gimple_omp_atomic_store_set_val, gimple_omp_atomic_store_val,
2125         gimple_omp_continue_control_def,
2126         gimple_omp_continue_control_def_ptr,
2127         gimple_omp_continue_set_control_def,
2128         gimple_omp_continue_control_use,
2129         gimple_omp_continue_control_use_ptr,
2130         gimple_omp_continue_set_control_use, gimple_omp_critical_name,
2131         gimple_omp_critical_name_ptr, gimple_omp_critical_set_name,
2132         gimple_omp_parallel_clauses_ptr, gimple_omp_parallel_set_clauses,
2133         gimple_omp_parallel_child_fn, gimple_omp_parallel_child_fn_ptr,
2134         gimple_omp_parallel_set_child_fn, gimple_omp_parallel_data_arg,
2135         gimple_omp_parallel_data_arg_ptr,
2136         gimple_omp_parallel_set_data_arg, gimple_omp_single_set_clauses,
2137         gimple_phi_set_result, gimple_phi_set_arg, gimple_resx_region,
2138         gimple_resx_set_region, gimple_return_retval,
2139         gimple_return_set_retval, gimple_switch_num_labels,
2140         gimple_switch_set_num_labels, gimple_switch_index,
2141         gimple_switch_set_index, gimple_switch_label,
2142         gimple_switch_set_label, gimple_switch_default_label,
2143         gimple_switch_set_default_label, gimple_try_set_eval,
2144         gimple_try_set_cleanup): Update initial param within description
2145         to reflect changes in gimple.h to using gimple subclasses.
2146         (Adding a new GIMPLE statement code): Update to reflect gimple
2147         statement subclassing.
2149 2014-12-04  Sriraman Tallam  <tmsriram@google.com>
2150             H.J. Lu  <hongjiu.lu@intel.com>
2152         * configure.ac (HAVE_LD_PIE_COPYRELOC): Defined to 1 if
2153         Linux/x86-64 linker supports PIE with copy reloc.
2154         * config.in: Regenerated.
2155         * configure: Likewise.
2157         * config/i386/i386.c (legitimate_pic_address_disp_p): Allow
2158         pc-relative address for undefined, non-weak, non-function
2159         symbol reference in 64-bit PIE if linker supports PIE with
2160         copy reloc.
2162         * doc/sourcebuild.texi: Document pie_copyreloc target.
2164 2014-12-04  Marek Polacek  <polacek@redhat.com>
2166         PR middle-end/56917
2167         * fold-const.c (fold_unary_loc): Perform the negation in A's type
2168         when transforming ~ (A - 1) or ~ (A + -1) to -A.
2170 2014-12-04  Tobias Burnus  <burnus@net-b.de>
2172         * Makefile.in: Remove CLOOGLIB and CLOOGINC.
2174 2014-12-04  Richard Biener  <rguenther@suse.de>
2176         * doc/match-and-simplify.texi: Update for recent changes.
2178 2014-12-04  Martin Jambor  <mjambor@suse.cz>
2180         * ipa-prop.h (ipa_alignment): New type.
2181         (ipa_jump_func): New field alignment.
2182         (ipcp_transformation_summary) New type.
2183         (ipcp_grow_transformations_if_necessary): Declare.
2184         (ipa_node_agg_replacements): Removed.
2185         (ipcp_transformations): Declare.
2186         (ipcp_get_transformation_summary): New function.
2187         (ipa_get_agg_replacements_for_node): Use it.
2188         * ipa-cp.c (ipcp_param_lattices): New field alignment.
2189         (print_all_lattices): Also print alignment.
2190         (alignment_bottom_p): New function.
2191         (set_alignment_to_bottom): Likewise.
2192         (set_all_contains_variable): Also set alignment to bottom.
2193         (initialize_node_lattices): Likewise.
2194         (propagate_alignment_accross_jump_function): New function.
2195         (propagate_constants_accross_call): Call it.
2196         (ipcp_store_alignment_results): New function.
2197         (ipcp_driver): Call it.
2198         * ipa-prop.c (ipa_node_agg_replacements): Removed.
2199         (ipcp_transformations): New.
2200         (ipa_print_node_jump_functions_for_edge): Also print alignment.
2201         (ipa_set_jf_unknown): New function.
2202         (detect_type_change_from_memory_writes): Use ipa_set_jf_unknown.
2203         (ipa_compute_jump_functions_for_edge): Also calculate alignment.
2204         (update_jump_functions_after_inlining): Use ipa_set_jf_unknown.
2205         (ipcp_grow_transformations_if_necessary): New function.
2206         (ipa_set_node_agg_value_chain): Use ipcp_transformations.
2207         (ipa_node_removal_hook): Likewise.
2208         (ipa_node_duplication_hook): Also duplicate alignment results.
2209         (ipa_write_jump_function): Also stream alignments.
2210         (ipa_read_jump_function): Use ipa_set_jf_unknown, also stream
2211         alignments.
2212         (write_agg_replacement_chain): Renamed to
2213         write_ipcp_transformation_info, also stream alignments.
2214         (read_agg_replacement_chain): Renamed to
2215         read_ipcp_transformation_info, also stream alignments.
2216         (ipa_prop_write_all_agg_replacement): Renamed to
2217         ipcp_write_transformation_summaries. Stream always.
2218         (ipa_prop_read_all_agg_replacement): Renamed to
2219         ipcp_read_transformation_summaries.
2220         (ipcp_update_alignments): New function.
2221         (ipcp_transform_function): Call it, free also alignments.
2223 2014-12-04  Richard Biener  <rguenther@suse.de>
2225         * gimple-fold.c (replace_stmt_with_simplification): Properly
2226         fail when maybe_push_res_to_seq fails.
2228 2014-12-04 Ganesh Gopalasubramanian  <Ganesh.Gopalasubramanian@amd.com>
2230         * config/aarch64/aarch64.md (define_insn "prefetch"): New.
2232 2014-12-04  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
2234         * doc/install.texi: Remove mentions of cloog and ppl.
2235         * doc/invoke.texi: Likewise
2237 2014-12-04  Jakub Jelinek  <jakub@redhat.com>
2239         PR c++/56493
2240         * convert.c (convert_to_real, convert_to_expr, convert_to_complex):
2241         Handle COMPOUND_EXPR.
2243 2014-12-04  Richard Biener  <rguenther@suse.de>
2245         * builtins.c (target_newline): Export.
2246         (target_percent_s_newline): Likewise.
2247         (fold_builtin_1): Do not fold printf functions here.
2248         (fold_builtin_2): Likewise.
2249         (fold_builtin_3): Likewise, do not fold strncat.
2250         (fold_builtin_strncat): Move to gimple-fold.c.
2251         (fold_builtin_printf): Likewise.
2252         * builtins.h (target_newline): Declare.
2253         (target_percent_s_newline): Likewise.
2254         * gimple-fold.c (gimple_fold_builtin_strncat): Move from
2255         builtins.c and gimplify.
2256         (gimple_fold_builtin_printf): Likewise.
2257         (gimple_fold_builtin): Fold strncat, printf, printf_unlocked,
2258         vprintf, printf_chk and vprintf_chk here.
2260 2014-12-03  David Edelsohn  <dje.gcc@gmail.com>
2262         * config/rs6000/rs6000.md (floatsidf2_internal): Use std::swap.
2263         (floatunssidf2_internal): Same.
2264         * config/rs6000/rs6000.c (rs6000_emit_vector_compare): Same.
2265         (rs6000_emit_int_cmove): Same.
2266         (rs6000_sched_reorder): Same.
2267         (altivec_expand_vec_perm_const): Same.
2268         (rs6000_expand_vec_perm_const_1): Same.
2270 2014-12-03  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
2272         PR rtl-optimization/64010
2273         * reload.c (push_reload): Before reusing a register contained
2274         in an operand as input reload register, ensure that it is not
2275         used in CALL_INSN_FUNCTION_USAGE.
2277 2014-12-03  Ulrich Drepper  <drepper@gmail.com>
2279         * Makefile.in: Use $(LN_S) instead of $(LN) -s and remove file first
2280         if it exists.
2282 2014-12-03  Jakub Jelinek  <jakub@redhat.com>
2284         * expmed.c (expand_mult): Use std::swap.
2286         PR c/59708
2287         * expmed.c (expand_widening_mult): Return const0_rtx if
2288         coeff is 0.
2290         * doc/gimple.texi (gimple_build_assign_with_ops): Remove.
2291         (gimple_build_assign): Document the new overloads.
2293 2014-12-03  Michael Meissner  <meissner@linux.vnet.ibm.com>
2295         PR target/64019
2296         * config/rs6000/rs6000.c (rs6000_legitimize_reload_address): Do
2297         not create LO_SUM address for constant addresses if the type can
2298         go in Altivec registers.
2300 2014-12-03  Manuel López-Ibáñez  <manu@gcc.gnu.org>
2302         PR fortran/44054
2303         * pretty-print.c (output_buffer::output_buffer): Init flush_p to true.
2304         (pp_flush): Flush only if flush_p.
2305         (pp_really_flush): New.
2306         * pretty-print.h (struct output_buffer): Add flush_p.
2307         (pp_really_flush): Declare.
2309 2014-12-03  Jakub Jelinek  <jakub@redhat.com>
2311         * Makefile.in (ALL_HOST_BACKEND_OBJS): Add $(GENGTYPE_OBJS),
2312         gcc-ar.o, gcc-nm.o and gcc-ranlib.o.
2313         (GENGTYPE_OBJS): New.
2314         (gengtype-lex.o, gengtype-parse.o, gengtype-state.o, gengtype.o):
2315         Remove explicit dependencies.
2316         (CFLAGS-gengtype-lex.o, CFLAGS-gengtype-parse.o,
2317         CFLAGS-gengtype-state.o, CFLAGS-gengtype.o): Add -DHOST_GENERATOR_FILE
2318         instead of -DGENERATOR_FILE.
2319         (CFLAGS-errors.o): New.
2320         * gengtype.c: Instead of testing GENERATOR_FILE define, test
2321         HOST_GENERATOR_FILE.  If defined, include config.h and define
2322         GENERATOR_FILE afterwards, otherwise include bconfig.h.
2323         * gengtype-parse.c: Likewise.
2324         * gengtype-state.c: Likewise.
2325         * gengtype-lex.l: Likewise.
2326         * errors.c: Likewise.
2328 2014-12-03  Joern Rennecke  <joern.rennecke@embecosm.com>
2330         * config/epiphany/epiphany.c (epiphany_override_options):
2331         If TARGET_SOFT_CMPSF is not enabled, set flag_finite_math_only.
2332         * config/epiphany/epiphany.md (mov<mode>cc): Don't use
2333         reverse_condition_maybe_unordered if flag_finite_math_only is set.
2335 2014-12-03  Andrew Stubbs  <ams@codesourcery.com>
2337         Revert:
2339         2014-09-17  Andrew Stubbs  <ams@codesourcery.com>
2340         * config/arm/arm.c (arm_option_override): Reject -mfpu=neon
2341         when architecture is older than ARMv7.
2343 2014-12-03  Richard Biener  <rguenther@suse.de>
2345         * builtins.c (target_percent_c): Export.
2346         (fold_builtin_fprintf): Move to gimple-fold.c.
2347         (fold_builtin_2): Do not fold fprintf functions.
2348         (fold_builtin_3): Likewise.
2349         (fold_builtin_4): Remove.
2350         (fold_builtin_n): Do not call fold_builtin_4.
2351         * builtins.h (target_percent_c): Declare.
2352         * gimple-fold.c (gimple_fold_builtin_fprintf): Move from
2353         builtins.c and gimplify.
2354         (gimple_fold_builtin): Fold fprintf, fprintf_unlocked, vfprintf,
2355         fprintf_chk and vfprintf_chk here.
2357 2014-12-03  Martin Jambor  <mjambor@suse.cz>
2359         PR ipa/64153
2360         * ipa-inline-analysis.c (evaluate_conditions_for_known_args): Check
2361         type sizes before view_converting.
2363 2014-12-03  H.J. Lu  <hongjiu.lu@intel.com>
2365         PR rtl-optimization/64151
2366         PR rtl-optimization/64156
2367         * ira-costs.c (scan_one_insn): Revert r218266.
2369 2014-12-03  Richard Biener  <rguenther@suse.de>
2371         * builtins.c (fold_builtin_fpclassify): Change to take
2372         array of arguments instead of CALL_EXPR tree.
2373         (MAX_ARGS_TO_FOLD_BUILTIN): Remove.
2374         (fold_builtin_n): Dispatch to fold_builtin_varargs.
2375         (fold_call_expr): Always use fold_builtin_n.
2376         (fold_builtin_call_array): Change to not build the unfolded call,
2377         always use fold_builtin_n.
2378         (fold_builtin_varargs): Change to take array of arguments instead
2379         of CALL_EXPR tree.
2380         (fold_call_stmt): Always use fold_builtin_n.
2381         * tree.c (build_call_expr_loc_array): Use fold_build_call_array_loc.
2382         * fold-const.c (fold_build_call_array_loc): Build the call
2383         if fold_builtin_call_array returned NULL_TREE.
2384         * gimple-fold.c (gimple_fold_stmt_to_constant_1): Do not build
2385         a CALL_EXPR and use fold_builtin_call_array instead of
2386         fold_call_expr.
2388 2014-12-03  Alan Lawrence  <alan.lawrence@arm.com>
2390         * config/aarch64/aarch64-simd.md (aarch64_simd_dup<mode>, orn<mode>3,
2391         bic<mode>3, add<mode>3, sub<mode>3, neg<mode>2, abs<mode>2, and<mode>3,
2392         ior<mode>3, xor<mode>3, one_cmpl<mode>2,
2393         aarch64_simd_lshr<mode> ,arch64_simd_ashr<mode>,
2394         aarch64_simd_imm_shl<mode>, aarch64_simd_reg_sshl<mode>,
2395         aarch64_simd_reg_shl<mode>_unsigned, aarch64_simd_reg_shr<mode>_signed,
2396         ashl<mode>3, lshr<mode>3, ashr<mode>3, vashl<mode>3,
2397         reduc_plus_scal_<mode>, aarch64_vcond_internal<mode><mode>,
2398         vcondu<mode><mode>, aarch64_cm<optab><mode>, aarch64_cmtst<mode>):
2399         Change VDQ to VDQ_I.
2401         (mul<mode>3): Change VDQM to VDQ_BHSI.
2402         (aarch64_simd_vec_set<mode>,vashr<mode>3, vlshr<mode>3, vec_set<mode>,
2403         aarch64_mla<mode>, aarch64_mls<mode>, <su><maxmin><mode>3,
2404         aarch64_<sur>h<addsub><mode>): Change VQ_S to VDQ_BHSI.
2406         (*aarch64_<su>mlal<mode>, *aarch64_<su>mlsl<mode>,
2407         aarch64_<ANY_EXTEND:su><ADDSUB:optab>l<mode>,
2408         aarch64_<ANY_EXTEND:su><ADDSUB:optab>w<mode>, aarch64_<sur>shll_n<mode>):
2409         Change VDW to VD_BHSI.
2410         (*aarch64_combinez<mode>, *aarch64_combinez_be<mode>):
2411         Change VDIC to VD_BHSI.
2413         * config/aarch64/aarch64-simd-builtins.def (saddl, uaddl, ssubl, usubl,
2414         saddw, uaddw, ssubw, usubw, shadd, uhadd, srhadd, urhadd, sshll_n,
2415         ushll_n): Change BUILTIN_VDW to BUILTIN_VD_BHSI.
2417         * config/aarch64/iterators.md (SDQ_I, VDQ, VQ_S, VSDQ_I_BHSI, VDQM, VDW,
2418         VDIC, VDQQHS): Remove.
2419         (Vwtype): Update comment (changing VDW to VD_BHSI).
2421 2014-12-03  Richard Biener  <rguenther@suse.de>
2423         PR middle-end/14541
2424         * builtins.c (fold_builtin_logarithm): Implement simplifications ...
2425         * match.pd: ... here as patterns.
2427 2014-12-03  Prachi Godbole  <prachi.godbole@imgtec.com>
2429         * config/mips/p5600.md (define_automaton, define_cpu_unit): Replace
2430         p5600_agen_pipe and p5600_alu_pipe with p5600_agen_alq_pipe.
2431         (p5600_int_arith_1, p5600_int_arith_2, p5600_int_arith_4): Change
2432         reservation order.
2434 2014-12-03  Tom de Vries  <tom@codesourcery.com>
2436         PR rtl-optimization/63957
2437         * doc/invoke.texi: Replace -fuse-caller-save with -fipa-ra.
2438         * final.c (rest_of_handle_final): Replace flag_use_caller_save with
2439         flag_ipa_ra.
2440         (get_call_reg_set_usage): Same.
2441         * lra-assigns.c (lra_assign): Same.
2442         * lra-constraints.c (need_for_call_save_p): Same.
2443         * lra-lives.c (process_bb_lives): Same.
2444         * lra.c (lra): Same.
2445         * calls.c (expand_call): Same.
2446         (emit_library_call_value_1): Same.
2447         * config/arm/arm.c (arm_option_override): Same.
2448         * opts.c (default_options_table): Replace OPT_fuse_caller_save with
2449         OPT_fipa_ra.
2450         * target.def (call_fusage_contains_non_callee_clobbers): Replace
2451         fuse-caller-save with fipa-ra.
2452         * doc/tm.texi (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS): Same.
2453         * common.opt: Same.
2455 2014-12-03  Yury Gribov  <y.gribov@samsung.com>
2457         * sanopt.c (maybe_get_single_definition): New function.
2458         (maybe_get_dominating_check): Ditto.
2459         (can_remove_asan_check): Ditto.
2460         (struct tree_map_traits): New struct.
2461         (struct sanopt_ctx): Use custom traits for asan_check_map.
2462         (maybe_optimize_ubsan_null_ifn): Move code to
2463         maybe_get_dominating_check.
2464         (maybe_optimize_asan_check_ifn): Move code and take non-SSA expressions
2465         into account when optimizing.
2466         (sanopt_optimize_walker): Optimize ASan checks even when
2467         recovering.
2469 2014-12-03  Ilya Enkovich  <ilya.enkovich@intel.com>
2471         * config/i386/constraints.md (Yr): New.
2472         * config/i386/i386.h (reg_class): Add NO_REX_SSE_REGS.
2473         (REG_CLASS_NAMES): Likewise.
2474         (REG_CLASS_CONTENTS): Likewise.
2475         * config/i386/sse.md (*vec_concatv2sf_sse4_1): Add alternatives
2476         which use only NO_REX_SSE_REGS.
2477         (vec_set<mode>_0): Likewise.
2478         (*vec_setv4sf_sse4_1): Likewise.
2479         (sse4_1_insertps): Likewise.
2480         (*sse4_1_extractps): Likewise.
2481         (*sse4_1_mulv2siv2di3<mask_name>): Likewise.
2482         (*<sse4_1_avx2>_mul<mode>3<mask_name>): Likewise.
2483         (*sse4_1_<code><mode>3<mask_name>): Likewise.
2484         (*sse4_1_<code><mode>3): Likewise.
2485         (*sse4_1_eqv2di3): Likewise.
2486         (sse4_2_gtv2di3): Likewise.
2487         (*vec_extractv4si): Likewise.
2488         (*vec_concatv2si_sse4_1): Likewise.
2489         (vec_concatv2di): Likewise.
2490         (<sse4_1>_blend<ssemodesuffix><avxsizesuffix>): Likewise.
2491         (<sse4_1>_blendv<ssemodesuffix><avxsizesuffix>): Likewise.
2492         (<sse4_1>_dp<ssemodesuffix><avxsizesuffix>): Likewise.
2493         (<vi8_sse4_1_avx2_avx512>_movntdqa): Likewise.
2494         (<sse4_1_avx2>_mpsadbw): Likewise.
2495         (<sse4_1_avx2>packusdw<mask_name>): Likewise.
2496         (<sse4_1_avx2>_pblendvb): Likewise.
2497         (sse4_1_pblendw): Likewise.
2498         (sse4_1_phminposuw): Likewise.
2499         (sse4_1_<code>v8qiv8hi2<mask_name>): Likewise.
2500         (sse4_1_<code>v4qiv4si2<mask_name>): Likewise.
2501         (sse4_1_<code>v4hiv4si2<mask_name>): Likewise.
2502         (sse4_1_<code>v2qiv2di2<mask_name>): Likewise.
2503         (sse4_1_<code>v2hiv2di2<mask_name>): Likewise.
2504         (sse4_1_<code>v2siv2di2<mask_name>): Likewise.
2505         (sse4_1_ptest): Likewise.
2506         (<sse4_1>_round<ssemodesuffix><avxsizesuffix>): Likewise.
2507         (sse4_1_round<ssescalarmodesuffix>): Likewise.
2508         * config/i386/subst.md (mask_prefix4): New.
2509         * config/i386/x86-tune.def (X86_TUNE_AVOID_4BYTE_PREFIXES): New.
2511 2014-12-03  Segher Boessenkool  <segher@kernel.crashing.org>
2513         PR rtl-optimization/52714
2514         * combine.c (try_combine): Allow combining two insns into two
2515         new insns if at least one of those is a noop.
2517 2014-12-03  Bin Cheng  <bin.cheng@arm.com>
2519         * target.def (fusion_priority): Wrap code with @smallexample.
2520         * doc/tm.texi: Regenerated.
2522 2014-12-03  Manuel López-Ibáñez  <manu@gcc.gnu.org>
2524         * diagnostic.c (diagnostic_show_locus): Honor override_column when
2525         placing the caret.
2527 2014-12-02  Dmitry Vyukov  <dvyukov@google.com>
2529         * asan.c: (asan_finish_file): Use default priority for constructors
2530         in kernel mode.
2532 2014-12-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
2534         PR target/64115
2535         * config/rs6000/rs6000.c (rs6000_delegitimize_address): Remove
2536         invalid UNSPEC_TOCREL sanity check under ENABLE_CHECKING.
2538 2014-12-02  H.J. Lu  <hongjiu.lu@intel.com>
2540         PR target/64108
2541         * config/i386/i386.c (decide_alg): Stop only if there aren't
2542         any usable algorithms.
2544 2014-12-02  Tom de Vries  <tom@codesourcery.com>
2546         PR rtl-optimization/63718
2547         * config/arm/arm.c (arm_option_override): Disable fuse-caller-save for
2548         Thumb1.
2550 2014-12-02  Richard Biener  <rguenther@suse.de>
2552         * match.pd: When combining divisions exclude the degenerate
2553         case involving INT_MIN from overflow handling.
2555 2014-12-02  Wilco Dijkstra  <wilco.dijkstra@arm.com>
2557         * ira-costs.c (scan_one_insn): Improve spill cost adjustment.
2559 2014-12-02  Martin Jambor  <mjambor@suse.cz>
2561         PR ipa/63814
2562         * ipa-cp.c (same_node_or_its_all_contexts_clone_p): New function.
2563         (cgraph_edge_brings_value_p): New parameter dest, use
2564         same_node_or_its_all_contexts_clone_p and check availability.
2565         (cgraph_edge_brings_value_p): Likewise.
2566         (get_info_about_necessary_edges): New parameter dest, pass it to
2567         cgraph_edge_brings_value_p.  Update caller.
2568         (gather_edges_for_value): Likewise.
2569         (perhaps_add_new_callers): Use cgraph_edge_brings_value_p to check
2570         both the destination and availability.
2572 2014-12-02  Uros Bizjak  <ubizjak@gmail.com>
2574         PR target/64113
2575         * config/alpha/alpha.md (call_value_osf_tlsgd): Do not split insn
2576         using post-reload splitter.  Use peephole2 pass instead.
2577         (call_value_osf_tlsldm): Ditto.
2578         (TLS_CALL): New int iterator.
2579         (tls): New int attribute.
2580         (call_value_osf_<tls>): Merge insn pattern from call_value_osf_tlsgd
2581         and call_value_tlsldm using TLS_CALL int iterator.
2583 2014-12-02  Richard Biener  <rguenther@suse.de>
2584             Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
2586         * genmatch.c: Include hash-set.h.
2587         (fatal_at): Add source_location overload.
2588         (parser::record_operlist): New method.
2589         (parser::push_simplify): Likewise.
2590         (parser::oper_lists_set): New member.
2591         (parser::oper_lists): Likewise.
2592         (parser::parse_operation): Record seen operator list references.
2593         (parser::parse_c_expr): Likewise.
2594         (parser::parse_simplify): Init oper_lists_set and oper_lists
2595         and use push_simplify.
2596         (parser::parser): Init oper_lists_set and oper_lists.
2598 2014-12-02  Richard Biener  <rguenther@suse.de>
2600         * match.pd: Restrict division combining to trunc_div and
2601         exact_div.
2603 2014-12-02  Jakub Jelinek  <jakub@redhat.com>
2605         * config/sparc/sparc.c (sparc_atomic_assign_expand_fenv):
2606         Remove NULL last argument from create_tmp_var calls.
2607         * config/mips/mips.c (mips_atomic_assign_expand_fenv): Likewise.
2608         * config/arm/arm-builtins.c (arm_atomic_assign_expand_fenv): Likewise.
2609         * config/i386/i386.c (add_condition_to_bb,
2610         ix86_atomic_assign_expand_fenv): Likewise.
2611         * config/mep/mep.c (mep_gimplify_va_arg_expr): Likewise.
2612         * config/xtensa/xtensa.c (xtensa_gimplify_va_arg_expr): Likewise.
2613         * config/aarch64/aarch64-builtins.c
2614         (aarch64_atomic_assign_expand_fenv): Likewise.
2615         * config/stormy16/stormy16.c (xstormy16_gimplify_va_arg_expr):
2616         Likewise.
2617         * config/rs6000/rs6000.c (rs6000_atomic_assign_expand_fenv): Likewise.
2618         * config/alpha/alpha.c (alpha_atomic_assign_expand_fenv): Likewise.
2619         * config/sh/sh.c (sh_gimplify_va_arg_expr): Likewise.
2621         * config/alpha/alpha.c (alpha_gimple_fold_builtin): Use
2622         gimple_build_assign instead of gimple_build_assign_with_ops and swap
2623         the order of first two arguments.
2624         * config/aarch64/aarch64-builtins.c (aarch64_gimple_fold_builtin):
2625         Likewise.  Remove last NULL_TREE argument.
2627 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2629         PR rtl-optimization/59278
2630         * combine (reg_dead_at_p): Consider REG_UNUSED notes.
2632 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2634         * combine.c (try_combine): Use is_parallel_of_n_reg_sets some more.
2636 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2638         * combine.c (is_parallel_of_n_reg_sets): New function.
2639         (can_split_parallel_of_n_reg_sets): New function.
2640         (try_combine): If I2 is a PARALLEL of two SETs, split it into
2641         two insns if possible.
2643 2014-12-01  Tobias Burnus  <burnus@net-b.de>
2644             Jack Howarth  <howarth@bromo.med.uc.edu>
2646         PR middle-end/64017
2647         * configure.ac (ac_has_isl_schedule_constraints_compute_schedule):
2648         New check.
2649         * doc/install.texi (ISL): Permit ISL 0.14.
2650         * graphite-optimize-isl.c (getScheduleForBandList, optimize_isl):
2651         Conditionally use ISL 0.13+ functions.
2652         * graphite-interchange.c: Make 'extern "C"' conditional.
2653         * graphite-isl-ast-to-gimple.c: Ditto.
2654         * graphite-poly.c: Ditto.
2655         * graphite-sese-to-poly.c: Ditto.
2656         * config.in: Regenerate.
2657         * gcc/configure: Regenerate.
2659 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2661         * combine.c (distribute_links): Handle multiple SETs.
2663 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2665         * combine.c (struct insn_link): New field `regno'.
2666         (alloc_insn_link): New parameter `regno'.  Use it.
2667         (find_single_use): Check the new field.
2668         (can_combine_def_p, can_combine_use_p): New functions.  Split
2669         off from ...
2670         (create_log_links): ... here.  Correct data type of `regno'.
2671         Adjust call to alloc_insn_link.
2672         (adjust_for_new_dest): Find regno, use it in call to
2673         alloc_insn_link.
2674         (try_combine): Check reg_used_between_p when combining a PARALLEL
2675         as earlier insn.  Adjust call to alloc_insn_link.
2676         (distribute_links): Check the new field.
2678 2014-12-01  David Malcolm  <dmalcolm@redhat.com>
2680         PR jit/63854
2681         * real.c (real_from_string): Add missing mpfr_clear.
2683 2014-12-01  David Malcolm  <dmalcolm@redhat.com>
2685         PR jit/63854
2686         * tree-ssa-math-opts.c (execute_cse_sincos_1): Fix a missing
2687         release of stmts by converting it to an auto_vec.
2689 2014-12-01  Richard Biener  <rguenther@suse.de>
2691         * Makefile.in (gimple-match.o-warn): Use -Wno-unused instead of
2692         -Wno-unused-variable and -Wno-unused-but-set-variable to restore
2693         bootstrap with old GCC.
2694         (generic-match.o-warn): Likewise.
2696 2014-12-01  Richard Biener  <rguenther@suse.de>
2698         * fold-const.c (const_binop): Handle POINTER_PLUS_EXPR.
2699         Properly handle FIXED_CST shifts by INTEGER_CST.
2700         (const_binop): Move COMPLEX_EXPR, VEC_PACK_TRUNC_EXPR,
2701         VEC_PACK_FIX_TRUNC_EXPR, VEC_WIDEN_MULT_LO_EXPR,
2702         VEC_WIDEN_MULT_HI_EXPR, VEC_WIDEN_MULT_EVEN_EXPR and
2703         VEC_WIDEN_MULT_ODD_EXPR handling here from ...
2704         (fold_binary_loc): ... here.  Call const_binop overload
2705         with result type.
2707 2014-12-01  Marek Polacek  <polacek@redhat.com>
2708             Jakub Jelinek  <jakub@redhat.com>
2710         PR sanitizer/64121
2711         * ubsan.c (instrument_object_size): Stop searching if the base
2712         occurs in abnormal phi.
2714 2014-12-01  Marek Polacek  <polacek@redhat.com>
2716         PR sanitizer/63956
2717         * ubsan.c (is_ubsan_builtin_p): Check also built-in class.
2719 2014-12-01  Jakub Jelinek  <jakub@redhat.com>
2721         * gimple.h (gimple_build_assign_stat): Remove prototype.
2722         (gimple_build_assign): Remove define.  Add overload prototypes
2723         with tree lhs and either a tree rhs, or enum tree_code and
2724         1, 2 or 3 tree operands.
2725         * gimple.c (gimple_build_assign_stat): Renamed to...
2726         (gimple_build_assign): ... this.  Add overloads with
2727         enum tree_code and 1, 2 or 3 tree operands.
2728         (gimple_build_assign_with_ops): Remove 1 and 2 operand overloads.
2729         Rename the 3 operand overload to ...
2730         (gimple_build_assign_1): ... this.  Make it static inline.
2731         * tree-ssa-strlen.c (get_string_length): Use gimple_build_assign
2732         instead of gimple_build_assign_with_ops, swap the order of first
2733         two arguments and adjust formatting where necessary.
2734         * tree-vect-slp.c (vect_get_constant_vectors,
2735         vect_create_mask_and_perm): Likewise.
2736         * tree-ssa-forwprop.c (simplify_rotate): Likewise.
2737         * asan.c (build_shadow_mem_access, maybe_create_ssa_name,
2738         maybe_cast_to_ptrmode, asan_expand_check_ifn): Likewise.
2739         * tsan.c (instrument_builtin_call): Likewise.
2740         * tree-chkp.c (chkp_compute_bounds_for_assignment,
2741         chkp_generate_extern_var_bounds): Likewise.
2742         * tree-loop-distribution.c (generate_memset_builtin): Likewise.
2743         * tree-ssa-loop-im.c (rewrite_reciprocal): Likewise.
2744         * gimple-builder.c (build_assign, build_type_cast): Likewise.
2745         * tree-vect-loop-manip.c (vect_create_cond_for_align_checks): Likewise.
2746         * value-prof.c (gimple_divmod_fixed_value, gimple_mod_pow2,
2747         gimple_mod_subtract): Likewise.
2748         * gimple-match-head.c (maybe_push_res_to_seq): Likewise.
2749         * tree-vect-patterns.c (vect_recog_dot_prod_pattern,
2750         vect_recog_sad_pattern, vect_handle_widen_op_by_const,
2751         vect_recog_widen_mult_pattern, vect_recog_pow_pattern,
2752         vect_recog_widen_sum_pattern, vect_operation_fits_smaller_type,
2753         vect_recog_over_widening_pattern, vect_recog_widen_shift_pattern,
2754         vect_recog_rotate_pattern, vect_recog_vector_vector_shift_pattern,
2755         vect_recog_divmod_pattern, vect_recog_mixed_size_cond_pattern,
2756         adjust_bool_pattern_cast, adjust_bool_pattern,
2757         vect_recog_bool_pattern): Likewise.
2758         * gimple-ssa-strength-reduction.c (create_add_on_incoming_edge,
2759         insert_initializers, introduce_cast_before_cand,
2760         replace_one_candidate): Likewise.
2761         * tree-ssa-math-opts.c (insert_reciprocals, powi_as_mults_1,
2762         powi_as_mults, build_and_insert_binop, build_and_insert_cast,
2763         pass_cse_sincos::execute, bswap_replace, convert_mult_to_fma):
2764         Likewise.
2765         * tree-tailcall.c (adjust_return_value_with_ops,
2766         update_accumulator_with_ops): Likewise.
2767         * tree-predcom.c (reassociate_to_the_same_stmt): Likewise.
2768         * tree-ssa-reassoc.c (build_and_add_sum,
2769         optimize_range_tests_to_bit_test, update_ops,
2770         maybe_optimize_range_tests, rewrite_expr_tree, linearize_expr,
2771         negate_value, repropagate_negates, attempt_builtin_powi,
2772         reassociate_bb): Likewise.
2773         * tree-vect-loop.c (vect_is_simple_reduction_1,
2774         get_initial_def_for_induction, vect_create_epilog_for_reduction):
2775         Likewise.
2776         * ipa-split.c (split_function): Likewise.
2777         * tree-ssa-phiopt.c (conditional_replacement, minmax_replacement,
2778         abs_replacement, neg_replacement): Likewise.
2779         * tree-profile.c (gimple_gen_edge_profiler): Likewise.
2780         * tree-vrp.c (simplify_truth_ops_using_ranges,
2781         simplify_float_conversion_using_ranges,
2782         simplify_internal_call_using_ranges): Likewise.
2783         * gimple-fold.c (rewrite_to_defined_overflow, gimple_build): Likewise.
2784         * tree-vect-generic.c (expand_vector_divmod,
2785         optimize_vector_constructor): Likewise.
2786         * ubsan.c (ubsan_expand_null_ifn, ubsan_expand_objsize_ifn,
2787         instrument_bool_enum_load): Likewise.
2788         * tree-ssa-loop-manip.c (create_iv): Likewise.
2789         * omp-low.c (lower_rec_input_clauses, expand_omp_for_generic,
2790         expand_omp_for_static_nochunk, expand_omp_for_static_chunk,
2791         expand_cilk_for, simd_clone_adjust): Likewise.
2792         * trans-mem.c (expand_transaction): Likewise.
2793         * tree-vect-data-refs.c (bump_vector_ptr, vect_permute_store_chain,
2794         vect_setup_realignment, vect_permute_load_chain,
2795         vect_shift_permute_load_chain): Likewise.
2796         * tree-vect-stmts.c (vect_init_vector, vectorizable_mask_load_store,
2797         vectorizable_simd_clone_call, vect_gen_widened_results_half,
2798         vect_create_vectorized_demotion_stmts, vectorizable_conversion,
2799         vectorizable_shift, vectorizable_operation, vectorizable_store,
2800         permute_vec_elements, vectorizable_load): Likewise.
2802 2014-12-01  Richard Biener  <rguenther@suse.de>
2804         PR middle-end/64111
2805         * tree.c (int_cst_hasher::hash): Use TYPE_UID instead of
2806         htab_hash_pointer to not break PCH.
2808 2014-12-01  Richard Biener  <rguenther@suse.de>
2810         PR tree-optimization/15346
2811         * Makefile.in (gimple-match.o-warn): Remove -Wno-unused-parameter,
2812         add -Wno-unused-but-set-variable.
2813         * match.pd: Combine two successive divisions.
2815 2014-12-01  Richard Biener  <rguenther@suse.de>
2817         PR middle-end/64126
2818         * match.pd: Allow conversions in ~A + 1 -> -A, add -A - 1 -> ~A
2819         and -1 - A -> ~A.
2820         * fold-const.c (fold_binary_loc): Remove transforms here.
2822 2014-12-01  Maciej W. Rozycki  <macro@codesourcery.com>
2824         * config/mips/mips.c (mips16_build_call_stub): Move the save of
2825         the return address in $18 ahead of passing arguments to FPRs.
2827 2014-12-01  Ilya Enkovich  <ilya.enkovich@intel.com>
2829         PR target/64055
2830         * tree-chkp.c (chkp_find_bound_slots_1): Allow non constant
2831         values in array domain.
2833 2014-12-01  Yuri Rumyantsev  <ysrumyan@gmail.com>
2835         PR tree-optimization/63941
2836         * tree-if-conv.c (add_to_predicate_list): Delete wrong assertion that
2837         DOM_BB has non-true predicate, conditionally set non-true predicate
2838         for BB.
2840 2014-12-01  Martin Jambor  <mjambor@suse.cz>
2842         PR ipa/63551
2843         * ipa-inline-analysis.c (evaluate_conditions_for_known_args): Convert
2844         value of the argument to the type of the value in the condition.
2846 2014-12-01  Oleg Endo  <olegendo@gcc.gnu.org>
2848         PR target/63986
2849         PR target/51244
2850         * config/sh/sh.c (sh_unspec_insn_p,
2851         sh_insn_operands_modified_between_p): New functions.
2852         (sh_split_movrt_negc_to_movt_xor): Do not delete insn if its operands
2853         are modified or if it has side effects, may trap or is volatile.
2855 2014-11-29  Jakub Jelinek  <jakub@redhat.com>
2857         * gimple-expr.h (create_tmp_var_raw, create_tmp_var,
2858         create_tmp_reg): Add default NULL value to last argument.
2859         * tree-ssanames.h (make_ssa_name, copy_ssa_name): Likewise.
2860         * gimple-low.c (lower_builtin_posix_memalign): Remove NULL
2861         last argument from create_tmp_var_raw, create_tmp_var,
2862         create_tmp_reg, make_ssa_name and copy_ssa_name calls.
2863         * tree-ssa-strlen.c (get_string_length): Likewise.
2864         * tree-emutls.c (gen_emutls_addr, lower_emutls_1): Likewise.
2865         * tree-ssa-phiprop.c (phiprop_insert_phi): Likewise.
2866         * tree-vect-slp.c (vect_get_constant_vectors): Likewise.
2867         * ipa-prop.c (ipa_modify_call_arguments): Likewise.
2868         * tree-ssa-forwprop.c (simplify_rotate): Likewise.
2869         * tree-ssa-ccp.c (fold_builtin_alloca_with_align): Likewise.
2870         * asan.c (build_shadow_mem_access, maybe_create_ssa_name,
2871         maybe_cast_to_ptrmode, asan_expand_check_ifn): Likewise.
2872         * tsan.c (instrument_expr, instrument_builtin_call,
2873         instrument_func_entry): Likewise.
2874         * varpool.c (add_new_static_var): Likewise.
2875         * tree-loop-distribution.c (generate_memset_builtin): Likewise.
2876         * gimplify.c (internal_get_tmp_var, gimplify_return_expr,
2877         gimplify_modify_expr_to_memcpy, gimplify_modify_expr_to_memset,
2878         gimplify_init_ctor_eval_range, gimplify_init_constructor,
2879         gimplify_omp_atomic, gimplify_expr): Likewise.
2880         * gimple-builder.c (build_assign, build_type_cast): Likewise.
2881         * tree-vect-loop-manip.c (slpeel_update_phi_nodes_for_guard1,
2882         slpeel_update_phi_nodes_for_guard2, slpeel_tree_peel_loop_to_edge,
2883         vect_loop_versioning): Likewise.
2884         * tree-if-conv.c (version_loop_for_if_conversion): Likewise.
2885         * gimple-match-head.c (maybe_push_res_to_seq): Likewise.
2886         * tree-vect-patterns.c (vect_handle_widen_op_by_const,
2887         vect_recog_widen_mult_pattern, vect_operation_fits_smaller_type,
2888         vect_recog_over_widening_pattern): Likewise.
2889         * tree-sra.c (build_ref_for_offset, create_access_replacement):
2890         Likewise.
2891         * tree-cfg.c (make_blocks): Likewise.
2892         * tree-eh.c (lower_eh_constructs_2, lower_resx, lower_eh_dispatch):
2893         Likewise.
2894         * tree-ssa-propagate.c (update_call_from_tree): Likewise.
2895         * tree-complex.c (get_component_ssa_name, expand_complex_div_wide):
2896         Likewise.
2897         * tree-ssa-math-opts.c (build_and_insert_cast): Likewise.
2898         * tree-tailcall.c (update_accumulator_with_ops): Likewise.
2899         * tree-predcom.c (initialize_root_vars, initialize_root_vars_lm,
2900         execute_load_motion, reassociate_to_the_same_stmt): Likewise.
2901         * tree-ssa-reassoc.c (build_and_add_sum,
2902         optimize_range_tests_to_bit_test, update_ops,
2903         maybe_optimize_range_tests, rewrite_expr_tree, linearize_expr,
2904         negate_value, repropagate_negates): Likewise.
2905         * tree-vect-loop.c (vect_is_simple_reduction_1,
2906         vect_create_epilog_for_reduction): Likewise.
2907         * ipa-split.c (split_function): Likewise.
2908         * tree-inline.c (remap_ssa_name, setup_one_parameter,
2909         declare_return_variable, tree_function_versioning): Likewise.
2910         * tree-cfgcleanup.c (fixup_noreturn_call): Likewise.
2911         * cfgexpand.c (update_alias_info_with_stack_vars, expand_used_vars):
2912         Likewise.
2913         * tree-ssa-phiopt.c (conditional_replacement, abs_replacement,
2914         neg_replacement): Likewise.
2915         * gimplify-me.c (force_gimple_operand_1, gimple_regimplify_operands):
2916         Likewise.
2917         * tree-vrp.c (simplify_truth_ops_using_ranges,
2918         simplify_float_conversion_using_ranges,
2919         simplify_internal_call_using_ranges): Likewise.
2920         * tree-switch-conversion.c (emit_case_bit_tests,
2921         build_one_array, build_arrays, gen_def_assigns): Likewise.
2922         * gimple-fold.c (gimple_fold_builtin_memory_op,
2923         gimple_fold_builtin_strcat, gimple_fold_call, gimple_build): Likewise.
2924         * tree-vect-generic.c (expand_vector_divmod,
2925         optimize_vector_constructor): Likewise.
2926         * ubsan.c (ubsan_encode_value, ubsan_expand_null_ifn,
2927         ubsan_expand_objsize_ifn, instrument_si_overflow,
2928         instrument_bool_enum_load, instrument_nonnull_arg): Likewise.
2929         * tree-outof-ssa.c (insert_backedge_copies): Likewise.
2930         * tree-ssa-loop-manip.c (create_iv,
2931         tree_transform_and_unroll_loop): Likewise.
2932         * omp-low.c (scan_omp_parallel, lower_rec_simd_input_clauses,
2933         lower_rec_input_clauses, lower_lastprivate_clauses,
2934         expand_parallel_call, expand_omp_for_static_chunk,
2935         expand_omp_atomic_pipeline, expand_omp_target,
2936         maybe_add_implicit_barrier_cancel, lower_omp_single_simple,
2937         lower_omp_critical, lower_omp_for, task_copyfn_copy_decl,
2938         lower_depend_clauses, lower_omp_target, lower_omp_1,
2939         ipa_simd_modify_stmt_ops, simd_clone_adjust): Likewise.
2940         * tree-parloops.c (take_address_of, create_phi_for_local_result,
2941         create_call_for_reduction_1, separate_decls_in_region,
2942         create_parallel_loop): Likewise.
2943         * graphite-sese-to-poly.c (rewrite_cross_bb_scalar_dependence,
2944         handle_scalar_deps_crossing_scop_limits): Likewise.
2945         * trans-mem.c (lower_transaction, build_tm_load, build_tm_store,
2946         expand_assign_tm, expand_call_tm, expand_transaction,
2947         ipa_tm_insert_gettmclone_call): Likewise.
2948         * tree-vect-data-refs.c (bump_vector_ptr, vect_setup_realignment):
2949         Likewise.
2950         * tree-vect-stmts.c (vect_init_vector, vectorizable_mask_load_store,
2951         vectorizable_call, vectorizable_simd_clone_call,
2952         vectorizable_conversion, vectorizable_store, permute_vec_elements,
2953         vectorizable_load): Likewise.
2955 2014-11-29  Tobias Burnus  <burnus@net-b.de>
2956             Manuel López-Ibáñez  <manu@gcc.gnu.org>
2958         * opt-functions.awk (lang_enabled_by): Support || for
2959         enabled-by.
2960         * optc-gen.awk: Ditto.
2961         * doc/options.texi (LangEnabledBy, EnabledBy): Document the
2962         || syntax.
2964 2014-11-28  Mike Stump  <mikestump@comcast.net>
2966         * bitmap.c (bitmap_ior): Zap current as it could be deleted.
2967         (bitmap_ior_and_compl): Likewise.
2969 2014-11-28  Vladimir Makarov  <vmakarov@redhat.com>
2971         PR target/64061
2972         * lra.c (lra_substitute_pseudo): Ignore constant with int mode for
2973         subreg.
2975 2014-11-28  Segher Boessenkool  <segher@kernel.crashing.org>
2977         PR target/64093
2978         * config/rs6000/rs6000.md (and<mode>3): Don't generate
2979         and<mode>3_imm unless rs6000_gen_cell_microcode is true.
2981 2014-11-28  Vladimir Makarov  <vmakarov@redhat.com>
2983         PR rtl-optimization/64087
2984         * lra-lives.c (process_bb_lives): Add debug output.
2985         (lra_create_live_ranges): Don't remove dead insn on the second
2986         call of lra_create_live_ranges_1.
2988 2014-11-28  H.J. Lu  <hongjiu.lu@intel.com>
2990         PR rtl-optimization/64037
2991         * combine.c (setup_incoming_promotions): Pass the argument
2992         before any promotions happen to promote_function_mode.
2994 2014-11-28  Evgeny Stupachenko  <evstupac@gmail.com>
2996         * tree-vect-data-refs.c (vect_transform_grouped_load): Limit shift
2997         permutations to loads group of size 3.
2999 2014-11-28  Jiong Wang  <jiong.wang@arm.com>
3001         * config/arm/arm.md (copysignsf3): New pattern.
3002         (copysigndf3): Likewise.
3004 2014-11-28  Andrey Turetskiy  <andrey.turetskiy@intel.com>
3005             Ilya Verbin  <ilya.verbin@intel.com>
3007         * omp-low.c (lower_omp_critical): Mark critical sections
3008         inside target functions as offloadable.
3010 2014-11-28  Ilya Verbin  <ilya.verbin@intel.com>
3012         * lto-wrapper.c (run_gcc): Set have_lto and have_offload if at least one
3013         file contains sections with LTO and offload IR, respectively.
3015 2014-11-28  Ilya Verbin  <ilya.verbin@intel.com>
3017         * cgraphunit.c (ipa_passes): Handle flag_generate_offload.
3018         (symbol_table::compile): Set flag_generate_offload if there is something
3019         to offload.
3020         * common.opt (flag_generate_offload): New Variable declaration.
3021         * dwarf2out.c (dwarf2out_finish): Handle flag_generate_offload.
3022         * ipa-inline-analysis.c (inline_generate_summary): Do not skip if
3023         flag_generate_offload is set.
3024         * lto-streamer.c (gate_lto_out): Handle flag_generate_offload.
3025         * passes.c (ipa_write_summaries): Do not skip if flag_generate_offload
3026         is set.
3027         * toplev.c (compile_file): Emit LTO marker if offload info has been
3028         previously emitted.  Do not emit lto_slim marker if
3029         flag_generate_offload is without flag_generate_lto.
3030         * tree.c (free_lang_data): Do not skip if flag_generate_offload is set.
3032 2014-11-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3034         * config/arm/arm-cores.def (cortex-a17.cortex-a7): New entry.
3035         * config/arm/arm-tables.opt: Regenerate.
3036         * config/arm/arm-tune.md: Regenerate.
3037         * config/arm/bpabi.h (BE8_LINK_SPEC): Add mcpu=cortex-a17.cortex-a7.
3038         * config/arm/t-aprofile: Add cortex-a17.cortex-a7 entry to
3039         MULTILIB_MATCHES.
3041 2014-11-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3043         * config/arm/arm.md (generic_sched): Specify cortexa17 in 'no' list.
3044         Include cortex-a17.md.
3045         * config/arm/arm.c (arm_issue_rate): Specify 2 for cortexa17.
3046         * config/arm/arm-cores.def (cortex-a17): New entry.
3047         * config/arm/arm-tables.opt: Regenerate.
3048         * config/arm/arm-tune.md: Regenerate.
3049         * config/arm/bpabi.h (BE8_LINK_SPEC): Specify mcpu=cortex-a17.
3050         * config/arm/cortex-a17.md: New file.
3051         * config/arm/cortex-a17-neon.md: New file.
3052         * config/arm/driver-arm.c (arm_cpu_table): Add entry for cortex-a17.
3053         * config/arm/t-aprofile: Add cortex-a17 entries to MULTILIB_MATCHES.
3055 2014-11-28  Richard Biener  <rguenther@suse.de>
3057         PR middle-end/64084
3058         * genmatch.c (dt_node::gen_kids_1): New function, split out
3059         from dt_node::gen_kids.
3060         (decision_tree::cmp_node): DT_TRUE are generally not equal.
3061         (decision_tree::find_node): Treat DT_TRUE as barrier for
3062         node CSE on the same level.
3063         (dt_node::append_node): Do not keep DT_TRUE last.
3064         (dt_node::gen_kids): Emit code after each DT_TRUE node seen.
3066 2014-11-28  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
3068         * config/arm/t-aprofile (MULTILIB_MATCHES): New entry for
3069         -march=armv8-a+crc.
3071 2014-11-27  Uros Bizjak  <ubizjak@gmail.com>
3073         * config/i386/i386.md (preferred_for_size): New attribute
3074         (*pushxf): Split Yx*r constraints to r,*r.  Use preferred_for_size
3075         attribute to conditionally disable alternative 1.
3076         (*pushdf): Split Yd*r constraints to r,*r.  Use preferred_for_size
3077         and prefered_for_speed attributes to conditionally disable
3078         alternative 1.
3079         (*movxf_internal): Split Yx*r constraints to r,*r.  Use
3080         preferred_for_size attribute to conditionally disable
3081         alternatives 3 and 4.
3082         (*movdf_internal): Split Yd*r constraints to r,*r.  Use
3083         preferred_for_size and prefered_for_speed attributes to conditionally
3084         disable alternatives 3 and 4.
3085         * config/i386/constraints.md (Yd, Yx): Remove register constraints.
3087 2014-11-27  Eric Botcazou  <ebotcazou@adacore.com>
3089         * dwarf2out.c (set_block_origin_self): Skip nested functions.
3091 2014-11-27  H.J. Lu  <hongjiu.lu@intel.com>
3093         PR target/63833
3094         * config/i386/i386.h (REAL_PIC_OFFSET_TABLE_REGNUM): Use
3095         R15_REG for 64-bit.
3096         * config/i386/rdos64.h (REAL_PIC_OFFSET_TABLE_REGNUM): Removed.
3098 2014-11-27  Martin Liska  <mliska@suse.cz>
3099             David Malcolm  <dmalcolm@redhat.com>
3101         * ipa-icf.c (sem_function::equals_private): int* is replaced with
3102         auto_vec.
3103         (sem_function::bb_dict_test): Likewise.
3104         * ipa-icf.h: Likewise.
3106 2014-11-27  Richard Biener  <rguenther@suse.de>
3108         PR middle-end/64088
3109         * fold-const.c (const_unop): Re-instantiate missing condition
3110         before calling fold_abs_const.
3112         PR tree-optimization/64088
3113         * tree-ssa-tail-merge.c (update_debug_stmt): After resetting
3114         the stmt break from the loop over use operands.
3116 2014-11-27  Ilya Tocar  <ilya.tocar@intel.com>
3118         * config/i386/cpuid.h (bit_MPX, bit_BNDREGS, bit_BNDCSR):
3119         Define.
3120         * config/i386/i386.c (get_builtin_code_for_version): Add avx512f.
3121         (fold_builtin_cpu): Ditto.
3122         * doc/extend.texi: Documment it.
3124 2014-11-27  Jakub Jelinek  <jakub@redhat.com>
3126         PR middle-end/64067
3127         * expr.c (expand_expr_addr_expr_1) <case COMPOUND_LITERAL_EXPR>:
3128         Handle it by returning address of COMPOUND_LITERAL_EXPR_DECL
3129         not only if modifier is EXPAND_INITIALIZER, but whenever
3130         COMPOUND_LITERAL_EXPR_DECL is non-NULL and TREE_STATIC.
3132         PR tree-optimization/64024
3133         * tree-vectorizer.h (struct _stmt_vec_info): Remove simd_clone_fndecl
3134         field.  Add simd_clone_info field.
3135         (STMT_VINFO_SIMD_CLONE_FNDECL): Remove.
3136         (STMT_VINFO_SIMD_CLONE_INFO): Define.
3137         * tree-vect-stmts.c (vectorizable_simd_clone_call): Adjust for
3138         STMT_VINFO_SIMD_CLONE_FNDECL becoming first element of
3139         STMT_VINFO_SIMD_CLONE_INFO vector.  For linear arguments, remember
3140         base and linear_step from analysis phase and use it during transform
3141         phase, biased by the difference between LOOP_VINFO_NITERS{_UNCHANGED,}
3142         multiplied by linear_step.
3143         (free_stmt_vec_info): Release STMT_VINFO_SIMD_CLONE_INFO.
3145         PR lto/64025
3146         * alias.c (find_base_term): Use std::swap.  Prefer tmp2
3147         if it is CONSTANT_P other than CONST_INT.
3149 2014-11-27  Thomas Preud'homme  <thomas.preudhomme@arm.com>
3151         PR target/59593
3152         * config/arm/arm.c (dump_minipool): dispatch to consttable pattern
3153         based on mode size.
3154         * config/arm/arm.md (consttable_1): Move from config/arm/thumb1.md and
3155         make it TARGET_EITHER.
3156         (consttable_2): Move from config/arm/thumb1.md, make it TARGET_EITHER
3157         and move HFmode handling from consttable_4 to it.
3158         (consttable_4): Move HFmode handling to consttable_2 pattern.
3159         * config/arm/thumb1.md (consttable_1): Move to config/arm/arm.md.
3160         (consttable_2): Ditto.
3162 2014-11-27  Richard Biener  <rguenther@suse.de>
3164         * tree-ssa-sccvn.c (try_to_simplify): Allow
3165         gimple_fold_stmt_to_constant_1 to follow SSA edges.
3167 2014-11-27  Richard Biener  <rguenther@suse.de>
3169         PR tree-optimization/64083
3170         * tree-ssa-threadupdate.c (thread_through_all_blocks): Do not
3171         forcibly mark loop for removal the wrong way.
3173 2014-11-27  Richard Biener  <rguenther@suse.de>
3175         PR middle-end/63704
3176         * alias.c (mems_in_disjoint_alias_sets_p): Remove assert
3177         and instead return false when !fstrict-aliasing.
3179 2014-11-27  Richard Biener  <rguenther@suse.de>
3181         PR tree-optimization/61634
3182         * tree-vect-slp.c: Include gimple-walk.h.
3183         (vect_detect_hybrid_slp_stmts): Rewrite to propagate hybrid
3184         down the SLP tree for one scalar statement.
3185         (vect_detect_hybrid_slp_1): New walker function.
3186         (vect_detect_hybrid_slp_2): Likewise.
3187         (vect_detect_hybrid_slp): Properly handle pattern statements
3188         in a pre-scan over all loop stmts.
3190 2014-11-27  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
3192         Revert:
3193         2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
3194         * config/aarch64/aarch64.c (aarch64_code_to_ccmode,
3195         aarch64_convert_mode, aarch64_gen_ccmp_first,
3196         aarch64_gen_ccmp_next): New functions.
3197         (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): Define.
3199 2014-11-26  Jakub Jelinek  <jakub@redhat.com>
3201         * gcc.c (SANITIZER_SPEC): Don't error on -fsanitize=thread
3202         without -pie or -shared, error on -fsanitize=thread -static instead.
3204 2014-11-26  Bernd Edlinger  <bernd.edlinger@hotmail.de>
3206         PR ipa/61190
3207         * cgraph.h (symtab_node::call_for_symbol_and_aliases): Fix comment.
3208         (cgraph_node::function_or_virtual_thunk_symbol): New function.
3209         (cgraph_node::call_for_symbol_and_aliases): Fix comment.
3210         (cgraph_node::call_for_symbol_thunks_and_aliases): Adjust comment.
3211         Add new optional parameter exclude_virtual_thunks.
3212         * cgraph.c (cgraph_node::call_for_symbol_thunks_and_aliases): Add new
3213         optional parameter exclude_virtual_thunks.
3214         (cgraph_node::set_const_flag): Don't propagate to virtual thunks.
3215         (cgraph_node::set_pure_flag): Likewise.
3216         (cgraph_node::function_symbol): Simplified.
3217         (cgraph_node::function_or_virtual_thunk_symbol): New function.
3218         * ipa-pure-const.c (analyze_function): For virtual thunks set
3219         pure_const_state to IPA_NEITHER.
3220         (propagate_pure_const): Use function_or_virtual_thunk_symbol.
3222 2014-11-26  Richard Biener  <rguenther@suse.de>
3224         PR middle-end/63738
3225         * tree-data-ref.c (split_constant_offset_1): Do not follow
3226         SSA edges for SSA names with SSA_NAME_OCCURS_IN_ABNORMAL_PHI.
3228 2014-11-26  Richard Biener  <rguenther@suse.de>
3230         * fold-const.h (const_unop): Declare.
3231         (const_binop): Likewise.
3232         * fold-const.c (const_binop): Export overload that expects
3233         a type parameter and dispatches to fold_relational_const as well.
3234         Check both operand kinds for guarding the transforms.
3235         (const_unop): New function, with constant folding from fold_unary_loc.
3236         (fold_unary_loc): Dispatch to const_unop for tcc_constant operand.
3237         Remove constant folding done there from the simplifications.
3238         (fold_binary_loc): Check for constants using CONSTANT_CLASS_P.
3239         (fold_negate_expr): Remove dead code from the REAL_CST case.
3240         Avoid building garbage in the COMPLEX_CST case.
3241         * gimple-match-head.c (gimple_resimplify1): Dispatch to
3242         const_unop.
3243         (gimple_resimplify2): Dispatch to const_binop.
3244         (gimple_simplify): Likewise.
3246 2014-11-26  Ilya Enkovich  <ilya.enkovich@intel.com>
3248         PR bootstrap/63995
3249         * tree-chkp-opt.c (chkp_reduce_bounds_lifetime): Ignore
3250         debug statement when searching for a new position for
3251         bounds load/creation statement.
3253 2014-11-26  Marek Polacek  <polacek@redhat.com>
3255         PR sanitizer/63788
3256         * asan.c (initialize_sanitizer_builtins): Add BT_FN_SIZE_CONST_PTR_INT
3257         var.  Conditionally build BUILT_IN_OBJECT_SIZE decl.
3258         (ATTR_PURE_NOTHROW_LEAF_LIST): Define.
3260 2014-11-26  Ilya Enkovich  <ilya.enkovich@intel.com>
3262         PR lto/64075
3263         * tree-streamer-in.c (unpack_ts_function_decl_value_fields): Use
3264         proper size for function_code bitfield.
3265         (pack_ts_function_decl_value_fields): Likewise.
3267 2014-11-21  Mark Wielaard  <mjw@redhat.com>
3269         * doc/invoke.texi (-gdwarf-@{version}): Mention experimental DWARFv5.
3270         * opts.c (common_handle_option): Accept -gdwarf-5.
3271         * dwarf2out.c (is_cxx): Add DW_LANG_C_plus_plus_11 and
3272         DW_LANG_C_plus_plus_14.
3273         (lower_bound_default): Likewise. Plus DW_LANG_C11.
3274         (gen_compile_unit_die): Output DW_LANG_C_plus_plus_11,
3275         DW_LANG_C_plus_plus_14 or DW_LANG_C11.
3276         (output_compilation_unit_header): Output at most a DWARFv4 header.
3277         (output_skeleton_debug_sections): Likewise.
3278         (output_line_info): Likewise.
3279         (output_aranges): Document header version number.
3281 2014-11-26  Richard Biener  <rguenther@suse.de>
3283         * gimple-fold.c (get_symbol_constant_value): Allow all
3284         GIMPLE register type zero-constants.
3286 2014-11-26  Mark Wielaard  <mjw@redhat.com>
3288         * dwarf2out.c (gen_subprogram_die): Add DW_AT_noreturn when the
3289         function decl has TREE_THIS_VOLATILE.
3291 2014-11-26  Richard Biener  <rguenther@suse.de>
3293         PR tree-optimization/62238
3294         * tree-predcom.c (ref_at_iteration): Unshare the expression
3295         before gimplifying it.
3296         (prepare_initializers_chain): Discard unused seq.
3298 2014-11-26  Prachi Godbole  <prachi.godbole@imgtec.com>
3300         * config/mips/mips.c (mips_rtx_cost_data): Fix memory_latency cost
3301         for p5600.
3303 2014-11-25  Vladimir Makarov  <vmakarov@redhat.com>
3305         * ira-lives.c (process_bb_node_lives): Make code with conditional
3306         REAL_PIC_OFFSET_TABLE_REGNUM.
3308 2014-11-25  Vladimir Makarov  <vmakarov@redhat.com>
3310         PR target/63527
3311         * ira-lives.c (process_bb_node_lives): Check and remove conflict
3312         of pic pseudo with pic hard reg.
3314 2014-11-25  Rohit  <rohitarulraj@freescale.com>
3316         PR bootstrap/63703
3317         * config/rs6000/darwin.h (REGISTER_NAMES): Update based on 32 newly
3318         added GCC hard register numbers for SPE high registers.
3320 2014-11-25  Segher Boessenkool  <segher@kernel.crashing.org>
3322         * bt-load.c (migrate_btr_defs): Get the key of a heap entry
3323         before removing it, not after.
3325 2014-11-25  Segher Boessenkool  <segher@kernel.crashing.org>
3327         * config/mn10300/mn10300.c (mn10300_insert_setlb_lcc): Remove
3328         PATTERN call.
3330 2014-11-25  Segher Boessenkool  <segher@kernel.crashing.org>
3332         * config/rs6000/sysv4.h (ASM_OUTPUT_REG_POP): Use addi instead
3333         of addic.
3335 2014-11-25  Segher Boessenkool  <segher@kernel.crashing.org>
3337         * config/rs6000/rs6000.md (iorxor, IORXOR): Delete code_attrs.
3338         (rest of file): Replace those with code resp. CODE.
3340 2014-11-25  Tom de Vries  <tom@codesourcery.com>
3342         * tree-cfg.c (verify_sese): New function.
3343         (move_sese_region_to_fn): Call verify_sese.
3344         * tree-cfg.h (verify_sese): Declare.
3346 2014-11-25  Richard Biener  <rguenther@suse.de>
3348         PR lto/64065
3349         * lto-streamer-out.c (output_struct_function_base): Stream
3350         last_clique field.
3351         * lto-streamer-in.c (input_struct_function_base): Likewise.
3353 2014-11-25  Martin Liska  <mliska@suse.cz>
3355         PR bootstrap/64050
3356         PR ipa/64060
3357         * sreal.c (sreal::operator+): Addition fixed.
3358         (sreal::signedless_plus): Negative numbers are
3359         handled correctly.
3360         (sreal::operator-): Subtraction is fixed.
3361         (sreal::signedless_minus): Negative numbers are
3362         handled correctly.
3363         * sreal.h (sreal::operator<): Equal negative numbers
3364         are compared correctly.
3365         (sreal::shift): New checking asserts are introduced.
3366         Operation is fixed.
3368 2014-11-25  Richard Biener  <rguenther@suse.de>
3370         PR tree-optimization/61927
3371         * tree-vect-loop.c (vect_analyze_loop_2): Revert ordering
3372         of group and pattern analysis to the one in GCC 4.8.
3374 2014-11-25  Ilya Tocar  <ilya.tocar@intel.com>
3375             Jakub Jelinek  <jakub@redhat.com>
3377         * gcc.c (handle_foffload_option): Remove unnecessary calls to strchr,
3378         strlen, strncpy.
3379         * lto-wrapper.c (append_offload_options): Likewise.
3381 2014-11-25  Eric Botcazou  <ebotcazou@adacore.com>
3383         * config/rs6000/rs6000.c (rs6000_call_aix): For the AIX ABI, do not
3384         load the static chain if the call was originally direct.
3386 2014-11-25  Jan Hubicka  <hubicka@ucw.cz>
3388         PR ipa/64059
3389         * ipa-prop.c (ipa_analyze_call_uses): Don't call get_dynamic_type when
3390         devirtualization is disabled.
3392 2014-11-24  Michael Meissner  <meissner@linux.vnet.ibm.com>
3394         PR target/63965
3395         * config/rs6000/rs6000.c (rs6000_setup_reg_addr_masks): Do not set
3396         Altivec & -16 mask if the type is not valid for Altivec registers.
3397         (rs6000_secondary_reload_memory): Add support for ((reg + const) +
3398         reg) that occurs during push_reload processing.
3400         * config/rs6000/altivec.md (altivec_mov<mode>): Add instruction
3401         alternative for moving constant vectors which are easy altivec
3402         constants to GPRs.  Set the length attribute each of the
3403         alternatives.
3405         * config/rs6000/rs6000-cpus.def: Undo November 21st changes, a
3406         work in progress patch was committed instead of the fixes for
3407         63965.
3408         * config/rs6000/rs6000.c: Likewise.
3410 2014-11-22  Jan Hubicka  <hubicka@ucw.cz>
3412         PR ipa/63671
3413         * ipa-inline-transform.c (can_remove_node_now_p_1): Handle alises
3414         and -fno-devirtualize more carefully.
3415         (can_remove_node_now_p): Update.
3417 2014-11-24  Andrew Pinski  <apinski@cavium.com>
3419         PR rtl-opt/63972
3420         * shrink-wrap.c (move_insn_for_shrink_wrap): Allow LO_SUM also.
3422 2014-11-24  Alan Lawrence  <alan.lawrence@arm.com>
3424         * config/aarch64/aarch64-simd.md (vec_shr<mode>): New.
3426 2014-11-24  Alan Lawrence  <alan.lawrence@arm.com>
3428         * config/aarch64/aarch64-builtins.c (aarch64_simd_expand_args):
3429         Refactor by combining switch statements and make arrays into scalars.
3431 2014-11-24  David Edelsohn  <dje.gcc@gmail.com>
3433         PR c++/58561
3434         * dbxout.c: Include stringpool.h
3435         (dbxout_type) [default]: Ignore auto type.
3437 2014-11-24  Richard Biener  <rguenther@suse.de>
3439         PR tree-optimization/63679
3440         * tree-ssa-sccvn.c: Include ipa-ref.h, plugin-api.h and cgraph.h.
3441         (copy_reference_ops_from_ref): Fix non-constant ADDR_EXPR case
3442         to properly leave off at -1.
3443         (fully_constant_vn_reference_p): Generalize folding from
3444         constant initializers.
3445         (vn_reference_lookup_3): When looking through aggregate copies
3446         handle offsetted reads and try simplifying the result to
3447         a constant.
3448         * gimple-fold.h (fold_ctor_reference): Export.
3449         * gimple-fold.c (fold_ctor_reference): Likewise.
3451 2014-11-24  Petr Murzin  <petr.murzin@intel.com>
3453         * simplify-rtx.c (simplify_ternary_operation): Simplify
3454         vec_merge (vec_duplicate (vec_select)).
3456 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3458         * config/aarch64/aarch64.c (AARCH64_FUSE_ADRP_LDR): Define.
3459         (cortexa53_tunings): Specify AARCH64_FUSE_ADRP_LDR in fuseable_ops.
3460         (aarch_macro_fusion_pair_p): Handle AARCH64_FUSE_ADRP_LDR.
3462 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3464         * config/aarch64/aarch64.c (AARCH64_FUSE_MOVK_MOVK): Define.
3465         (cortexa53_tunings): Specify AARCH64_FUSE_MOVK_MOVK in fuseable_ops.
3466         (cortexa57_tunings): Likewise.
3467         (aarch_macro_fusion_pair_p): Handle AARCH64_FUSE_MOVK_MOVK.
3469 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3471         * sched-deps.c (sched_macro_fuse_insns): Do not check modified_in_p
3472         in the not conditional jump case.
3473         * doc/tm.texi (TARGET_SCHED_MACRO_FUSION_PAIR_P): Update description.
3474         * target.def (TARGET_SCHED_MACRO_FUSION_PAIR_P): Update description.
3476 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3478         * config/aarch64/aarch64.c: Include tm-constrs.h
3479         (AARCH64_FUSE_ADRP_ADD): Define.
3480         (cortexa57_tunings): Add AARCH64_FUSE_ADRP_ADD to fuseable_ops.
3481         (cortexa53_tunings): Likewise.
3482         (aarch_macro_fusion_pair_p): Handle AARCH64_FUSE_ADRP_ADD.
3484 2014-11-24  Martin Liska  <mliska@suse.cz>
3486         * ipa-inline.c (edge_badness): long is replaced by sreal
3487         as fibonacci_heap template type.
3488         (update_edge_key): Likewise.
3489         (inline_small_functions): Likewise.
3491 2014-11-24  Martin Liska  <mliska@suse.cz>
3493         * predict.c (propagate_freq): More elegant sreal API is used.
3494         (estimate_bb_frequencies): Precomputed constants replaced by integer
3495         constants.
3496         * sreal.c (sreal::normalize): New function.
3497         (sreal::to_int): Likewise.
3498         (sreal::operator+): Likewise.
3499         (sreal::operator-): Likewise.
3500         (sreal::signedless_plus): Likewise.
3501         (sreal::signedless_minus): Likewise.
3502         (sreal::operator/): Negative number support is added.
3503         * sreal.h: Definition of new functions added.
3504         (inline sreal operator<<): New function.
3505         (inline sreal operator>>): Likewise.
3507 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3509         * config/aarch64/aarch64-protos.h (struct tune_params): Add
3510         fuseable_ops field.
3511         * config/aarch64/aarch64.c (generic_tunings): Specify fuseable_ops.
3512         (cortexa53_tunings): Likewise.
3513         (cortexa57_tunings): Likewise.
3514         (thunderx_tunings): Likewise.
3515         (aarch64_macro_fusion_p): New function.
3516         (aarch_macro_fusion_pair_p): Likewise.
3517         (TARGET_SCHED_MACRO_FUSION_P): Define.
3518         (TARGET_SCHED_MACRO_FUSION_PAIR_P): Likewise.
3519         (AARCH64_FUSE_MOV_MOVK): Likewise.
3520         (AARCH64_FUSE_NOTHING): Likewise.
3522 2014-11-24  Martin Liska  <mliska@suse.cz>
3524         PR lto/63968
3525         * bb-reorder.c (find_traces_1_round): decreate_key is replaced
3526         with replace_key method.
3527         * fibonacci_heap.h (fibonacci_heap::insert): New argument.
3528         (fibonacci_heap::replace_key_data): Likewise.
3529         (fibonacci_heap::replace_key): New method that can even increment key,
3530         this operation costs O(log N).
3531         (fibonacci_heap::extract_min): New argument.
3532         (fibonacci_heap::delete_node): Likewise.
3534 2014-11-24  Richard Biener  <rguenther@suse.de>
3536         PR tree-optimization/55334
3537         * function.h (struct function): Add last_clique member.
3538         * tree-inline.c (remap_dependence_clique): New function.
3539         (remap_gimple_op_r): Remap dependence cliques in MEM_REFs.
3540         (copy_tree_body_r): Likewise.
3541         (copy_cfg_body): Free dependence map.
3542         (copy_gimple_seq_and_replace_locals): Likewise.
3543         * tree-pretty-print.c (dump_generic_node): Dump
3544         dependence info.
3545         * tree-ssa-alias.c (refs_may_alias_p_1): Use dependence info
3546         to answer alias query.
3547         * tree-ssa-structalias.c: Include tree-phinodes.h, ssa-iterators.h,
3548         tree-pretty-print.h and gimple-walk.h.
3549         (struct variable_info): Add is_restrict_var flag and ruid
3550         member.
3551         (new_var_info): Initialize is_restrict_var.
3552         (make_constraint_from_restrict): Likewise.
3553         (create_variable_info_for): Exclude restricts from global vars
3554         from new handling.
3555         (intra_create_variable_infos): But not those from parameters.
3556         (visit_loadstore): New function.
3557         (maybe_set_dependence_info): Likewise.
3558         (compute_dependence_clique): Likewise.
3559         (compute_may_aliases): Call compute_dependence_clique.
3560         * tree-data-ref.c (dr_analyze_indices): Copy dependence info
3561         to fake MEM_REF.
3562         (dr_may_alias_p): Use recorded dependence info to answer
3563         alias query.
3564         * tree-core.h (struct tree_base): Add clique, base struct in
3565         union.
3566         * tree.h (MR_DEPENDENCE_CLIQUE): New macro.
3567         (MR_DEPENDENCE_BASE): Likewise.
3568         * tree-inline.h (dependence_hasher): New hash-map kind.
3569         (struct copy_body_data): Add dependence_map pointer.
3570         * gimple-fold.c (maybe_canonicalize_mem_ref_addr): Avoid
3571         throwing away dependence info.
3572         * tree-streamer-in.c (unpack_value_fields): Stream dependence info.
3573         * tree-streamer-out.c (streamer_pack_tree_bitfields): Likewise.
3575 2014-11-23  Oleg Endo  <olegendo@gcc.gnu.org>
3577         PR target/53976
3578         * config/sh/sh_optimize_sett_clrt.cc
3579         (sh_optimize_sett_clrt::find_last_ccreg_values): Return bool instead
3580         of void.  Abort at complex edges.
3581         (sh_optimize_sett_clrt::execute): Do nothing if find_last_ccreg_values
3582         returned false.
3584 2014-11-22  John David Anglin  <danglin@gcc.gnu.org>
3586         PR other/63694
3587         * configure.ac: Check for strtol, strtoul, strtoll and strtoull
3588         declarations.
3589         * configure: Regenerated.
3590         * config.in: Regenerated.
3592 2014-11-22  Jan Hubicka  <hubicka@ucw.cz>
3594         * ipa.c (symbol_table::remove_unreachable_nodes): Mark all inline
3595         clones as having abstract origin used.
3596         * ipa-inline-transform.c (can_remove_node_now_p_1): Drop abstract
3597         origin check.
3598         (clone_inlined_nodes): Copy abstract originflag.
3599         * lto-cgraph.c (compute_ltrans_boundary): Use get_create to get
3600         abstract origin node.
3602 2014-11-22  Uros Bizjak  <ubizjak@gmail.com>
3604         * params.def (PARAM_MAX_COMPLETELY_PEELED_INSNS): Increase to 200.
3605         * config/i386/i386.c (ix86_option_override_internal): Do not increase
3606         PARAM_MAX_COMPLETELY_PEELED_INSNS.
3608 2014-11-22  Oleg Endo  <olegendo@gcc.gnu.org>
3610         PR target/63783
3611         PR target/51244
3612         * config/sh/sh_treg_combine.cc (sh_treg_combine::make_not_reg_insn):
3613         Do not emit bitwise not insn.  Emit logical not insn sequence instead.
3614         Adjust related comments throughout the file.
3616 2014-11-22  Oleg Endo  <olegendo@gcc.gnu.org>
3618         PR target/63986
3619         PR target/51244
3620         * config/sh/sh.c (sh_is_logical_t_store_expr,
3621         sh_try_omit_signzero_extend): Use rtx_insn* for insn argument.
3622         (sh_split_movrt_negc_to_movt_xor): New function.
3623         (sh_find_set_of_reg): Move to ...
3624         * config/sh/sh-protos.h (sh_find_set_of_reg): ... here and convert
3625         to template function.
3626         (set_of_reg): Use rtx_insn* for insn member.
3627         (sh_is_logical_t_store_expr, sh_try_omit_signzero_extend): Use
3628         rtx_insn* for insn argument.
3629         * config/sh/sh.md (movrt_negc, *movrt_negc): Split into movt-xor
3630         sequence using new sh_split_movrt_negc_to_movt_xor function.
3631         (movrt_xor): Allow also for SH2A.
3632         (*movt_movrt): Delete insns and splits.
3634 2014-11-22  Marc Glisse  <marc.glisse@inria.fr>
3636         PR tree-optimization/60770
3637         * tree-sra.c (clobber_subtree): New function.
3638         (sra_modify_constructor_assign): Call it.
3640 2014-11-21  Vladimir Makarov  <vmakarov@redhat.com>
3642         PR target/63897
3643         * lra-lives.c (mark_regno_live, mark_regno_dead): Remove last
3644         argument.
3645         (process_bb_lives): Rename dead_insn_p on remove_p
3646         and global_live_info_p on dead_insn_p.  Calculate local live info
3647         unconditionally.  Remove last argument in calls mark_regno_live and
3648         mark_regno_dead.  Reorganize body of EXECUTE_IF_SET_IN_BITMAP.
3649         (lra_create_live_ranges): Rename to lra_create_live_ranges_1.
3650         Return bool.  Rename global_live_info_p on dead_insn_p.  Return
3651         flag of live info change.
3652         (lra_create_live_ranges): New.
3654 2014-11-21  Jakub Jelinek  <jakub@redhat.com>
3656         PR target/63848
3657         PR target/63975
3658         * internal-fn.c (expand_arith_overflow_result_store,
3659         expand_addsub_overflow, expand_neg_overflow, expand_mul_overflow): Use
3660         do_compare_rtx_and_jump instead of emit_cmp_and_jump_insns everywhere,
3661         adjust arguments to those functions.  Use unsignedp = true for
3662         EQ, NE, GEU, LEU, LTU and GTU comparisons.
3664         PR tree-optimization/64006
3665         * tree-vrp.c (stmt_interesting_for_vrp): Return true
3666         for {ADD,SUB,MUL}_OVERFLOW internal calls.
3667         (vrp_visit_assignment_or_call): For {ADD,SUB,MUL}_OVERFLOW
3668         internal calls, check if any REALPART_EXPR/IMAGPART_EXPR
3669         immediate uses would change their value ranges and return
3670         SSA_PROP_INTERESTING if so, or SSA_PROP_NOT_INTERESTING
3671         if there are some REALPART_EXPR/IMAGPART_EXPR immediate uses
3672         interesting for vrp.
3674 2014-11-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
3676         PR target/63965
3677         * config/rs6000/rs6000.c (rs6000_setup_reg_addr_masks): Do not set
3678         Altivec & -16 mask if the type is not valid for Altivec registers.
3679         (rs6000_secondary_reload_memory): Add support for ((reg + const) +
3680         reg) that occurs during push_reload processing.
3682         * config/rs6000/altivec.md (altivec_mov<mode>): Add instruction
3683         alternative for moving constant vectors which are easy altivec
3684         constants to GPRs.  Set the length attribute each of the
3685         alternatives.
3687 2014-11-21  Matthew Fortune  <matthew.fortune@imgtec.com>
3689         * configure.ac: When checking for MIPS .module support ensure that
3690         o32 FPXX is supported to avoid a second configure check.
3691         * configure: Regenerate.
3693 2014-11-21  Jiong Wang  <jiong.wang@arm.com>
3695         * config/aarch64/iterators.md (VS): New mode iterator.
3696         (vsi2qi): New mode attribute.
3697         (VSI2QI): Likewise.
3698         * config/aarch64/aarch64-simd-builtins.def: New entry for ctz.
3699         * config/aarch64/aarch64-simd.md (ctz<mode>2): New pattern for ctz.
3700         * config/aarch64/aarch64-builtins.c
3701         (aarch64_builtin_vectorized_function): Support BUILT_IN_CTZ.
3703 2014-11-21  H.J. Lu  <hongjiu.lu@intel.com>
3705         PR bootstrap/63784
3706         * configure: Regenerated.
3708 2014-11-21  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3710         * config/aarch64/arm_neon.h (vsqrt_f64): New intrinsic.
3712 2014-11-21  Ilya Tocar  <ilya.tocar@intel.com>
3714         * common/config/i386/i386-common.c (OPTION_MASK_ISA_PCOMMIT_UNSET,
3715         OPTION_MASK_ISA_PCOMMIT_SET): New.
3716         (ix86_handle_option): Handle OPT_mpcommit.
3717         * config.gcc: Add pcommitintrin.h
3718         * config/i386/pcommitintrin.h: New file.
3719         * config/i386/cpuid.h (bit_PCOMMIT): Define.
3720         * config/i386/driver-i386.c (host_detect_local_cpu): Detect pcommit.
3721         * config/i386/i386-c.c (ix86_target_macros_internal): Define
3722         __PCOMMIT__.
3723         * config/i386/i386.c (ix86_target_string): Add -mpcommit.
3724         (PTA_PCOMMIT): Define.
3725         (ix86_option_override_internal): Handle new option.
3726         (ix86_valid_target_attribute_inner_p): Add pcommit.
3727         (ix86_builtins): Add IX86_BUILTIN_PCOMMIT.
3728         (bdesc_special_args): Add __builtin_ia32_pcommit.
3729         * config/i386/i386.h (TARGET_PCOMMIT, TARGET_PCOMMIT_P): Define.
3730         * config/i386/i386.md (unspecv): Add UNSPECV_PCOMMIT.
3731         (pcommit): New instruction.
3732         * config/i386/i386.opt: Add mpcommit.
3733         * config/i386/x86intrin.h: Include pcommitintrin.h.
3735 2014-11-20  Mark Wielaard  <mjw@redhat.com>
3737         PR debug/38757
3738         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Use lang_GNU_C.
3739         * config/darwin.c (darwin_file_end): Use lang_GNU_CXX.
3740         (darwin_override_options): Likewise.
3741         * config/ia64/ia64.c (ia64_struct_retval_addr_is_first_parm_p):
3742         Likewise.
3743         * config/rs6000/rs6000.c (rs6000_output_function_epilogue):
3744         Likewise.
3745         * dbxout.c (get_lang_number): Likewise.
3746         (dbxout_type): Likewise.
3747         (dbxout_symbol_location): Likewise.
3748         * dwarf2out.c (add_prototyped_attribute): Add DW_AT_prototype
3749         also for DW_LANG_{C,C99,ObjC}.
3750         (highest_c_language): New function.
3751         (gen_compile_unit_die): Call highest_c_language to merge LTO
3752         TRANSLATION_UNIT_LANGUAGE. Use strncmp language_string to
3753         determine if DW_LANG_C99 or DW_LANG_C89 should be returned.
3754         * fold-const.c (fold_cond_expr_with_comparison): Use lang_GNU_CXX.
3755         * langhooks.h (struct lang_hooks): Add version comment to name.
3756         (lang_GNU_C): New function declaration.
3757         (lang_GNU_CXX): Likewise.
3758         * langhooks.c (lang_GNU_C): New function.
3759         (lang_GNU_CXX): Likewise.
3760         * vmsdbgout.c (vmsdbgout_init): Use lang_GNU_C and lang_GNU_CXX.
3762 2014-11-21  Ilya Tocar  <ilya.tocar@intel.com>
3764         * common/config/i386/i386-common.c (OPTION_MASK_ISA_CLWB_UNSET,
3765         OPTION_MASK_ISA_CLWB_SET): New.
3766         (ix86_handle_option): Handle OPT_mclwb.
3767         * config.gcc: Add clwbintrin.h.
3768         * config/i386/clwbintrin.h: New file.
3769         * config/i386/cpuid.h (bit_CLWB): Define.
3770         * config/i386/driver-i386.c (host_detect_local_cpu): Detect clwb.
3771         * config/i386/i386-c.c (ix86_target_macros_internal): Define
3772         __CLWB__.
3773         * config/i386/i386.c (ix86_target_string): Add -mclwb.
3774         (PTA_CLWB): Define.
3775         (ix86_option_override_internal): Handle new option.
3776         (ix86_valid_target_attribute_inner_p): Add clwb.
3777         (ix86_builtins): Add IX86_BUILTIN_CLWB.
3778         (ix86_init_mmx_sse_builtins): Add __builtin_ia32_clwb.
3779         (ix86_expand_builtin): Handle IX86_BUILTIN_CLWB.
3780         * config/i386/i386.h (TARGET_CLWB, TARGET_CLWB_P): Define.
3781         * config/i386/i386.md (unspecv): Add UNSPECV_CLWB.
3782         (clwb): New instruction.
3783         * config/i386/i386.opt: Add mclwb.
3784         * config/i386/x86intrin.h: Include clwbintrin.h.
3786 2014-11-21  Ilya Tocar  <ilya.tocar@intel.com>
3788         * common/config/i386/i386-common.c (OPTION_MASK_ISA_AVX512VBMI_SET
3789         OPTION_MASK_ISA_AVX512VBMI_UNSET): New.
3790         (ix86_handle_option): Handle OPT_mavx512vbmi.
3791         * config.gcc: Add avx512vbmiintrin.h, avx512vbmivlintrin.h.
3792         * config/i386/avx512vbmiintrin.h: New file.
3793         * config/i386/avx512vbmivlintrin.h: Ditto.
3794         * config/i386/cpuid.h (bit_AVX512VBMI): New.
3795         * config/i386/driver-i386.c (host_detect_local_cpu): Detect avx512vbmi.
3796         * config/i386/i386-c.c (ix86_target_macros_internal): Define
3797         __AVX512VBMI__.
3798         * config/i386/i386.c (ix86_target_string): Add -mavx512vbmi.
3799         (PTA_AVX512VBMI): Define.
3800         (ix86_option_override_internal): Handle new options.
3801         (ix86_valid_target_attribute_inner_p): Add avx512vbmi,
3802         (ix86_builtins): Add IX86_BUILTIN_VPMULTISHIFTQB512,
3803         IX86_BUILTIN_VPMULTISHIFTQB256, IX86_BUILTIN_VPMULTISHIFTQB128,
3804         IX86_BUILTIN_VPERMVARQI512_MASK, IX86_BUILTIN_VPERMT2VARQI512,
3805         IX86_BUILTIN_VPERMT2VARQI512_MASKZ, IX86_BUILTIN_VPERMI2VARQI512,
3806         IX86_BUILTIN_VPERMVARQI256_MASK, IX86_BUILTIN_VPERMVARQI128_MASK,
3807         IX86_BUILTIN_VPERMT2VARQI256, IX86_BUILTIN_VPERMT2VARQI256_MASKZ,
3808         IX86_BUILTIN_VPERMT2VARQI128, IX86_BUILTIN_VPERMI2VARQI256,
3809         IX86_BUILTIN_VPERMI2VARQI128.
3810         (bdesc_special_args): Add __builtin_ia32_vpmultishiftqb512_mask,
3811         __builtin_ia32_vpmultishiftqb256_mask,
3812         __builtin_ia32_vpmultishiftqb128_mask,
3813         __builtin_ia32_permvarqi512_mask, __builtin_ia32_vpermt2varqi512_mask,
3814         __builtin_ia32_vpermt2varqi512_maskz,
3815         __builtin_ia32_vpermi2varqi512_mask, __builtin_ia32_permvarqi256_mask,
3816         __builtin_ia32_permvarqi128_mask, __builtin_ia32_vpermt2varqi256_mask,
3817         __builtin_ia32_vpermt2varqi256_maskz,
3818         __builtin_ia32_vpermt2varqi128_mask,
3819         __builtin_ia32_vpermt2varqi128_maskz,
3820         __builtin_ia32_vpermi2varqi256_mask,
3821         __builtin_ia32_vpermi2varqi128_mask.
3822         (ix86_hard_regno_mode_ok): Allow big masks for AVX512VBMI.
3823         * config/i386/i386.h (TARGET_AVX512VBMI, TARGET_AVX512VBMI_P): Define.
3824         * config/i386/i386.opt: Add mavx512vbmi.
3825         * config/i386/immintrin.h: Include avx512vbmiintrin.h,
3826         avx512vbmivlintrin.h.
3827         * config/i386/sse.md (unspec): Add UNSPEC_VPMULTISHIFT.
3828         (VI1_AVX512VL): New iterator.
3829         (<avx512>_permvar<mode><mask_name>): Use it.
3830         (<avx512>_vpermi2var<mode>3_maskz): Ditto.
3831         (<avx512>_vpermi2var<mode>3<sd_maskz_name>): Ditto.
3832         (<avx512>_vpermi2var<mode>3_mask): Ditto.
3833         (<avx512>_vpermt2var<mode>3_maskz): Ditto.
3834         (<avx512>_vpermt2var<mode>3<sd_maskz_name>): Ditto.
3835         (<avx512>_vpermt2var<mode>3_mask): Ditto.
3836         (vpmultishiftqb<mode><mask_name>): Ditto.
3838 2014-11-21  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
3840         PR rtl-optimization/63952
3841         * optabs.c (prepare_cmp_insn): Do not call can_compare_p for CCmode.
3842         * config/s390/s390.md ("cbranchcc4"): Accept any s390_comparison.
3843         Remove incorrect TARGET_HARD_FLOAT check and no-op expander code.
3845 2014-11-21  Ilya Tocar  <ilya.tocar@intel.com>
3847         * common/config/i386/i386-common.c (OPTION_MASK_ISA_AVX512IFMA_SET,
3848         OPTION_MASK_ISA_AVX512IFMA_UNSET): New.
3849         (ix86_handle_option): Handle OPT_mavx512ifma.
3850         * config.gcc: Add avx512ifmaintrin.h, avx512ifmavlintrin.h.
3851         * config/i386/avx512ifmaintrin.h: New file.
3852         * config/i386/avx512ifmaivlntrin.h: Ditto.
3853         * config/i386/cpuid.h (bit_AVX512IFMA): New.
3854         * config/i386/driver-i386.c (host_detect_local_cpu): Detect
3855         avx512ifma.
3856         * config/i386/i386-c.c (ix86_target_macros_internal): Define
3857         __AVX512IFMA__.
3858         * config/i386/i386.c (ix86_target_string): Add -mavx512ifma.
3859         (PTA_AVX512IFMA): Define.
3860         (ix86_option_override_internal): Handle new options.
3861         (ix86_valid_target_attribute_inner_p): Add avx512ifma.
3862         (ix86_builtins): Add IX86_BUILTIN_VPMADD52LUQ512,
3863         IX86_BUILTIN_VPMADD52HUQ512, IX86_BUILTIN_VPMADD52LUQ256,
3864         IX86_BUILTIN_VPMADD52HUQ256, IX86_BUILTIN_VPMADD52LUQ128,
3865         IX86_BUILTIN_VPMADD52HUQ128, IX86_BUILTIN_VPMADD52LUQ512_MASKZ,
3866         IX86_BUILTIN_VPMADD52HUQ512_MASKZ, IX86_BUILTIN_VPMADD52LUQ256_MASKZ,
3867         IX86_BUILTIN_VPMADD52HUQ256_MASKZ, IX86_BUILTIN_VPMADD52LUQ128_MASKZ,
3868         IX86_BUILTIN_VPMADD52HUQ128_MASKZ.
3869         (bdesc_special_args): Add __builtin_ia32_vpmadd52luq512_mask,
3870         __builtin_ia32_vpmadd52luq512_maskz,
3871         __builtin_ia32_vpmadd52huq512_mask,
3872         __builtin_ia32_vpmadd52huq512_maskx,
3873         __builtin_ia32_vpmadd52luq256_mask,
3874         __builtin_ia32_vpmadd52luq256_maskz,
3875         __builtin_ia32_vpmadd52huq256_mask,
3876         __builtin_ia32_vpmadd52huq256_maskz,
3877         __builtin_ia32_vpmadd52luq128_mask,
3878         __builtin_ia32_vpmadd52luq128_maskz,
3879         __builtin_ia32_vpmadd52huq128_mask,
3880         __builtin_ia32_vpmadd52huq128_maskz,
3881         * config/i386/i386.h (TARGET_AVX512IFMA, TARGET_AVX512IFMA_P): Define.
3882         * config/i386/i386.opt: Add mavx512ifma.
3883         * config/i386/immintrin.h: Include avx512ifmaintrin.h,
3884         avx512ifmavlintrin.h.
3885         * config/i386/sse.md (unspec): Add UNSPEC_VPMADD52LUQ,
3886         UNSPEC_VPMADD52HUQ.
3887         (VPMADD52): New iterator.
3888         (vpmadd52type): New attribute.
3889         (vpamdd52huq<mode>_maskz): New.
3890         (vpamdd52luq<mode>_maskz): Ditto.
3891         (vpamdd52<vpmadd52type><mode><sd_maskz_name>): Ditto.
3892         (vpamdd52<vpmadd52type><mode>_mask): Ditto.
3894 2014-11-21  Alan Lawrence  <alan.lawrence@arm.com>
3896         Revert:
3897         2014-09-22  Alan Lawrence  <alan.lawrence@arm.com>
3898         * fold-const.c (tree_swap_operands_p): Strip only sign-preserving NOPs.
3900 2014-11-21  Andrew Bennett  <andrew.bennett@imgtec.com>
3902         * config/mips/mips.c (mips_process_sync_loop): Place a
3903         nop in the delay slot of the branch likely instruction.
3904         (mips_output_sync_loop): Ensure mips_branch_likely is
3905         set before calling mips_output_sync_loop.
3906         (mips_sync_loop_insns): Likewise.
3908 2014-11-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
3910         PR/target 63673
3911         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Allow
3912         the base pointer of vec_vsx_ld and vec_vsx_st to take a pointer to
3913         double.
3915 2014-11-21  Georg-Johann Lay  <avr@gjlay.de>
3917         Forward-port from 2014-10-30 4_9-branch r216934
3919         PR target/63633
3920         * config/avr/avr-protos.h (regmask): New inline function.
3921         (avr_fix_inputs, avr_emit3_fix_outputs): New protos.
3922         * config/avr/avr.c (avr_fix_operands, avr_move_fixed_operands)
3923         (avr_fix_inputs, avr_emit3_fix_outputs): New functions.
3924         * config/avr/avr-fixed.md (mulqq3_nomul, muluqq3_nomul)
3925         (mul<ALL2QA>3, mul<ALL4A>3, <usdiv><ALL1Q>3, <usdiv><ALL2QA>3)
3926         (<usdiv><ALL4A>3, round<ALL124QA>3): Fix input operands.
3927         * config/avr/avr-dimode.md (add<ALL8>3, sub<ALL8>3)
3928         (<ss_addsub><ALL8S>3, <us_addsub><ALL8U>3, cbranch<ALL8>4)
3929         (<di_shifts><ALL8>3, <any_extend>mulsidi3): Fix input operands.
3930         * config/avr/avr.md (mulqi3_call, mulhi3_call, mulsi3, mulpsi3)
3931         (mulu<QIHI>si3, muls<QIHI>si3, mulohisi3, <any_extend>mulhisi3)
3932         (usmulhisi3, <any_extend>mulhi3_highpart, mulsqipsi3)
3933         (fmul, fmuls, fmulsu): Fix operands.  Turn insn into expander as
3934         needed.
3936 2014-11-21  Jakub Jelinek  <jakub@redhat.com>
3938         PR target/61137
3939         * config/ia64/ia64.c (ia64_attribute_takes_identifier_p): New function.
3940         (TARGET_ATTRIBUTE_TAKES_IDENTIFIER_P): Redefine to it.
3942 2014-11-21  James Greenhalgh  <james.greenhalgh@arm.com>
3944         * config/aarch64/aarch64-simd.md
3945         (aarch64_<ANY_EXTEND:su><ADDSUB:optab>l<mode>): Add a tab between
3946         output mnemonic and operands.
3947         (aarch64_simd_vec_unpack<su>_lo_<mode>): Likewise.
3948         (aarch64_simd_vec_unpack<su>_hi_<mode>): Likewise.
3950 2014-11-21  Evgeny Stupachenko  <evstupac@gmail.com>
3952         * config/i386/i386.c (ix86_option_override_internal): Increase
3953         PARAM_MAX_COMPLETELY_PEELED_INSNS.
3955 2014-11-21  Evgeny Stupachenko  <evstupac@gmail.com>
3957         PR target/60451
3958         * config/i386/i386.c (expand_vec_perm_even_odd_pack): New.
3959         (expand_vec_perm_even_odd_1): Add new expand for V8HI mode,
3960         replace for V16QI, V16HI and V32QI modes.
3961         (ix86_expand_vec_perm_const_1): Add new expand.
3963 2014-11-21  Nick Clifton  <nickc@redhat.com>
3965         * config/rl78/rl78-real.md (movqi_from_es): New pattern.
3966         * config/rl78/rl78.c (struct machine_function): Add uses_es field.
3967         (rl78_expand_prologue): Save the ES register in interrupt handlers
3968         that use it.
3969         (rl78_expand_epilogue): Restore the ES register if necessary.
3970         (rl78_start_function): Mention if the function uses the ES
3971         register.
3972         (rl78_lo16): Record the use of the ES register.
3973         (transcode_memory_rtx): Likewise.
3975 2014-11-21  Jakub Jelinek  <jakub@redhat.com>
3977         PR tree-optimization/61773
3978         * tree-ssa-strlen.c (get_string_length): Don't assert
3979         stpcpy has been prototyped if si->stmt is BUILT_IN_MALLOC.
3981         PR target/63910
3982         * simplify-rtx.c (simplify_immed_subreg): Return NULL for integer
3983         modes wider than MAX_BITSIZE_MODE_ANY_INT.  If not using
3984         CONST_WIDE_INT, make sure r fits into CONST_DOUBLE.
3986 2014-11-21  Markus Trippelsdorf  <markus@trippelsdorf.de>
3988         * config/rs6000/rs6000.c (includes_rldic_lshift_p): Use
3989         HOST_WIDE_INT_M1U instead of ~0.
3990         (includes_rldicr_lshift_p): Likewise.
3992 2014-11-21  Chung-Ju Wu  <jasonwucj@gmail.com>
3994         * config/nds32/nds32.c (nds32_legitimate_address_p): For LO_SUM,
3995         we need to look into its operand to determine if it is a valid
3996         address.
3998 2014-11-21  Chung-Ju Wu  <jasonwucj@gmail.com>
4000         * config/nds32/nds32.c (nds32_emit_stack_push_multiple): Add new
4001         vaarg_p argument and create correct CFI info.
4002         (nds32_expand_prologue): Pass true or false to
4003         nds32_emit_stack_push_multiple function.
4005 2014-11-21  Chung-Ju Wu  <jasonwucj@gmail.com>
4007         * config/nds32/nds32.c (nds32_expand_prologue): Set fp_adjust_insn
4008         as RTX_FRAME_RELATED_P rtx.
4010 2014-11-21  Chung-Ju Wu  <jasonwucj@gmail.com>
4012         * config/nds32/nds32.opt (march): Add help message.
4014 2014-11-20  Patrick Palka  <ppalka@gcc.gnu.org>
4016         * tree-vrp.c (test_for_singularity): New parameter
4017         strict_overflow_p.  Set *strict_overflow_p to true if signed
4018         overflow must be undefined for the return value to satisfy the
4019         conditional.
4020         (simplify_cond_using_ranges): Don't perform the simplification
4021         if it violates overflow rules.
4023 2014-11-20  Marek Polacek  <polacek@redhat.com>
4025         * tree-ssa-loop-niter.c (maybe_lower_iteration_bound): Fix typo.
4027 2014-11-20  Andrew Stubbs  <ams@codesourcery.com>
4029         * tree-ssa-loop-niter.c (maybe_lower_iteration_bound): Warn if a loop
4030         condition would be removed due to undefined behaviour.
4032 2014-11-20  Andrew Pinski  <apinski@cavium.com>
4034         PR ipa/63981
4035         PR ipa/63982
4036         * ipa-polymorphic-call.c (possible_placement_new):
4037         Use POINTER_SIZE instead of GET_MODE_BITSIZE (Pmode).
4038         (ipa_polymorphic_call_context::restrict_to_inner_class): Likewise.
4039         (extr_type_from_vtbl_ptr_store): Likewise.
4041 2014-11-20  Markus Trippelsdorf  <markus@trippelsdorf.de>
4043         * config/rs6000/constraints.md: Avoid signed integer overflows.
4044         * config/rs6000/predicates.md: Likewise.
4045         * config/rs6000/rs6000.c (num_insns_constant_wide): Likewise.
4046         (includes_rldic_lshift_p): Likewise.
4047         (includes_rldicr_lshift_p): Likewise.
4048         * emit-rtl.c (const_wide_int_htab_hash): Likewise.
4049         * loop-iv.c (determine_max_iter): Likewise.
4050         (iv_number_of_iterations): Likewise.
4051         * tree-ssa-loop-ivopts.c (get_computation_cost_at): Likewise.
4052         * varasm.c (get_section_anchor): Likewise.
4054 2014-11-20  Charles Baylis  <charles.baylis@linaro.org>
4056         PR target/63870
4057         * config/aarch64/aarch64-builtins.c (aarch64_simd_expand_args): Pass
4058         expression to aarch64_simd_lane_bounds.
4059         * config/aarch64/aarch64-protos.h (aarch64_simd_lane_bounds): Update
4060         prototype.
4061         * config/aarch64/aarch64-simd.md: (aarch64_combinez<mode>): Update
4062         call to aarch64_simd_lane_bounds.
4063         (aarch64_get_lanedi): Likewise.
4064         (aarch64_ld2_lane<mode>): Likewise.
4065         (aarch64_ld3_lane<mode>): Likewise.
4066         (aarch64_ld4_lane<mode>): Likewise.
4067         (aarch64_im_lane_boundsi): Likewise.
4068         * config/aarch64/aarch64.c (aarch64_simd_lane_bounds): Add exp
4069         parameter. Report calling function in error message if exp is non-NULL.
4071 2014-11-20  Segher Boessenkool  <segher@kernel.crashing.org>
4073         PR target/60111
4074         * config/sh/sh.c: Use signed char for signed field.
4076 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4078         * cfgexpand.c, gimple-ssa.h, trans-mem.c: Replace htab with
4079         hash_table.
4081 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4083         * ipa-utils.c, lto-section-in.c, lto-streamer.h,
4084         tree-scalar-evolution.c: Replace htab with hash_table.
4086 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4088         * lto-section-in.c (lto_delete_in_decl_state): Adjust.
4089         (lto_free_function_in_decl_state): Likewise.
4090         * lto-streamer-out.c (copy_function_or_variable): Likewise.
4091         * lto-streamer.h (lto_file_decl_data_get_ ## name): Likewise.
4092         (lto_file_decl_data_num_ ## name ## s): Likewise.
4093         (struct lto_tree_ref_table): Remove.
4094         (struct lto_in_decl_state): Replace lto_tree_ref_table with vec<tree>.
4096 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4098         * hash-map.h (hash_map::iterator): New class.
4099         (hash_map::begin): New method.
4100         (hash_map::end): Likewise.
4101         * alias.c, config/alpha/alpha.c, dwarf2asm.c, omp-low.c, tree.h:
4102         replace splay_tree with hash_map.
4104 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4106         * hash-table.h (hash_table::hash_table): Call alloc_entries.
4107         (hash_table::alloc_entries): new method.
4108         (hash_table::expand): Call alloc_entries.
4109         (hash_table::empty): Likewise.
4111 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4113         * config/i386/i386.c, function.c, trans-mem.c, tree-core.h,
4114         tree.c, tree.h, ubsan.c, varasm.c: Use hash_table instead of htab.
4116 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4118         * doc/gty.texi: Document the new cache gty attribute.
4119         * gengtype.c (finish_cache_funcs): New function.
4120         (write_roots): Call gt_clear_cache on global variables with the cache
4121         gty attribute.
4122         * ggc-common.c (ggc_mark_roots): Call gt_clear_caches.
4123         * ggc.h (gt_clear_caches): New declaration.
4124         * hash-table.h (struct ggc_cache_hasher): New hasher for caches in gc
4125         memory.
4126         (gt_cleare_cache): New function.
4127         * emit-rtl.c, rtl.h, tree.c: Use hash_table instead of htab.
4129 2014-11-20  Segher Boessenkool  <segher@kernel.crashing.org>
4131         * combine.c (try_combine): Prefer to delete dead SETs inside
4132         a PARALLEL over keeping them.
4134 2014-11-20  Segher Boessenkool  <segher@kernel.crashing.org>
4136         * combine.c (combine_validate_cost): Always print the insn costs
4137         to the dump file.
4139 2014-11-20  Richard Henderson <rth@redhat.com>
4141         PR target/63977
4142         * config/i386/i386.c (ix86_static_chain): Reinstate the check
4143         for DECL_STATIC_CHAIN.
4145 2014-11-20  Tejas Belagod  <tejas.belagod@arm.com>
4147         * config/aarch64/aarch64-protos.h (aarch64_classify_symbol):
4148         Fixup prototype.
4149         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate,
4150         aarch64_cannot_force_const_mem, aarch64_classify_address,
4151         aarch64_classify_symbolic_expression): Fixup call to
4152         aarch64_classify_symbol.
4153         (aarch64_classify_symbol): Add range-checking for
4154         symbol + offset addressing for tiny and small models.
4156 2014-11-20  Richard Biener  <rguenther@suse.de>
4158         PR middle-end/63962
4159         * match.pd ((p +p off1) +p off2 -> (p +p (off1 + off2))):
4160         Guard with single-use operand 0.
4162 2014-11-20   Richard Biener  <rguenther@suse.de>
4164         PR tree-optimization/63677
4165         * tree-ssa-dom.c: Include gimplify.h for unshare_expr.
4166         (avail_exprs_stack): Make a vector of pairs.
4167         (struct hash_expr_elt): Replace stmt member with vop member.
4168         (expr_elt_hasher::equal): Simplify.
4169         (initialize_hash_element): Adjust.
4170         (initialize_hash_element_from_expr): Likewise.
4171         (dom_opt_dom_walker::thread_across_edge): Likewise.
4172         (record_cond): Likewise.
4173         (dom_opt_dom_walker::before_dom_children): Likewise.
4174         (print_expr_hash_elt): Likewise.
4175         (remove_local_expressions_from_table): Restore previous state
4176         if requested.
4177         (record_equivalences_from_stmt): Record &x + CST as constant
4178         &MEM[&x, CST] for further propagation.
4179         (vuse_eq): New function.
4180         (lookup_avail_expr): For loads use the alias oracle to see
4181         whether a candidate from the expr hash is usable.
4182         (avail_expr_hash): Do not hash VUSEs.
4184 2014-11-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
4186         PR target/59593
4187         * config/arm/arm.md (*movhi_insn): Use right formatting
4188         for immediate.
4190 2014-11-20  Igor Zamyatin  <igor.zamyatin@intel.com>
4192         PR sanitizer/63845
4193         * function.c (assign_parms): Move init of pic_offset_table_rtx
4194         from here to...
4195         * cfgexpand.c (expand_used_vars): ...here.
4197 2014-11-19  Jan Hubicka  <hubicka@ucw.cz>
4199         * tree.c (free_lang_data_in_type): If BINFO has no important
4200         information in it, set it to NULL.
4201         (get_binfo_at_offset): Do not walk fields, only bases.
4202         * ipa-utils.h (polymorphic_type_binfo_p): Be ready for BINFO_TYPE
4203         to be NULL.
4204         * ipa-polymorphic-call.c (record_known_type): Likewise.
4206 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4208         PR jit/63854
4209         * ipa-icf.c (sem_item_optimizer::~sem_item_optimizer): Free each
4210         congruence_class_group *.
4212 2014-11-19  Uros Bizjak  <ubizjak@gmail.com>
4214         PR target/63947
4215         * config/i386/i386.c (put_condition_code) <case LTU, case GEU>:
4216         Output "b" and "nb" suffix for FP mode.
4218 2014-11-19  Jan Hubicka  <hubicka@ucw.cz>
4220         PR bootstrap/63963
4221         * tree-streamer-out.c (write_ts_function_decl_tree_pointers): Stream
4222         out DECL_FUNCTION_SPECIFIC_TARGET
4223         * tree-streamer-in.c (lto_input_ts_function_decl_tree_pointers): Stream
4224         in DECL_FUNCTION_SPECIFIC_TARGET.
4226 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4228         PR jit/63854
4229         * pass_manager.h (GCC_PASS_LISTS): Add all_late_ipa_passes.
4231 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4233         PR jit/63854
4234         * lra.c (lra): After creating live ranges in preparation for call
4235         to lra_inheritance, set live_p to true.
4237 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4239         PR jit/63854
4240         * tree-ssa-threadedge.c (thread_across_edge): Don't just release
4241         "path", delete it.
4242         * tree-ssa-threadupdate.c (delete_jump_thread_path): Likewise.
4244 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4246         PR jit/63854
4247         * tree-ssa-pre.c (do_regular_insertion): Convert "avail" from
4248         vec<> to auto_vec<> to fix a leak.
4250 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4252         PR jit/63854
4253         * dwarf2out.c (dwarf2out_c_finalize): Free producer_string.
4255 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4257         PR jit/63854
4258         * ira-costs.c (ira_costs_c_finalize): New function.
4259         * ira.h (ira_costs_c_finalize): New prototype.
4260         * toplev.c (toplev::finalize): Call ira_costs_c_finalize.
4262 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4264         PR jit/63854
4265         * ipa-reference.c (ipa_reference_c_finalize): Release
4266         optimization_summary_obstack.
4268 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4270         PR jit/63854
4271         * toplev.c (toplev::finalize): Free opts_obstack.
4273 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4275         PR jit/63854
4276         * toplev.c (toplev::finalize): Clean up save_decoded_options.
4278 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4280         PR jit/63854
4281         * bb-reorder.c
4282         (find_rarely_executed_basic_blocks_and_crossing_edges): Convert
4283         local bbs_in_hot_partition from vec<> to auto_vec<>.
4285 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4287         PR jit/63854
4288         * config/alpha/alpha.c (alpha_option_override): Remove static from
4289         "handle_trap_shadows_info" and "align_insns_info".
4290         * config/i386/i386.c (ix86_option_override): Likewise for
4291         "insert_vzeroupper_info".
4292         * config/rl78/rl78.c (rl78_asm_file_start): Likewise for
4293         "rl78_devirt_info" and "rl78_move_elim_info".
4294         * config/rs6000/rs6000.c (rs6000_option_override): Likewise for
4295         "analyze_swaps_info".
4296         * context.c (gcc::context::~context): New.
4297         * context.h (gcc::context::~context): New.
4298         * dumpfile.c (dump_files): Add "false" initializers for new field
4299         "owns_strings".
4300         (gcc::dump_manager::~dump_manager): New.
4301         (gcc::dump_manager::dump_register): Add param "take_ownership".
4302         * dumpfile.h (struct dump_file_info): Add field "owns_strings".
4303         (gcc::dump_manager::~dump_manager): New.
4304         (gcc::dump_manager::dump_register): Add param "take_ownership".
4305         * pass_manager.h (gcc::pass_manager::operator delete): New.
4306         (gcc::pass_manager::~pass_manager): New.
4307         * passes.c (pass_manager::register_one_dump_file): Pass "true" to
4308         new "owns_strings" argument to dump_register.
4309         (pass_manager::operator delete): New.
4310         (delete_pass_tree): New function.
4311         (pass_manager::~pass_manager): New.
4312         * statistics.c (statistics_early_init): Pass "false" to
4313         new "owns_strings" argument to dump_register.
4314         * toplev.c (toplev::finalize): Clean up the context and thus the
4315         things it owns.
4317 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4319         PR jit/63854
4320         * reginfo.c (finish_subregs_of_mode): Replace obstack_finish with
4321         obstack_free when cleaning up valid_mode_changes_obstack.
4323 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4325         PR jit/63854
4326         * opts.c (finalize_options_struct): New.
4327         * opts.h (finalize_options_struct): New.
4328         * toplev.c (toplev::finalize): Call finalize_options_struct
4329         on global_options and global_options_set.
4331 2014-11-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
4332             Jakub Jelinek  <jakub@redhat.com>
4334         PR driver/36312
4335         PR driver/63837
4336         * gcc.c (process_command): Don't check for input/output
4337         filename equality if output is HOST_BIT_BUCKET.
4338         * toplev.c (init_asm_output): Likewise.
4340 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4342         Merger of git branch "gimple-classes-v2-option-3".
4344         * ChangeLog.gimple-classes: New.
4346         * coretypes.h (struct gcond): Add forward decl.
4347         (struct gdebug): Likewise.
4348         (struct ggoto): Likewise.
4349         (struct glabel): Likewise.
4350         (struct gswitch): Likewise.
4351         (struct gassign): Likewise.
4352         (struct gasm): Likewise.
4353         (struct gcall): Likewise.
4354         (struct gtransaction): Likewise.
4355         (struct greturn): Likewise.
4356         (struct gbind): Likewise.
4357         (struct gcatch): Likewise.
4358         (struct geh_filter): Likewise.
4359         (struct geh_mnt): Likewise.
4360         (struct geh_else): Likewise.
4361         (struct gresx): Likewise.
4362         (struct geh_dispatch): Likewise.
4363         (struct gphi): Likewise.
4364         (struct gtry): Likewise.
4365         (struct gomp_atomic_load): Likewise.
4366         (struct gomp_atomic_store): Likewise.
4367         (struct gomp_continue): Likewise.
4368         (struct gomp_critical): Likewise.
4369         (struct gomp_for): Likewise.
4370         (struct gomp_parallel): Likewise.
4371         (struct gomp_task): Likewise.
4372         (struct gomp_sections): Likewise.
4373         (struct gomp_single): Likewise.
4374         (struct gomp_target): Likewise.
4375         (struct gomp_teams): Likewise.
4377         * doc/gimple.texi (Class hierarchy of GIMPLE statements): Update
4378         for renaming of gimple subclasses.
4380         * gdbhooks.py: Update.
4382         * gimple-iterator.c (gsi_for_phi): New.
4383         (gsi_start_phis): Strengthen return type from gimple_stmt_iterator
4384         to gphi_iterator.
4385         * gimple-iterator.h (struct gphi_iterator): New subclass of
4386         gimple_stmt_iterator.
4387         (gsi_for_phi): New prototype.
4388         (gsi_start_phis): Strengthen return type from gimple_stmt_iterator
4389         to gphi_iterator.
4390         (gsi_next_nonvirtual_phi): Strengthen param from
4391         gimple_stmt_iterator * to gphi_iterator *, and local "phi" from
4392         gimple to gphi *.
4394         * gsstruct.def: Update for renamings of classes.
4396         * gimple.c (gimple_build_return): Strengthen return type from
4397         gimple to greturn *.
4398         (gimple_call_reset_alias_info): Strengthen param to gcall *.
4399         (gimple_build_call_1): Strengthen return type from gimple to
4400         gcall *.
4401         (gimple_build_call_vec): Likewise.
4402         (gimple_build_call): Likewise.
4403         (gimple_build_call_valist): Likewise.
4404         (gimple_build_call_internal_1): Likewise.
4405         (gimple_build_call_internal): Likewise.
4406         (gimple_build_call_internal_vec): Likewise.
4407         (gimple_build_call_from_tree): Likewise.
4408         (gimple_build_assign_stat): Strengthen return type from gimple to
4409         gassign *.
4410         (gimple_build_assign_with_ops): Likewise.
4411         (gimple_build_assign_with_ops): Likewise.
4412         (gimple_build_cond): Strengthen return type from gimple to
4413         gcond *.
4414         (gimple_build_cond_from_tree): Likewise.
4415         (gimple_cond_set_condition_from_tree): Require a gcond *.
4416         (gimple_build_label): Strengthen return type from gimple to
4417         glabel *.
4418         (gimple_build_goto): Strengthen return type from gimple to
4419         ggoto *.
4420         (gimple_build_bind): Strengthen return type from gimple to
4421         gbind *.
4422         (gimple_build_asm_1): Strengthen return type from gimple to
4423         gasm *.
4424         (gimple_build_asm_vec): Likewise.
4425         (gimple_build_catch): Strengthen return type from gimple to
4426         gcatch *.
4427         (gimple_build_eh_filter): Strengthen return type from gimple to
4428         geh_filter *.
4429         (gimple_build_eh_must_not_throw): Strengthen return type from
4430         gimple to geh_mnt *.
4431         (gimple_build_eh_else): Strengthen return type from gimple to
4432         geh_else *.
4433         (gimple_build_try): Update for renaming of gimple_statement_try to
4434         gtry.
4435         (gimple_build_resx): Strengthen return type from gimple to
4436         gresx *.
4437         (gimple_build_switch_nlabels): Strengthen return type from gimple
4438         to gswitch *.
4439         (gimple_build_switch): Likewise.
4440         (gimple_build_eh_dispatch): Strengthen return type from gimple to
4441         geh_dispatch *.
4442         (gimple_build_debug_bind_stat): Strengthen return type from gimple
4443         to gdebug *.
4444         (gimple_build_debug_source_bind_stat): Strengthen return type from
4445         gimple to gdebug *.
4446         (gimple_build_omp_critical): Strengthen return type from gimple to
4447         gomp_critical *.
4448         (gimple_build_omp_for): Strengthen return type from gimple to
4449         gomp_for *.
4450         (gimple_build_omp_parallel): Strengthen return type from gimple to
4451         gomp_parallel *.
4452         (gimple_build_omp_task): Strengthen return type from gimple to
4453         gomp_task *.
4454         (gimple_build_omp_continue): Strengthen return type from gimple to
4455         gomp_continue *.
4456         (gimple_build_omp_sections): Strengthen return type from gimple to
4457         gomp_sections *.
4458         (gimple_build_omp_single): Strengthen return type from gimple to
4459         gomp_single *.
4460         (gimple_build_omp_target): Strengthen return type from gimple to
4461         gomp_target *.
4462         (gimple_build_omp_teams): Strengthen return type from gimple to
4463         gomp_teams *.
4464         (gimple_build_omp_atomic_load): Strengthen return type from gimple
4465         to gomp_atomic_load *.
4466         (gimple_build_omp_atomic_store): Strengthen return type from gimple
4467         to gomp_atomic_store *.
4468         (gimple_build_transaction): Strengthen return type from gimple
4469         to gtransaction *.
4470         (empty_stmt_p): Replace check for GIMPLE_BIND with a dyn_cast.
4471         (gimple_call_fnspec): Require a const gcall *.
4472         (gimple_call_arg_flags): Likewise.
4473         (gimple_call_return_flags): Likewise.
4474         (gimple_set_bb): Add a checked cast.
4475         (gimple_copy): Within the cases, add locals of the appropriate
4476         subclass and use in place of "stmt" and "copy" for typesafety.
4477         (gimple_has_side_effects): Add a checked cast.
4478         (gimple_could_trap_p_1): Likewise.
4479         (gimple_call_copy_skip_args): Require a gcall *, and return one.
4480         (gimple_asm_clobbers_memory_p): Require a const gasm *.
4481         (infer_nonnull_range): Replace a check for GIMPLE_RETURN with a
4482         dyn_cast, introducing local "return_stmt" and using ti in place
4483         of "stmt".
4485         * gimple.h (gimple_vec): Eliminate this typedef.
4486         (struct gimple_statement_call): Rename to...
4487         (struct gcall): ...this.
4488         (struct gimple_statement_bind): Rename to...
4489         (struct gbind): ...this.
4490         (struct gimple_statement_catch): Rename to...
4491         (struct gcatch): ...this.
4492         (struct gimple_statement_eh_filter): Rename to...
4493         (struct geh_filter): ...this.
4494         (struct gimple_statement_eh_else): Rename to...
4495         (struct geh_else): ...this.
4496         (struct gimple_statement_eh_mnt): Rename to...
4497         (struct geh_mnt): ...this.
4498         (struct gimple_statement_phi): Rename to...
4499         (struct gphi): ...this.
4500         (struct gimple_statement_resx): Rename to...
4501         (struct gresx): ...this.
4502         (struct gimple_statement_eh_dispatch): Rename to...
4503         (struct geh_dispatch): ...this.
4504         (struct gimple_statement_try): Rename to...
4505         (struct gtry): ...this.
4506         (struct gimple_statement_asm): Rename to...
4507         (struct gasm): ...this.
4508         (struct gimple_statement_omp_critical): Rename to...
4509         (struct gomp_critical): ...this.
4510         (struct gimple_statement_omp_for): Rename to...
4511         (struct gomp_for): ...this.
4512         (struct gimple_statement_omp_parallel): Rename to...
4513         (struct gomp_parallel): ...this.
4514         (struct gimple_statement_omp_target): Rename to...
4515         (struct gomp_target): ...this.
4516         (struct gimple_statement_omp_task): Rename to...
4517         (struct gomp_task): ...this.
4518         (struct gimple_statement_omp_sections): Rename to...
4519         (struct gomp_sections): ...this.
4520         (struct gimple_statement_omp_continue): Rename to...
4521         (struct gomp_continue): ...this.
4522         (struct gimple_statement_omp_single): Rename to...
4523         (struct gomp_single): ...this.
4524         (struct gimple_statement_omp_teams): Rename to...
4525         (struct gomp_teams): ...this.
4526         (struct gimple_statement_omp_atomic_load): Rename to...
4527         (struct gomp_atomic_load): ...this.
4528         (struct gimple_statement_omp_atomic_store :): Rename to...
4529         (struct gomp_atomic_store :): ...this.
4530         (struct gimple_statement_transaction): Rename to...
4531         (struct gtransaction): ...this.
4532         (struct gcond): New subclass.
4533         (struct gdebug): New subclass.
4534         (struct ggoto): New subclass.
4535         (struct glabel): New subclass.
4536         (struct gswitch): New subclass.
4537         (struct gassign): New subclass.
4538         (struct greturn): New subclass.
4539         (is_a_helper <gimple_statement_asm *>::test): Rename to...
4540         (is_a_helper <gasm *>::test): ...this.
4541         (is_a_helper <gimple_statement_bind *>::test): Rename to...
4542         (is_a_helper <gbind *>::test): ...this.
4543         (is_a_helper <gassign *>::test): New.
4544         (is_a_helper <gimple_statement_call *>::test): Rename to...
4545         (is_a_helper <gcall *>::test): ...this.
4546         (is_a_helper <gimple_statement_catch *>::test): Rename to...
4547         (is_a_helper <gcatch *>::test): ...this.
4548         (is_a_helper <gimple_statement_resx *>::test): Rename to...
4549         (is_a_helper <gresx *>::test): ...this.
4550         (is_a_helper <gcond *>::test): New.
4551         (is_a_helper <gdebug *>::test): New.
4552         (is_a_helper <ggoto *>::test): New.
4553         (is_a_helper <glabel *>::test): New.
4554         (is_a_helper <gimple_statement_eh_dispatch *>::test): Rename to...
4555         (is_a_helper <geh_dispatch *>::test): ...this.
4556         (is_a_helper <gimple_statement_eh_else *>::test): Rename to...
4557         (is_a_helper <geh_else *>::test): ...this.
4558         (is_a_helper <gimple_statement_eh_filter *>::test): Rename to...
4559         (is_a_helper <geh_filter *>::test): ...this.
4560         (is_a_helper <gimple_statement_eh_mnt *>::test): Rename to...
4561         (is_a_helper <geh_mnt *>::test): ...this.
4562         (is_a_helper <gimple_statement_omp_atomic_load *>::test): Rename to...
4563         (is_a_helper <gomp_atomic_load *>::test): ...this.
4564         (is_a_helper <gimple_statement_omp_atomic_store *>::test): Rename to...
4565         (is_a_helper <gomp_atomic_store *>::test): ...this.
4566         (is_a_helper <gimple_statement_omp_continue *>::test): Rename to...
4567         (is_a_helper <gomp_continue *>::test): ...this.
4568         (is_a_helper <gimple_statement_omp_critical *>::test): Rename to...
4569         (is_a_helper <gomp_critical *>::test): ...this.
4570         (is_a_helper <gimple_statement_omp_for *>::test): Rename to...
4571         (is_a_helper <gomp_for *>::test): ...this.
4572         (is_a_helper <gimple_statement_omp_parallel *>::test): Rename to...
4573         (is_a_helper <gomp_parallel *>::test): ...this.
4574         (is_a_helper <gimple_statement_omp_target *>::test): Rename to...
4575         (is_a_helper <gomp_target *>::test): ...this.
4576         (is_a_helper <gimple_statement_omp_sections *>::test): Rename to...
4577         (is_a_helper <gomp_sections *>::test): ...this.
4578         (is_a_helper <gimple_statement_omp_single *>::test): Rename to...
4579         (is_a_helper <gomp_single *>::test): ...this.
4580         (is_a_helper <gimple_statement_omp_teams *>::test): Rename to...
4581         (is_a_helper <gomp_teams *>::test): ...this.
4582         (is_a_helper <gimple_statement_omp_task *>::test): Rename to...
4583         (is_a_helper <gomp_task *>::test): ...this.
4584         (is_a_helper <gimple_statement_phi *>::test): Rename to...
4585         (is_a_helper <gphi *>::test): ...this.
4586         (is_a_helper <gimple_statement_transaction *>::test): Rename to...
4587         (is_a_helper <gtransaction *>::test): ...this.
4588         (is_a_helper <greturn *>::test): New.
4589         (is_a_helper <gswitch *>::test): New.
4590         (is_a_helper <gimple_statement_try *>::test): Rename to...
4591         (is_a_helper <gtry *>::test): ...this.
4592         (is_a_helper <const gimple_statement_asm *>::test): Rename to...
4593         (is_a_helper <const gasm *>::test): ...this.
4594         (is_a_helper <const gimple_statement_bind *>::test): Rename to...
4595         (is_a_helper <const gbind *>::test): ...this.
4596         (is_a_helper <const gimple_statement_call *>::test): Rename to...
4597         (is_a_helper <const gcall *>::test): ...this.
4598         (is_a_helper <const gimple_statement_catch *>::test): Rename to...
4599         (is_a_helper <const gcatch *>::test): ...this.
4600         (is_a_helper <const gimple_statement_resx *>::test): Rename to...
4601         (is_a_helper <const gresx *>::test): ...this.
4602         (is_a_helper <const gimple_statement_eh_dispatch *>::test): Rename to...
4603         (is_a_helper <const geh_dispatch *>::test): ...this.
4604         (is_a_helper <const gimple_statement_eh_filter *>::test): Rename to...
4605         (is_a_helper <const geh_filter *>::test): ...this.
4606         (is_a_helper <const gimple_statement_omp_atomic_load *>::test):
4607         Rename to...
4608         (is_a_helper <const gomp_atomic_load *>::test): ...this.
4609         (is_a_helper <const gimple_statement_omp_atomic_store *>::test):
4610         Rename to...
4611         (is_a_helper <const gomp_atomic_store *>::test): ...this.
4612         (is_a_helper <const gimple_statement_omp_continue *>::test):
4613         Rename to...
4614         (is_a_helper <const gomp_continue *>::test): ...this.
4615         (is_a_helper <const gimple_statement_omp_critical *>::test):
4616         Rename to...
4617         (is_a_helper <const gomp_critical *>::test): ...this.
4618         (is_a_helper <const gimple_statement_omp_for *>::test): Rename to...
4619         (is_a_helper <const gomp_for *>::test): ...this.
4620         (is_a_helper <const gimple_statement_omp_parallel *>::test):
4621         Rename to...
4622         (is_a_helper <const gomp_parallel *>::test): ...this.
4623         (is_a_helper <const gimple_statement_omp_target *>::test): Rename to...
4624         (is_a_helper <const gomp_target *>::test): ...this.
4625         (is_a_helper <const gimple_statement_omp_sections *>::test):
4626         Rename to...
4627         (is_a_helper <const gomp_sections *>::test): ...this.
4628         (is_a_helper <const gimple_statement_omp_single *>::test): Rename to...
4629         (is_a_helper <const gomp_single *>::test): ...this.
4630         (is_a_helper <const gimple_statement_omp_teams *>::test): Rename to...
4631         (is_a_helper <const gomp_teams *>::test): ...this.
4632         (is_a_helper <const gimple_statement_omp_task *>::test): Rename to...
4633         (is_a_helper <const gomp_task *>::test): ...this.
4634         (is_a_helper <const gimple_statement_phi *>::test): Rename to...
4635         (is_a_helper <const gphi *>::test): ...this.
4636         (is_a_helper <const gimple_statement_transaction *>::test): Rename to...
4637         (is_a_helper <const gtransaction *>::test): ...this.
4638         (gimple_build_return): Strengthen return type to greturn *.
4639         (gimple_call_reset_alias_info): Require a gcall *.
4640         (gimple_build_call_vec): Return a gcall *.
4641         (gimple_build_call): Likewise.
4642         (gimple_build_call_valist): Likewise.
4643         (gimple_build_call_internal): Likewise.
4644         (gimple_build_call_internal_vec): Likewise.
4645         (gimple_build_call_from_tree): Likewise.
4646         (gimple_build_assign_stat): Return a gassign *.
4647         (gimple_build_assign_with_ops): Likewise.
4648         (gimple_build_cond): Return a gcond *.
4649         (gimple_build_cond_from_tree): Likewise.
4650         (gimple_cond_set_condition_from_tree): Require a gcond *.
4651         (gimple_build_label): Return a glabel *.
4652         (gimple_build_goto): Return a ggoto *.
4653         (gimple_build_bind): Return a gbind *.
4654         (gimple_build_asm_vec): Return a gasm *.
4655         (gimple_build_catch): Return a gcatch *.
4656         (gimple_build_eh_filter): Return a geh_filter *.
4657         (gimple_build_eh_must_not_throw): Return a geh_mnt *.
4658         (gimple_build_eh_else): Return a geh_else *.
4659         (gimple_build_try): Return a gtry *.
4660         (gimple_build_resx): Return a gresx *.
4661         (gimple_build_switch_nlabels): Return a gswitch *.
4662         (gimple_build_switch): Return a gswitch *.
4663         (gimple_build_eh_dispatch): Return a geh_dispatch *.
4664         (gimple_build_debug_bind_stat): Return a gdebug *.
4665         (gimple_build_debug_source_bind_stat): Return a gdebug *.
4666         (gimple_build_omp_critical): Return a gomp_critical *.
4667         (gimple_build_omp_for): Return a gomp_for *.
4668         (gimple_build_omp_parallel): Return a gomp_parallel *.
4669         (gimple_build_omp_task): Return a gomp_task *.
4670         (gimple_build_omp_continue): Return a gomp_continue *.
4671         (gimple_build_omp_sections): Return a gomp_sections *.
4672         (gimple_build_omp_single): Return a gomp_single *.
4673         (gimple_build_omp_target): Return a gomp_target *.
4674         (gimple_build_omp_teams): Return a gomp_teams *.
4675         (gimple_build_omp_atomic_load): Return a gomp_atomic_load *.
4676         (gimple_build_omp_atomic_store): Return a gomp_atomic_store *.
4677         (gimple_build_transaction): Return a gtransaction *.
4678         (gimple_call_arg_flags): Require a const gcall *.
4679         (gimple_call_return_flags): Likewise.
4680         (gimple_call_copy_skip_args): Require and return a gcall *.
4681         (gimple_asm_clobbers_memory_p): Require a const gasm *.
4682         (gimple_seq_first_stmt_as_a_bind): New.
4683         (gimple_assign_nontemporal_move_p): Require a const gassign *
4684         rather than a const_gimple.
4685         (gimple_call_internal_fn): Update for renaming to gcall.
4686         (gimple_call_fntype): Likewise.
4687         (gimple_call_set_fntype): Require a gcall * rather than a gimple.
4688         (gimple_call_set_fn): Likewise.
4689         (gimple_call_set_internal_fn): Likewise.
4690         (gimple_call_set_chain): Likewise.
4691         (gimple_call_set_tail): Likewise.
4692         (gimple_call_tail_p): Likewise.
4693         (gimple_call_set_return_slot_opt): Likewise.
4694         (gimple_call_return_slot_opt_p): Likewise.
4695         (gimple_call_set_from_thunk): Likewise.
4696         (gimple_call_from_thunk_p): Likewise.
4697         (gimple_call_set_va_arg_pack): Likewise.
4698         (gimple_call_va_arg_pack_p): Likewise.
4699         (gimple_call_set_nothrow): Likewise.
4700         (gimple_call_nothrow_p): Likewise.
4701         (gimple_call_set_alloca_for_var): Likewise.
4702         (gimple_call_alloca_for_var_p): Likewise.
4703         (gimple_call_use_set): Likewise.
4704         (gimple_call_clobber_set): Likewise.
4705         (gimple_call_return_type): Require a const gcall * rather than a
4706         const_gimple.
4707         (gimple_call_chain_ptr): Likewise.
4708         (gimple_call_copy_flags): Require a pair of gcall *.
4709         (gimple_cond_set_code): Require a gcond * rather than a gimple
4710         (gimple_cond_set_lhs): Likewise.
4711         (gimple_cond_set_rhs): Likewise.
4712         (gimple_cond_set_true_label): Likewise.
4713         (gimple_cond_set_false_label): Likewise.
4714         (gimple_cond_make_false): Likewise.
4715         (gimple_cond_make_true): Likewise.
4716         (gimple_cond_lhs_ptr): Require a const gcond * rather than a
4717         const_gimple.
4718         (gimple_cond_rhs_ptr): Likewise.
4719         (gimple_cond_true_label): Likewise.
4720         (gimple_cond_false_label): Likewise.
4721         (gimple_cond_true_p): Likewise.
4722         (gimple_cond_false_p): Likewise.
4723         (gimple_cond_set_condition): Likewise.
4724         (gimple_label_label): Require a const glabel *.
4725         (gimple_label_set_label): Require a glabel *.
4726         (gimple_goto_set_dest): Require a ggoto *.
4727         (gimple_bind_vars): Require a const gbind *.
4728         (gimple_bind_block): Likewise.
4729         (gimple_bind_set_vars): Require a gbind *.
4730         (gimple_bind_append_vars): Likewise.
4731         (gimple_bind_body_ptr): Likewise.
4732         (gimple_bind_body): Likewise.
4733         (gimple_bind_set_body): Likewise.
4734         (gimple_bind_add_stmt): Likewise.
4735         (gimple_bind_add_seq): Likewise.
4736         (gimple_bind_set_block): Likewise.
4737         (gimple_asm_ninputs): Require a const gasm *.
4738         (gimple_asm_noutputs): Likewise.
4739         (gimple_asm_nclobbers): Likewise.
4740         (gimple_asm_nlabels): Likewise.
4741         (gimple_asm_input_op): Likewise.
4742         (gimple_asm_input_op_ptr): Likewise.
4743         (gimple_asm_output_op): Likewise.
4744         (gimple_asm_output_op_ptr): Likewise.
4745         (gimple_asm_clobber_op): Likewise.
4746         (gimple_asm_label_op): Likewise.
4747         (gimple_asm_string): Likewise.
4748         (gimple_asm_volatile_p): Likewise.
4749         (gimple_asm_input_p): Likewise.
4750         (gimple_asm_set_input_op): Require a gasm *.
4751         (gimple_asm_set_output_op): Likewise.
4752         (gimple_asm_set_clobber_op): Likewise.
4753         (gimple_asm_set_label_op): Likewise.
4754         (gimple_asm_set_volatile): Likewise.
4755         (gimple_asm_set_input): Likewise.
4756         (gimple_catch_types): Require a const gcatch *.
4757         (gimple_catch_types_ptr): Require a gcatch *.
4758         (gimple_catch_handler_ptr): Likewise.
4759         (gimple_catch_handler): Likewise.
4760         (gimple_catch_set_types): Likewise.
4761         (gimple_catch_set_handler): Likewise.
4762         (gimple_eh_filter_types): Update for renaming of subclass to
4763         geh_filter.
4764         (gimple_eh_filter_types_ptr): Likewise.
4765         (gimple_eh_filter_failure_ptr): Likewise.
4766         (gimple_eh_filter_set_types): Require a geh_filter *.
4767         (gimple_eh_filter_set_failure): Likewise.
4768         (gimple_eh_must_not_throw_fndecl): Require a geh_mnt *.
4769         (gimple_eh_must_not_throw_set_fndecl): Likewise.
4770         (gimple_eh_else_n_body_ptr): Require a geh_else *.
4771         (gimple_eh_else_n_body): Likewise.
4772         (gimple_eh_else_e_body_ptr): Likewise.
4773         (gimple_eh_else_e_body): Likewise.
4774         (gimple_eh_else_set_n_body): Likewise.
4775         (gimple_eh_else_set_e_body): Likewise.
4776         (gimple_try_set_kind): Require a gtry *.
4777         (gimple_try_set_catch_is_cleanup): Likewise.
4778         (gimple_try_set_eval): Likewise.
4779         (gimple_try_set_cleanup): Likewise.
4780         (gimple_try_eval_ptr): Update for renaming of subclass to gtry.
4781         (gimple_try_cleanup_ptr): Likewise.
4782         (gimple_phi_capacity): Update for renaming of subclass to gphi.
4783         (gimple_phi_num_args): Likewise.
4784         (gimple_phi_result): Likewise.
4785         (gimple_phi_result_ptr): Likewise.
4786         (gimple_phi_arg): Likewise.
4787         (gimple_phi_set_result): Require a gphi *.
4788         (gimple_phi_set_arg): Likewise.
4789         (gimple_phi_arg_def_ptr): Likewise.
4790         (gimple_phi_arg_edge): Likewise.
4791         (gimple_phi_arg_location): Likewise.
4792         (gimple_phi_arg_location_from_edge): Likewise.
4793         (gimple_phi_arg_set_location): Likewise.
4794         (gimple_phi_arg_has_location): Likewise.
4795         (gimple_resx_region): Require a const gresx *.
4796         (gimple_resx_set_region): Require a gresx *.
4797         (gimple_eh_dispatch_region): Require a const geh_dispatch *.
4798         (gimple_eh_dispatch_set_region): Require a geh_dispatch *.
4799         (gimple_switch_num_labels): Require a const gswitch *.
4800         (gimple_switch_set_num_labels): Likewise.
4801         (gimple_switch_index): Likewise.
4802         (gimple_switch_index_ptr): Likewise.
4803         (gimple_switch_label): Likewise.
4804         (gimple_switch_default_label): Likewise.
4805         (gimple_switch_set_index): Require a gswitch *.
4806         (gimple_switch_set_label): Likewise.
4807         (gimple_switch_set_default_label): Likewise.
4808         (gimple_omp_critical_name): Require a const gomp_critical *.
4809         (gimple_omp_critical_name_ptr): Require a gomp_critical *.
4810         (gimple_omp_critical_set_name): Likewise.
4811         (gimple_omp_for_set_kind): Require a gomp_for *.
4812         (gimple_omp_for_set_combined_p): Likewise.
4813         (gimple_omp_for_set_combined_into_p): Likewise.
4814         (gimple_omp_for_clauses): Update for renaming of subclass to
4815         gomp_for.
4816         (gimple_omp_for_clauses_ptr): Likewise.
4817         (gimple_omp_for_set_clauses): Likewise.
4818         (gimple_omp_for_collapse): Likewise.
4819         (gimple_omp_for_index): Likewise.
4820         (gimple_omp_for_index_ptr): Likewise.
4821         (gimple_omp_for_set_index): Likewise.
4822         (gimple_omp_for_initial): Likewise.
4823         (gimple_omp_for_initial_ptr): Likewise.
4824         (gimple_omp_for_set_initial): Likewise.
4825         (gimple_omp_for_final): Likewise.
4826         (gimple_omp_for_final_ptr): Likewise.
4827         (gimple_omp_for_set_final): Likewise.
4828         (gimple_omp_for_incr): Likewise.
4829         (gimple_omp_for_incr_ptr): Likewise.
4830         (gimple_omp_for_set_incr): Likewise.
4831         (gimple_omp_for_pre_body): Likewise.
4832         (gimple_omp_for_set_pre_body): Likewise.
4833         (gimple_omp_parallel_clauses): Update for renaming of subclass to
4834         gomp_parallel.
4835         (gimple_omp_parallel_clauses_ptr): Require a gomp_parallel *.
4836         (gimple_omp_parallel_set_clauses): Likewise.
4837         (gimple_omp_parallel_child_fn_ptr): Likewise.
4838         (gimple_omp_parallel_set_child_fn): Likewise.
4839         (gimple_omp_parallel_data_arg_ptr): Likewise.
4840         (gimple_omp_parallel_set_data_arg): Likewise.
4841         (gimple_omp_parallel_child_fn): Require a const gomp_parallel *.
4842         (gimple_omp_parallel_data_arg): Likewise.
4843         (gimple_omp_task_clauses): Update for renaming of subclass to
4844         gomp_task.
4845         (gimple_omp_task_clauses_ptr): Likewise.
4846         (gimple_omp_task_set_clauses): Likewise.
4847         (gimple_omp_task_child_fn): Likewise.
4848         (gimple_omp_task_child_fn_ptr): Likewise.
4849         (gimple_omp_task_set_child_fn): Likewise.
4850         (gimple_omp_task_data_arg): Likewise.
4851         (gimple_omp_task_data_arg_ptr): Likewise.
4852         (gimple_omp_task_set_data_arg): Likewise.
4853         (gimple_omp_taskreg_clauses): Whitespace fixes.
4854         (gimple_omp_taskreg_clauses_ptr): Likewise.
4855         (gimple_omp_taskreg_set_clauses): Likewise.
4856         (gimple_omp_taskreg_child_fn): Likewise.
4857         (gimple_omp_taskreg_child_fn_ptr): Likewise.
4858         (gimple_omp_taskreg_set_child_fn): Likewise.
4859         (gimple_omp_taskreg_data_arg): Likewise.
4860         (gimple_omp_taskreg_data_arg_ptr): Likewise.
4861         (gimple_omp_taskreg_set_data_arg): Likewise.
4862         (gimple_omp_task_copy_fn): Update for renaming of subclass to
4863         gomp_task.
4864         (gimple_omp_task_copy_fn_ptr): Likewise.
4865         (gimple_omp_task_set_copy_fn): Likewise.
4866         (gimple_omp_task_arg_size): Likewise.
4867         (gimple_omp_task_arg_size_ptr): Likewise.
4868         (gimple_omp_task_set_arg_size): Likewise.
4869         (gimple_omp_task_arg_align): Likewise.
4870         (gimple_omp_task_arg_align_ptr): Likewise.
4871         (gimple_omp_task_set_arg_align): Likewise.
4872         (gimple_omp_single_clauses): Update for renaming of subclass to
4873         gomp_single.
4874         (gimple_omp_single_clauses_ptr): Likewise.
4875         (gimple_omp_single_set_clauses): Likewise.
4876         (gimple_omp_target_clauses): Update for renaming of subclass to
4877         gomp_target.
4878         (gimple_omp_target_clauses_ptr): Likewise.
4879         (gimple_omp_target_set_clauses): Require a gomp_target *.
4880         (gimple_omp_target_set_kind): Likewise.
4881         (gimple_omp_target_child_fn_ptr): Likewise.
4882         (gimple_omp_target_set_child_fn): Likewise.
4883         (gimple_omp_target_data_arg_ptr): Likewise.
4884         (gimple_omp_target_set_data_arg): Likewise.
4885         (gimple_omp_target_child_fn): Require a const gomp_target *.
4886         (gimple_omp_target_data_arg): Likewise.
4887         (gimple_omp_teams_clauses): Update for renaming of subclass to
4888         gomp_teams.
4889         (gimple_omp_teams_clauses_ptr): Likewise.
4890         (gimple_omp_teams_set_clauses): Require a gomp_teams *.
4891         (gimple_omp_sections_clauses): Update for renaming of subclass to
4892         gomp_sections.
4893         (gimple_omp_sections_clauses_ptr): Likewise.
4894         (gimple_omp_sections_set_clauses): Likewise.
4895         (gimple_omp_sections_control): Likewise.
4896         (gimple_omp_sections_control_ptr): Likewise.
4897         (gimple_omp_sections_set_control): Likewise.
4898         (gimple_omp_for_set_cond): Likewise.
4899         (gimple_omp_for_cond): Likewise.
4900         (gimple_omp_atomic_store_set_val): Require a gomp_atomic_store *.
4901         (gimple_omp_atomic_store_val_ptr): Likewise.
4902         (gimple_omp_atomic_load_set_lhs): Likewise.
4903         (gimple_omp_atomic_store_val): Require a const gomp_atomic_store *.
4904         (gimple_omp_atomic_load_lhs): Likewise.
4905         (gimple_omp_atomic_load_rhs): Likewise.
4906         (gimple_omp_atomic_load_lhs_ptr): Require a gomp_atomic_load *.
4907         (gimple_omp_atomic_load_set_rhs): Likewise.
4908         (gimple_omp_atomic_load_rhs_ptr): Likewise.
4909         (gimple_omp_continue_control_def): Require a const gomp_continue *.
4910         (gimple_omp_continue_control_use): Likewise.
4911         (gimple_omp_continue_control_def_ptr): Require a gomp_continue *.
4912         (gimple_omp_continue_set_control_def): Likewise.
4913         (gimple_omp_continue_control_use_ptr): Likewise.
4914         (gimple_omp_continue_set_control_use): Likewise.
4915         (gimple_transaction_body_ptr): Require a gtransaction *.
4916         (gimple_transaction_body): Likewise.
4917         (gimple_transaction_label_ptr): Likewise.
4918         (gimple_transaction_label): Require a const gtransaction *.
4919         (gimple_transaction_subcode): Likewise.
4920         (gimple_transaction_set_body): Require a gtransaction *.
4921         (gimple_transaction_set_label): Likewise.
4922         (gimple_transaction_set_subcode): Likewise.
4923         (gimple_return_retval_ptr): Require a const greturn *.
4924         (gimple_return_retval): Likewise.
4925         (gimple_return_set_retval): Require a greturn *.
4926         (gimple_expr_type): Introduce local "call_stmt" and use in place of
4927         "stmt" for typesafety.
4929         * asan.c: Use gimple subclasses.
4930         * auto-profile.c: Likewise.
4931         * builtins.c: Likewise.
4932         * builtins.h: Likewise.
4933         * cfgexpand.c: Likewise.
4934         * cfgloop.c: Likewise.
4935         * cfgloopmanip.c: Likewise.
4936         * cgraph.c: Likewise.
4937         * cgraph.h: Likewise.
4938         * cgraphbuild.c: Likewise.
4939         * cgraphclones.c: Likewise.
4940         * cgraphunit.c: Likewise.
4941         * expr.h: Likewise.
4942         * gimple-builder.c: Likewise.
4943         * gimple-builder.h: Likewise.
4944         * gimple-fold.c: Likewise.
4945         * gimple-low.c: Likewise.
4946         * gimple-pretty-print.c: Likewise.
4947         * gimple-ssa-isolate-paths.c: Likewise.
4948         * gimple-ssa-strength-reduction.c: Likewise.
4949         * gimple-streamer-in.c: Likewise.
4950         * gimple-streamer-out.c: Likewise.
4951         * gimple-walk.c: Likewise.
4952         * gimplify-me.c: Likewise.
4953         * gimplify.c: Likewise.
4954         * gimplify.h: Likewise.
4955         * graphite-scop-detection.c: Likewise.
4956         * graphite-sese-to-poly.c: Likewise.
4957         * internal-fn.c: Likewise.
4958         * internal-fn.def:: Likewise.
4959         * internal-fn.h: Likewise.
4960         * ipa-icf-gimple.c: Likewise.
4961         * ipa-icf-gimple.h: Likewise.
4962         * ipa-icf.c: Likewise.
4963         * ipa-inline-analysis.c: Likewise.
4964         * ipa-prop.c: Likewise.
4965         * ipa-prop.h: Likewise.
4966         * ipa-pure-const.c: Likewise.
4967         * ipa-split.c: Likewise.
4968         * lto-streamer-in.c: Likewise.
4969         * lto-streamer-out.c: Likewise.
4970         * omp-low.c: Likewise.
4971         * predict.c: Likewise.
4972         * sanopt.c: Likewise.
4973         * sese.c: Likewise.
4974         * ssa-iterators.h: Likewise.
4975         * stmt.c: Likewise.
4976         * trans-mem.c: Likewise.
4977         * tree-call-cdce.c: Likewise.
4978         * tree-cfg.c: Likewise.
4979         * tree-cfg.h: Likewise.
4980         * tree-cfgcleanup.c: Likewise.
4981         * tree-chkp.c: Likewise.
4982         * tree-chkp.h: Likewise.
4983         * tree-complex.c: Likewise.
4984         * tree-data-ref.c: Likewise.
4985         * tree-dfa.c: Likewise.
4986         * tree-eh.c: Likewise.
4987         * tree-eh.h: Likewise.
4988         * tree-emutls.c: Likewise.
4989         * tree-if-conv.c: Likewise.
4990         * tree-inline.c: Likewise.
4991         * tree-inline.h: Likewise.
4992         * tree-into-ssa.c: Likewise.
4993         * tree-into-ssa.h: Likewise.
4994         * tree-loop-distribution.c: Likewise.
4995         * tree-nrv.c: Likewise.
4996         * tree-object-size.c: Likewise.
4997         * tree-outof-ssa.c: Likewise.
4998         * tree-parloops.c: Likewise.
4999         * tree-phinodes.c: Likewise.
5000         * tree-phinodes.h: Likewise.
5001         * tree-predcom.c: Likewise.
5002         * tree-profile.c: Likewise.
5003         * tree-scalar-evolution.c: Likewise.
5004         * tree-scalar-evolution.h
5005         * tree-sra.cn_function):
5006         * tree-ssa-alias.c: Likewise.
5007         * tree-ssa-alias.h: Likewise.
5008         * tree-ssa-ccp.c: Likewise.
5009         * tree-ssa-coalesce.c: Likewise.
5010         * tree-ssa-copy.c: Likewise.
5011         * tree-ssa-copyrename.c: Likewise.
5012         * tree-ssa-dce.c: Likewise.
5013         * tree-ssa-dom.c: Likewise.
5014         * tree-ssa-forwprop.c: Likewise.
5015         * tree-ssa-ifcombine.c: Likewise.
5016         * tree-ssa-live.c: Likewise.
5017         * tree-ssa-loop-im.c: Likewise.
5018         * tree-ssa-loop-ivcanon.c: Likewise.
5019         * tree-ssa-loop-ivopts.c: Likewise.
5020         * tree-ssa-loop-manip.c: Likewise.
5021         * tree-ssa-loop-niter.c: Likewise.
5022         * tree-ssa-loop-prefetch.c: Likewise.
5023         * tree-ssa-loop-unswitch.c: Likewise.
5024         * tree-ssa-math-opts.c: Likewise.
5025         * tree-ssa-operands.c: Likewise.
5026         * tree-ssa-phiopt.c: Likewise.
5027         * tree-ssa-phiprop.c: Likewise.
5028         * tree-ssa-pre.c: Likewise.
5029         * tree-ssa-propagate.c: Likewise.
5030         * tree-ssa-propagate.h: Likewise.
5031         * tree-ssa-reassoc.c: Likewise.
5032         * tree-ssa-sccvn.c: Likewise.
5033         * tree-ssa-sccvn.h: Likewise.
5034         * tree-ssa-sink.c: Likewise.
5035         * tree-ssa-strlen.c
5036         * tree-ssa-structalias.c
5037         * tree-ssa-tail-merge.c: Likewise.
5038         * tree-ssa-ter.c: Likewise.
5039         * tree-ssa-threadedge.c: Likewise.
5040         * tree-ssa-threadedge.h: Likewise.
5041         * tree-ssa-threadupdate.c: Likewise.
5042         * tree-ssa-uncprop.c: Likewise.
5043         * tree-ssa-uninit.c: Likewise.
5044         * tree-ssa.c: Likewise.
5045         * tree-stdarg.c: Likewise.
5046         * tree-switch-conversion.c: Likewise.
5047         * tree-tailcall.c: Likewise.
5048         * tree-vect-data-refs.c: Likewise.
5049         * tree-vect-generic.c: Likewise.
5050         * tree-vect-loop-manip.c: Likewise.
5051         * tree-vect-loop.c: Likewise.
5052         * tree-vect-patterns.c: Likewise.
5053         * tree-vect-slp.c: Likewise.
5054         * tree-vect-stmts.c: Likewise.
5055         * tree-vectorizer.h: Likewise.
5056         * tree-vrp.c: Likewise.
5057         * tree.c: Likewise.
5058         * ubsan.c: Likewise.
5059         * value-prof.c: Likewise.
5060         * value-prof.h: Likewise.
5061         * vtable-verify.c: Likewise.
5063 2014-11-19  Markus Trippelsdorf  <markus@trippelsdorf.de>
5065         * config/rs6000/constraints.md: Avoid signed integer overflows.
5066         * config/rs6000/predicates.md: Likewise.
5068 2014-11-19  Renlin Li  <Renlin.Li@arm.com>
5070         PR target/63424
5071         * config/aarch64/aarch64-simd.md (<su><maxmin>v2di3): New.
5073 2014-11-19  Renlin Li  <Renlin.Li@arm.com>
5075         PR middle-end/63762
5076         * ira.c (ira): Update preferred class.
5078 2014-11-19  Jakub Jelinek  <jakub@redhat.com>
5080         * gimple.h (gimple_build_assign_with_ops): Add unary arg overload.
5081         (gimple_assign_set_rhs_with_ops_1): Renamed to ...
5082         (gimple_assign_set_rhs_with_ops): ... this.  Adjust binary arg
5083         inline overload to use it.  Add unary arg overload.
5084         * gimple.c (gimple_build_assign_with_ops): New unary arg overload.
5085         (gimple_assign_set_rhs_from_tree): Use
5086         gimple_assign_set_rhs_with_ops instead of
5087         gimple_assign_set_rhs_with_ops_1.
5088         (gimple_assign_set_rhs_with_ops_1): Renamed to ...
5089         (gimple_assign_set_rhs_with_ops): ... this.
5090         * ipa-split.c (split_function): Remove last NULL argument
5091         from gimple_build_assign_with_ops call.
5092         * tree-ssa-loop-im.c
5093         (move_computations_dom_walker::before_dom_children): Likewise.
5094         * tsan.c (instrument_builtin_call): Likewise.
5095         * tree-vect-stmts.c (vect_init_vector, vectorizable_mask_load_store,
5096         vectorizable_conversion, vectorizable_load): Likewise.
5097         * tree-vect-loop.c (vect_is_simple_reduction_1,
5098         get_initial_def_for_induction): Likewise.
5099         * tree-loop-distribution.c (generate_memset_builtin): Likewise.
5100         * tree-vect-patterns.c (vect_handle_widen_op_by_const,
5101         vect_recog_widen_mult_pattern, vect_operation_fits_smaller_type,
5102         vect_recog_over_widening_pattern, vect_recog_rotate_pattern,
5103         vect_recog_vector_vector_shift_pattern, vect_recog_divmod_pattern,
5104         vect_recog_mixed_size_cond_pattern, adjust_bool_pattern_cast,
5105         adjust_bool_pattern, vect_recog_bool_pattern): Likewise.
5106         * tree-ssa-phiopt.c (conditional_replacement, abs_replacement,
5107         neg_replacement): Likewise.
5108         * asan.c (build_shadow_mem_access, maybe_create_ssa_name,
5109         maybe_cast_to_ptrmode, asan_expand_check_ifn): Likewise.
5110         * tree-vect-slp.c (vect_get_constant_vectors): Likewise.
5111         * omp-low.c (lower_rec_input_clauses, expand_omp_for_generic,
5112         expand_omp_for_static_nochunk, expand_omp_for_static_chunk,
5113         simd_clone_adjust): Likewise.
5114         * tree-vect-loop-manip.c (vect_create_cond_for_align_checks): Likewise.
5115         * gimple-ssa-strength-reduction.c (introduce_cast_before_cand,
5116         replace_one_candidate): Likewise.
5117         * gimple-builder.c (build_type_cast): Likewise.
5118         * tree-ssa-forwprop.c (simplify_rotate): Likewise.
5119         (forward_propagate_addr_expr_1): Remove last NULL argument
5120         from gimple_assign_set_rhs_with_ops call.
5121         (simplify_vector_constructor): Use gimple_assign_set_rhs_with_ops
5122         instead of gimple_assign_set_rhs_with_ops_1.
5123         * tree-ssa-reassoc.c (maybe_optimize_range_tests): Remove last NULL
5124         argument from gimple_build_assign_with_ops call.
5125         (repropagate_negates): Remove last NULL argument from
5126         gimple_assign_set_rhs_with_ops call.
5127         * ubsan.c (ubsan_expand_null_ifn, ubsan_expand_objsize_ifn): Remove
5128         last NULL argument from gimple_build_assign_with_ops call.
5129         (instrument_bool_enum_load): Likewise.  Remove last NULL argument
5130         from gimple_assign_set_rhs_with_ops call.
5131         * tree-ssa-math-opts.c (build_and_insert_cast, convert_mult_to_fma):
5132         Remove last NULL argument from gimple_build_assign_with_ops call.
5133         (bswap_replace): Likewise.  Use gimple_assign_set_rhs_with_ops instead
5134         of gimple_assign_set_rhs_with_ops_1.
5135         (convert_plusminus_to_widen): Use gimple_assign_set_rhs_with_ops
5136         instead of gimple_assign_set_rhs_with_ops_1.
5137         * gimple-fold.c (replace_stmt_with_simplification): Likewise.
5138         (rewrite_to_defined_overflow, gimple_build): Remove last NULL argument
5139         from gimple_build_assign_with_ops call.
5140         * tree-ssa-strlen.c (handle_pointer_plus): Remove last NULL argument
5141         from gimple_assign_set_rhs_with_ops call.
5142         * tree-vrp.c (simplify_truth_ops_using_ranges,
5143         simplify_bit_ops_using_ranges): Remove last NULL argument from
5144         gimple_assign_set_rhs_with_ops call.
5145         (simplify_float_conversion_using_ranges,
5146         simplify_internal_call_using_ranges): Remove last NULL argument from
5147         gimple_build_assign_with_ops call.
5149 2014-11-19  Wilco Dijkstra  <wdijkstr@arm.com>
5151         PR target/61915
5152         * config/aarch64/aarch64.c (generic_regmove_cost): Increase FP move
5153         cost.
5155 2014-11-19  Marek Polacek  <polacek@redhat.com>
5157         PR sanitizer/63690
5158         * ubsan.c (instrument_object_size): Check for MEM_REF.
5160 2014-11-19  Ilya Verbin  <ilya.verbin@intel.com>
5162         PR regression/63868
5163         * cgraph.c (cgraph_node::create): Guard g->have_offload with
5164         ifdef ENABLE_OFFLOADING.
5165         * omp-low.c (create_omp_child_function): Likewise.
5166         (expand_omp_target): Guard node->mark_force_output and offload_funcs
5167         with ifdef ENABLE_OFFLOADING.
5168         * varpool.c (varpool_node::get_create): Guard g->have_offload and
5169         offload_vars with ifdef ENABLE_OFFLOADING.
5171 2014-11-19  Felix Yang  <felix.yang@huawei.com>
5172             Shanyao Chen  <chenshanyao@huawei.com>
5174         PR target/59593
5175         * config/arm/arm.md (define_attr "arch"): Add v6t2.
5176         (define_attr "arch_enabled"): Add test for the above.
5177         (*movhi_insn_arch4): Add new alternative.
5179 2014-11-19  Richard Henderson  <rth@redhat.com>
5181         * c-family/c-common.c (c_common_reswords): Add
5182         __builtin_call_with_static_chain.
5183         * c-family/c-common.h (RID_BUILTIN_CALL_WITH_STATIC_CHAIN): New.
5184         * c/c-parser.c (c_parser_postfix_expression): Handle it.
5185         * doc/extend.texi (__builtin_call_with_static_chain): Document it.
5187         * calls.c (prepare_call_address): Allow decl or type for first arg.
5188         (expand_call): Pass type to prepare_call_address if no decl.
5189         * gimple-fold.c (gimple_fold_call): Eliminate the static chain if
5190         the function doesn't use it; fold it otherwise.
5191         * gimplify.c (gimplify_call_expr): Gimplify the static chain.
5192         * tree-cfg.c (verify_gimple_call): Allow a static chain on indirect
5193         function calls.
5195         * targhooks.c (default_static_chain): Remove check for
5196         DECL_STATIC_CHAIN.
5197         * config/moxie/moxie.c (moxie_static_chain): Likewise.
5198         * config/i386/i386.c (ix86_static_chain): Allow decl or type
5199         as the first argument.
5200         * config/xtensa/xtensa.c (xtensa_static_chain): Change the name
5201         of the unused first parameter.
5202         * doc/tm.texi (TARGET_STATIC_CHAIN): Document the first parameter
5203         may be a type.
5204         * target.def (static_chain): Likewise.
5206 2014-11-19  Renlin Li  <renlin.li@arm.com>
5208         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Define
5209         __ARM_FP_FAST, __ARM_FEATURE_FMA, __ARM_FP,
5210         __ARM_FEATURE_NUMERIC_MAXMIN, __ARM_NEON_FP.
5212 2014-11-19  Marek Polacek  <polacek@redhat.com>
5214         PR sanitizer/63879
5215         * fold-const.c (negate_expr_p) <case NEGATE_EXPR>: Return
5216         !TYPE_OVERFLOW_SANITIZED.
5217         (fold_negate_expr) <case INTEGER_CST>: Fold when overflow
5218         does not trap and when overflow wraps, or when SANITIZE_SI_OVERFLOW
5219         is 0.
5221 2014-11-19  Ilya Tocar  <ilya.tocar@intel.com>
5223         * collect2.c (main): Don't call fatal_error before
5224         diagnostic_initialize.
5225         * lto-wrapper.c (main): Likewise.
5227 2014-11-19  Tom de Vries  <tom@codesourcery.com>
5229         PR tree-optimization/62167
5230         * tree-ssa-tail-merge.c (stmt_local_def): Handle statements with vuse
5231         conservatively.
5232         (gimple_equal_p): Don't use vn_valueize to compare for lhs equality of
5233         assigns.
5235 2014-11-19  Jakub Jelinek  <jakub@redhat.com>
5237         PR tree-optimization/63915
5238         * tree-vect-stmts.c (vectorizable_simd_clone_call): Pass
5239         true instead of false as last argument to gsi_replace.
5241         PR sanitizer/63520
5242         * internal-fn.c (expand_ubsan_result_store): New function.
5243         (expand_addsub_overflow, expand_neg_overflow, expand_mul_overflow):
5244         Use it instead of just emit_move_insn.
5246 2014-11-19  Richard Biener  <rguenther@suse.de>
5248         PR tree-optimization/63844
5249         * omp-low.c (fixup_child_record_type): Use a restrict qualified
5250         referece type for the receiver parameter.
5252 2014-11-19  Jakub Jelinek  <jakub@redhat.com>
5254         PR sanitizer/63913
5255         * ubsan.c: Include tree-eh.h.
5256         (instrument_bool_enum_load): Handle loads that can throw.
5258         PR rtl-optimization/63843
5259         * simplify-rtx.c (simplify_binary_operation_1) <case ASHIFTRT>: For
5260         optimization of ashiftrt of subreg of lshiftrt, check that code
5261         is ASHIFTRT.
5263 2014-11-18  Andrew MacLeod  <amacleod@redhat.com>
5265         * attribs.c (decl_attributes): Remove always true condition,
5266         TREE_TYPE(x) will never compare equal to a TYPE_DECL.
5268 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5270         PR target/63937
5271         * target.def (use_by_pieces_infrastructure_p): Take unsigned
5272         HOST_WIDE_INT as the size parameter.
5273         * targhooks.c (default_use_by_pieces_infrastructure_p): Likewise.
5274         * targhooks.h (default_use_by_pieces_infrastructure_p): Likewise.
5275         * config/arc/arc.c (arc_use_by_pieces_infrastructure_p)): Likewise.
5276         * config/mips/mips.c (mips_use_by_pieces_infrastructure_p)): Likewise.
5277         * config/s390/s390.c (s390_use_by_pieces_infrastructure_p)): Likewise.
5278         * config/sh/sh.c (sh_use_by_pieces_infrastructure_p)): Likewise.
5279         * config/aarch64/aarch64.c
5280         (aarch64_use_by_pieces_infrastructure_p)): Likewise.
5281         * doc/tm.texi: Regenerate.
5283 2014-11-18  Jan Hubicka  <hubicka@ucw.cz>
5285         * ipa-cp.c (ipcp_cloning_candidate_p): Use opt_for_fn.
5286         (ipa_value_from_jfunc, ipa_context_from_jfunc): Skip sanity check.
5287         (ipa_get_indirect_edge_target_1): Use opt_for_fn.
5288         (good_cloning_opportunity_p): Likewise.
5289         (ipa-cp gate): Enable ipa-cp with LTO.
5290         * ipa-profile.c (ipa_propagate_frequency): Use opt_for_fn.
5291         * ipa.c (symbol_table::remove_unreachable_nodes): Always build type
5292         inheritance.
5293         * ipa-inline-transform.c (inline_transform): Check if there are inlines
5294         to apply even at -O0.
5295         * cgraphunit.c (cgraph_node::finalize_function): Use opt_for_fn.
5296         (analyze_functions): Build type inheritance graph.
5297         * ipa-inline.c (can_inline_edge_p): Use opt_for_fn.
5298         (want_early_inline_function_p, want_inline_small_function_p):
5299         Likewise.
5300         (check_callers): Likewise.
5301         (edge_badness): Likewise.
5302         (inline_small_functions): Always be ready for indirect inlining
5303         to happend.
5304         (ipa_inline): Always use want_inline_function_to_all_callers_p.
5305         (early_inline_small_functions): Use opt_for_fn.
5306         * ipa-inline-analysis.c (estimate_function_body_sizes): use opt_for_fn.
5307         (estimate_function_body_sizes): Likewise.
5308         (compute_inline_parameters): Likewise.
5309         (estimate_edge_devirt_benefit): Likewise.
5310         (inline_analyze_function): Likewise.
5311         * ipa-devirt.c (ipa_devirt): Likewise.
5312         (gate): Use in_lto_p.
5313         * ipa-prop.c (ipa_func_spec_opts_forbid_analysis_p): Use opt_for_fn.
5314         (try_make_edge_direct_virtual_call): Likewise.
5315         (update_indirect_edges_after_inlining): Likewise.
5316         (ipa_free_all_structures_after_ipa_cp): Add in_lto_p check.
5317         * common.opt (findirect-inlining): Turn into optimization.
5318         * ipa-pure-const.c (add_new_function): Use opt_for_fn.
5319         (pure_const_generate_summary): Likewise.
5320         (gate_pure_const): Always enable with in_lto_p.
5322 2014-11-18  Maciej W. Rozycki  <macro@codesourcery.com>
5324         * config/mips/mips.md (compression): Add `micromips32' setting.
5325         (enabled, length): Handle it.
5326         (shift_compression): Replace `micromips' with `micromips32' in
5327         the `compression' attribute.
5328         (*add<mode>3, sub<mode>3): Likewise.
5330 2014-11-18  Maciej W. Rozycki  <macro@codesourcery.com>
5332         * gcc/config/mips/mips.md (*jump_absolute): Use a branch when in
5333         range, a jump otherwise.
5335 2014-11-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
5337         * config/arm/cortex-a15-neon.md (cortex_a15_vfp_to_from_gp):
5338         Split into...
5339         (cortex_a15_gp_to_vfp): ...This.
5340         (cortex_a15_fp_to_gp): ...And this.
5341         Define and comment bypass from vfp operations to fp->gp moves.
5343 2014-11-18  Martin Liska  <mliska@suse.cz>
5345         * var-tracking.c (vt_find_locations): New fibonacci_node is used.
5347 2014-11-18  Martin Liska  <mliska@suse.cz>
5349         * bt-load.c (add_btr_def): New fibonacci_heap is used.
5350         (migrate_btr_defs): Likewise.
5352 2014-11-18  Martin Liska  <mliska@suse.cz>
5354         * tracer.c (tail_duplicate): New fibonacci_heap class is used.
5356 2014-11-18  Martin Liska  <mliska@suse.cz>
5358         * bb-reorder.c (mark_bb_visited): New fibonacci_heap is used.
5359         (find_traces): Likewise.
5360         (find_traces_1_round): Likewise.
5362 2014-11-18  Martin Liska  <mliska@suse.cz>
5364         * fibonacci_heap.h: New file.
5365         (fibonacci_heap::insert): Created from fibheap_insert.
5366         (fibonacci_heap::empty): Created from fibheap_empty.
5367         (fibonacci_heap::nodes): Created from fibheap_nodes.
5368         (fibonacci_heap::min_key): Created from fibheap_min_key.
5369         (fibonacci_heap::decrease_key): Created from fibheap_replace_key.
5370         (fibonacci_heap::replace_key_data): Created from fibheap_replace_key_data.
5371         (fibonacci_heap::extract_min): Created from fibheap_extract_min.
5372         (fibonacci_heap::min): Created from fibheap_min.
5373         (fibonacci_heap::replace_data): Created from fibheap_replace_data.
5374         (fibonacci_heap::delete_node): Created from fibheap_delete_node.
5375         (fibonacci_heap::union_with): Created from fibheap_union.
5376         * ipa-inline.c (update_edge_key): New heap API is used.
5377         (update_caller_keys): Likewise.
5378         (update_callee_keys): Likewise.
5379         (lookup_recursive_calls): Likewise.
5380         (recursive_inlining): Likewise.
5381         (add_new_edges_to_heap): Likewise.
5382         (heap_edge_removal_hook): Likewise.
5383         (inline_small_functions): Likewise.
5385 2014-11-18  Marek Polacek  <polacek@redhat.com>
5387         PR sanitizer/63866
5388         * asan.c (asan_global_struct): Create a TYPE_DECL for "__asan_global",
5389         put it into TYPE_NAME and TYPE_STUB_DECL.
5390         * ubsan.c (ubsan_type_descriptor_type): New variable.
5391         Function renamed to ...
5392         (ubsan_get_type_descriptor_type): ... this.  Cache
5393         return value in ubsan_type_descriptor_type variable.
5394         Create a TYPE_DECL for "__ubsan_type_descriptor", put it into
5395         TYPE_NAME and TYPE_STUB_DECL.
5396         (ubsan_get_source_location_type): Create a TYPE_DECL for
5397         "__ubsan_source_location", put it into TYPE_NAME and TYPE_STUB_DECL.
5398         (ubsan_type_descriptor, ubsan_create_data): Call
5399         ubsan_get_type_descriptor_type instead of ubsan_type_descriptor_type.
5400         Create a TYPE_DECL for name, put it into TYPE_NAME and TYPE_STUB_DECL.
5402 2014-11-18  Felix Yang  <felix.yang@huawei.com>
5404         * config/aarch64/aarch64.c (doloop_end): New pattern.
5405         * config/aarch64/aarch64.md (TARGET_CAN_USE_DOLOOP_P): Implement.
5407 2014-11-18  Jason Merrill  <jason@redhat.com>
5409         * tree.c (warn_deprecated_use): Show declaration with inform.
5411 2014-11-18  Richard Biener  <rguenther@suse.de>
5413         PR tree-optimization/63914
5414         * tree-ssa-ccp.c (canonicalize_value): Remove float value
5415         canonicalization.
5416         (valid_lattice_transition): Allow (partial) transition
5417         from NaN to non-NaN if !HONOR_NANS.
5418         (set_lattice_value): Check for valid lattice transitions
5419         only when checking is enabled.
5421 2014-11-18  Bernd Schmidt  <bernds@codesourcery.com>
5423         * config/nvptx/nvptx.c: Include <sstream> directly after "config.h".
5425 2014-11-18  Christophe Lyon  <christophe.lyon@linaro.org>
5427         * config/arm/neon-testgen.ml (emit_prologue): Handle new
5428         compile_test_optim argument.
5429         (emit_automatics): Rename to emit_variables. Support variable
5430         indentation of its output.
5431         (compile_test_optim): New function.
5432         (test_intrinsic): Call compile_test_optim.
5433         * config/arm/neon.ml (features): Add Compiler_optim.
5434         (ops): Add Compiler_optim feature to Vbic and Vorn.
5435         (type_in_crypto_only): Replace 'or' by '||'.
5436         (reinterp): Likewise.
5437         (reinterpq): Likewise.
5439 2014-11-18  Alan Lawrence  <alan.lawrence@arm.com>
5441         * config/aarch64/arm_neon.h (vld1_dup_f32, vld1_dup_f64, vld1_dup_p8,
5442         vld1_dup_p16, vld1_dup_s8, vld1_dup_s16, vld1_dup_s32, vld1_dup_s64,
5443         vld1_dup_u8, vld1_dup_u16, vld1_dup_u32, vld1_dup_u64, vld1q_dup_f32,
5444         vld1q_dup_f64, vld1q_dup_p8, vld1q_dup_p16, vld1q_dup_s8, vld1q_dup_s16,
5445         vld1q_dup_s32, vld1q_dup_s64, vld1q_dup_u8, vld1q_dup_u16,
5446         vld1q_dup_u32, vld1q_dup_u64): Replace inline asm with vdup_n_ and
5447         pointer dereference.
5449 2014-11-18  Marc Glisse  <marc.glisse@inria.fr>
5451         * tree.c (element_mode, integer_truep): New functions.
5452         * tree.h (element_mode, integer_truep): Declare them.
5453         * fold-const.c (negate_expr_p, fold_negate_expr, combine_comparisons,
5454         fold_cond_expr_with_comparison, fold_real_zero_addition_p,
5455         fold_comparison, fold_ternary_loc, tree_call_nonnegative_warnv_p,
5456         fold_strip_sign_ops): Use element_mode.
5457         (fold_binary_loc): Use element_mode and element_precision.
5458         * match.pd: Use integer_truep, element_mode, element_precision,
5459         VECTOR_TYPE_P and build_one_cst. Extend some transformations to
5460         vectors. Simplify A/-A.
5462 2014-11-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
5464         * config/arm/arm.md (unaligned_loaddi): Use std::swap instead of
5465         manual swapping implementation.
5466         (movcond_addsi): Likewise.
5467         * config/arm/arm.c (arm_canonicalize_comparison): Likewise.
5468         (arm_select_dominance_cc_mode): Likewise.
5469         (arm_reload_out_hi): Likewise.
5470         (gen_operands_ldrd_strd): Likewise.
5471         (output_move_double): Likewise.
5472         (arm_print_operand_address): Likewise.
5473         (thumb_output_move_mem_multiple): Likewise.
5474         (SWAP_RTX): Delete.
5476 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5478         * config/arm/arm-builtins.c (CONVERT_QUALIFIERS): Delete.
5479         (COPYSIGNF_QUALIFIERS): Likewise.
5480         (CREATE_QUALIFIERS): Likewise.
5481         (DUP_QUALIFIERS): Likewise.
5482         (FLOAT_WIDEN_QUALIFIERS): Likewise.
5483         (FLOAT_NARROW_QUALIFIERS): Likewise.
5484         (REINTERP_QUALIFIERS): Likewise.
5485         (RINT_QUALIFIERS): Likewise.
5486         (SPLIT_QUALIFIERS): Likewise.
5487         (FIXCONV_QUALIFIERS): Likewise.
5488         (SCALARMUL_QUALIFIERS): Likewise.
5489         (SCALARMULL_QUALIFIERS): Likewise.
5490         (SCALARMULH_QUALIFIERS): Likewise.
5491         (SELECT_QUALIFIERS): Likewise.
5492         (VTBX_QUALIFIERS): Likewise.
5493         (SHIFTIMM_QUALIFIERS): Likewise.
5494         (SCALARMAC_QUALIFIERS): Likewise.
5495         (LANEMUL_QUALIFIERS): Likewise.
5496         (LANEMULH_QUALIFIERS): Likewise.
5497         (LANEMULL_QUALIFIERS): Likewise.
5498         (SHIFTACC_QUALIFIERS): Likewise.
5499         (SHIFTINSERT_QUALIFIERS): Likewise.
5500         (VTBL_QUALIFIERS): Likewise.
5501         (LOADSTRUCT_QUALIFIERS): Likewise.
5502         (LOADSTRUCTLANE_QUALIFIERS): Likewise.
5503         (STORESTRUCT_QUALIFIERS): Likewise.
5504         (STORESTRUCTLANE_QUALIFIERS): Likewise.
5505         (neon_builtin_type_mode): Delete.
5506         (v8qi_UP): Map to V8QImode.
5507         (v8qi_UP): Map to V8QImode.
5508         (v4hi_UP): Map to V4HImode.
5509         (v4hf_UP): Map to V4HFmode.
5510         (v2si_UP): Map to V2SImode.
5511         (v2sf_UP): Map to V2SFmode.
5512         (di_UP): Map to DImode.
5513         (v16qi_UP): Map to V16QImode.
5514         (v8hi_UP): Map to V8HImode.
5515         (v4si_UP): Map to V4SImode.
5516         (v4sf_UP): Map to V4SFmode.
5517         (v2di_UP): Map to V2DImode.
5518         (ti_UP): Map to TImode.
5519         (ei_UP): Map to EImode.
5520         (oi_UP): Map to OImode.
5521         (neon_itype): Delete.
5522         (neon_builtin_datum): Remove itype, make mode a machine_mode.
5523         (VAR1): Update accordingly.
5524         (arm_init_neon_builtins): Use machine_mode directly.
5525         (neon_dereference_pointer): Likewise.
5526         (arm_expand_neon_args): Use qualifiers to decide operand types.
5527         (arm_expand_neon_builtin): Likewise.
5528         * config/arm/arm_neon_builtins.def: Remap operation type for
5529         many builtins.
5531 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5533         * config/arm/arm-builtins.c (arm_scalar_builtin_types): New.
5534         (enum arm_simd_type): Likewise.
5535         (struct arm_simd_type_info): Likewise
5536         (arm_mangle_builtin_scalar_type): Likewise.
5537         (arm_mangle_builtin_vector_type): Likewise.
5538         (arm_mangle_builtin_type): Likewise.
5539         (arm_simd_builtin_std_type): Likewise.
5540         (arm_lookup_simd_builtin_type): Likewise.
5541         (arm_simd_builtin_type): Likewise.
5542         (arm_init_simd_builtin_types): Likewise.
5543         (arm_init_simd_builtin_scalar_types): Likewise.
5544         (arm_init_neon_builtins): Rewrite using qualifiers.
5545         * config/arm/arm-protos.h (arm_mangle_builtin_type): New.
5546         * config/arm/arm-simd-builtin-types.def: New file.
5547         * config/arm/t-arm (arm-builtins.o): Depend on it.
5548         * config/arm/arm.c (arm_mangle_type): Call arm_mangle_builtin_type.
5549         * config/arm/arm_neon.h (int8x8_t): Use new internal type.
5550         (int16x4_t): Likewise.
5551         (int32x2_t): Likewise.
5552         (float16x4_t): Likewise.
5553         (float32x2_t): Likewise.
5554         (poly8x8_t): Likewise.
5555         (poly16x4_t): Likewise.
5556         (uint8x8_t): Likewise.
5557         (uint16x4_t): Likewise.
5558         (uint32x2_t): Likewise.
5559         (int8x16_t): Likewise.
5560         (int16x8_t): Likewise.
5561         (int32x4_t): Likewise.
5562         (int64x2_t): Likewise.
5563         (float32x4_t): Likewise.
5564         (poly8x16_t): Likewise.
5565         (poly16x8_t): Likewise.
5566         (uint8x16_t): Likewise.
5567         (uint16x8_t): Likewise.
5568         (uint32x4_t): Likewise.
5569         (uint64x2_t): Likewise.
5571 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5573         * gcc/config/arm/arm-builtins.c (arm_type_qualifiers): New.
5574         (neon_itype): Add new types corresponding to the types used in
5575         qualifiers names.
5576         (arm_unop_qualifiers): New.
5577         (arm_bswap_qualifiers): Likewise.
5578         (arm_binop_qualifiers): Likewise.
5579         (arm_ternop_qualifiers): Likewise.
5580         (arm_getlane_qualifiers): Likewise.
5581         (arm_lanemac_qualifiers): Likewise.
5582         (arm_setlane_qualifiers): Likewise.
5583         (arm_combine_qualifiers): Likewise.
5584         (arm_load1_qualifiers): Likewise.
5585         (arm_load1_lane_qualifiers): Likewise.
5586         (arm_store1_qualifiers): Likewise.
5587         (arm_storestruct_lane_qualifiers): Likewise.
5588         (UNOP_QUALIFIERS): Likewise.
5589         (DUP_QUALIFIERS): Likewise.
5590         (SPLIT_QUALIFIERS): Likewise.
5591         (CONVERT_QUALIFIERS): Likewise.
5592         (FLOAT_WIDEN_QUALIFIERS): Likewise.
5593         (FLOAT_NARROW_QUALIFIERS): Likewise.
5594         (RINT_QUALIFIERS): Likewise.
5595         (COPYSIGNF_QUALIFIERS): Likewise.
5596         (CREATE_QUALIFIERS): Likewise.
5597         (REINTERP_QUALIFIERS): Likewise.
5598         (BSWAP_QUALIFIERS): Likewise.
5599         (BINOP_QUALIFIERS): Likewise.
5600         (FIXCONV_QUALIFIERS): Likewise.
5601         (SCALARMUL_QUALIFIERS): Likewise.
5602         (SCALARMULL_QUALIFIERS): Likewise.
5603         (SCALARMULH_QUALIFIERS): Likewise.
5604         (TERNOP_QUALIFIERS): Likewise.
5605         (SELECT_QUALIFIERS): Likewise.
5606         (VTBX_QUALIFIERS): Likewise.
5607         (GETLANE_QUALIFIERS): Likewise.
5608         (SHIFTIMM_QUALIFIERS): Likewise.
5609         (LANEMAC_QUALIFIERS): Likewise.
5610         (SCALARMAC_QUALIFIERS): Likewise.
5611         (SETLANE_QUALIFIERS): Likewise.
5612         (SHIFTINSERT_QUALIFIERS): Likewise.
5613         (SHIFTACC_QUALIFIERS): Likewise.
5614         (LANEMUL_QUALIFIERS): Likewise.
5615         (LANEMULL_QUALIFIERS): Likewise.
5616         (LANEMULH_QUALIFIERS): Likewise.
5617         (COMBINE_QUALIFIERS): Likewise.
5618         (VTBL_QUALIFIERS): Likewise.
5619         (LOAD1_QUALIFIERS): Likewise.
5620         (LOADSTRUCT_QUALIFIERS): Likewise.
5621         (LOAD1LANE_QUALIFIERS): Likewise.
5622         (LOADSTRUCTLANE_QUALIFIERS): Likewise.
5623         (STORE1_QUALIFIERS): Likewise.
5624         (STORESTRUCT_QUALIFIERS): Likewise.
5625         (STORE1LANE_QUALIFIERS): Likewise.
5626         (STORESTRUCTLANE_QUALIFIERS): Likewise.
5627         (neon_builtin_datum): Keep track of qualifiers.
5628         (VAR1): Likewise.
5630 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5632         * config/arm/arm-builtins.c (VAR1): Add a comma.
5633         (VAR2): Rewrite in terms of VAR1.
5634         (VAR3-10): Likewise.
5635         (arm_builtins): Remove leading comma before ARM_BUILTIN_MAX.
5636         * config/arm/arm_neon_builtins.def: Remove trailing commas.
5638 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5640         * config.gcc (extra_objs): Add arm-builtins.o for arm*-*-*.
5641         (target_gtfiles): Add config/arm/arm-builtins.c for arm*-*-*.
5642         * config/arm/arm-builtins.c: New.
5643         * config/arm/t-arm (arm_builtins.o): New.
5644         * config/arm/arm-protos.h (arm_expand_builtin): New.
5645         (arm_builtin_decl): Likewise.
5646         (arm_init_builtins): Likewise.
5647         (arm_atomic_assign_expand_fenv): Likewise.
5648         * config/arm/arm.c (arm_atomic_assign_expand_fenv): Remove prototype.
5649         (arm_init_builtins): Likewise.
5650         (arm_init_iwmmxt_builtins): Likewise
5651         (safe_vector_operand): Likewise
5652         (arm_expand_binop_builtin): Likewise
5653         (arm_expand_unop_builtin): Likewise
5654         (arm_expand_builtin): Likewise
5655         (arm_builtin_decl): Likewise
5656         (insn_flags): Remove static.
5657         (tune_flags): Likewise.
5658         (enum arm_builtins): Move to config/arm/arm-builtins.c.
5659         (arm_init_neon_builtins): Likewise.
5660         (struct builtin_description): Likewise.
5661         (arm_init_iwmmxt_builtins): Likewise.
5662         (arm_init_fp16_builtins): Likewise.
5663         (arm_init_crc32_builtins): Likewise.
5664         (arm_init_builtins): Likewise.
5665         (arm_builtin_decl): Likewise.
5666         (safe_vector_operand): Likewise.
5667         (arm_expand_ternop_builtin): Likewise.
5668         (arm_expand_binop_builtin): Likewise.
5669         (arm_expand_unop_builtin): Likewise.
5670         (neon_dereference_pointer): Likewise.
5671         (arm_expand_neon_args): Likewise.
5672         (arm_expand_neon_builtin): Likewise.
5673         (neon_split_vcombine): Likewise.
5674         (arm_expand_builtin): Likewise.
5675         (arm_builtin_vectorized_function): Likewise.
5676         (arm_atomic_assign_expand_fenv): Likewise.
5678 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5680         * config/arm/t-arm (arm.o): Include arm-protos.h in the recipe.
5681         * config/arm/arm.c (FL_CO_PROC): Move to arm-protos.h.
5682         (FL_ARCH3M): Likewise.
5683         (FL_MODE26): Likewise.
5684         (FL_MODE32): Likewise.
5685         (FL_ARCH4): Likewise.
5686         (FL_ARCH5): Likewise.
5687         (FL_THUMB): Likewise.
5688         (FL_LDSCHED): Likewise.
5689         (FL_STRONG): Likewise.
5690         (FL_ARCH5E): Likewise.
5691         (FL_XSCALE): Likewise.
5692         (FL_ARCH6): Likewise.
5693         (FL_VFPV2): Likewise.
5694         (FL_WBUF): Likewise.
5695         (FL_ARCH6K): Likewise.
5696         (FL_THUMB2): Likewise.
5697         (FL_NOTM): Likewise.
5698         (FL_THUMB_DIV): Likewise.
5699         (FL_VFPV3): Likewise.
5700         (FL_NEON): Likewise.
5701         (FL_ARCH7EM): Likewise.
5702         (FL_ARCH7): Likewise.
5703         (FL_ARM_DIV): Likewise.
5704         (FL_ARCH8): Likewise.
5705         (FL_CRC32): Likewise.
5706         (FL_SMALLMUL): Likewise.
5707         (FL_IWMMXT): Likewise.
5708         (FL_IWMMXT2): Likewise.
5709         (FL_TUNE): Likewise.
5710         (FL_FOR_ARCH2): Likewise.
5711         (FL_FOR_ARCH3): Likewise.
5712         (FL_FOR_ARCH3M): Likewise.
5713         (FL_FOR_ARCH4): Likewise.
5714         (FL_FOR_ARCH4T): Likewise.
5715         (FL_FOR_ARCH5): Likewise.
5716         (FL_FOR_ARCH5T): Likewise.
5717         (FL_FOR_ARCH5E): Likewise.
5718         (FL_FOR_ARCH5TE): Likewise.
5719         (FL_FOR_ARCH5TEJ): Likewise.
5720         (FL_FOR_ARCH6): Likewise.
5721         (FL_FOR_ARCH6J): Likewise.
5722         (FL_FOR_ARCH6K): Likewise.
5723         (FL_FOR_ARCH6Z): Likewise.
5724         (FL_FOR_ARCH6ZK): Likewise.
5725         (FL_FOR_ARCH6T2): Likewise.
5726         (FL_FOR_ARCH6M): Likewise.
5727         (FL_FOR_ARCH7): Likewise.
5728         (FL_FOR_ARCH7A): Likewise.
5729         (FL_FOR_ARCH7VE): Likewise.
5730         (FL_FOR_ARCH7R): Likewise.
5731         (FL_FOR_ARCH7M): Likewise.
5732         (FL_FOR_ARCH7EM): Likewise.
5733         (FL_FOR_ARCH8A): Likewise.
5734         * config/arm/arm-protos.h: Take definitions moved from arm.c.
5736 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5738         * config/arm/arm.c (arm_expand_neon_builtin): Remove "Magic Word"
5739         parameter, rearrange switch statement accordingly.
5740         (arm_evpc_neon_vrev): Remove "Magic Word".
5741         * config/arm/unspecs.md (unspec): Split many UNSPECs to
5742         rounding, or signed/unsigned variants.
5743         * config/arm/neon.md (vcond<mode><mode>): Remove "Magic Word" code.
5744         (vcondu<mode><mode>): Likewise.
5745         (neon_vadd): Remove "Magic Word" operand.
5746         (neon_vaddl): Remove "Magic Word" operand, convert to use
5747         signed/unsigned iterator.
5748         (neon_vaddw): Likewise.
5749         (neon_vhadd): Likewise, also iterate over "rounding" forms.
5750         (neon_vqadd): Remove "Magic Word" operand, convert to use
5751         signed/unsigned iterator.
5752         (neon_v<r>addhn): Remove "Magic Word" operand, convert to iterate
5753         over "rounding" forms.
5754         (neon_vmul): Remove "Magic Word" operand, iterate over
5755         polynomial/float instruction forms.
5756         (neon_vmla): Remove "Magic Word" operand.
5757         (neon_vfma): Likewise.
5758         (neon_vfms): Likewise.
5759         (neon_vmls): Likewise.
5760         (neon_vmlal): Remove "Magic Word" operand, iterate over
5761         signed/unsigned forms.
5762         (neon_vmlsl): Likewise.
5763         (neon_vqdmulh): Remove "Magic Word" operand, iterate over "rounding"
5764         forms.
5765         (neon_vqdmlal): Remove "Magic Word" operand, iterate over
5766         signed/unsigned forms.
5767         (neon_vqdmlsl): Likewise.
5768         (neon_vmull): Likewise.
5769         (neon_vqdmull): Remove "Magic Word" operand.
5770         (neon_vsub): Remove "Magic Word" operand.
5771         (neon_vsubl): Remove "Magic Word" operand, convert to use
5772         signed/unsigned iterator.
5773         (neon_vsubw): Likewise.
5774         (neon_vhsub): Likewise.
5775         (neon_vqsub): Likewise.
5776         (neon_v<r>subhn): Remove "Magic Word" operand, convert to iterate
5777         over "rounding" forms.
5778         (neon_vceq): Remove "Magic Word" operand.
5779         (neon_vcge): Likewise.
5780         (neon_vcgeu): Likewise.
5781         (neon_vcgt): Likewise.
5782         (neon_vcgtu): Likewise.
5783         (neon_vcle): Likewise.
5784         (neon_vclt): Likewise.
5785         (neon_vcage): Likewise.
5786         (neon_vcagt): Likewise.
5787         (neon_vabd): Remove "Magic Word" operand, iterate over
5788         signed/unsigned forms, and split out...
5789         (neon_vabdf): ...this as new.
5790         (neon_vabdl): Remove "Magic Word" operand, iterate over
5791         signed/unsigned forms.
5792         (neon_vaba): Likewise.
5793         (neon_vmax): Remove "Magic Word" operand, iterate over
5794         signed/unsigned and max/min forms, and split out...
5795         (neon_v<maxmin>f): ...this as new.
5796         (neon_vmin): Delete.
5797         (neon_vpadd): Remove "Magic Word" operand.
5798         (neon_vpaddl): Remove "Magic Word" operand, iterate over
5799         signed/unsigned variants.
5800         (neon_vpadal): Likewise.
5801         (neon_vpmax): Remove "Magic Word" operand, iterate over
5802         signed/unsigned and max/min forms, and split out...
5803         (neon_vp<maxmin>f): ...this as new.
5804         (neon_vpmin): Delete.
5805         (neon_vrecps): Remove "Magic Word" operand.
5806         (neon_vrsqrts): Likewise.
5807         (neon_vabs): Likewise.
5808         (neon_vqabs): Likewise.
5809         (neon_vneg): Likewise.
5810         (neon_vqneg): Likewise.
5811         (neon_vcls): Likewise.
5812         (neon_vcnt): Likewise.
5813         (neon_vrecpe): Likewise.
5814         (neon_vrsqrte): Likewise.
5815         (neon_vmvn): Likewise.
5816         (neon_vget_lane): Likewise.
5817         (neon_vget_laneu): New.
5818         (neon_vget_lanedi): Remove "Magic Word" operand.
5819         (neon_vget_lanev2di): Likewise.
5820         (neon_vcvt): Remove "Magic Word" operand, iterate over
5821         signed/unsigned variants.
5822         (neon_vcvt_n): Likewise.
5823         (neon_vmovn): Remove "Magic Word" operand.
5824         (neon_vqmovn): Remove "Magic Word" operand, iterate over
5825         signed/unsigned variants.
5826         (neon_vmovun): Remove "Magic Word" operand.
5827         (neon_vmovl): Remove "Magic Word" operand, iterate over
5828         signed/unsigned variants.
5829         (neon_vmul_lane): Remove "Magic Word" operand.
5830         (neon_vmull_lane): Remove "Magic Word" operand, iterate over
5831         signed/unsigned variants.
5832         (neon_vqdmull_lane): Remove "Magic Word" operand.
5833         (neon_vqdmulh_lane): Remove "Magic Word" operand, iterate over
5834         rounding variants.
5835         (neon_vmla_lane): Remove "Magic Word" operand.
5836         (neon_vmlal_lane): Remove "Magic Word" operand, iterate over
5837         signed/unsigned variants.
5838         (neon_vqdmlal_lane): Remove "Magic Word" operand.
5839         (neon_vmls_lane): Likewise.
5840         (neon_vmlsl_lane): Remove "Magic Word" operand, iterate over
5841         signed/unsigned variants.
5842         (neon_vqdmlsl_lane): Remove "Magic Word" operand.
5843         (neon_vmul_n): Remove "Magic Word" operand.
5844         (neon_vmull_n): Rename to...
5845         (neon_vmulls_n): ...this, remove "Magic Word" operand.
5846         (neon_vmullu_n): New.
5847         (neon_vqdmull_n): Remove "Magic Word" operand.
5848         (neon_vqdmulh_n): Likewise.
5849         (neon_vqrdmulh_n): New.
5850         (neon_vmla_n): Remove "Magic Word" operand.
5851         (neon_vmls_n): Likewise.
5852         (neon_vmlal_n): Rename to...
5853         (neon_vmlals_n): ...this, remove "Magic Word" operand.
5854         (neon_vmlalu_n): New.
5855         (neon_vqdmlal_n): Remove "Magic Word" operand.
5856         (neon_vmlsl_n): Rename to...
5857         (neon_vmlsls_n): ...this, remove "Magic Word" operand.
5858         (neon_vmlslu_n): New.
5859         (neon_vqdmlsl_n): Remove "Magic Word" operand.
5860         (neon_vrev64): Remove "Magic Word" operand.
5861         (neon_vrev32): Likewise.
5862         (neon_vrev16): Likewise.
5863         (neon_vshl): Remove "Magic Word" operand, iterate over
5864         signed/unsigned and "rounding" forms.
5865         (neon_vqshl): Likewise.
5866         (neon_vshr_n): Likewise.
5867         (neon_vshrn_n): Remove "Magic Word" operand, iterate over
5868         "rounding" forms.
5869         (neon_vqshrn_n): Remove "Magic Word" operand, iterate over
5870         signed/unsigned and "rounding" forms.
5871         (neon_vqshrun_n): Remove "Magic Word" operand, iterate over
5872         "rounding" forms.
5873         (neon_vshl_n): Remove "Magic Word" operand.
5874         (neon_vqshl_n): Remove "Magic Word" operand, iterate over
5875         signed/unsigned variants.
5876         (neon_vqshlu_n): Remove "Magic Word" operand.
5877         (neon_vshll_n): Remove "Magic Word" operand, iterate over
5878         signed/unsigned variants.
5879         (neon_vsra_n): Remove "Magic Word" operand, iterate over
5880         signed/unsigned and "rounding" forms.
5881         * config/arm/iterators.md (VPF): New.
5882         (VADDL): Likewise.
5883         (VADDW): Likewise.
5884         (VHADD): Likewise.
5885         (VQADD): Likewise.
5886         (VADDHN): Likewise.
5887         (VMLAL): Likewise.
5888         (VMLAL_LANE): Likewise.
5889         (VLMSL): Likewise.
5890         (VMLSL_LANE): Likewise.
5891         (VQDMULH): Likewise,
5892         (VQDMULH_LANE): Likewise.
5893         (VMULL): Likewise.
5894         (VMULL_LANE): Likewise.
5895         (VSUBL): Likewise.
5896         (VSUBW): Likewise.
5897         (VHSUB): Likewise.
5898         (VQSUB): Likewise.
5899         (VSUBHN): Likewise.
5900         (VABD): Likewise.
5901         (VABDL): Likewise.
5902         (VMAXMIN): Likewise.
5903         (VMAXMINF): Likewise.
5904         (VPADDL): Likewise.
5905         (VPADAL): Likewise.
5906         (VPMAXMIN): Likewise.
5907         (VPMAXMINF): Likewise.
5908         (VCVT_US): Likewise.
5909         (VCVT_US_N): Likewise.
5910         (VQMOVN): Likewise.
5911         (VMOVL): Likewise.
5912         (VSHL): Likewise.
5913         (VQSHL): Likewise.
5914         (VSHR_N): Likewise.
5915         (VSHRN_N): Likewise.
5916         (VQSHRN_N): Likewise.
5917         (VQSHRUN_N): Likewise.
5918         (VQSHL_N): Likewise.
5919         (VSHLL_N): Likewise.
5920         (VSRA_N): Likewise.
5921         (pf): Likewise.
5922         (sup): Likewise.
5923         (r): Liekwise.
5924         (maxmin): Likewise.
5925         (shift_op): Likewise.
5926         * config/arm/arm_neon_builtins.def (vaddl): Split to...
5927         (vaddls): ...this and...
5928         (vaddlu): ...this.
5929         (vaddw): Split to...
5930         (vaddws): ...this and...
5931         (vaddwu): ...this.
5932         (vhadd): Split to...
5933         (vhadds): ...this and...
5934         (vhaddu): ...this and...
5935         (vrhadds): ...this and...
5936         (vrhaddu): ...this.
5937         (vqadd): Split to...
5938         (vqadds): ...this and...
5939         (vqaddu): ...this.
5940         (vaddhn): Split to itself and...
5941         (vraddhn): ...this.
5942         (vmul): Split to...
5943         (vmulf): ...this and...
5944         (vmulp): ...this.
5945         (vmlal): Split to...
5946         (vmlals): ...this and...
5947         (vmlalu): ...this.
5948         (vmlsl): Split to...
5949         (vmlsls): ...this and...
5950         (vmlslu): ...this.
5951         (vqdmulh): Split to itself and...
5952         (vqrdmulh): ...this.
5953         (vmull): Split to...
5954         (vmullp): ...this and...
5955         (vmulls): ...this and...
5956         (vmullu): ...this.
5957         (vmull_n): Split to...
5958         (vmulls_n): ...this and...
5959         (vmullu_n): ...this.
5960         (vmull_lane): Split to...
5961         (vmulls_lane): ...this and...
5962         (vmullu_lane): ...this.
5963         (vqdmulh_n): Split to itself and...
5964         (vqrdmulh_n): ...this.
5965         (vqdmulh_lane): Split to itself and...
5966         (vqrdmulh_lane): ...this.
5967         (vshl): Split to...
5968         (vshls): ...this and...
5969         (vshlu): ...this and...
5970         (vrshls): ...this and...
5971         (vrshlu): ...this.
5972         (vqshl): Split to...
5973         (vqshls): ...this and...
5974         (vqrshlu): ...this and...
5975         (vqrshls): ...this and...
5976         (vqrshlu): ...this.
5977         (vshr_n): Split to...
5978         (vshrs_n): ...this and...
5979         (vshru_n): ...this and...
5980         (vrshrs_n): ...this and...
5981         (vrshru_n): ...this.
5982         (vshrn_n): Split to itself and...
5983         (vrshrn_n): ...this.
5984         (vqshrn_n): Split to...
5985         (vqshrns_n): ...this and...
5986         (vqshrnu_n): ...this and...
5987         (vqrshrns_n): ...this and...
5988         (vqrshrnu_n): ...this.
5989         (vqshrun_n): Split to itself and...
5990         (vqrshrun_n): ...this.
5991         (vqshl_n): Split to...
5992         (vqshl_s_n): ...this and...
5993         (vqshl_u_n): ...this.
5994         (vshll_n): Split to...
5995         (vshlls_n): ...this and...
5996         (vshllu_n): ...this.
5997         (vsra_n): Split to...
5998         (vsras_n): ...this and...
5999         (vsrau_n): ...this and.
6000         (vrsras_n): ...this and...
6001         (vrsrau_n): ...this and.
6002         (vsubl): Split to...
6003         (vsubls): ...this and...
6004         (vsublu): ...this.
6005         (vsubw): Split to...
6006         (vsubws): ...this and...
6007         (vsubwu): ...this.
6008         (vqsub): Split to...
6009         (vqsubs): ...this and...
6010         (vqsubu): ...this.
6011         (vhsub): Split to...
6012         (vhsubs): ...this and...
6013         (vhsubu): ...this.
6014         (vsubhn): Split to itself and...
6015         (vrsubhn): ...this.
6016         (vabd): Split to...
6017         (vabds): ...this and...
6018         (vabdu): ...this and...
6019         (vabdf): ...this.
6020         (vabdl): Split to...
6021         (vabdls): ...this and...
6022         (vabdlu): ...this.
6023         (vaba): Split to...
6024         (vabas): ...this and...
6025         (vabau): ...this and...
6026         (vabal): Split to...
6027         (vabals): ...this and...
6028         (vabalu): ...this.
6029         (vmax): Split to...
6030         (vmaxs): ...this and...
6031         (vmaxu): ...this and...
6032         (vmaxf): ...this.
6033         (vmin): Split to...
6034         (vmins): ...this and...
6035         (vminu): ...this and...
6036         (vminf): ...this.
6037         (vpmax): Split to...
6038         (vpmaxs): ...this and...
6039         (vpmaxu): ...this and...
6040         (vpmaxf): ...this.
6041         (vpmin): Split to...
6042         (vpmins): ...this and...
6043         (vpminu): ...this and...
6044         (vpminf): ...this.
6045         (vpaddl): Split to...
6046         (vpaddls): ...this and...
6047         (vpaddlu): ...this.
6048         (vpadal): Split to...
6049         (vpadals): ...this and...
6050         (vpadalu): ...this.
6051         (vget_laneu): New.
6052         (vqmovn): Split to...
6053         (vqmovns): ...this and...
6054         (vqmovnu): ...this.
6055         (vmovl): Split to...
6056         (vmovls): ...this and...
6057         (vmovlu): ...this.
6058         (vmlal_lane): Split to...
6059         (vmlals_lane): ...this and...
6060         (vmlalu_lane): ...this.
6061         (vmlsl_lane): Split to...
6062         (vmlsls_lane): ...this and...
6063         (vmlslu_lane): ...this.
6064         (vmlal_n): Split to...
6065         (vmlals_n): ...this and...
6066         (vmlalu_n): ...this.
6067         (vmlsl_n): Split to...
6068         (vmlsls_n): ...this and...
6069         (vmlslu_n): ...this.
6070         (vext): Make type "SHIFTINSERT".
6071         (vcvt): Split to...
6072         (vcvts): ...this and...
6073         (vcvtu): ...this.
6074         (vcvt_n): Split to...
6075         (vcvts_n): ...this and...
6076         (vcvtu_n): ...this.
6077         * config/arm/arm_neon.h (vaddl_s8): Remove "Magic Word".
6078         (vaddl_s16): Likewise.
6079         (vaddl_s32): Likewise.
6080         (vaddl_u8): Likewise.
6081         (vaddl_u16): Likewise.
6082         (vaddl_u32): Likewise.
6083         (vaddw_s8): Likewise.
6084         (vaddw_s16): Likewise.
6085         (vaddw_s32): Likewise.
6086         (vaddw_u8): Likewise.
6087         (vaddw_u16): Likewise.
6088         (vaddw_u32): Likewise.
6089         (vhadd_s8): Likewise.
6090         (vhadd_s16): Likewise.
6091         (vhadd_s32): Likewise.
6092         (vhadd_u8): Likewise.
6093         (vhadd_u16): Likewise.
6094         (vhadd_u32): Likewise.
6095         (vhaddq_s8): Likewise.
6096         (vhaddq_s16): Likewise.
6097         (vhaddq_s32): Likewise.
6098         (vhaddq_u8): Likewise.
6099         (vhaddq_u16): Likewise.
6100         (vrhadd_s8): Likewise.
6101         (vrhadd_s16): Likewise.
6102         (vrhadd_s32): Likewise.
6103         (vrhadd_u8): Likewise.
6104         (vrhadd_u16): Likewise.
6105         (vrhadd_u32): Likewise.
6106         (vrhaddq_s8): Likewise.
6107         (vrhaddq_s16): Likewise.
6108         (vrhaddq_s32): Likewise.
6109         (vrhaddq_u8): Likewise.
6110         (vrhaddq_u16): Likewise.
6111         (vrhaddq_u32): Likewise.
6112         (vqadd_s8): Likewise.
6113         (vqadd_s16): Likewise.
6114         (vqadd_s32): Likewise.
6115         (vqadd_s64): Likewise.
6116         (vqadd_u8): Likewise.
6117         (vqadd_u16): Likewise.
6118         (vqadd_u32): Likewise.
6119         (vqadd_u64): Likewise.
6120         (vqaddq_s8): Likewise.
6121         (vqaddq_s16): Likewise.
6122         (vqaddq_s32): Likewise.
6123         (vqaddq_s64): Likewise.
6124         (vqaddq_u8): Likewise.
6125         (vqaddq_u16): Likewise.
6126         (vqaddq_u32): Likewise.
6127         (vqaddq_u64): Likewise.
6128         (vaddhn_s16): Likewise.
6129         (vaddhn_s32): Likewise.
6130         (vaddhn_s64): Likewise.
6131         (vaddhn_u16): Likewise.
6132         (vaddhn_u32): Likewise.
6133         (vaddhn_u64): Likewise.
6134         (vraddhn_s16): Likewise.
6135         (vraddhn_s32): Likewise.
6136         (vraddhn_s64): Likewise.
6137         (vraddhn_u16): Likewise.
6138         (vraddhn_u32): Likewise.
6139         (vraddhn_u64): Likewise.
6140         (vmul_p8): Likewise.
6141         (vmulq_p8): Likewise.
6142         (vqdmulh_s16): Likewise.
6143         (vqdmulh_s32): Likewise.
6144         (vqdmulhq_s16): Likewise.
6145         (vqdmulhq_s32): Likewise.
6146         (vqrdmulh_s16): Likewise.
6147         (vqrdmulh_s32): Likewise.
6148         (vqrdmulhq_s16): Likewise.
6149         (vqrdmulhq_s32): Likewise.
6150         (vmull_s8): Likewise.
6151         (vmull_s16): Likewise.
6152         (vmull_s32): Likewise.
6153         (vmull_u8): Likewise.
6154         (vmull_u16): Likewise.
6155         (vmull_u32): Likewise.
6156         (vmull_p8): Likewise.
6157         (vqdmull_s16): Likewise.
6158         (vqdmull_s32): Likewise.
6159         (vmla_s8): Likewise.
6160         (vmla_s16): Likewise.
6161         (vmla_s32): Likewise.
6162         (vmla_f32): Likewise.
6163         (vmla_u8): Likewise.
6164         (vmla_u16): Likewise.
6165         (vmla_u32): Likewise.
6166         (vmlaq_s8): Likewise.
6167         (vmlaq_s16): Likewise.
6168         (vmlaq_s32): Likewise.
6169         (vmlaq_f32): Likewise.
6170         (vmlaq_u8): Likewise.
6171         (vmlaq_u16): Likewise.
6172         (vmlaq_u32): Likewise.
6173         (vmlal_s8): Likewise.
6174         (vmlal_s16): Likewise.
6175         (vmlal_s32): Likewise.
6176         (vmlal_u8): Likewise.
6177         (vmlal_u16): Likewise.
6178         (vmlal_u32): Likewise.
6179         (vqdmlal_s16): Likewise.
6180         (vqdmlal_s32): Likewise.
6181         (vmls_s8): Likewise.
6182         (vmls_s16): Likewise.
6183         (vmls_s32): Likewise.
6184         (vmls_f32): Likewise.
6185         (vmls_u8): Likewise.
6186         (vmls_u16): Likewise.
6187         (vmls_u32): Likewise.
6188         (vmlsq_s8): Likewise.
6189         (vmlsq_s16): Likewise.
6190         (vmlsq_s32): Likewise.
6191         (vmlsq_f32): Likewise.
6192         (vmlsq_u8): Likewise.
6193         (vmlsq_u16): Likewise.
6194         (vmlsq_u32): Likewise.
6195         (vmlsl_s8): Likewise.
6196         (vmlsl_s16): Likewise.
6197         (vmlsl_s32): Likewise.
6198         (vmlsl_u8): Likewise.
6199         (vmlsl_u16): Likewise.
6200         (vmlsl_u32): Likewise.
6201         (vqdmlsl_s16): Likewise.
6202         (vqdmlsl_s32): Likewise.
6203         (vfma_f32): Likewise.
6204         (vfmaq_f32): Likewise.
6205         (vfms_f32): Likewise.
6206         (vfmsq_f32): Likewise.
6207         (vsubl_s8): Likewise.
6208         (vsubl_s16): Likewise.
6209         (vsubl_s32): Likewise.
6210         (vsubl_u8): Likewise.
6211         (vsubl_u16): Likewise.
6212         (vsubl_u32): Likewise.
6213         (vsubw_s8): Likewise.
6214         (vsubw_s16): Likewise.
6215         (vsubw_s32): Likewise.
6216         (vsubw_u8): Likewise.
6217         (vsubw_u16): Likewise.
6218         (vsubw_u32): Likewise.
6219         (vhsub_s8): Likewise.
6220         (vhsub_s16): Likewise.
6221         (vhsub_s32): Likewise.
6222         (vhsub_u8): Likewise.
6223         (vhsub_u16): Likewise.
6224         (vhsub_u32): Likewise.
6225         (vhsubq_s8): Likewise.
6226         (vhsubq_s16): Likewise.
6227         (vhsubq_s32): Likewise.
6228         (vhsubq_u8): Likewise.
6229         (vhsubq_u16): Likewise.
6230         (vhsubq_u32): Likewise.
6231         (vqsub_s8): Likewise.
6232         (vqsub_s16): Likewise.
6233         (vqsub_s32): Likewise.
6234         (vqsub_s64): Likewise.
6235         (vqsub_u8): Likewise.
6236         (vqsub_u16): Likewise.
6237         (vqsub_u32): Likewise.
6238         (vqsub_u64): Likewise.
6239         (vqsubq_s8): Likewise.
6240         (vqsubq_s16): Likewise.
6241         (vqsubq_s32): Likewise.
6242         (vqsubq_s64): Likewise.
6243         (vqsubq_u8): Likewise.
6244         (vqsubq_u16): Likewise.
6245         (vqsubq_u32): Likewise.
6246         (vqsubq_u64): Likewise.
6247         (vsubhn_s16): Likewise.
6248         (vsubhn_s32): Likewise.
6249         (vsubhn_s64): Likewise.
6250         (vsubhn_u16): Likewise.
6251         (vsubhn_u32): Likewise.
6252         (vsubhn_u64): Likewise.
6253         (vrsubhn_s16): Likewise.
6254         (vrsubhn_s32): Likewise.
6255         (vrsubhn_s64): Likewise.
6256         (vrsubhn_u16): Likewise.
6257         (vrsubhn_u32): Likewise.
6258         (vrsubhn_u64): Likewise.
6259         (vceq_s8): Likewise.
6260         (vceq_s16): Likewise.
6261         (vceq_s32): Likewise.
6262         (vceq_f32): Likewise.
6263         (vceq_u8): Likewise.
6264         (vceq_u16): Likewise.
6265         (vceq_u32): Likewise.
6266         (vceq_p8): Likewise.
6267         (vceqq_s8): Likewise.
6268         (vceqq_s16): Likewise.
6269         (vceqq_s32): Likewise.
6270         (vceqq_f32): Likewise.
6271         (vceqq_u8): Likewise.
6272         (vceqq_u16): Likewise.
6273         (vceqq_u32): Likewise.
6274         (vceqq_p8): Likewise.
6275         (vcge_s8): Likewise.
6276         (vcge_s16): Likewise.
6277         (vcge_s32): Likewise.
6278         (vcge_f32): Likewise.
6279         (vcge_u8): Likewise.
6280         (vcge_u16): Likewise.
6281         (vcge_u32): Likewise.
6282         (vcgeq_s8): Likewise.
6283         (vcgeq_s16): Likewise.
6284         (vcgeq_s32): Likewise.
6285         (vcgeq_f32): Likewise.
6286         (vcgeq_u8): Likewise.
6287         (vcgeq_u16): Likewise.
6288         (vcgeq_u32): Likewise.
6289         (vcle_s8): Likewise.
6290         (vcle_s16): Likewise.
6291         (vcle_s32): Likewise.
6292         (vcle_f32): Likewise.
6293         (vcle_u8): Likewise.
6294         (vcle_u16): Likewise.
6295         (vcle_u32): Likewise.
6296         (vcleq_s8): Likewise.
6297         (vcleq_s16): Likewise.
6298         (vcleq_s32): Likewise.
6299         (vcleq_f32): Likewise.
6300         (vcleq_u8): Likewise.
6301         (vcleq_u16): Likewise.
6302         (vcleq_u32): Likewise.
6303         (vcgt_s8): Likewise.
6304         (vcgt_s16): Likewise.
6305         (vcgt_s32): Likewise.
6306         (vcgt_f32): Likewise.
6307         (vcgt_u8): Likewise.
6308         (vcgt_u16): Likewise.
6309         (vcgt_u32): Likewise.
6310         (vcgtq_s8): Likewise.
6311         (vcgtq_s16): Likewise.
6312         (vcgtq_s32): Likewise.
6313         (vcgtq_f32): Likewise.
6314         (vcgtq_u8): Likewise.
6315         (vcgtq_u16): Likewise.
6316         (vcgtq_u32): Likewise.
6317         (vclt_s8): Likewise.
6318         (vclt_s16): Likewise.
6319         (vclt_s32): Likewise.
6320         (vclt_f32): Likewise.
6321         (vclt_u8): Likewise.
6322         (vclt_u16): Likewise.
6323         (vclt_u32): Likewise.
6324         (vcltq_s8): Likewise.
6325         (vcltq_s16): Likewise.
6326         (vcltq_s32): Likewise.
6327         (vcltq_f32): Likewise.
6328         (vcltq_u8): Likewise.
6329         (vcltq_u16): Likewise.
6330         (vcltq_u32): Likewise.
6331         (vcage_f32): Likewise.
6332         (vcageq_f32): Likewise.
6333         (vcale_f32): Likewise.
6334         (vcaleq_f32): Likewise.
6335         (vcagt_f32): Likewise.
6336         (vcagtq_f32): Likewise.
6337         (vcalt_f32): Likewise.
6338         (vcaltq_f32): Likewise.
6339         (vtst_s8): Likewise.
6340         (vtst_s16): Likewise.
6341         (vtst_s32): Likewise.
6342         (vtst_u8): Likewise.
6343         (vtst_u16): Likewise.
6344         (vtst_u32): Likewise.
6345         (vtst_p8): Likewise.
6346         (vtstq_s8): Likewise.
6347         (vtstq_s16): Likewise.
6348         (vtstq_s32): Likewise.
6349         (vtstq_u8): Likewise.
6350         (vtstq_u16): Likewise.
6351         (vtstq_u32): Likewise.
6352         (vtstq_p8): Likewise.
6353         (vabd_s8): Likewise.
6354         (vabd_s16): Likewise.
6355         (vabd_s32): Likewise.
6356         (vabd_f32): Likewise.
6357         (vabd_u8): Likewise.
6358         (vabd_u16): Likewise.
6359         (vabd_u32): Likewise.
6360         (vabdq_s8): Likewise.
6361         (vabdq_s16): Likewise.
6362         (vabdq_s32): Likewise.
6363         (vabdq_f32): Likewise.
6364         (vabdq_u8): Likewise.
6365         (vabdq_u16): Likewise.
6366         (vabdq_u32): Likewise.
6367         (vabdl_s8): Likewise.
6368         (vabdl_s16): Likewise.
6369         (vabdl_s32): Likewise.
6370         (vabdl_u8): Likewise.
6371         (vabdl_u16): Likewise.
6372         (vabdl_u32): Likewise.
6373         (vaba_s8): Likewise.
6374         (vaba_s16): Likewise.
6375         (vaba_s32): Likewise.
6376         (vaba_u8): Likewise.
6377         (vaba_u16): Likewise.
6378         (vaba_u32): Likewise.
6379         (vabaq_s8): Likewise.
6380         (vabaq_s16): Likewise.
6381         (vabaq_s32): Likewise.
6382         (vabaq_u8): Likewise.
6383         (vabaq_u16): Likewise.
6384         (vabaq_u32): Likewise.
6385         (vabal_s8): Likewise.
6386         (vabal_s16): Likewise.
6387         (vabal_s32): Likewise.
6388         (vabal_u8): Likewise.
6389         (vabal_u16): Likewise.
6390         (vabal_u32): Likewise.
6391         (vmax_s8): Likewise.
6392         (vmax_s16): Likewise.
6393         (vmax_s32): Likewise.
6394         (vmax_f32): Likewise.
6395         (vmax_u8): Likewise.
6396         (vmax_u16): Likewise.
6397         (vmax_u32): Likewise.
6398         (vmaxq_s8): Likewise.
6399         (vmaxq_s16): Likewise.
6400         (vmaxq_s32): Likewise.
6401         (vmaxq_f32): Likewise.
6402         (vmaxq_u8): Likewise.
6403         (vmaxq_u16): Likewise.
6404         (vmaxq_u32): Likewise.
6405         (vmin_s8): Likewise.
6406         (vmin_s16): Likewise.
6407         (vmin_s32): Likewise.
6408         (vmin_f32): Likewise.
6409         (vmin_u8): Likewise.
6410         (vmin_u16): Likewise.
6411         (vmin_u32): Likewise.
6412         (vminq_s8): Likewise.
6413         (vminq_s16): Likewise.
6414         (vminq_s32): Likewise.
6415         (vminq_f32): Likewise.
6416         (vminq_u8): Likewise.
6417         (vminq_u16): Likewise.
6418         (vminq_u32): Likewise.
6419         (vpadd_s8): Likewise.
6420         (vpadd_s16): Likewise.
6421         (vpadd_s32): Likewise.
6422         (vpadd_f32): Likewise.
6423         (vpadd_u8): Likewise.
6424         (vpadd_u16): Likewise.
6425         (vpadd_u32): Likewise.
6426         (vpaddl_s8): Likewise.
6427         (vpaddl_s16): Likewise.
6428         (vpaddl_s32): Likewise.
6429         (vpaddl_u8): Likewise.
6430         (vpaddl_u16): Likewise.
6431         (vpaddl_u32): Likewise.
6432         (vpaddlq_s8): Likewise.
6433         (vpaddlq_s16): Likewise.
6434         (vpaddlq_s32): Likewise.
6435         (vpaddlq_u8): Likewise.
6436         (vpaddlq_u16): Likewise.
6437         (vpaddlq_u32): Likewise.
6438         (vpadal_s8): Likewise.
6439         (vpadal_s16): Likewise.
6440         (vpadal_s32): Likewise.
6441         (vpadal_u8): Likewise.
6442         (vpadal_u16): Likewise.
6443         (vpadal_u32): Likewise.
6444         (vpadalq_s8): Likewise.
6445         (vpadalq_s16): Likewise.
6446         (vpadalq_s32): Likewise.
6447         (vpadalq_u8): Likewise.
6448         (vpadalq_u16): Likewise.
6449         (vpadalq_u32): Likewise.
6450         (vpmax_s8): Likewise.
6451         (vpmax_s16): Likewise.
6452         (vpmax_s32): Likewise.
6453         (vpmax_f32): Likewise.
6454         (vpmax_u8): Likewise.
6455         (vpmax_u16): Likewise.
6456         (vpmax_u32): Likewise.
6457         (vpmin_s8): Likewise.
6458         (vpmin_s16): Likewise.
6459         (vpmin_s32): Likewise.
6460         (vpmin_f32): Likewise.
6461         (vpmin_u8): Likewise.
6462         (vpmin_u16): Likewise.
6463         (vpmin_u32): Likewise.
6464         (vrecps_f32): Likewise.
6465         (vrecpsq_f32): Likewise.
6466         (vrsqrts_f32): Likewise.
6467         (vrsqrtsq_f32): Likewise.
6468         (vshl_s8): Likewise.
6469         (vshl_s16): Likewise.
6470         (vshl_s32): Likewise.
6471         (vshl_s64): Likewise.
6472         (vshl_u8): Likewise.
6473         (vshl_u16): Likewise.
6474         (vshl_u32): Likewise.
6475         (vshl_u64): Likewise.
6476         (vshlq_s8): Likewise.
6477         (vshlq_s16): Likewise.
6478         (vshlq_s32): Likewise.
6479         (vshlq_s64): Likewise.
6480         (vshlq_u8): Likewise.
6481         (vshlq_u16): Likewise.
6482         (vshlq_u32): Likewise.
6483         (vshlq_u64): Likewise.
6484         (vrshl_s8): Likewise.
6485         (vrshl_s16): Likewise.
6486         (vrshl_s32): Likewise.
6487         (vrshl_s64): Likewise.
6488         (vrshl_u8): Likewise.
6489         (vrshl_u16): Likewise.
6490         (vrshl_u32): Likewise.
6491         (vrshl_u64): Likewise.
6492         (vrshlq_s8): Likewise.
6493         (vrshlq_s16): Likewise.
6494         (vrshlq_s32): Likewise.
6495         (vrshlq_s64): Likewise.
6496         (vrshlq_u8): Likewise.
6497         (vrshlq_u16): Likewise.
6498         (vrshlq_u32): Likewise.
6499         (vrshlq_u64): Likewise.
6500         (vqshl_s8): Likewise.
6501         (vqshl_s16): Likewise.
6502         (vqshl_s32): Likewise.
6503         (vqshl_s64): Likewise.
6504         (vqshl_u8): Likewise.
6505         (vqshl_u16): Likewise.
6506         (vqshl_u32): Likewise.
6507         (vqshl_u64): Likewise.
6508         (vqshlq_s8): Likewise.
6509         (vqshlq_s16): Likewise.
6510         (vqshlq_s32): Likewise.
6511         (vqshlq_s64): Likewise.
6512         (vqshlq_u8): Likewise.
6513         (vqshlq_u16): Likewise.
6514         (vqshlq_u32): Likewise.
6515         (vqshlq_u64): Likewise.
6516         (vqrshl_s8): Likewise.
6517         (vqrshl_s16): Likewise.
6518         (vqrshl_s32): Likewise.
6519         (vqrshl_s64): Likewise.
6520         (vqrshl_u8): Likewise.
6521         (vqrshl_u16): Likewise.
6522         (vqrshl_u32): Likewise.
6523         (vqrshl_u64): Likewise.
6524         (vqrshlq_s8): Likewise.
6525         (vqrshlq_s16): Likewise.
6526         (vqrshlq_s32): Likewise.
6527         (vqrshlq_s64): Likewise.
6528         (vqrshlq_u8): Likewise.
6529         (vqrshlq_u16): Likewise.
6530         (vqrshlq_u32): Likewise.
6531         (vqrshlq_u64): Likewise.
6532         (vshr_n_s8): Likewise.
6533         (vshr_n_s16): Likewise.
6534         (vshr_n_s32): Likewise.
6535         (vshr_n_s64): Likewise.
6536         (vshr_n_u8): Likewise.
6537         (vshr_n_u16): Likewise.
6538         (vshr_n_u32): Likewise.
6539         (vshr_n_u64): Likewise.
6540         (vshrq_n_s8): Likewise.
6541         (vshrq_n_s16): Likewise.
6542         (vshrq_n_s32): Likewise.
6543         (vshrq_n_s64): Likewise.
6544         (vshrq_n_u8): Likewise.
6545         (vshrq_n_u16): Likewise.
6546         (vshrq_n_u32): Likewise.
6547         (vshrq_n_u64): Likewise.
6548         (vrshr_n_s8): Likewise.
6549         (vrshr_n_s16): Likewise.
6550         (vrshr_n_s32): Likewise.
6551         (vrshr_n_s64): Likewise.
6552         (vrshr_n_u8): Likewise.
6553         (vrshr_n_u16): Likewise.
6554         (vrshr_n_u32): Likewise.
6555         (vrshr_n_u64): Likewise.
6556         (vrshrq_n_s8): Likewise.
6557         (vrshrq_n_s16): Likewise.
6558         (vrshrq_n_s32): Likewise.
6559         (vrshrq_n_s64): Likewise.
6560         (vrshrq_n_u8): Likewise.
6561         (vrshrq_n_u16): Likewise.
6562         (vrshrq_n_u32): Likewise.
6563         (vrshrq_n_u64): Likewise.
6564         (vshrn_n_s16): Likewise.
6565         (vshrn_n_s32): Likewise.
6566         (vshrn_n_s64): Likewise.
6567         (vshrn_n_u16): Likewise.
6568         (vshrn_n_u32): Likewise.
6569         (vshrn_n_u64): Likewise.
6570         (vrshrn_n_s16): Likewise.
6571         (vrshrn_n_s32): Likewise.
6572         (vrshrn_n_s64): Likewise.
6573         (vrshrn_n_u16): Likewise.
6574         (vrshrn_n_u32): Likewise.
6575         (vrshrn_n_u64): Likewise.
6576         (vqshrn_n_s16): Likewise.
6577         (vqshrn_n_s32): Likewise.
6578         (vqshrn_n_s64): Likewise.
6579         (vqshrn_n_u16): Likewise.
6580         (vqshrn_n_u32): Likewise.
6581         (vqshrn_n_u64): Likewise.
6582         (vqrshrn_n_s16): Likewise.
6583         (vqrshrn_n_s32): Likewise.
6584         (vqrshrn_n_s64): Likewise.
6585         (vqrshrn_n_u16): Likewise.
6586         (vqrshrn_n_u32): Likewise.
6587         (vqrshrn_n_u64): Likewise.
6588         (vqshrun_n_s16): Likewise.
6589         (vqshrun_n_s32): Likewise.
6590         (vqshrun_n_s64): Likewise.
6591         (vqrshrun_n_s16): Likewise.
6592         (vqrshrun_n_s32): Likewise.
6593         (vqrshrun_n_s64): Likewise.
6594         (vshl_n_s8): Likewise.
6595         (vshl_n_s16): Likewise.
6596         (vshl_n_s32): Likewise.
6597         (vshl_n_s64): Likewise.
6598         (vshl_n_u8): Likewise.
6599         (vshl_n_u16): Likewise.
6600         (vshl_n_u32): Likewise.
6601         (vshl_n_u64): Likewise.
6602         (vshlq_n_s8): Likewise.
6603         (vshlq_n_s16): Likewise.
6604         (vshlq_n_s32): Likewise.
6605         (vshlq_n_s64): Likewise.
6606         (vshlq_n_u8): Likewise.
6607         (vshlq_n_u16): Likewise.
6608         (vshlq_n_u32): Likewise.
6609         (vshlq_n_u64): Likewise.
6610         (vqshl_n_s8): Likewise.
6611         (vqshl_n_s16): Likewise.
6612         (vqshl_n_s32): Likewise.
6613         (vqshl_n_s64): Likewise.
6614         (vqshl_n_u8): Likewise.
6615         (vqshl_n_u16): Likewise.
6616         (vqshl_n_u32): Likewise.
6617         (vqshl_n_u64): Likewise.
6618         (vqshlq_n_s8): Likewise.
6619         (vqshlq_n_s16): Likewise.
6620         (vqshlq_n_s32): Likewise.
6621         (vqshlq_n_s64): Likewise.
6622         (vqshlq_n_u8): Likewise.
6623         (vqshlq_n_u16): Likewise.
6624         (vqshlq_n_u32): Likewise.
6625         (vqshlq_n_u64): Likewise.
6626         (vqshlu_n_s8): Likewise.
6627         (vqshlu_n_s16): Likewise.
6628         (vqshlu_n_s32): Likewise.
6629         (vqshlu_n_s64): Likewise.
6630         (vqshluq_n_s8): Likewise.
6631         (vqshluq_n_s16): Likewise.
6632         (vqshluq_n_s32): Likewise.
6633         (vqshluq_n_s64): Likewise.
6634         (vshll_n_s8): Likewise.
6635         (vshll_n_s16): Likewise.
6636         (vshll_n_s32): Likewise.
6637         (vshll_n_u8): Likewise.
6638         (vshll_n_u16): Likewise.
6639         (vshll_n_u32): Likewise.
6640         (vsra_n_s8): Likewise.
6641         (vsra_n_s16): Likewise.
6642         (vsra_n_s32): Likewise.
6643         (vsra_n_s64): Likewise.
6644         (vsra_n_u8): Likewise.
6645         (vsra_n_u16): Likewise.
6646         (vsra_n_u32): Likewise.
6647         (vsra_n_u64): Likewise.
6648         (vsraq_n_s8): Likewise.
6649         (vsraq_n_s16): Likewise.
6650         (vsraq_n_s32): Likewise.
6651         (vsraq_n_s64): Likewise.
6652         (vsraq_n_u8): Likewise.
6653         (vsraq_n_u16): Likewise.
6654         (vsraq_n_u32): Likewise.
6655         (vsraq_n_u64): Likewise.
6656         (vrsra_n_s8): Likewise.
6657         (vrsra_n_s16): Likewise.
6658         (vrsra_n_s32): Likewise.
6659         (vrsra_n_s64): Likewise.
6660         (vrsra_n_u8): Likewise.
6661         (vrsra_n_u16): Likewise.
6662         (vrsra_n_u32): Likewise.
6663         (vrsra_n_u64): Likewise.
6664         (vrsraq_n_s8): Likewise.
6665         (vrsraq_n_s16): Likewise.
6666         (vrsraq_n_s32): Likewise.
6667         (vrsraq_n_s64): Likewise.
6668         (vrsraq_n_u8): Likewise.
6669         (vrsraq_n_u16): Likewise.
6670         (vrsraq_n_u32): Likewise.
6671         (vrsraq_n_u64): Likewise.
6672         (vabs_s8): Likewise.
6673         (vabs_s16): Likewise.
6674         (vabs_s32): Likewise.
6675         (vabs_f32): Likewise.
6676         (vabsq_s8): Likewise.
6677         (vabsq_s16): Likewise.
6678         (vabsq_s32): Likewise.
6679         (vabsq_f32): Likewise.
6680         (vqabs_s8): Likewise.
6681         (vqabs_s16): Likewise.
6682         (vqabs_s32): Likewise.
6683         (vqabsq_s8): Likewise.
6684         (vqabsq_s16): Likewise.
6685         (vqabsq_s32): Likewise.
6686         (vneg_s8): Likewise.
6687         (vneg_s16): Likewise.
6688         (vneg_s32): Likewise.
6689         (vneg_f32): Likewise.
6690         (vnegq_s8): Likewise.
6691         (vnegq_s16): Likewise.
6692         (vnegq_s32): Likewise.
6693         (vnegq_f32): Likewise.
6694         (vqneg_s8): Likewise.
6695         (vqneg_s16): Likewise.
6696         (vqneg_s32): Likewise.
6697         (vqnegq_s8): Likewise.
6698         (vqnegq_s16): Likewise.
6699         (vqnegq_s32): Likewise.
6700         (vmvn_s8): Likewise.
6701         (vmvn_s16): Likewise.
6702         (vmvn_s32): Likewise.
6703         (vmvn_u8): Likewise.
6704         (vmvn_u16): Likewise.
6705         (vmvn_u32): Likewise.
6706         (vmvn_p8): Likewise.
6707         (vmvnq_s8): Likewise.
6708         (vmvnq_s16): Likewise.
6709         (vmvnq_s32): Likewise.
6710         (vmvnq_u8): Likewise.
6711         (vmvnq_u16): Likewise.
6712         (vmvnq_u32): Likewise.
6713         (vmvnq_p8): Likewise.
6714         (vcls_s8): Likewise.
6715         (vcls_s16): Likewise.
6716         (vcls_s32): Likewise.
6717         (vclsq_s8): Likewise.
6718         (vclsq_s16): Likewise.
6719         (vclsq_s32): Likewise.
6720         (vclz_s8): Likewise.
6721         (vclz_s16): Likewise.
6722         (vclz_s32): Likewise.
6723         (vclz_u8): Likewise.
6724         (vclz_u16): Likewise.
6725         (vclz_u32): Likewise.
6726         (vclzq_s8): Likewise.
6727         (vclzq_s16): Likewise.
6728         (vclzq_s32): Likewise.
6729         (vclzq_u8): Likewise.
6730         (vclzq_u16): Likewise.
6731         (vclzq_u32): Likewise.
6732         (vcnt_s8): Likewise.
6733         (vcnt_u8): Likewise.
6734         (vcnt_p8): Likewise.
6735         (vcntq_s8): Likewise.
6736         (vcntq_u8): Likewise.
6737         (vcntq_p8): Likewise.
6738         (vrecpe_f32): Likewise.
6739         (vrecpe_u32): Likewise.
6740         (vrecpeq_f32): Likewise.
6741         (vrecpeq_u32): Likewise.
6742         (vrsqrte_f32): Likewise.
6743         (vrsqrte_u32): Likewise.
6744         (vrsqrteq_f32): Likewise.
6745         (vrsqrteq_u32): Likewise.
6746         (vget_lane_s8): Likewise.
6747         (vget_lane_s16): Likewise.
6748         (vget_lane_s32): Likewise.
6749         (vget_lane_f32): Likewise.
6750         (vget_lane_u8): Likewise.
6751         (vget_lane_u16): Likewise.
6752         (vget_lane_u32): Likewise.
6753         (vget_lane_p8): Likewise.
6754         (vget_lane_p16): Likewise.
6755         (vget_lane_s64): Likewise.
6756         (vget_lane_u64): Likewise.
6757         (vgetq_lane_s8): Likewise.
6758         (vgetq_lane_s16): Likewise.
6759         (vgetq_lane_s32): Likewise.
6760         (vgetq_lane_f32): Likewise.
6761         (vgetq_lane_u8): Likewise.
6762         (vgetq_lane_u16): Likewise.
6763         (vgetq_lane_u32): Likewise.
6764         (vgetq_lane_p8): Likewise.
6765         (vgetq_lane_p16): Likewise.
6766         (vgetq_lane_s64): Likewise.
6767         (vgetq_lane_u64): Likewise.
6768         (vcvt_s32_f32): Likewise.
6769         (vcvt_f32_s32): Likewise.
6770         (vcvt_f32_u32): Likewise.
6771         (vcvt_u32_f32): Likewise.
6772         (vcvtq_s32_f32): Likewise.
6773         (vcvtq_f32_s32): Likewise.
6774         (vcvtq_f32_u32): Likewise.
6775         (vcvtq_u32_f32): Likewise.
6776         (vcvt_n_s32_f32): Likewise.
6777         (vcvt_n_f32_s32): Likewise.
6778         (vcvt_n_f32_u32): Likewise.
6779         (vcvt_n_u32_f32): Likewise.
6780         (vcvtq_n_s32_f32): Likewise.
6781         (vcvtq_n_f32_s32): Likewise.
6782         (vcvtq_n_f32_u32): Likewise.
6783         (vcvtq_n_u32_f32): Likewise.
6784         (vmovn_s16): Likewise.
6785         (vmovn_s32): Likewise.
6786         (vmovn_s64): Likewise.
6787         (vmovn_u16): Likewise.
6788         (vmovn_u32): Likewise.
6789         (vmovn_u64): Likewise.
6790         (vqmovn_s16): Likewise.
6791         (vqmovn_s32): Likewise.
6792         (vqmovn_s64): Likewise.
6793         (vqmovn_u16): Likewise.
6794         (vqmovn_u32): Likewise.
6795         (vqmovn_u64): Likewise.
6796         (vqmovun_s16): Likewise.
6797         (vqmovun_s32): Likewise.
6798         (vqmovun_s64): Likewise.
6799         (vmovl_s8): Likewise.
6800         (vmovl_s16): Likewise.
6801         (vmovl_s32): Likewise.
6802         (vmovl_u8): Likewise.
6803         (vmovl_u16): Likewise.
6804         (vmovl_u32): Likewise.
6805         (vmul_lane_s16): Likewise.
6806         (vmul_lane_s32): Likewise.
6807         (vmul_lane_f32): Likewise.
6808         (vmul_lane_u16): Likewise.
6809         (vmul_lane_u32): Likewise.
6810         (vmulq_lane_s16): Likewise.
6811         (vmulq_lane_s32): Likewise.
6812         (vmulq_lane_f32): Likewise.
6813         (vmulq_lane_u16): Likewise.
6814         (vmulq_lane_u32): Likewise.
6815         (vmla_lane_s16): Likewise.
6816         (vmla_lane_s32): Likewise.
6817         (vmla_lane_f32): Likewise.
6818         (vmla_lane_u16): Likewise.
6819         (vmla_lane_u32): Likewise.
6820         (vmlaq_lane_s16): Likewise.
6821         (vmlaq_lane_s32): Likewise.
6822         (vmlaq_lane_f32): Likewise.
6823         (vmlaq_lane_u16): Likewise.
6824         (vmlaq_lane_u32): Likewise.
6825         (vmlal_lane_s16): Likewise.
6826         (vmlal_lane_s32): Likewise.
6827         (vmlal_lane_u16): Likewise.
6828         (vmlal_lane_u32): Likewise.
6829         (vqdmlal_lane_s16): Likewise.
6830         (vqdmlal_lane_s32): Likewise.
6831         (vmls_lane_s16): Likewise.
6832         (vmls_lane_s32): Likewise.
6833         (vmls_lane_f32): Likewise.
6834         (vmls_lane_u16): Likewise.
6835         (vmls_lane_u32): Likewise.
6836         (vmlsq_lane_s16): Likewise.
6837         (vmlsq_lane_s32): Likewise.
6838         (vmlsq_lane_f32): Likewise.
6839         (vmlsq_lane_u16): Likewise.
6840         (vmlsq_lane_u32): Likewise.
6841         (vmlsl_lane_s16): Likewise.
6842         (vmlsl_lane_s32): Likewise.
6843         (vmlsl_lane_u16): Likewise.
6844         (vmlsl_lane_u32): Likewise.
6845         (vqdmlsl_lane_s16): Likewise.
6846         (vqdmlsl_lane_s32): Likewise.
6847         (vmull_lane_s16): Likewise.
6848         (vmull_lane_s32): Likewise.
6849         (vmull_lane_u16): Likewise.
6850         (vmull_lane_u32): Likewise.
6851         (vqdmull_lane_s16): Likewise.
6852         (vqdmull_lane_s32): Likewise.
6853         (vqdmulhq_lane_s16): Likewise.
6854         (vqdmulhq_lane_s32): Likewise.
6855         (vqdmulh_lane_s16): Likewise.
6856         (vqdmulh_lane_s32): Likewise.
6857         (vqrdmulhq_lane_s16): Likewise.
6858         (vqrdmulhq_lane_s32): Likewise.
6859         (vqrdmulh_lane_s16): Likewise.
6860         (vqrdmulh_lane_s32): Likewise.
6861         (vmul_n_s16): Likewise.
6862         (vmul_n_s32): Likewise.
6863         (vmul_n_f32): Likewise.
6864         (vmul_n_u16): Likewise.
6865         (vmul_n_u32): Likewise.
6866         (vmulq_n_s16): Likewise.
6867         (vmulq_n_s32): Likewise.
6868         (vmulq_n_f32): Likewise.
6869         (vmulq_n_u16): Likewise.
6870         (vmulq_n_u32): Likewise.
6871         (vmull_n_s16): Likewise.
6872         (vmull_n_s32): Likewise.
6873         (vmull_n_u16): Likewise.
6874         (vmull_n_u32): Likewise.
6875         (vqdmull_n_s16): Likewise.
6876         (vqdmull_n_s32): Likewise.
6877         (vqdmulhq_n_s16): Likewise.
6878         (vqdmulhq_n_s32): Likewise.
6879         (vqdmulh_n_s16): Likewise.
6880         (vqdmulh_n_s32): Likewise.
6881         (vqrdmulhq_n_s16): Likewise.
6882         (vqrdmulhq_n_s32): Likewise.
6883         (vqrdmulh_n_s16): Likewise.
6884         (vqrdmulh_n_s32): Likewise.
6885         (vmla_n_s16): Likewise.
6886         (vmla_n_s32): Likewise.
6887         (vmla_n_f32): Likewise.
6888         (vmla_n_u16): Likewise.
6889         (vmla_n_u32): Likewise.
6890         (vmlaq_n_s16): Likewise.
6891         (vmlaq_n_s32): Likewise.
6892         (vmlaq_n_f32): Likewise.
6893         (vmlaq_n_u16): Likewise.
6894         (vmlaq_n_u32): Likewise.
6895         (vmlal_n_s16): Likewise.
6896         (vmlal_n_s32): Likewise.
6897         (vmlal_n_u16): Likewise.
6898         (vmlal_n_u32): Likewise.
6899         (vqdmlal_n_s16): Likewise.
6900         (vqdmlal_n_s32): Likewise.
6901         (vmls_n_s16): Likewise.
6902         (vmls_n_s32): Likewise.
6903         (vmls_n_f32): Likewise.
6904         (vmls_n_u16): Likewise.
6905         (vmls_n_u32): Likewise.
6906         (vmlsq_n_s16): Likewise.
6907         (vmlsq_n_s32): Likewise.
6908         (vmlsq_n_f32): Likewise.
6909         (vmlsq_n_u16): Likewise.
6910         (vmlsq_n_u32): Likewise.
6911         (vmlsl_n_s16): Likewise.
6912         (vmlsl_n_s32): Likewise.
6913         (vmlsl_n_u16): Likewise.
6914         (vmlsl_n_u32): Likewise.
6915         (vqdmlsl_n_s16): Likewise.
6916         (vqdmlsl_n_s32): Likewise.
6918 2014-11-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
6920         * config/arm/arm.c (arm_new_rtx_costs, case PLUS, MINUS):
6921         Add cost of alu.arith in simple SImode case.
6923 2014-11-18  Jiong Wang  <jiong.wang@arm.com>
6925         * lra-eliminations.c (update_reg_eliminate): Relax gcc_assert for fixed
6926         registers.
6928 2014-11-18  Marat Zakirov  <m.zakirov@samsung.com>
6930         * opts.c (finish_options): Disable aggressive opts for sanitizer.
6931         (common_handle_option): Move code to finish_options.
6933 2014-11-18  Yury Gribov  <y.gribov@samsung.com>
6935         PR sanitizer/63802
6936         * stor-layout.c (min_align_of_type): Respect user alignment
6937         more.
6939 2014-11-18  Ilya Enkovich  <ilya.enkovich@intel.com>
6941         * passes.c (remove_cgraph_node_from_order): New.
6942         (do_per_function_toporder): Register cgraph removal
6943         hook.
6945 2014-11-17  Terry Guo  <terry.guo@arm.com>
6947         * config/arm/arm.c (arm_issue_rate): Return 2 for cortex-m7.
6948         * config/arm/arm.md (generic_sched): Exclude cortex-m7.
6949         (generic_vfp): Likewise.
6950         * config/arm/cortex-m7.md: Pipeline description for cortex-m7.
6952 2014-11-17  Vladimir Makarov  <vmakarov@redhat.com>
6954         PR rtl-optimization/63906
6955         * lra-remat.c (operand_to_remat): Check SP and
6956         frame_pointer_required.
6958 2014-11-17  Mircea Namolaru  <mircea.namolaru@inria.fr>
6960         * doc/invoke.texi (floop-unroll-and-jam): Document
6961         (loop-unroll-jam-size): Likewise.
6962         (loop-unroll-jam-depth): Likewise.
6963         * graphite-optimize-isl.c (getPrevectorMap_full): Modify comment.
6964         (getScheduleForBandList): Replaced unsafe union_map reuse.
6966 2014-11-17  Andrew Pinski  <apinski@cavium.com>
6968         * config/aarch64/thunderx.md: Remove copyright which should not
6969         have been there.
6971 2014-11-17  Michael Meissner  <meissner@linux.vnet.ibm.com>
6972             Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
6974         * config/rs6000/rs6000.c (RELOAD_REG_AND_M16): Add support for
6975         Altivec style vector loads that ignore the bottom 3 bits of the
6976         address.
6977         (rs6000_debug_addr_mask): New function to print the addr_mask
6978         values if debugging.
6979         (rs6000_debug_print_mode): Call rs6000_debug_addr_mask to print
6980         out addr_mask.
6981         (rs6000_setup_reg_addr_masks): Add support for Altivec style
6982         vector loads that ignore the bottom 3 bits of the address.  Allow
6983         pre-increment and pre-decrement on floating point, even if the
6984         -mupper-regs-{sf,df} options were used.
6985         (rs6000_init_hard_regno_mode_ok): Rework DFmode support if
6986         -mupper-regs-df.  Add support for -mupper-regs-sf.  Rearrange code
6987         placement for direct move support.
6988         (rs6000_option_override_internal): Add checks for -mupper-regs-df
6989         requiring -mvsx, and -mupper-regs-sf requiring -mpower8-vector.
6990         If -mupper-regs, set both -mupper-regs-sf and -mupper-regs-df,
6991         depending on the underlying cpu.
6992         (rs6000_secondary_reload_fail): Add ATTRIBUTE_NORETURN.
6993         (rs6000_secondary_reload_toc_costs): Helper function to identify
6994         costs of a TOC load for secondary reload support.
6995         (rs6000_secondary_reload_memory): Helper function for secondary
6996         reload, to determine if a particular memory operation is directly
6997         handled by the hardware, or if it needs support from secondary
6998         reload to create a valid address.
6999         (rs6000_secondary_reload): Rework code, to be clearer.  If the
7000         appropriate -mupper-regs-{sf,df} is used, use FPR registers to
7001         reload scalar values, since the FPR registers have D-form
7002         addressing. Move most of the code handling memory to the function
7003         rs6000_secondary_reload_memory, and use the reg_addr structure to
7004         determine what type of address modes are supported.  Print more
7005         debug information if -mdebug=addr.
7006         (rs6000_secondary_reload_inner): Rework entire function to be more
7007         general.  Use the reg_addr bits to determine what type of
7008         addressing is supported.
7009         (rs6000_preferred_reload_class): Rework.  Move constant handling
7010         into a single place.  Prefer using FLOAT_REGS for scalar floating
7011         point.
7012         (rs6000_secondary_reload_class): Use a FPR register to move a
7013         value from an Altivec register to a GPR, and vice versa.  Move VSX
7014         handling above traditional floating point.
7016         * config/rs6000/rs6000.md (mov<mode>_hardfloat, FMOVE32 case):
7017         Delete some spaces in the constraints.
7018         (DF->DF move peephole2): Disable if -mupper-regs-{sf,df} to
7019         allow using FPR registers to load/store an Altivec register for
7020         scalar floating point types.
7021         (SF->SF move peephole2): Likewise.
7022         (DFmode splitter): Add a define_split to move floating point
7023         constants to the constant pool before register allocation.
7024         Normally constants are put into the pool immediately, but
7025         -ffast-math delays putting them into the constant pool for the
7026         reciprocal approximation support.
7027         (SFmode splitter): Likewise.
7029         * config/rs6000/rs6000.opt (-mupper-regs-df): Make option public.
7030         (-mupper-regs-sf): Likewise.
7032         * config/rs6000/rs6000-c.c (rs6000_target_modify_macros): Define
7033         __UPPER_REGS_DF__ if -mupper-regs-df.  Define __UPPER_REGS_SF__ if
7034         -mupper-regs-sf.
7035         (-mupper-regs): New combination option that sets -mupper-regs-sf
7036         and -mupper-regs-df by default if the cpu supports the instructions.
7038         * doc/invoke.texi (RS/6000 and PowerPC Options): Document
7039         -mupper-regs, -mupper-regs-sf, and -mupper-regs-df.
7041         * config/rs6000/predicates.md (memory_fp_constant): New predicate
7042         to return true if the operand is a floating point constant that
7043         must be put into the constant pool, before register allocation
7044         occurs.
7046         * config/rs6000/rs6000-cpus.def (ISA_2_6_MASKS_SERVER): Enable
7047         -mupper-regs-df by default.
7048         (ISA_2_7_MASKS_SERVER): Enable -mupper-regs-sf by default.
7049         (POWERPC_MASKS): Add -mupper-regs-{sf,df} as options set by the
7050         various -mcpu=... options.
7051         (power7 cpu): Enable -mupper-regs-df by default.
7053         * doc/invoke.texi (RS/6000 and PowerPC Options): Document
7054         -mupper-regs.
7056 2014-11-17  Zhouyi Zhou <yizhouzhou@ict.ac.cn>
7058         * ira-conflicts.c (build_conflict_bit_table): Add the current
7059         object to OBJECTS_LIVE after traversing OBJECTS_LIVE.
7061 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7063         * ipa-cp.c (ipa_get_indirect_edge_target_1): Handle speculation.
7064         (ipa_get_indirect_edge_target): Add SPECULATIVE argument.
7065         (devirtualization_time_bonus): Use it.
7066         (ipcp_discover_new_direct_edges): Likewise.
7067         * ipa-inline-analysis.c (estimate_edge_devirt_benefit): Update.
7068         * ipa-prop.h (ipa_get_indirect_edge_target): Update prototype.
7070 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7072         * tree.c (free_lang_data_in_decl): Set
7073         DECL_FUNCTION_SPECIFIC_OPTIMIZATION to optimization_default_node.
7075 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7077         * cgraphunit.c (analyze_functions): Use opt_for_fn.
7078         * cgraph.h (cgraph_node::optimize_for_size_p): Likewise.
7080 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7082         * cgraph.c (symbol_table::create_edge): Use opt_for_fn.
7083         (cgraph_node::cannot_return_p): Likewise.
7084         (cgraph_edge::cannot_lead_to_return_p): Likewise.
7085         (cgraph_edge::maybe_hot_p): Likewise.
7087 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7089         * predict.c (maybe_hot_frequency_p): Use opt_for_fn.
7090         (optimize_function_for_size_p): Likewise.
7091         (probably_never_executed): Likewise; replace cfun by fun.
7093 2014-11-17  Alan Lawrence  <alan.lawrence@arm.com>
7095         * config/aarch64/aarch64-simd.md (aarch64_simd_vec_set<mode>): Add
7096         variant reading from memory and assembling to ld1.
7098         * config/aarch64/arm_neon.h (vld1_lane_f32, vld1_lane_f64, vld1_lane_p8,
7099         vld1_lane_p16, vld1_lane_s8, vld1_lane_s16, vld1_lane_s32,
7100         vld1_lane_s64, vld1_lane_u8, vld1_lane_u16, vld1_lane_u32,
7101         vld1_lane_u64, vld1q_lane_f32, vld1q_lane_f64, vld1q_lane_p8,
7102         vld1q_lane_p16, vld1q_lane_s8, vld1q_lane_s16, vld1q_lane_s32,
7103         vld1q_lane_s64, vld1q_lane_u8, vld1q_lane_u16, vld1q_lane_u32,
7104         vld1q_lane_u64): Replace asm with vset_lane and pointer dereference.
7106 2014-11-17  Jason Merrill  <jason@redhat.com>
7108         * tree-inline.c (copy_fn): New.
7109         * tree-inline.h: Declare it.
7111 2014-11-17  Alan Lawrence  <alan.lawrence@arm.com>
7113         * config/aarch64/aarch64-builtins.c (TYPES_CREATE): Remove.
7114         * config/aarch64/aarch64-simd-builtins.def (create): Remove.
7115         * config/aarch64/aarch64-simd.md (aarch64_create<mode>): Remove.
7116         * config/aarch64/arm_neon.h (vcreate_f64, vreinterpret_f64_s64,
7117         vreinterpret_f64_u64): Replace __builtin_aarch64_createv1df with C casts.
7118         * config/aarch64/iterators.md (VD1): Remove.
7120 2014-11-17  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
7122         * config/aarch64/aarch64-cores.def (cortex-a53): Remove
7123         AARCH64_FL_CRYPTO from feature flags.
7124         (cortex-a57): Likewise.
7125         (cortex-a57.cortex-a53): Likewise.
7127 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7129         * tree.c (free_lang_data_in_decl): Annotate all functio nbodies with
7130         DECL_FUNCTION_SPECIFIC_TARGET.
7131         * i386.c (ix86_set_current_function): Handle explicit default options.
7133 2014-11-17  Ilya Enkovich  <ilya.enkovich@intel.com>
7135         * builtins.c (expand_builtin_memcpy_with_bounds): Use target hook
7136         instead of BNDmode.
7137         (expand_builtin_mempcpy_with_bounds): Likewise.
7138         (expand_builtin_memset_with_bounds): Likewise.
7140 2014-11-17  Ilya Enkovich  <ilya.enkovich@intel.com>
7142         * tree-ssa-strlen.c: include ipa-chkp.h, cgraph.h,
7143         ipa-ref.h, plugin-api.h.
7144         (get_string_length): Handle calls with bounds.
7145         (adjust_last_stmt): Likewise.
7146         (handle_builtin_strchr): Likewise.
7147         (handle_builtin_strcpy): Likewise.
7148         (handle_builtin_memcpy): Likewise.
7149         (handle_builtin_strcat): Likewise.
7151 2014-11-17  Ilya Enkovich  <ilya.enkovich@intel.com>
7153         * tree-chkp-opt.c (chkp_get_nobnd_fndecl): New.
7154         (chkp_get_nochk_fndecl): New.
7155         (chkp_optimize_string_function_calls): New.
7156         (chkp_opt_execute): Call chkp_optimize_string_function_calls.
7157         * tree-cfg.h (insert_cond_bb): New.
7158         * tree-cfg.c (insert_cond_bb): New.
7160 2014-11-17  Ilya Enkovich  <ilya.enkovich@intel.com>
7162         * tree-core.h (built_in_class): Add builtin codes to be used
7163         by Pointer Bounds Checker for instrumented builtin functions.
7164         * tree-streamer-in.c: Include ipa-chkp.h.
7165         (streamer_get_builtin_tree): Created instrumented decl if
7166         required.
7167         * ipa-chkp.h (chkp_maybe_clone_builtin_fndecl): New.
7168         * ipa-chkp.c (chkp_build_instrumented_fndecl): Support builtin
7169         function decls.
7170         (chkp_maybe_clone_builtin_fndecl): New.
7171         (chkp_maybe_create_clone): Support builtin function decls.
7172         (chkp_versioning): Clone builtin functions.
7173         * tree-chkp.c (chkp_instrument_normal_builtin): New.
7174         (chkp_add_bounds_to_call_stmt): Support builtin functions.
7175         (chkp_replace_function_pointer): Likewise.
7176         * builtins.c (expand_builtin_memcpy_args): New.
7177         (expand_builtin_memcpy): Call expand_builtin_memcpy_args.
7178         (expand_builtin_memcpy_with_bounds): New.
7179         (expand_builtin_mempcpy_with_bounds): New.
7180         (expand_builtin_mempcpy_args): Add orig_exp arg. Support
7181         BUILT_IN_CHKP_MEMCPY_NOBND_NOCHK
7182         (expand_builtin_memset_with_bounds): New.
7183         (expand_builtin_memset_args): Support BUILT_IN_CHKP_MEMSET_NOBND_NOCHK.
7184         (expand_builtin_with_bounds): New.
7185         * builtins.h (expand_builtin_with_bounds): New.
7186         * expr.c (expand_expr_real_1): Support instrumented builtin calls.
7188 2014-11-17  Dodji Seketeli  <dodji@redhat.com>
7190         * gimple.h (gimple_set_visited, gimple_visited_p)
7191         (gimple_set_plf, gimple_plf, gimple_set_uid, gimple_uid): Add more
7192         comments to these accessors.
7194 2014-11-17  Georg-Johann Lay  <avr@gjlay.de>
7196         * config/avr/avr-log.c (avr_log_set_avr_log) [TARGET_ALL_DEBUG]:
7197         Set avr_log_details to "all".
7199 2014-11-17  Richard Biener  <rguenther@suse.de>
7201         PR middle-end/63898
7202         * match.pd: Guard X / CST -> X * CST' transform against
7203         zero CST.
7205 2014-11-17  Terry Guo  <terry.guo@arm.com>
7207         * config/arm/thumb1.md (*addsi3_cbranch_scratch): Updated to UAL
7208         format.
7210 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@arm.com>
7212         * ifcvt.c (HAVE_cbranchcc4): Define.
7213         (noce_emit_cmove, noce_get_alt_condition, noce_get_condition):
7214         Use HAVE_cbranchcc4.
7216 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7218         * config/aarch64/aarch64.c (aarch64_code_to_ccmode,
7219         aarch64_convert_mode, aarch64_gen_ccmp_first,
7220         aarch64_gen_ccmp_next): New functions.
7221         (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): Define.
7223 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7225         * config/aarch64/aarch64-protos.h (aarch64_ccmp_mode_to_code): New.
7226         * aarch64.c (aarch64_nzcv_codes): New data.
7227         (aarch64_ccmp_mode_to_code): New.
7228         (aarch64_print_operand): Output nzcv.
7229         config/aarch64/aarch64.md (cbranchcc4, *ccmp_and, *ccmp_ior, cstorecc4):
7230         New patterns.
7231         (cstore<mode>4): Handle ccmp_cc_register.
7232         * config/aarch64/predicates.md (const0_operand): New.
7234 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7236         * config/aarch64/aarch64-modes.def: Define ccmp CC mode.
7237         * config/aarch64/aarch64.c (aarch64_get_condition_code_1): New function
7238         extacted from aarch64_get_condition_code.
7239         (aarch64_get_condition_code): Call aarch64_get_condition_code_1.
7240         config/aarch64/predicates.md (ccmp_cc_register): New predicate.
7242 014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7244         * config/aarch64/constraints.md (Usn, aarch64_ccmp_immediate,
7245         aarch64_ccmp_operand): New constraints.
7247 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7249         * Makefile.in: Add ccmp.o.
7250         * ccmp.c: New file.
7251         * ccmp.h: New file.
7252         * expr.c: include "ccmp.h"
7253         (expand_cond_expr_using_cmove): Handle VOIDmode.
7254         (expand_expr_real_1): Try to expand ccmp.
7256 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7258         * cfgexpand.c (expand_gimple_cond): Check ccmp.
7259         * expmed.c (emit_cstore): Make it global.
7260         * expmed.h: #include "insn-codes.h"
7261         (emit_cstore): New prototype.
7262         * expr.c (expand_operands): Make it global.
7263         * expr.h (expand_operands): New prototype.
7264         * optabs.c (get_rtx_code): Make it global.
7265         * optabs.h (get_rtx_code): New prototype.
7267 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7269         * target.def (gen_ccmp_first, gen_ccmp_first): Add two new hooks.
7270         * doc/tm.texi.in (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): New.
7271         * doc/tm.texi (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): New.
7273 2014-11-16  Patrick Palka  <ppalka@gcc.gnu.org>
7275         PR middle-end/63790
7276         * tree-ssa-forwprop.c (forward_propagate_into_comparison_1):
7277         Always combine comparisons or conversions from booleans.
7279 2014-11-16  Jan Hubicka  <hubicka@ucw.cz>
7281         * ipa-polymorphic-call.c
7282         (ipa_polymorphic_call_context::speculation_consistent_p): Constify.
7283         (ipa_polymorphic_call_context::meet_speculation_with): New function.
7284         (ipa_polymorphic_call_context::combine_with): Handle types in
7285         construction better.
7286         (ipa_polymorphic_call_context::equal_to): Do not bother about useless
7287         speculation.
7288         (ipa_polymorphic_call_context::meet_with): New function.
7289         * cgraph.h (class ipa_polymorphic_call_context): Add
7290         meet_width, meet_speculation_with; constify speculation_consistent_p.
7291         * ipa-cp.c (ipa_context_from_jfunc): Handle speculation; combine
7292         with incomming context.
7293         (propagate_context_accross_jump_function): Likewise; be more cureful.
7294         about set_contains_variable.
7295         (ipa_get_indirect_edge_target_1): Fix handling of dynamic type changes.
7296         (find_more_scalar_values_for_callers_subset): Fix.
7297         (find_more_contexts_for_caller_subset): Perform meet operation.
7299 2014-11-16  Jan Hubicka  <hubicka@ucw.cz>
7301         * passes.c (execute_one_pass): Do not apply all transforms prior
7302         every simple IPA pass.
7303         * cgraphunit.c: Do not include fibheap.h
7304         (expand_thunk): Use get_untransformed_body.
7305         (cgraph_node::expand): Likewise.
7306         * tree-ssa-structalias.c (ipa_pta_execute): Skip inline clones.
7307         * cgraph.c (release_function_body): Do not push cfun when CFG
7308         is not there.
7309         (cgraph_node::get_untransformed_body): Break out from ...
7310         (cgraph_node::get_body): ... here; add code to apply all transforms.
7311         * cgraph.h (cgraph_node): Add get_untransformed_body.
7312         * ipa-icf.c (sem_function::init): Use get_untransformed_body.
7313         * cgraphclones.c (duplicate_thunk_for_node): Likewise.
7314         * tree-inline.c (expand_call_inline): LIkewise.
7315         * i386.c (ix86_reset_to_default_globals): Break out from ...
7316         (ix86_set_current_function): ... here;
7317         (ix86_reset_previous_fndecl): Use it.
7318         (ix86_simd_clone_adjust): Use ix86_reset_previous_fndecl.
7320 2014-11-16  Eric Botcazou  <ebotcazou@adacore.com>
7322         * doc/tm.texi.in (TARGET_FLAGS_REGNUM): Move around.
7323         * doc/tm.texi: Regenerate.
7325 2014-11-16  Uros Bizjak  <ubizjak@gmail.com>
7327         * config/sh/sh.c: Do not include algorithm.
7328         (sh_emit_scc_to_t): Replace open-coded swap with std::swap
7329         to swap values.
7330         (sh_emit_compare_and_branch): Ditto.
7331         (sh_emit_compare_and_set): Ditto.
7332         * config/sh/sh.md (replacement peephole2): Ditto.
7333         (cstore4_media): Ditto.
7334         (*fmasf4): Ditto.
7336 2014-11-15  Vladimir Makarov  <vmakarov@redhat.com>
7338         * lra-remat.c (cand_transf_func): Process regno for
7339         rematerialization too.
7340         * lra.c (lra): Switch on rematerialization pass.
7342 2014-11-15  Vladimir Makarov  <vmakarov@redhat.com>
7344         * lra.c (lra): Switch off rematerialization pass.
7346 2014-11-15  Marc Glisse  <marc.glisse@inria.fr>
7348         * config/i386/xmmintrin.h (_mm_add_ps, _mm_sub_ps, _mm_mul_ps,
7349         _mm_div_ps, _mm_store_ss, _mm_cvtss_f32): Use vector extensions
7350         instead of builtins.
7351         * config/i386/emmintrin.h (__v2du, __v4su, __v8hu, __v16qu): New
7352         typedefs.
7353         (_mm_sqrt_sd): Fix comment.
7354         (_mm_add_epi8, _mm_add_epi16, _mm_add_epi32, _mm_add_epi64,
7355         _mm_sub_epi8, _mm_sub_epi16, _mm_sub_epi32, _mm_sub_epi64,
7356         _mm_mullo_epi16, _mm_cmpeq_epi8, _mm_cmpeq_epi16, _mm_cmpeq_epi32,
7357         _mm_cmplt_epi8, _mm_cmplt_epi16, _mm_cmplt_epi32, _mm_cmpgt_epi8,
7358         _mm_cmpgt_epi16, _mm_cmpgt_epi32, _mm_and_si128, _mm_or_si128,
7359         _mm_xor_si128, _mm_store_sd, _mm_cvtsd_f64, _mm_storeh_pd,
7360         _mm_cvtsi128_si64, _mm_cvtsi128_si64x, _mm_add_pd, _mm_sub_pd,
7361         _mm_mul_pd, _mm_div_pd, _mm_storel_epi64, _mm_movepi64_pi64):
7362         Use vector extensions instead of builtins.
7363         * config/i386/smmintrin.h (_mm_cmpeq_epi64, _mm_cmpgt_epi64,
7364         _mm_mullo_epi32): Likewise.
7365         * config/i386/avxintrin.h (__v4du, __v8su, __v16hu, __v32qu):
7366         New typedefs.
7367         (_mm256_add_pd, _mm256_add_ps, _mm256_div_pd, _mm256_div_ps,
7368         _mm256_mul_pd, _mm256_mul_ps, _mm256_sub_pd, _mm256_sub_ps):
7369         Use vector extensions instead of builtins.
7370         * config/i386/avx2intrin.h (_mm256_cmpeq_epi8, _mm256_cmpeq_epi16,
7371         _mm256_cmpeq_epi32, _mm256_cmpeq_epi64, _mm256_cmpgt_epi8,
7372         _mm256_cmpgt_epi16, _mm256_cmpgt_epi32, _mm256_cmpgt_epi64,
7373         _mm256_and_si256, _mm256_or_si256, _mm256_xor_si256, _mm256_add_epi8,
7374         _mm256_add_epi16, _mm256_add_epi32, _mm256_add_epi64,
7375         _mm256_mullo_epi16, _mm256_mullo_epi32, _mm256_sub_epi8,
7376         _mm256_sub_epi16, _mm256_sub_epi32, _mm256_sub_epi64): Likewise.
7377         * config/i386/avx512fintrin.h (__v8du, __v16su, __v32hu, __v64qu):
7378         New typedefs.
7379         (_mm512_or_si512, _mm512_or_epi32, _mm512_or_epi64, _mm512_xor_si512,
7380         _mm512_xor_epi32, _mm512_xor_epi64, _mm512_and_si512,
7381         _mm512_and_epi32, _mm512_and_epi64, _mm512_mullo_epi32,
7382         _mm512_add_epi64, _mm512_sub_epi64, _mm512_add_epi32,
7383         _mm512_sub_epi32, _mm512_add_pd, _mm512_add_ps, _mm512_sub_pd,
7384         _mm512_sub_ps, _mm512_mul_pd, _mm512_mul_ps, _mm512_div_pd,
7385         _mm512_div_ps): Use vector extensions instead of builtins.
7386         * config/i386/avx512bwintrin.h (_mm512_mullo_epi16, _mm512_add_epi8,
7387         _mm512_sub_epi8, _mm512_sub_epi16, _mm512_add_epi16): Likewise.
7388         * config/i386/avx512dqintrin.h (_mm512_mullo_epi64): Likewise.
7389         * config/i386/avx512vldqintrin.h (_mm256_mullo_epi64, _mm_mullo_epi64):
7390         Likewise.
7392 2014-11-15  Jan Hubicka <hubicka@ucw.cz>
7394         * lto-streamer-out.c (hash_tree): Use cl_optimization_hash.
7395         * lto-streamer.h (cl_optimization_stream_out,
7396         cl_optimization_stream_in): Declare.
7397         * optc-save-gen.awk: Generate cl_optimization LTO streaming
7398         and hashing routines.
7399         * opth-gen.awk: Add prototype of cl_optimization_hash.
7400         * tree-streamer-in.c (unpack_ts_optimization): Remove.
7401         (streamer_unpack_tree_bitfields): Use cl_optimization_stream_in.
7402         * tree-streamer-out.c (pack_ts_optimization): Remove.
7403         (streamer_pack_tree_bitfields): Use cl_optimization_stream_out.
7405 2014-11-15  Mircea Namolaru  <mircea.namolaru@inria.fr>
7407         * common.opt (flag_loop_unroll_and_jam): New flag.
7408         * params.def (PARAM_LOOP_UNROLL_JAM_SIZE): Parameter for unroll and
7409         jam flag.
7410         (PARAM_LOOP_UNROLL_JAM_DEPTH): Likewise.
7411         * graphite-poly.h (struct poly_bb:map_sepclass): New field
7412         * graphite-poly.c (new_poly_bb): Initialization for new field.
7413         (apply_poly_transforms): Support for unroll and jam flag.
7414         * graphite-isl-ast-to-gimple.c (generate_luj_sepclass): Compute the
7415         separation class.
7416         (generate_luj_sepclass_opt): Build the separation class option.
7417         (generate_luj_options): Set unroll and jam options.
7418         (set_options): Support for unroll and jam options.
7419         (scop_to_isl_ast): Likewise
7420         * graphite-optimize-isl.c (getPrevectorMap_full): New function for
7421         computing the separating class map.
7422         (optimize_isl): Support for the separating class map.
7423         (apply_schedule_map_to_scop): Likewise.
7424         (getScheduleMap): Likewise.
7425         (getScheduleForBand): Likewise.
7426         (getScheduleForBandList): Likewise.
7427         * graphite.c (gate_graphite_transforms): Add unroll and jam flag.
7428         * toplev.c (process_options) Likewise.
7430 2014-11-15  Eric Botcazou  <ebotcazou@adacore.com>
7432         * tree-cfg.c (replace_loop_annotate_in_block): New function extracted
7433         from...
7434         (replace_loop_annotate): ...here.  Call it on the header and on the
7435         latch block, if any.  Restore proper behavior of final cleanup.
7437 2014-11-15  Eric Botcazou  <ebotcazou@adacore.com>
7439         * tree-ssa-loop-ivcanon.c (try_unroll_loop_completely): Add log message
7440         for max-completely-peeled-insns limit.
7442 2014-11-14  Jan Hubicka  <hubicka@ucw.cz>
7444         * ipa-prop.h (ipa_known_type_data): Remove.
7445         (ipa_binfo_from_known_type_jfunc): Remove.
7447 2014-11-14  Andrew Pinski  <apinski@cavium.com>
7449         * config/aarch64/aarch64-cores.def (thunderx): Change the scheduler
7450         over to thunderx.
7451         * config/aarch64/aarch64.md: Include thunderx.md.
7452         (generic_sched): Set to no for thunderx.
7453         * config/aarch64/thunderx.md: New file.
7455 2014-11-14  Michael Meissner  <meissner@linux.vnet.ibm.com>
7457         * config/rs6000/predicates.md (easy_fp_constant): Delete redunant
7458         tests for 0.0.
7460         * config/rs6000/vector.md (VEC_R): Move secondary reload support
7461         insns to rs6000.md from vector.md.
7462         (reload_<VEC_R:mode>_<P:mptrsize>_store): Likewise.
7463         (reload_<VEC_R:mode>_<P:mptrsize>_load): Likewise.
7464         (vec_reload_and_plus_<mptrsize>): Likewise.
7466         * config/rs6000/rs6000.md (Fa): New mode attribute to give
7467         constraint for the Altivec registers for a type.
7468         (RELOAD): New mode iterator for all of the types that have
7469         secondary reload address support to load up a base register.
7470         (extendsfdf2_fpr): Use correct constraint.
7471         (copysign<mode>3_fcpsgn): For SFmode, use correct xscpsgndp
7472         instruction.
7473         (floatsi<mode>2_lfiwax): Add support for -mupper-regs-{sf,df}.
7474         Generate the non-VSX instruction if all registers were FPRs.  Do
7475         not use the patterns in vsx.md for scalar operations.
7476         (floatsi<mode>2_lfiwax_mem): Likewise.
7477         (floatunssi<mode>2_lfiwzx): Likewise.
7478         (floatunssi<mode>2_lfiwzx_mem): Likewise.
7479         (fix_trunc<mode>di2_fctidz): Likewise.
7480         (fixuns_trunc<mode>di2_fctiduz): Likewise.
7481         (fctiwz_<mode>): Likewise.
7482         (fctiwuz_<mode>): Likewise.
7483         (friz): Likewise.
7484         (floatdidf2_fpr): Likewise.
7485         (floatdidf2_mem): Likewise.
7486         (floatunsdidf2): Likewise.
7487         (floatunsdidf2_fcfidu): Likewise.
7488         (floatunsdidf2_mem): Likewise.
7489         (floatdisf2_fcfids): Likewise.
7490         (floatdisf2_mem): Likewise.
7491         (floatdisf2_internal1): Add explicit test for not FCFIDS to make
7492         it more obvious that the code is for pre-ISA 2.06 machines.
7493         (floatdisf2_internal2): Likewise.
7494         (floatunsdisf2_fcfidus): Add support for -mupper-regs-{sf,df}.
7495         Generate the non-VSX instruction if all registers were FPRs.  Do
7496         not use the patterns in vsx.md for scalar operations.
7497         (floatunsdisf2_mem): Likewise.
7498         (reload_<RELOAD:mode>_<P:mptrsize>_store): Move the reload
7499         handlers here from vector.md, and expand the types we generate
7500         reload handlers for.
7501         (reload_<RELOAD:mode>_<P:mptrsize>_load): Likewise.
7502         (vec_reload_and_plus_<mptrsize>): Likewise.
7504         * config/rs6000/vsx.md (vsx_float<VSi><mode>2): Only provide the
7505         vector forms of the instructions.  Move VSX scalar forms to
7506         rs6000.md, and add support for -mupper-regs-sf.
7507         (vsx_floatuns<VSi><mode>2): Likewise.
7508         (vsx_fix_trunc<mode><VSi>2): Likewise.
7509         (vsx_fixuns_trunc<mode><VSi>2): Likewise.
7510         (vsx_float_fix_<mode>2): Delete DF version, rename to
7511         vsx_float_fix_v2df2.
7512         (vsx_float_fix_v2df2): Likewise.
7514 2014-11-14  Martin Jambor  <mjambor@suse.cz>
7516         * ipa-prop.h (jump_func_type): Removed value IPA_JF_KNOWN_TYPE.
7517         (ipa_pass_through_data): Removed field type_preserved.
7518         (ipa_ancestor_jf_data): removed fields type and type_preserved.
7519         (ipa_jump_func): Removed field known_type.
7520         (ipa_get_jf_known_type_offset): Removed.
7521         (ipa_get_jf_known_type_base_type): Likewise.
7522         (ipa_get_jf_known_type_component_type): Likewise.
7523         (ipa_get_jf_ancestor_type): Likewise.
7524         * ipa-cp.c (print_ipcp_constant_value): Removed BINFO handling.
7525         (ipa_get_jf_pass_through_result): Likewise.
7526         (ipa_get_jf_ancestor_result): Always build ptr_node_type accesses.
7527         (values_equal_for_ipcp_p): Removed BINFO handling.
7528         (ipa_get_indirect_edge_target_1): Updated comment.
7529         * ipa-prop.c (ipa_print_node_jump_functions_for_edge): Removed handling
7530         of IPA_JF_KNOWN_TYPE jump functions.  Do not print removed fields.
7531         (ipa_set_jf_known_type): Removed.
7532         (ipa_set_jf_simple_pass_through): Do not set removed fields.  Update
7533         all callers.
7534         (ipa_set_jf_arith_pass_through): Likewise.
7535         (ipa_set_ancestor_jf): Likewise.
7536         (ipa_binfo_from_known_type_jfunc): Removed.
7537         (prop_type_change_info): Removed fields known_current_type and
7538         multiple_types_encountered.
7539         (extr_type_from_vtbl_ptr_store): Removed.
7540         (check_stmt_for_type_change): Do not attempt to identify changed type.
7541         (detect_type_change_from_memory_writes): Do not set the removed fields,
7542         always set jfunc to unknown.
7543         (compute_complex_assign_jump_func): Do not detect dynamic type change.
7544         (compute_complex_ancestor_jump_func): Likewise.
7545         (compute_known_type_jump_func): Removed.
7546         (ipa_compute_jump_functions_for_edge): Do not detect dynamic type
7547         change.  Do not comute known type jump functions.
7548         (combine_known_type_and_ancestor_jfs): Removed.
7549         (update_jump_functions_after_inlining): Removed handling of
7550         IPA_JF_KNOWN_TYPE jump functions.  Do not set removed fields.
7551         (ipa_write_jump_function): Do not stream removed fields or known type
7552         jump functions.
7553         (ipa_read_jump_function): Likewise.
7555 2014-11-14  Vladimir Makarov  <vmakarov@redhat.com>
7557         * lra-int.h (lra_create_live_ranges): Add parameter.
7558         * lra-lives.c (temp_bitmap): Move higher.
7559         (initiate_live_solver): Move temp_bitmap initialization into
7560         lra_live_ranges_init.
7561         (finish_live_solver): Move temp_bitmap clearing into
7562         live_ranges_finish.
7563         (process_bb_lives): Add parameter.  Use it to control live info
7564         update and dead insn elimination.  Pass it to mark_regno_live and
7565         mark_regno_dead.
7566         (lra_create_live_ranges): Add parameter.  Pass it to
7567         process_bb_lives.
7568         (lra_live_ranges_init, lra_live_ranges_finish): See changes in
7569         initiate_live_solver and finish_live_solver.
7570         * lra-remat.c (do_remat): Process insn non-operand hard regs too.
7571         Use temp_bitmap to update avail_cands.
7572         * lra.c (lra): Pass new parameter to lra_create_live_ranges.  Move
7573         check with lra_need_for_spill_p after live range pass.  Switch on
7574         rematerialization pass.
7576 2014-11-14  Martin Jambor  <mjambor@suse.cz>
7578         * ipa-prop.h (ipa_get_jf_pass_through_type_preserved): use
7579         agg_preserved flag instead.
7580         (ipa_get_jf_ancestor_type_preserved): Likewise.
7581         (ipa_node_params): Rename known_vals to known_csts, update all users.
7582         New field known_contexts.
7583         (ipa_get_indirect_edge_target): Update prototype.
7584         (ipcp_poly_ctx_values_pool): Declare.
7585         (ipa_context_from_jfunc): Likewise.
7586         * ipa-inline.h (estimate_ipcp_clone_size_and_time): Updated prototype.
7587         * cgraph.h (ipa_polymorphic_call_context): New method equal_to.  New
7588         parameter newline of method dump.
7589         * ipa-cp.c (ctxlat): New field.
7590         (ipcp_values_pool): Renamed to ipcp_cst_values_pool, updated all users.
7591         (ipcp_poly_ctx_values_pool):New variable.
7592         (ipa_get_poly_ctx_lat): New function.
7593         (print_ipcp_constant_value): New overloaded function for contexts.
7594         (print_all_lattices): Also print contexts.
7595         (ipa_topo_info): New field contexts;
7596         (set_all_contains_variable): Also set the flag in the context lattice.
7597         (initialize_node_lattices): Likewise for flag bottom.
7598         (ipa_get_jf_ancestor_result): Removed BINFO handling.
7599         (ipa_value_from_jfunc): Likewise.
7600         (ipa_context_from_jfunc): New function.
7601         (values_equal_for_ipcp_p): New overloaded function for contexts.
7602         (allocate_and_init_ipcp_value): Construct the value.
7603         (allocate_and_init_ipcp_value): New overloaded function for contexts.
7604         (propagate_scalar_accross_jump_function): Removed handling of
7605         KNOWN_TYPE jump functions.
7606         (propagate_context_accross_jump_function): New function.
7607         (propagate_constants_accross_call): Also propagate contexts.
7608         (ipa_get_indirect_edge_target_1): Work on contexts rather than BINFOs.
7609         (ipa_get_indirect_edge_target): Likewise.
7610         (devirtualization_time_bonus): Likewise.
7611         (gather_context_independent_values): Create and populate known_contexts
7612         vector rather than known_binfos.
7613         (perform_estimation_of_a_value): Work on contexts rather than BINFOs.
7614         (estimate_local_effects): Likewise.
7615         (add_all_node_vals_to_toposort): Also add contexts to teir topological
7616         sort.
7617         (ipcp_propagate_stage): Also propagate effects of contexts.
7618         (ipcp_discover_new_direct_edges): Receive and pass known_contexts to
7619         ipa_get_indirect_edge_target_1.
7620         (cgraph_edge_brings_value_p): New overloaded function for contexts.
7621         (create_specialized_node): Work on contexts rather than BINFOs.
7622         (find_more_contexts_for_caller_subset): New function.
7623         (known_contexts_useful_p): New function.
7624         (copy_useful_known_contexts): Likewise.
7625         (modify_known_vectors_with_val): Likewise.
7626         (ipcp_val_in_agg_replacements_p): Renamed to
7627         ipcp_val_agg_replacement_ok_p, return true for all offset indicating
7628         non-aggregate.
7629         (ipcp_val_agg_replacement_ok_p): New overloaded function for contexts.
7630         (decide_about_value): Work on contexts rather than BINFOs.
7631         (decide_whether_version_node): Likewise.
7632         (ipcp_driver): Initialize the new alloc pool.
7633         * ipa-prop.c (ipa_print_node_jump_functions_for_edge): Prettify
7634         printing of edge contexts.
7635         (ipa_set_ancestor_jf): Replace assert with conditional setting of
7636         type_preserved to false.
7637         (update_jump_functions_after_inlining): Use access function instead of
7638         reading agg_preserved directly.  Store combined context in the ancestor
7639         case.
7640         (try_make_edge_direct_virtual_call): Work on contexts rather than
7641         BINFOs.
7642         (update_indirect_edges_after_inlining): Get context from
7643         ipa_context_from_jfunc.
7644         (ipa_free_node_params_substructures): Free also known_contexts.
7645         (ipa_free_all_structures_after_ipa_cp): Free the new alloc pool.
7646         (ipa_free_all_structures_after_iinln): Likewise.
7647         * ipa-inline-analysis.c (evaluate_properties_for_edge): Work on
7648         contexts rather than BINFOs.
7649         (estimate_edge_devirt_benefit): Likewise.
7650         (estimate_edge_size_and_time): Likewise.
7651         (estimate_calls_size_and_time): Likewise.
7652         (estimate_node_size_and_time): Likewise.
7653         (estimate_ipcp_clone_size_and_time): Likewise.
7654         (do_estimate_edge_time): Likewise.
7655         (do_estimate_edge_size): Likewise.
7656         (do_estimate_edge_hints): Likewise.
7657         * ipa-polymorphic-call.c (ipa_polymorphic_call_context::dump): New
7658         parameter newline, ouput newline only when it is set.
7659         (ipa_polymorphic_call_context::equal_to): New method.
7661 2014-11-14  Martin Jambor  <mjambor@suse.cz>
7663         * ipa-cp.c (ipcp_value_source): Converted to a template class.  All
7664         users converted to the same specialization as the using class/function
7665         or specialization on tree.
7666         (ipcp_value): Likewise.
7667         (ipcp_lattice): Likewise.
7668         (ipcp_agg_lattice): Now derived from tree specialization of
7669         ipcp_lattice.
7670         (values_topo): Moved to new class value_topo_info.
7671         (ipa_lat_is_single_const): Turned into ipcp_lattice::is_single_const.
7672         Updated all callers.
7673         (print_lattice): Turned into ipcp_lattice::print.  Updated all
7674         callers.
7675         (value_topo_info): New class template.
7676         (ipa_topo_info): New field constants.  New constructor.
7677         (build_toporder_info): Do not clear stack_top, only checkign assert
7678         it.
7679         (set_lattice_to_bottom): Turned into ipcp_lattice::set_to_bottom.
7680         Updated all callers.
7681         (set_lattice_contains_variable): Turned into
7682         ipcp_lattice::set_contains_variable.  Updated all callers.
7683         (add_value_source): Turned into ipcp_value::add_source.  Updated all
7684         callers.
7685         (allocate_and_init_ipcp_value): New function.
7686         (add_value_to_lattice): Turned into ipcp_lattice::add_value.  Last
7687         parameter got default a value.  Updated all callers.
7688         (add_scalar_value_to_lattice): Removed, users converted to using
7689         ipcp_lattice::add_value with default value of the last parameter.
7690         (add_val_to_toposort): Turned to value_topo_info::add_val.  Updated
7691         all callers.
7692         (propagate_effects): Made method of value_topo_info.
7693         (cgraph_edge_brings_value_p): Now a template function.
7694         (get_info_about_necessary_edges): Likewise.
7695         (gather_edges_for_value): Likewise.
7696         (perhaps_add_new_callers): Likewise.
7697         (decide_about_value): Likewise.
7698         * ipa-prop.h (ipcp_lattice): Remove fowrward declaration.
7700 2014-11-14  Jakub Jelinek  <jakub@redhat.com>
7702         * doc/install.texi (--with-diagnostics-color=): Document.
7704         * tree-ssa.dce.c (eliminate_unnecessary_stmts): Eliminate
7705         IFN_GOMP_SIMD_LANE without lhs as useless.
7707         * ipa-pure-const.c (struct funct_state_d): Add can_free field.
7708         (varying_state): Add true for can_free.
7709         (check_call): For builtin or internal !nonfreeing_call_p set
7710         local->can_free.
7711         (check_stmt): For asm volatile and asm with "memory" set
7712         local->can_free.
7713         (analyze_function): Clear local->can_free initially, continue
7714         calling check_stmt until all flags are computed, dump can_free
7715         flag.
7716         (pure_const_write_summary): Write can_free flag.
7717         (pure_const_read_summary): Read it back.
7718         (propagate_pure_const): Propagate also can_free flag, set
7719         w->nonfreeing_fn if it is false after propagation.
7720         * cgraph.h (cgraph_node): Add nonfreeing_fn member.
7721         * gimple.c: Include ipa-ref.h, lto-streamer.h and cgraph.h.
7722         (nonfreeing_call_p): Return cgraph nonfreeing_fn flag if set.
7723         Also return true for IFN_ABNORMAL_DISPATCHER.
7724         * cgraph.c (cgraph_node::dump): Dump nonfreeing_fn flag.
7725         * lto-cgraph.c (lto_output_node): Write nonfreeing_fn flag.
7726         (input_overwrite_node): Read it back.
7728 2014-11-14  Jakub Jelinek  <jakub@redhat.com>
7729             Marek Polacek  <polacek@redhat.com>
7731         * sanopt.c: Include tree-ssa-operands.h.
7732         (struct sanopt_info): Add has_freeing_call_p,
7733         has_freeing_call_computed_p, imm_dom_path_with_freeing_call_p,
7734         imm_dom_path_with_freeing_call_computed_p, freeing_call_events,
7735         being_visited_p fields.
7736         (struct sanopt_ctx): Add asan_check_map field.
7737         (imm_dom_path_with_freeing_call, maybe_optimize_ubsan_null_ifn,
7738         maybe_optimize_asan_check_ifn): New functions.
7739         (sanopt_optimize_walker): Use them, optimize even ASAN_CHECK
7740         internal calls.
7741         (pass_sanopt::execute): Call sanopt_optimize even for
7742         -fsanitize=address.
7743         * gimple.c (nonfreeing_call_p): Return true for non-ECF_LEAF
7744         internal calls.
7746 2014-11-14  Alan Lawrence  <alan.lawrence@arm.com>
7748         * tree-vect-loop.c (vect_create_epilog_for_reduction): Move code for
7749         'if (extract_scalar_result)' to the only place that it is true.
7751 2014-11-14  H.J. Lu  <hongjiu.lu@intel.com>
7753         * config.gcc (default_gnu_indirect_function): Set to yes
7754         for i[34567]86-*-linux* and x86_64-*-linux* if not targeting
7755         Android nor uclibc.
7757 2014-11-14  Felix Yang  <felix.yang@huawei.com>
7758             Jiji Jiang  <jiangjiji@huawei.com>
7760         * config/aarch64/aarch64-simd.md (*aarch64_simd_ld1r<mode>): Use
7761         VALL mode iterator instead of VALLDI.
7763 2014-11-14  Jan Hubicka  <hubicka@ucw.cz>
7765         * optc-save-gen.awk: Output cl_target_option_eq,
7766         cl_target_option_hash, cl_target_option_stream_out,
7767         cl_target_option_stream_in functions.
7768         * opth-gen.awk: Output prototypes for
7769         cl_target_option_eq and cl_target_option_hash.
7770         * lto-streamer.h (cl_target_option_stream_out,
7771         cl_target_option_stream_in): Declare.
7772         * tree.c (cl_option_hash_hash): Use cl_target_option_hash.
7773         (cl_option_hash_eq): Use cl_target_option_eq.
7774         * tree-streamer-in.c (unpack_value_fields): Stream in
7775         TREE_TARGET_OPTION.
7776         * lto-streamer-out.c (DFS::DFS_write_tree_body): Follow
7777         DECL_FUNCTION_SPECIFIC_TARGET.
7778         (hash_tree): Hash TREE_TARGET_OPTION; visit
7779         DECL_FUNCTION_SPECIFIC_TARGET.
7780         * tree-streamer-out.c (streamer_pack_tree_bitfields): Skip
7781         TS_TARGET_OPTION.
7782         (streamer_write_tree_body): Output TS_TARGET_OPTION.
7784 2014-11-14  Richard Biener  <rguenther@suse.de>
7786         * gimple-fold.h (gimple_fold_stmt_to_constant_1): Add 2nd
7787         valueization hook defaulted to no_follow_ssa_edges.
7788         * gimple-fold.c (gimple_fold_stmt_to_constant_1): Pass
7789         2nd valueization hook to gimple_simplify.
7790         * tree-ssa-ccp.c (valueize_op_1): New function to be
7791         used for gimple_simplify called via gimple_fold_stmt_to_constant_1.
7792         (ccp_fold): Adjust.
7793         * tree-vrp.c (vrp_valueize_1): New function to be
7794         used for gimple_simplify called via gimple_fold_stmt_to_constant_1.
7795         (vrp_visit_assignment_or_call): Adjust.
7797 2014-11-14  Marek Polacek  <polacek@redhat.com>
7799         * fold-const.c (fold_negate_expr): Don't fold INTEGER_CST if
7800         that overflows when SANITIZE_SI_OVERFLOW is on.  Guard -(-A)
7801         folding with TYPE_OVERFLOW_SANITIZED.
7803 2014-11-14  Marek Polacek  <polacek@redhat.com>
7805         PR sanitizer/63839
7806         * asan.c (ATTR_CONST_NORETURN_NOTHROW_LEAF_LIST,
7807         ATTR_COLD_CONST_NORETURN_NOTHROW_LEAF_LIST): Define.
7808         * builtin-attrs.def (ATTR_COLD_CONST_NORETURN_NOTHROW_LEAF_LIST):
7809         Define.
7810         * builtins.c (fold_builtin_0): Don't include ubsan.h.  Don't
7811         instrument BUILT_IN_UNREACHABLE here.
7812         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_BUILTIN_UNREACHABLE): Make
7813         const.
7814         * sanopt.c (pass_sanopt::execute): Instrument BUILT_IN_UNREACHABLE.
7815         * tree-ssa-ccp.c (optimize_unreachable): Bail out if
7816         SANITIZE_UNREACHABLE.
7817         * ubsan.c (ubsan_instrument_unreachable): Rewrite for GIMPLE.
7818         * ubsan.h (ubsan_instrument_unreachable): Adjust declaration.
7820 2014-11-14  Alan Lawrence  <alan.lawrence@arm.com>
7822         * config/rs6000/vector.md (vec_shl_<mode>): Remove.
7823         (vec_shr_<mode>): Reverse shift if BYTES_BIG_ENDIAN.
7825 2014-11-14  Alan Lawrence  <alan.lawrence@arm.com>
7827         * optabs.c (shift_amt_for_vec_perm_mask): Remove code conditional on
7828         BYTES_BIG_ENDIAN.
7829         * tree-vect-loop.c (calc_vec_perm_mask_for_shift,
7830         vect_create_epilog_for_reduction): Likewise.
7831         * doc/md.texi (vec_shr_m): Clarify direction of shifting.
7833 2014-11-14  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
7835         PR target/63724
7836         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate): Split out
7837         numerical immediate handling to...
7838         (aarch64_internal_mov_immediate): ...this. New.
7839         (aarch64_rtx_costs): Use aarch64_internal_mov_immediate.
7840         (aarch64_mov_operand_p): Relax predicate.
7841         * config/aarch64/aarch64.md (mov<mode>:GPI): Do not expand CONST_INTs.
7842         (*movsi_aarch64): Turn into define_insn_and_split and new alternative
7843         for 'n'.
7844         (*movdi_aarch64): Likewise.
7846 2014-11-14  Richard Biener  <rguenther@suse.de>
7848         * match.pd: Implement more binary patterns exercised by
7849         fold_stmt.
7850         * fold-const.c (sing_bit_p): Export.
7851         (exact_inverse): Likewise.
7852         (fold_binary_loc): Remove patterns here.
7853         (tree_unary_nonnegative_warnv_p): Use CASE_CONVERT.
7854         * fold-const.h (sing_bit_p): Declare.
7855         (exact_inverse): Likewise.
7857 2014-11-14  Marek Polacek  <polacek@redhat.com>
7859         * tree.c (build_common_builtin_nodes): Remove doubled ECF_LEAF.
7861 2014-11-14  Richard Biener  <rguenther@suse.de>
7863         * genmatch.c (add_operator): Allow CONSTRUCTOR.
7864         (dt_node::gen_kids): Handle CONSTRUCTOR not as GENERIC.
7865         (parser::parse_op): Allow to iterate over predicates.
7867 2014-11-14  Jakub Jelinek  <jakub@redhat.com>
7869         * configure.ac (--with-diagnostics-color): New configure
7870         option, default to --with-diagnostics-color=auto.
7871         * toplev.c (process_options): Use DIAGNOSTICS_COLOR_DEFAULT
7872         to determine -fdiagnostics-color= option default.
7873         * doc/invoke.texi (-fdiagnostics-color=): Document new
7874         default.
7875         * configure: Regenerated.
7876         * config.in: Regenerated.
7878 2014-11-13  Teresa Johnson  <tejohnson@google.com>
7880         PR tree-optimization/63841
7881         * tree-ssa-strlen.c (strlen_optimize_stmt): Ignore clobbers.
7883 2014-11-14  Bin Cheng  <bin.cheng@arm.com>
7885         * timevar.def (TV_SCHED_FUSION): New time var.
7886         * passes.def (pass_sched_fusion): New pass.
7887         * config/arm/arm.c (TARGET_SCHED_FUSION_PRIORITY): New.
7888         (extract_base_offset_in_addr, fusion_load_store): New.
7889         (arm_sched_fusion_priority): New.
7890         (arm_option_override): Disable scheduling fusion by default
7891         on non-armv7 processors or ldrd/strd isn't preferred.
7892         * sched-int.h (struct _haifa_insn_data): New field.
7893         (INSN_FUSION_PRIORITY, FUSION_MAX_PRIORITY, sched_fusion): New.
7894         * sched-rgn.c (rest_of_handle_sched_fusion): New.
7895         (pass_data_sched_fusion, pass_sched_fusion): New.
7896         (make_pass_sched_fusion): New.
7897         * haifa-sched.c (sched_fusion): New.
7898         (insn_cost): Handle sched_fusion.
7899         (priority): Handle sched_fusion by calling target hook.
7900         (enum rfs_decision): New enum value.
7901         (rfs_str): New element for RFS_FUSION.
7902         (rank_for_schedule): Support sched_fusion.
7903         (schedule_insn, max_issue, prune_ready_list): Handle sched_fusion.
7904         (schedule_block, fix_tick_ready): Handle sched_fusion.
7905         * common.opt (flag_schedule_fusion): New.
7906         * tree-pass.h (make_pass_sched_fusion): New.
7907         * target.def (fusion_priority): New.
7908         * doc/tm.texi.in (TARGET_SCHED_FUSION_PRIORITY): New.
7909         * doc/tm.texi: Regenerated.
7910         * doc/invoke.texi (-fschedule-fusion): New.
7912 2014-11-13  Rong Xu  <xur@google.com>
7914         PR debug/63581
7915         * cfgrtl.c (emit_barrier_after_bb): Append the barrier to the
7916         footer, instead of unconditionally overwritten.
7918 2014-11-14  Martin Jambor  <mjambor@suse.cz>
7920         * cgraph.h (clear_outer_type): Make public.  Fix comment.
7921         * ipa-devirt.c (possible_polymorphic_call_targets): Use
7922         clear_outer_type when resetting the context.
7924 2014-11-13  Dominique Dhumieres  <dominiq@lps.ens.fr>
7926         PR bootstrap/63853
7927         * gcc.c (handle_foffload_option): Replace strchrnul with strchr.
7928         * lto-wrapper.c (parse_env_var, append_offload_options): Likewise.
7930 2014-11-13  Alan Lawrence  <alan.lawrence@arm.com>
7932         * fold-const.c (const_binop): Remove code handling VEC_RSHIFT_EXPR.
7933         * tree-cfg.c (verify_gimple_assign_binary): Likewise.
7934         * tree-inline.c (estimate_operator_cost): Likewise.
7935         * tree-pretty-print.c (dump_generic_node, op_code_prio, op_symbol_code):
7936         Likewise.
7938         * tree-vect-generic.c (expand_vector_operations_1): Remove assertion
7939         against VEC_RSHIFT_EXPR.
7941         * optabs.h (expand_vec_shift_expr): Remove.
7942         * optabs.c (optab_for_tree_code): Remove case VEC_RSHIFT_EXPR.
7943         (expand_vec_shift_expr): Remove.
7944         * tree.def (VEC_RSHIFT_EXPR): Remove
7946 2014-11-13  Alan Lawrence  <alan.lawrence@arm.com>
7948         * optabs.c (can_vec_perm_p): Update comment, does not consider vec_shr.
7949         (shift_amt_for_vec_perm_mask): New.
7950         (expand_vec_perm_1): Use vec_shr_optab if second vector is const0_rtx
7951         and mask appropriate.
7953         * tree-vect-loop.c (calc_vec_perm_mask_for_shift): New.
7954         (have_whole_vector_shift): New.
7955         (vect_model_reduction_cost): Call have_whole_vector_shift instead of
7956         looking for vec_shr_optab.
7957         (vect_create_epilog_for_reduction): Likewise; also rename local variable
7958         have_whole_vector_shift to reduce_with_shift; output VEC_PERM_EXPRs
7959         instead of VEC_RSHIFT_EXPRs.
7961         * tree-vect-stmts.c (vect_gen_perm_mask_checked): Extend comment.
7963 2014-11-13  Alan Lawrence  <alan.lawrence@arm.com>
7965         * tree-vectorizer.h (vect_gen_perm_mask): Remove.
7966         (vect_gen_perm_mask_checked, vect_gen_perm_mask_any): New.
7968         * tree_vec_data_refs.c (vect_permute_load_chain,
7969         vec_permute_store_chain, vec_shift_permute_load_chain): Replace
7970         vect_gen_perm_mask & assert with vect_gen_perm_mask_checked.
7972         * tree-vect-stmts.c (vectorizable_mask_load_store, vectorizable_load):
7973         Likewise.
7974         (vect_gen_perm_mask_checked): New.
7975         (vect_gen_perm_mask): Remove can_vec_perm_p check, rename to...
7976         (vect_gen_perm_mask_any): ...this.
7977         (perm_mask_for_reverse): Call can_vec_perm_p and
7978         vect_gen_perm_mask_checked.
7980 2014-11-13  Felix Yang  <felix.yang@huawei.com>
7982         * ipa-utils.h: Fix typo in comments.
7983         * ipa-profile.c: Likewise.
7984         * tree-ssa-loop-ivcanon.c: Fix typo in comments and debugging dumps.
7986 2014-11-13  Teresa Johnson  <tejohnson@google.com>
7988         PR tree-optimization/63841
7989         * tree-ssa-strlen.c (strlen_optimize_stmt): Ignore clobbers.
7991 2014-11-13  Teresa Johnson  <tejohnson@google.com>
7993         PR tree-optimization/63841
7994         * tree.c (initializer_zerop): A clobber does not zero initialize.
7996 2014-11-13  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
7998         * optabs.c (prepare_operand): Gracefully fail if the mode of X
7999         does not match the operand mode expected by the insn pattern.
8001 2014-11-13  Richard Biener  <rguenther@suse.de>
8003         * match.pd: Add tcc_comparison, inverted_tcc_comparison
8004         and inverted_tcc_comparison_with_nans operator lists.
8005         Use tcc_comparison in the truth_valued_p predicate definition.
8006         Restrict logical_inverted_value with bit_xor to integral types.
8007         Build a boolean true for simplifying x |^ !x because of
8008         vector types.  Implement patterns from forward_propagate_comparison
8009         * tree-ssa-forwprop.c (forward_propagate_comparison): Remove.
8010         (get_prop_dest_stmt): Likewise.
8011         (pass_forwprop::execute): Do not call it.
8012         * fold-const.c (fold_unary_loc): Remove the pattern here.
8014 2014-11-13  Ilya Verbin  <ilya.verbin@intel.com>
8015             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8017         * config.gcc (*-intelmic-* | *-intelmicemul-*): Add i386/t-intelmic to
8018         tmake_file.
8019         (i[34567]86-*-* | x86_64-*-*): Build mkoffload$(exeext) with the
8020         accelerator compiler.
8021         * config/i386/intelmic-mkoffload.c: New file.
8022         * config/i386/t-intelmic: Ditto.
8024 2014-11-13  Bernd Schmidt  <bernds@codesourcery.com>
8025             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8026             Ilya Verbin  <ilya.verbin@intel.com>
8028         * common.opt (foffload, foffload-abi): New options.
8029         * config/i386/i386.c (ix86_offload_options): New static function.
8030         (TARGET_OFFLOAD_OPTIONS): Define.
8031         * coretypes.h (enum offload_abi): New enum.
8032         * doc/tm.texi: Regenerate.
8033         * doc/tm.texi.in (TARGET_OFFLOAD_OPTIONS): Document.
8034         * gcc.c (offload_targets): New static variable.
8035         (handle_foffload_option): New static function.
8036         (driver_handle_option): Handle OPT_foffload_.
8037         (driver::maybe_putenv_OFFLOAD_TARGETS): Set OFFLOAD_TARGET_NAMES
8038         according to offload_targets.
8039         * hooks.c (hook_charptr_void_null): New hook.
8040         * hooks.h (hook_charptr_void_null): Declare.
8041         * lto-opts.c: Include lto-section-names.h.
8042         (lto_write_options): Append options from target offload_options hook and
8043         store them to offload_lto section.  Do not store target-specific,
8044         driver and diagnostic options in offload_lto section.
8045         * lto-wrapper.c (merge_and_complain): Handle OPT_foffload_ and
8046         OPT_foffload_abi_.
8047         (append_compiler_options, append_linker_options)
8048         (append_offload_options): New static functions.
8049         (compile_offload_image): Add new arguments with options.
8050         Call append_compiler_options and append_offload_options.
8051         (compile_images_for_offload_targets): Add new arguments with options.
8052         (find_and_merge_options): New static function.
8053         (run_gcc): Outline options handling into the new functions:
8054         find_and_merge_options, append_compiler_options, append_linker_options.
8055         * opts.c (common_handle_option): Don't handle OPT_foffload_.
8056         Forbid OPT_foffload_abi_ for non-offload compiler.
8057         * target.def (offload_options): New target hook.
8059 2014-11-13  Ilya Verbin  <ilya.verbin@intel.com>
8060             Bernd Schmidt  <bernds@codesourcery.com>
8061             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8062             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
8064         * gcc.c (spec_host_machine, accel_dir_suffix): New variables.
8065         (process_command): Tweak path construction for the possibility
8066         of being configured as an offload compiler.
8067         (driver::maybe_putenv_OFFLOAD_TARGETS): New function.
8068         (driver::main): Call maybe_putenv_OFFLOAD_TARGETS.
8069         (driver::set_up_specs): Tweak path construction for the possibility of
8070         being configured as an offload compiler.
8071         * lto-wrapper.c (OFFLOAD_TARGET_NAMES_ENV): Define.
8072         (offload_names, offloadbegin, offloadend): New static variables.
8073         (free_array_of_ptrs, parse_env_var, access_check, compile_offload_image)
8074         (compile_images_for_offload_targets, copy_file, find_offloadbeginend):
8075         New static functions.
8076         (run_gcc): Determine whether offload sections are present.  If so, run
8077         compile_images_for_offload_targets and return the names of new generated
8078         objects to linker.  If there are offload sections, but no LTO sections,
8079         then return the copies of input objects without link-time recompilation.
8081 2014-11-13  Richard Biener  <rguenther@suse.de>
8083         * genmatch.c (dt_node::gen_kids): Fix placement of break statement.
8085 2014-11-13  Ilya Verbin  <ilya.verbin@intel.com>
8086             Bernd Schmidt  <bernds@codesourcery.com>
8087             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8088             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
8090         * Makefile.in (GTFILES): Add omp-low.h to list of GC files.
8091         * cgraphunit.c: Include omp-low.h.
8092         * doc/tm.texi: Regenerate.
8093         * doc/tm.texi.in (TARGET_RECORD_OFFLOAD_SYMBOL): Document.
8094         * gengtype.c (open_base_files): Add omp-low.h to ifiles.
8095         * lto-cgraph.c (output_offload_tables): New function.
8096         (input_offload_tables): Likewise.
8097         * lto-section-in.c (lto_section_name): Add "offload_table".
8098         * lto-section-names.h (OFFLOAD_VAR_TABLE_SECTION_NAME): Define.
8099         (OFFLOAD_FUNC_TABLE_SECTION_NAME): Likewise.
8100         * lto-streamer-out.c (lto_output): Call output_offload_tables.
8101         * lto-streamer.h (lto_section_type): Add LTO_section_offload_table.
8102         (output_offload_tables, input_offload_tables): Declare.
8103         * omp-low.c: Include common/common-target.h and lto-section-names.h.
8104         (offload_funcs, offload_vars): New global <tree, va_gc> vectors.
8105         (expand_omp_target): Add child_fn into offload_funcs vector.
8106         (add_decls_addresses_to_decl_constructor): New function.
8107         (omp_finish_file): Likewise.
8108         * omp-low.h (omp_finish_file, offload_funcs, offload_vars): Declare.
8109         * target.def (record_offload_symbol): New DEFHOOK.
8110         * toplev.c: Include omp-low.h.
8111         (compile_file): Call omp_finish_file.
8112         * varpool.c: Include omp-low.h.
8113         (varpool_node::get_create): Add decl into offload_vars vector.
8115 2014-11-13  Ilya Verbin  <ilya.verbin@intel.com>
8116             Ilya Tocar  <ilya.tocar@intel.com>
8117             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8118             Bernd Schmidt  <bernds@codesourcery.com>
8120         * cgraph.c: Include context.h.
8121         (cgraph_node::create): Set node->offloadable and g->have_offload if
8122         decl have "omp declare target" attribute.
8123         * cgraph.h (symtab_node): Add need_lto_streaming and offloadable flags.
8124         * cgraphunit.c: Include lto-section-names.h.
8125         (ipa_passes): Call ipa_write_summaries if there is something to write to
8126         OFFLOAD_SECTION_NAME_PREFIX sections.
8127         (symbol_table::compile): Set flag_generate_lto if there is something to
8128         offload.
8129         Replace flag_lto with flag_generate_lto before lto_streamer_hooks_init.
8130         * context.c (gcc::context::context): Initialize have_offload with false.
8131         * context.h (class context): Add have_offload flag.
8132         * ipa-inline-analysis.c (inline_generate_summary): Do not exit under
8133         flag_generate_lto.
8134         (inline_free_summary): Always remove hooks.
8135         * lto-cgraph.c (referenced_from_other_partition_p): Ignore references
8136         from non-offloadable nodes while streaming a node into offload section.
8137         (reachable_from_other_partition_p): Likewise.
8138         (select_what_to_stream): New function.
8139         (compute_ltrans_boundary): Do not call
8140         lto_set_symtab_encoder_in_partition if the node should not be streamed.
8141         * lto-section-names.h (OFFLOAD_SECTION_NAME_PREFIX): Define.
8142         (section_name_prefix): Declare.
8143         * lto-streamer.c (section_name_prefix): New variable.
8144         (lto_get_section_name): Use section_name_prefix instead of
8145         LTO_SECTION_NAME_PREFIX.
8146         * lto-streamer.h (select_what_to_stream): Declare.
8147         * omp-low.c: Include context.h.
8148         (is_targetreg_ctx): New function.
8149         (scan_sharing_clauses): Use offloadable flag, instead of an attribute.
8150         (create_omp_child_function, check_omp_nesting_restrictions): Use new
8151         is_targetreg_ctx function.  Replace usage of "omp declare target"
8152         attribute with a cgraph_node flag offloadable.
8153         (expand_omp_target): Set mark_force_output for offloadable functions.
8154         (lower_omp_critical): Set offloadable flag for omp critical symbol.
8155         * passes.c (ipa_write_summaries): New argument offload_lto_mode.  Call
8156         select_what_to_stream.  Do not call lto_set_symtab_encoder_in_partition
8157         if the node should not be streamed out.
8158         * tree-pass.h (ipa_write_summaries): New bool argument.
8159         * varpool.c: Include context.h.
8160         (varpool_node::get_create): Set node->offloadable and g->have_offload if
8161         decl have "omp declare target" attribute.
8163 2014-11-13  Bernd Schmidt  <bernds@codesourcery.com>
8164             Thomas Schwinge  <thomas@codesourcery.com>
8165             Ilya Verbin  <ilya.verbin@intel.com>
8166             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8168         * Makefile.in (real_target_noncanonical, accel_dir_suffix)
8169         (enable_as_accelerator): New variables substituted by configure.
8170         (libsubdir, libexecsubdir, unlibsubdir): Tweak for the possibility of
8171         being configured as an offload compiler.
8172         (DRIVER_DEFINES): Pass new defines DEFAULT_REAL_TARGET_MACHINE and
8173         ACCEL_DIR_SUFFIX.
8174         (install-cpp, install-common, install_driver, install-gcc-ar): Do not
8175         install for the offload compiler.
8176         * config.in: Regenerate.
8177         * configure: Regenerate.
8178         * configure.ac (real_target_noncanonical, accel_dir_suffix)
8179         (enable_as_accelerator): Compute new variables.
8180         (ACCEL_COMPILER): Define if the compiler is built as the accel compiler.
8181         (OFFLOAD_TARGETS): List of target names suitable for offloading.
8182         (ENABLE_OFFLOADING): Define if list of offload targets is not empty.
8183         * doc/install.texi (Options specification): Document
8184         --enable-as-accelerator-for and --enable-offload-targets.
8186 2014-11-13  H.J. Lu  <hongjiu.lu@intel.com>
8188         PR tree-optimization/63828
8189         * ipa-polymorphic-call.c (possible_placement_new): Check
8190         POINTER_SIZE, instead of BITS_PER_WORD, for pointer size.
8192 2014-11-13  Eric Botcazou  <ebotcazou@adacore.com>
8194         * doc/tm.texi.in (SELECT_CC_MODE): Update example.
8195         (REVERSIBLE_CC_MODE): Fix example.
8196         (REVERSE_CONDITION): Fix typo.
8197         * doc/tm.texi: Regenerate.
8199 2014-11-13  Tom de Vries  <tom@codesourcery.com>
8201         * omp-low.c (pass_data_expand_omp): Set properties_provided to
8202         PROP_gimple_eomp.
8203         (pass_expand_omp::gate): Remove function.  Move gate expression to ...
8204         (pass_expand_omp::execute): ... here, as new variable gate.  Add early
8205         exit if gate is false.
8206         (pass_data pass_data_expand_omp_ssa): New pass_data.
8207         (class pass_expand_omp_ssa): New pass.
8208         (make_pass_expand_omp_ssa): New function.
8209         * passes.def (pass_parallelize_loops): Use PUSH_INSERT_PASSES_WITHIN
8210         instead of NEXT_PASS.
8211         (pass_expand_omp_ssa): Add after pass_parallelize_loops.
8212         * tree-parloops.c (gen_parallel_loop): Remove call to omp_expand_local.
8213         (pass_parallelize_loops::execute): Don't do cleanups TODO_cleanup_cfg
8214         and TODO_rebuild_alias yet.  Add TODO_update_ssa.  Set
8215         cfun->omp_expand_needed.
8216         * tree-pass.h: Add define PROP_gimple_eomp.
8217         (make_pass_expand_omp_ssa): Declare.
8219 2014-11-13  Marek Polacek  <polacek@redhat.com>
8221         * tree.h (TYPE_OVERFLOW_SANITIZED): Define.
8222         * fold-const.c (fold_binary_loc): Use it.
8223         * match.pd: Likewise.
8225 2014-11-14  Kirill Yukhin  <kirill.yukhin@intel.com>
8227         * lra-lives.c (struct bb_data): Rename to ...
8228         (struct bb_data_pseudos): ... this.
8229         (initiate_live_solver): Update struct name.
8231 2014-11-13  Richard Biener  <rguenther@suse.de>
8233         * match.pd: Implement conditional expression patterns.
8234         * tree-ssa-forwprop.c (forward_propagate_into_cond): Remove
8235         them here.
8236         (combine_cond_exprs): Remove.
8237         (pass_forwprop::execute): Do not call combine_cond_exprs.
8238         * fold-const.c (fold_ternary_loc): Remove patterns here.
8239         (pedantic_omit_one_operand_loc): Remove.
8241 2014-12-13  Richard Biener  <rguenther@suse.de>
8243         PR middle-end/61559
8244         * match.pd: Implement bswap patterns for transforms checked by
8245         gcc.dg/builtin-bswap-8.c.
8247 2014-11-13  Vladimir Makarov  <vmakarov@redhat.com>
8249         * lra.c (lra): Switch off rematerialization pass.
8251 2014-11-12  Vladimir Makarov  <vmakarov@redhat.com>
8253         * common.opt (flra-remat): New.
8254         * opts.c (default_options_table): Add entry for flra_remat.
8255         * timevar_def (TV_LRA_REMAT): New.
8256         * doc/invoke.texi (-flra-remat): Add description of the new
8257         option.
8258         * doc/passes.texi (-flra-remat): Remove lra-equivs.c and
8259         lra-saves.c.  Add lra-remat.c.
8260         * Makefile.in (OBJS): Add lra-remat.o.
8261         * lra-remat.c: New file.
8262         * lra.c: Add info about the rematerialization pass in the top
8263         comment.
8264         (collect_non_operand_hard_regs, add_regs_to_insn_regno_info):
8265         Process unallocatable regs too.
8266         (lra_constraint_new_insn_uid_start): Remove.
8267         (lra): Add code for calling rematerialization sub-pass.
8268         * lra-int.h (lra_constraint_new_insn_uid_start): Remove.
8269         (lra_constrain_insn, lra_remat): New prototypes.
8270         (lra_eliminate_regs_1): Add parameter.
8271         * lra-lives.c (make_hard_regno_born, make_hard_regno_dead):
8272         Process unallocatable hard regs too.
8273         (process_bb_lives): Ditto.
8274         * lra-spills.c (remove_pseudos): Add argument to
8275         lra_eliminate_regs_1 call.
8276         * lra-eliminations.c (lra_eliminate_regs_1): Add parameter.  Use it
8277         for sp offset calculation.
8278         (lra_eliminate_regs): Add argument for lra_eliminate_regs_1 call.
8279         (eliminate_regs_in_insn): Add parameter.  Use it for sp offset
8280         calculation.
8281         (process_insn_for_elimination): Add argument for
8282         eliminate_regs_in_insn call.
8283         * lra-constraints.c (get_equiv_with_elimination):  Add argument
8284         for lra_eliminate_regs_1 call.
8285         (process_addr_reg): Add parameter.  Use it.
8286         (process_address_1): Ditto.  Add argument for process_addr_reg
8287         call.
8288         (process_address): Ditto.
8289         (curr_insn_transform): Add parameter.  Use it.  Add argument for
8290         process_address calls.
8291         (lra_constrain_insn): New function.
8292         (lra_constraints): Add argument for curr_insn_transform call.
8294 2014-11-13  Manuel López-Ibáñez  <manu@gcc.gnu.org>
8296         * opts-global.c (postpone_unknown_option_warning): Fix spelling.
8297         (print_ignored_options): Fix quoting.
8298         * opts.c (common_handle_option): Likewise.
8299         (set_debug_level): Likewise.
8300         * toplev.c (process_options): Likewise.
8302 2014-11-12  Jakub Jelinek  <jakub@redhat.com>
8304         PR ipa/63838
8305         * ipa-pure-const.c (propagate_nothrow): Walk w->indirect_calls
8306         chain instead of node->indirect_calls.  Put !can_throw into
8307         conditions of all the loops.
8309 2014-11-12  H.J. Lu  <hongjiu.lu@intel.com>
8311         * config/i386/i386.c (x86_output_mi_thunk): Use gen_rtx_REG to
8312         set pic_offset_table_rtx.
8314 2014-11-12  Matthew Fortune  <matthew.fortune@imgtec.com>
8316         * common/config/mips/mips-common.c (mips_handle_option): Ensure
8317         that -mfp32, -mfp64 disable -mfpxx and -mfpxx disables -mfp64.
8318         * config.gcc (--with-fp-32): New option.
8319         (--with-odd-spreg-32): Likewise.
8320         * config.in (HAVE_AS_DOT_MODULE): New config define.
8321         * config/mips/mips-protos.h
8322         (mips_secondary_memory_needed): New prototype.
8323         (mips_hard_regno_caller_save_mode): Likewise.
8324         * config/mips/mips.c (mips_get_reg_raw_mode): New static prototype.
8325         (mips_get_arg_info): Assert that V2SFmode is only handled specially
8326         with TARGET_PAIRED_SINGLE_FLOAT.
8327         (mips_return_mode_in_fpr_p): Likewise.
8328         (mips16_call_stub_mode_suffix): Likewise.
8329         (mips_get_reg_raw_mode): New static function.
8330         (mips_return_fpr_pair): O32 return values span two registers.
8331         (mips16_build_call_stub): Likewise.
8332         (mips_function_value_regno_p): Support both FP return registers.
8333         (mips_output_64bit_xfer): Use mthc1 whenever TARGET_HAS_MXHC1.  Add
8334         specific cases for TARGET_FPXX to move via memory.
8335         (mips_dwarf_register_span): For TARGET_FPXX pretend that modes larger
8336         than UNITS_PER_FPREG 'span' one register.
8337         (mips_dwarf_frame_reg_mode): New static function.
8338         (mips_file_start): Switch to using .module instead of .gnu_attribute.
8339         No longer support FP ABI 4 (-mips32r2 -mfp64), replace with FP ABI 6.
8340         Add FP ABI 5 (-mfpxx) and FP ABI 7 (-mfp64 -mno-odd-spreg).
8341         (mips_save_reg, mips_restore_reg): Always represent DFmode frame
8342         slots with two CFI directives even for O32 FP64.
8343         (mips_for_each_saved_gpr_and_fpr): Account for fixed_regs when
8344         saving/restoring callee-saved registers.
8345         (mips_hard_regno_mode_ok_p): Implement O32 FP64A extension.
8346         (mips_secondary_memory_needed): New function.
8347         (mips_option_override): ABI check for TARGET_FLOATXX.  Disable
8348         odd-numbered single-precision registers when using TARGET_FLOATXX.
8349         Implement -modd-spreg and defaults.
8350         (mips_conditional_register_usage): Redefine O32 FP64 to match O32 FP32
8351         callee-saved behaviour.
8352         (mips_hard_regno_caller_save_mode): Implement.
8353         (TARGET_GET_RAW_RESULT_MODE): Define target hook.
8354         (TARGET_GET_RAW_ARG_MODE): Define target hook.
8355         (TARGET_DWARF_FRAME_REG_MODE): Define target hook.
8356         * config/mips/mips.h (TARGET_FLOAT32): New macro.
8357         (TARGET_O32_FP64A_ABI): Likewise.
8358         (TARGET_CPU_CPP_BUILTINS): TARGET_FPXX is __mips_fpr==0. Add
8359         _MIPS_SPFPSET builtin define.
8360         (MIPS_FPXX_OPTION_SPEC): New macro.
8361         (OPTION_DEFAULT_SPECS): Pass through --with-fp-32=* to -mfp and
8362         --with-odd-spreg-32=* to -m[no-]odd-spreg.
8363         (ISA_HAS_ODD_SPREG): New macro.
8364         (ISA_HAS_MXHC1): True for anything other than -mfp32.
8365         (ASM_SPEC): Pass through mfpxx, mfp64, -mno-odd-spreg and -modd-spreg.
8366         (MIN_FPRS_PER_FMT): Redefine in terms of TARGET_ODD_SPREG.
8367         (HARD_REGNO_CALLER_SAVE_MODE): Define.  Implement O32 FPXX extension
8368         (HARD_REGNO_CALL_PART_CLOBBERED): Likewise.
8369         (SECONDARY_MEMORY_NEEDED): Likewise.
8370         (FUNCTION_ARG_REGNO_P): Update for O32 FPXX and FP64 extensions.
8371         * config/mips/mips.md (define_attr enabled): Implement O32 FPXX and
8372         FP64A ABI extensions.
8373         (move_doubleword_fpr<mode>): Use ISA_HAS_MXHC1 instead of
8374         TARGET_FLOAT64.
8375         * config/mips/mips.opt (mfpxx): New target option.
8376         (modd-spreg): Likewise.
8377         * config/mips/mti-elf.h (DRIVER_SELF_SPECS): Infer FP ABI from arch.
8378         * config/mips/mti-linux.h (DRIVER_SELF_SPECS): Likewise and remove
8379         fp64 sysroot.
8380         * config/mips/t-mti-elf: Remove fp64 multilib.
8381         * config/mips/t-mti-linux: Likewise.
8382         * configure.ac: Detect .module support.
8383         * configure: Regenerate.
8384         * doc/invoke.texi: Document -mfpxx, -modd-spreg, -mno-odd-spreg option.
8385         * doc/install.texi (--with-fp-32, --with-odd-spreg-32): Document new
8386         options.
8388 2014-11-12  H.J. Lu  <hongjiu.lu@intel.com>
8390         PR target/63815
8391         * config/i386/i386.c (ix86_init_large_pic_reg): New.  Extracted
8392         from ...
8393         (ix86_init_pic_reg): Here.  Use ix86_init_large_pic_reg.
8394         (x86_output_mi_thunk): Set PIC register to %r11.  Call
8395         ix86_init_large_pic_reg to initialize PIC register.
8397 2014-11-12  Kai Tietz  <ktietz@redhat.com>
8399         * sdbout.c (sdbout_symbol): Eliminate register only
8400         if decl isn't a global variable.
8402 2014-11-12  Alan Lawrence  <alan.lawrence@arm.com>
8404         * config/aarch64/aarch64.c (aarch64_simd_lane_bounds): Display indices.
8406         * config/aarch64/aarch64-builtins.c (enum aarch64_type_qualifiers): Add
8407         qualifier_lane_index.
8408         (aarch64_types_ternop_lane_qualifiers, TYPES_TERNOP_LANE): Rename to...
8409         (aarch64_types_quadop_lane_qualifiers, TYPES_QUADOP_LANE): ...these.
8410         (aarch64_types_ternop_lane_qualifiers, TYPES_TERNOP_LANE): New.
8412         (aarch64_types_getlane_qualifiers): Rename to...
8413         (aarch64_types_binop_imm_qualifiers): ...this.
8414         (TYPES_SHIFTIMM): Follow renaming.
8415         (TYPES_GETLANE): Rename to...
8416         (TYPE_GETREG): ...this.
8418         (aarch64_types_setlane_qualifiers): Rename to...
8419         (aarch64_type_ternop_imm_qualifiers): ...this.
8420         (TYPES_SHIFTINSERT, TYPES_SHIFTACC): Follow renaming.
8421         (TYPES_SETLANE): Follow renaming above, and rename self to...
8422         (TYPE_SETREG): ...this.
8424         (enum builtin_simd_arg): Add SIMD_ARG_LANE_INDEX.
8425         (aarch64_simd_expand_args): Add range check and endianness-flip.
8427         (aarch64_simd_expand_builtin): Add mapping for qualifier_lane_index.
8429         * config/aarch64/aarch64-simd.md
8430         (aarch64_sq<r>dmulh_lane<mode>_internal *2): Rename to...
8431         (aarch64_sq<r>dmulh_lane<mode>): ...this, and remove lane bounds check.
8432         (aarch64_sqdmulh_lane<mode> *2, aarch64_sqrdmulh_lane<mode> *2): Delete.
8434         (aarch64_sq<r>dmulh_laneq<mode>_internal): Rename to...
8435         (aarch64_sq<r>dmulh_lane<mode>): ...this.
8437         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal *2): Rename to...
8438         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>): ...this.
8440         (aarch64_sqdml<SBINQOPS:as>l_laneq<mode>_internal *2): Rename to...
8441         (aarch64_sqdml<SBINQOPS:as>l_laneq<mode>): ...this.
8443         (aarch64_sqdmull_lane<mode>_internal *2): Rename to...
8444         (aarch64_sqdmull_lane<mode>): ...this.
8446         (aarch64_sqdmull_laneq<mode>_internal *2): Rename to...
8447         (aarch64_sqdmull_laneq<mode>): ...this.
8449         (aarch64_sqdmulh_laneq<mode>, aarch64_sqrdmulh_laneq<mode>,
8450         (aarch64_sqdmlal_lane<mode>, aarch64_sqdmlal_laneq<mode>,
8451         aarch64_sqdmlsl_lane<mode>, aarch64_sqdmlsl_laneq<mode>,
8452         aarch64_sqdmull_lane<mode>, aarch64_sqdmull_laneq<mode>): Delete.
8454         (aarch64_sqdmlal2_lane<mode>, aarch64_sqdmlal2_laneq<mode>,
8455         aarch64_sqdmlsl2_lane<mode>, aarch64_sqdmlsl2_laneq<mode>,
8456         aarch64_sqdmull2_lane<mode>, aarch64_sqdmull2_laneq<mode>): Remove
8457         bounds check and lane flip.
8459         * config/aarch64/aarch64-simd-builtins.def (be_checked_get_lane,
8460         get_dregoi, get_dregci, getdregxi, get_qregoi,get_qregci, get_qregxi,
8461         set_qregoi, set_qregci, set_qregxi): Change qualifiers to GETREG.
8463         (sqdmlal_lane, sqdmlsl_lane, sqdmlal_laneq, sqdmlsl_laneq,
8464         sqdmlal2_lane, sqdmlsl2_lane, sqdmlal2_laneq, sqdmlsl2_laneq): Follow
8465         renaming of TERNOP_LANE to QUADOP_LANE.
8467         (sqdmull_lane, sqdmull_laneq, sqdmull2_lane, sqdmull2_laneq,
8468         sqdmulh_lane, sqdmulh_laneq, sqrdmulh_lane, sqrdmulh_laneq): Set
8469         qualifiers to TERNOP_LANE.
8471 2014-11-12  Tobias Burnus  <burnus@net-b.de>
8473         * Makefile.in (CLOOGLIBS, CLOOGINC): Remove.
8474         * configure.ac: Ditto.
8475         * graphite-interchange.c: Remove HAVE_CLOOG block.
8476         * config.in: Regenerate.
8477         * configure: Regenerate.
8479 2014-11-12  Jiong Wang  <jiong.wang@arm.com>
8481         * config/aarch64/aarch64.h (CALL_USED_REGISTERS): Mark LR as
8482         caller-save.
8483         (EPILOGUE_USES): Guard the check by epilogue_completed.
8484         * config/aarch64/aarch64.c (aarch64_layout_frame): Explictly check for
8485         LR.
8486         (aarch64_can_eliminate): Check LR_REGNUM liveness.
8488 2014-11-12  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8490         * config/arm/arm.c (*<arith_shift_insn>_shiftsi): Fix typo.
8492 2014-11-12  Marek Polacek  <polacek@redhat.com>
8494         * fold-const.c (fold_binary_loc): Don't fold if the result
8495         is undefined.
8496         * match.pd (A + (-B) -> A - B, A - (-B) -> A + B,
8497         -(-A) -> A): Likewise.
8499 2014-11-12  Richard Biener  <rguenther@suse.de>
8501         Merge from match-and-simplify branch
8502         2014-11-04  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8504         * genmatch.c (user_id): Add new member is_oper_list.
8505         (user_id::user_id): Add new default argument.
8506         (parser::parse_operator_list): New function.
8507         (parser::parse_for): Allow operator-list.
8508         (parser::parse_pattern): Call parser::parse_operator_list.
8509         (parser::parse_operation): Reject operator-list.
8510         * match-builtin.pd: Define operator lists POWs, CBRTs and SQRTs.
8512         2014-10-31  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8514         * genmatch.c (parser::parse_c_expr): Mark user-defined ops as used.
8516         2014-10-30  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8518         * genmatch.c (parser::parse_op): Check if predicate is used in
8519         result operand.
8521         2014-10-29  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8523         * genmatch.c (parser::parse_for): Make sure to have a valid
8524         token to report errors at.
8526         2014-10-28  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8528         * genmatch.c (parser): Add new member parsing_match_operand.
8529         (parser::parse_operation): Check for conditional convert in result
8530         operand.
8531         (parser::parse_expr): Check for commutative operator in result operand.
8532         Check for :type in match operand.
8533         (parser::parse_simplify): Set/unset parsing_match_operand.
8534         (parser::parser): Initialize parsing_match_operand.
8536         2014-10-28  Richard Biener  <rguenther@suse.de>
8538         * genmatch.c (parser::parse_for): Properly check for already
8539         defined operators.
8541         2014-10-28  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8543         * genmatch.c (error_cb): Adjust for printing warnings.
8544         (warning_at): New function.
8545         (user_id): Add new member used.
8546         (get_operator): Mark user_id as used.
8547         (parse_for): Warn for unused operators.
8549 2014-11-12  Richard Biener  <rguenther@suse.de>
8551         * match.pd: Implement simple complex operations cancelling.
8552         * fold-const.c (fold_unary_loc): Remove them here.
8554 2014-11-12  Joseph Myers  <joseph@codesourcery.com>
8556         * cppbuiltin.c (define_builtin_macros_for_compilation_flags):
8557         Define __NO_MATH_ERRNO__ if -fno-math-errno.
8558         * doc/cpp.texi (__NO_MATH_ERRNO__): Document predefined macro.
8560 2014-11-12  Richard Biener  <rguenther@suse.de>
8562         * genmatch.c (::gen_transform): Add capture_info and
8563         expand_compares arguments.
8564         (struct expr): Add is_generic flag.
8565         (lower_cond): New functions lowering [VEC_]COND_EXPR
8566         conditions to a GENERIC and a GIMPLE variant.
8567         (lower): Call lower_cond.
8568         (cmp_operand): Also compare the is_generic flag.
8569         (capture_info::cinfo): Add cond_expr_cond_p flag.
8570         (capture_info::capture_info): Pass down whether the
8571         expression argument is a COND_EXPR condition.
8572         (capture_info::walk_match): Likewise, mark captures
8573         capturing COND_EXPR conditions with cond_expr_cond_p.
8574         (expr::gen_transform): Pass down whether we need to
8575         expand compares from COND_EXPR conditions.
8576         (capture::gen_transform): Expand compares substituted
8577         from COND_EXPR conditions into non-COND_EXPR conditions.
8578         (dt_operand::gen_gimple_expr): Handle explicitely marked
8579         GENERIC expressions as generic.
8580         (dt_simplify::gen): Pass whether we need to expand
8581         conditions to gen_transform.  Handle capture results
8582         which are from COND_EXPR conditions.
8583         (main): Pass gimple flag down to lower.
8585 2014-11-12  Jakub Jelinek  <jakub@redhat.com>
8587         PR c/59708
8588         * builtin-attrs.def (ATTR_NOTHROW_TYPEGENERIC_LEAF): New attribute.
8589         * builtins.c (fold_builtin_arith_overflow): New function.
8590         (fold_builtin_3): Use it.
8591         * builtins.def (BUILT_IN_ADD_OVERFLOW, BUILT_IN_SUB_OVERFLOW,
8592         BUILT_IN_MUL_OVERFLOW, BUILT_IN_SADD_OVERFLOW, BUILT_IN_SADDL_OVERFLOW,
8593         BUILT_IN_SADDLL_OVERFLOW, BUILT_IN_SSUB_OVERFLOW,
8594         BUILT_IN_SSUBL_OVERFLOW, BUILT_IN_SSUBLL_OVERFLOW,
8595         BUILT_IN_SMUL_OVERFLOW, BUILT_IN_SMULL_OVERFLOW,
8596         BUILT_IN_SMULLL_OVERFLOW, BUILT_IN_UADDL_OVERFLOW,
8597         BUILT_IN_UADDLL_OVERFLOW, BUILT_IN_USUB_OVERFLOW,
8598         BUILT_IN_USUBL_OVERFLOW, BUILT_IN_USUBLL_OVERFLOW,
8599         BUILT_IN_UMUL_OVERFLOW, BUILT_IN_UMULL_OVERFLOW,
8600         BUILT_IN_UMULLL_OVERFLOW): New built-in functions.
8601         * builtin-types.def (BT_PTR_UINT, BT_PTR_ULONG, BT_PTR_LONGLONG,
8602         BT_FN_BOOL_INT_INT_INTPTR, BT_FN_BOOL_LONG_LONG_LONGPTR,
8603         BT_FN_BOOL_LONGLONG_LONGLONG_LONGLONGPTR, BT_FN_BOOL_UINT_UINT_UINTPTR,
8604         BT_FN_BOOL_ULONG_ULONG_ULONGPTR,
8605         BT_FN_BOOL_ULONGLONG_ULONGLONG_ULONGLONGPTR, BT_FN_BOOL_VAR): New.
8606         * expr.c (write_complex_part): Remove prototype, no longer static.
8607         * expr.h (write_complex_part): New prototype.
8608         * function.c (aggregate_value_p): For internal functions return 0.
8609         * gimple-fold.c (arith_overflowed_p): New functions.
8610         (gimple_fold_call): Fold {ADD,SUB,MUL}_OVERFLOW internal calls.
8611         * gimple-fold.h (arith_overflowed_p): New prototype.
8612         * tree-ssa-dce.c: Include tree-ssa-propagate.h and gimple-fold.h.
8613         (find_non_realpart_uses, maybe_optimize_arith_overflow): New
8614         functions.
8615         (eliminate_unnecessary_stmts): Transform {ADD,SUB,MUL}_OVERFLOW
8616         into COMPLEX_CST/COMPLEX_EXPR if IMAGPART_EXPR of the result is
8617         never used.
8618         * gimplify.c (gimplify_call_expr): Handle gimplification of
8619         internal calls with lhs.
8620         * internal-fn.c (get_range_pos_neg, get_min_precision,
8621         expand_arith_overflow_result_store): New functions.
8622         (ubsan_expand_si_overflow_addsub_check): Renamed to ...
8623         (expand_addsub_overflow): ... this.  Add LOC, LHS, ARG0, ARG1,
8624         UNSR_P, UNS0_P, UNS1_P, IS_UBSAN arguments, remove STMT argument.
8625         Handle ADD_OVERFLOW and SUB_OVERFLOW expansion.
8626         (ubsan_expand_si_overflow_neg_check): Renamed to ...
8627         (expand_neg_overflow): ... this.  Add LOC, LHS, ARG1, IS_UBSAN
8628         arguments, remove STMT argument.  Handle SUB_OVERFLOW with
8629         0 as first argument expansion.
8630         (ubsan_expand_si_overflow_mul_check): Renamed to ...
8631         (expand_mul_overflow): ... this.  Add LOC, LHS, ARG0, ARG1,
8632         UNSR_P, UNS0_P, UNS1_P, IS_UBSAN arguments, remove STMT argument.
8633         Handle MUL_OVERFLOW expansion.
8634         (expand_UBSAN_CHECK_ADD): Use expand_addsub_overflow, prepare
8635         arguments for it.
8636         (expand_UBSAN_CHECK_SUB): Use expand_addsub_overflow or
8637         expand_neg_overflow, prepare arguments for it.
8638         (expand_UBSAN_CHECK_MUL): Use expand_mul_overflow, prepare arguments
8639         for it.
8640         (expand_arith_overflow, expand_ADD_OVERFLOW, expand_SUB_OVERFLOW,
8641         expand_MUL_OVERFLOW): New functions.
8642         * internal-fn.def (ADD_OVERFLOW, SUB_OVERFLOW, MUL_OVERFLOW): New
8643         internal functions.
8644         * tree-vrp.c (check_for_binary_op_overflow): New function.
8645         (extract_range_basic): Handle {REAL,IMAG}PART_EXPR if the operand
8646         is SSA_NAME set by {ADD,SUB,MUL}_OVERFLOW internal functions.
8647         (simplify_internal_call_using_ranges): Handle {ADD,SUB,MUL}_OVERFLOW
8648         internal functions.
8649         * optabs.def (umulv4_optab): New optab.
8650         * config/i386/i386.md (umulv<mode>4, <u>mulvqi4): New define_expands.
8651         (*umulv<mode>4, *<u>mulvqi4): New define_insns.
8652         * doc/extend.texi (Integer Overflow Builtins): Document
8653         __builtin_*_overflow.
8655 2014-11-12  Richard Biener  <rguenther@suse.de>
8657         * genmatch.c (capture_info::capture_info): Add missing
8658         COND_EXPR handling.
8659         (capture_info::walk_match): Fix COND_EXPR handling.
8660         (capture_info::walk_result): Likewise.
8662 2014-11-12  Richard Biener  <rguenther@suse.de>
8664         PR middle-end/63821
8665         * match.pd: Add missing conversion to the -(T)-X pattern.
8667 2014-11-12  Richard Biener  <rguenther@suse.de>
8669         PR bootstrap/63819
8670         * hash-table.h: Include ggc.h also for generator programs.
8671         * genmatch.c (ggc_internal_cleared_alloc): Properly define
8672         using MEM_STAT_DECL instead of CXX_MEM_STAT_INFO.
8674 2014-11-12  Thomas Preud'homme  <thomas.preudhomme@arm.com>
8676         PR tree-optimization/63761
8677         * tree-ssa-math-opts.c (bswap_replace): Construct gsi from cur_stmt
8678         rather than taking it as a parameter. Add some comments to explain the
8679         gsi_move_before in case of load and why canonicalization of bswap into
8680         a rotation is only done for 16bit values.
8681         (pass_optimize_bswap::execute): Adapt for loop via gsi to make gsi
8682         refer to the statement just before cur_stmt. Ignore 16bit bswap that
8683         are already in canonical form. Adapt bswap_replace to removal of its
8684         gsi parameter.
8686 2014-11-12  Richard Sandiford  <richard.sandiford@arm.com>
8688         * rtl.h (rtx_function, for_each_rtx, for_each_rtx_in_insn): Delete.
8689         * rtlanal.c (non_rtx_starting_operands, for_each_rtx_1, for_each_rtx):
8690         (for_each_rtx_in_insn): Delete.
8691         (init_rtlanal): Remove initialization of non_rtx_starting_operands.
8692         * df-core.c: Remove reference to for_each_rtx in comment.
8694 2014-11-12  Tejas Belagod  <tejas.belagod@arm.com>
8696         * Makefile.in (TEXI_GCC_FILES): Remove arm-acle-intrinsics.texi,
8697         arm-neon-intrinsics.texi, aarch64-acle-intrinsics.texi.
8698         * doc/aarch64-acle-intrinsics.texi: Remove.
8699         * doc/arm-acle-intrinsics.texi: Remove.
8700         * doc/arm-neon-intrinsics.texi: Remove.
8701         * doc/extend.texi: Consolidate sections AArch64 intrinsics,
8702         ARM NEON Intrinsics, ARM ACLE Intrinsics into one ARM C Language
8703         Extension section. Add references to public ACLE specification.
8705 2014-11-11  Patrick Palka  <ppalka@gcc.gnu.org>
8707         * tree-vrp.c (register_edge_assert_for_2): Change return type to
8708         void and adjust accordingly.
8709         (register_edge_assert_for_1): Likewise.
8710         (register_edge_assert_for): Likewise.
8711         (find_conditional_asserts): Likewise.
8712         (find_switch_asserts): Likewise.
8713         (find_assert_locations_1): Likewise.
8714         (find_assert_locations): Likewise.
8715         (insert_range_insertions): Inspect the need_assert_for bitmap.
8717 2014-11-11  Andrew Pinski  <apinski@cavium.com>
8719         Bug target/61997
8720         * config.gcc (aarch64*-*-*): Set target_gtfiles to include
8721         aarch64-builtins.c.
8722         * config/aarch64/aarch64-builtins.c: Include gt-aarch64-builtins.h
8723         at the end of the file.
8725 2014-11-11  Anthony Brandon  <anthony.brandon@gmail.com>
8726             Manuel López-Ibáñez  <manu@gcc.gnu.org>
8728         PR driver/36312
8729         * diagnostic-core.h: Add prototype for fatal_error.
8730         * diagnostic.c (fatal_error): New function fatal_error.
8731         * gcc.c (store_arg): Remove have_o_argbuf_index.
8732         (process_command): Check if input and output files are the same.
8733         * toplev.c (init_asm_output): Check if input and output files are
8734         the same.
8736 2014-11-11  Eric Botcazou  <ebotcazou@adacore.com>
8738         * reorg.c (fill_slots_from_thread): Do not copy frame-related insns.
8740 2014-11-11  Eric Botcazou  <ebotcazou@adacore.com>
8742         PR target/61535
8743         * config/sparc/sparc.c (function_arg_vector_value): Deal with vectors
8744         smaller than 8 bytes.
8745         (sparc_function_arg_1): Tweak.
8746         (sparc_function_value_1): Tweak.
8748 2014-11-11  David Malcolm  <dmalcolm@redhat.com>
8750         * ChangeLog.jit: New.
8751         * Makefile.in (doc_build_sys): New variable, set to "sphinx" if
8752         sphinx is installed, falling back to "texinfo" otherwise.
8753         (FULL_DRIVER_NAME): New variable, adapted from the
8754         install-driver target.  New target, a symlink within the builddir,
8755         linked to "xgcc", for use when running the JIT library from the
8756         builddir.
8757         (MOSTLYCLEANFILES): Add FULL_DRIVER_NAME.
8758         (install-driver): Use $(FULL_DRIVER_NAME) rather than spelling it
8759         out.
8760         * configure.ac (doc_build_sys): New variable, set to "sphinx" if
8761         sphinx is installed, falling back to "texinfo" otherwise.
8762         (GCC_DRIVER_NAME): Generate a gcc-driver-name.h file containing
8763         GCC_DRIVER_NAME for the benefit of jit/internal-api.c.
8764         * configure: Regenerate.
8765         * doc/install.texi (--enable-host-shared): Specify that this is
8766         required when building libgccjit.
8767         (Tools/packages necessary for modifying GCC): Add Sphinx.
8768         * timevar.def (TV_JIT_REPLAY): New.
8769         (TV_ASSEMBLE): New.
8770         (TV_LINK): New.
8771         (TV_LOAD): New.
8773 2014-11-11  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
8775         PR target/63610
8776         * configure: Regenerate.
8778 2014-11-11  James Greenhalgh  <james.greenhalgh@arm.com>
8780         * config/aarch64/aarch64-simd.md
8781         (aarch64_simd_bsl<mode>_internal): Remove float cases, canonicalize.
8782         (aarch64_simd_bsl<mode>): Add gen_lowpart expressions where we
8783         are punning between float vectors and integer vectors.
8785 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8787         * config/alpha/alpha.c (alpha_emit_conditional_branch): Replace
8788         open-coded swap with std::swap to swap values.
8789         (alpha_emit_setcc): Ditto.
8790         (alpha_emit_conditional_move): Ditto.
8791         (alpha_split_tmode_pair): Ditto.
8793 2014-11-11  Evgeny Stupachenko  <evstupac@gmail.com>
8795         * tree-vect-data-refs.c (vect_shift_permute_load_chain): Extend shift
8796         permutations on power of 2 cases.
8798 2014-11-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
8800         * config/aarch64/aarch64.h (MACHMODE): Remove 'enum' keyword.
8801         (CUMULATIVE_ARGS): Guard on !defined(USED_FOR_TARGET).
8803 2014-11-11  Richard Biener  <rguenther@suse.de>
8805         * tree-core.h (pedantic_lvalues): Remove.
8806         * fold-const.c (pedantic_lvalues): Likewise.
8807         (pedantic_non_lvalue_loc): Remove conditional non_lvalue_loc call.
8809 2014-11-11  Martin Liska  <mliska@suse.cz>
8811         PR ipa/63622
8812         PR ipa/63795
8813         * ipa-icf.c (sem_function::merge): Add new target symbol alias
8814         support guard.
8815         (sem_variable::merge): Likewise.
8816         * ipa-icf.h (target_supports_symbol_aliases_p): New function.
8818 2014-11-11  Richard Biener  <rguenther@suse.de>
8820         * match.pd: Implement patterns from associate_plusminus
8821         and factor in differences from the fold-const.c implementation.
8822         * fold-const.c (fold_binary_loc): Remove patterns here.
8823         * tree-ssa-forwprop.c (associate_plusminus): Remove.
8824         (pass_forwprop::execute): Don't call it.
8825         * tree.c (tree_nop_conversion_p): New function, factored
8826         from tree_nop_conversion.
8827         * tree.h (tree_nop_conversion_p): Declare.
8829 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8831         * system.h: Include algorithm and utility.
8832         * rtl.h: Do not include utility here.
8833         * wide-int.h: Ditto.
8834         * tree-vect-data-refs.c (swap): Remove template.
8835         (vect_prune_runtime_alias_test_list): Use std::swap instead of swap.
8837 2014-11-11  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
8839         PR bootstrap/63699
8840         PR bootstrap/63750
8841         * system.h: Include <string> before "safe-ctype.h"
8842         * wide-int.h (wi::smin, wi::smax, wi::umin, wi::umax): Prefix
8843         calls to min/max with wi namespace.
8844         * ipa-chkp.c: Don't include <string>.
8846 2014-11-11  Terry Guo  <terry.guo@arm.com>
8848         * doc/invoke.texi (-masm-syntax-unified): Reword and fix typo.
8849         * config/arm/thumb1.md (*thumb_mulsi3): Use movs to move low
8850         registers.
8851         (*thumb1_movhf): Likewise.
8853 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8855         * sreal.c (sreal::to_int): Use INTTYPE_MAXIMUM (int64_t)
8856         instead of INT64_MAX.
8858 2014-11-11  Tobias Burnus  <burnus@net-b.de>
8860         * doc/install.texi (Prerequisites): Remove CLooG.
8862 2014-11-10  Trevor Saunders  <tsaunders@mozilla.com>
8864         * ipa-inline.c (edge_badness): Adjust.
8865         (inline_small_functions): Likewise.
8866         * predict.c (propagate_freq): Likewise.
8867         (estimate_bb_frequencies): Likewise.
8868         * sreal.c (sreal::dump): Rename from dump_sreal.
8869         (debug): Adjust.
8870         (copy): Remove function.
8871         (sreal::shift_right): Rename from sreal_sift_right.
8872         (sreal::normalize): Rename from normalize.
8873         (sreal_init): Remove function.
8874         (sreal::to_int): Rename from sreal_to_int.
8875         (sreal_compare): Remove function.
8876         (sreal::operator+): Rename from sreal_add.
8877         (sreal::operator-): Rename from sreal_sub.
8878         (sreal::operator*): Rename from sreal_mul.
8879         (sreal::operator/): Rename from sreal_div.
8880         * sreal.h (class sreal): Adjust.
8881         (inline sreal &operator+=): New operator.
8882         (inline sreal &operator-=): Likewise.
8883         (inline sreal &operator/=): Likewise.
8884         (inline sreal &operator*=): Likewise.
8885         (inline bool operator!=): Likewise.
8886         (inline bool operator>): Likewise.
8887         (inline bool operator<=): Likewise.
8888         (inline bool operator>=): Likewise.
8890 2014-11-11  Bin Cheng  <bin.cheng@arm.com>
8892         * sched-deps.c (sched_analyze_1): Check pending list if it is not
8893         less than MAX_PENDING_LIST_LENGTH.
8894         (sched_analyze_2, sched_analyze_insn, deps_analyze_insn): Ditto.
8896 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8898         * config/i386/i386.c (ix86_decompose_address): Replace open-coded
8899         swap with std::swap to swap values.
8900         (ix86_fixup_binary_operands): Ditto.
8901         (ix86_binary_operator_ok): Ditto.
8902         (ix86_prepare_fp_compare_args): Ditto.
8903         (ix86_expand_branch): Ditto.
8904         (ix86_expand_carry_flag_compare): Ditto.
8905         (ix86_expand_int_movcc): Ditto.
8906         (ix86_prepare_sse_fp_compare_args): Ditto.
8907         (ix86_expand_sse_fp_minmax): Ditto.
8908         (ix86_expand_int_vcond): Ditto.
8909         (ix86_split_long_move): Ditto.
8910         (ix86_expand_sse_comi): Ditto.
8911         (ix86_expand_sse_compare_and_jump): Ditto.
8912         (ix86_expand_sse_compare_mask): Ditto.
8913         * config/i386/i386.md (*add<mode>_1): Ditto.
8914         (addsi_1_zext): Ditto.
8915         (*addhi_1): Ditto.
8916         (*addqi_1): Ditto.
8917         (*add<mode>_2): Ditto.
8918         (*addsi_2_zext): Ditto.
8919         (*add<mode>_3): Ditto.
8920         (*addsi_3_zext): Ditto.
8921         (*add<mode>_5): Ditto.
8922         (absneg splitter): Ditto.
8924 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8926         Revert:
8927         2014-10-31  Uros Bizjak  <ubizjak@gmail.com>
8929         PR target/63620
8930         * config/i386/i386-protos.h (ix86_use_pseudo_pic_reg): Declare.
8931         * config/i386/i386.c (ix86_use_pseudo_pic_reg): Export.
8932         * config/i386/i386.md (*pushtf): Allow only CONST_DOUBLEs that won't
8933         be reloaded through memory.
8934         (*pushxf): Ditto.
8935         (*pushdf): Ditto.
8937 2014-11-11  Jakub Jelinek  <jakub@redhat.com>
8938             Martin Liska  <mliska@suse.cz>
8940         * ipa-icf-gimple.c (func_checker::compare_bb): Fix comment typo.
8941         (func_checker::compare_gimple_call): Compare gimple_call_fn,
8942         gimple_call_chain, gimple_call_fntype and call flags.
8944 2014-11-10  Vladimir Makarov  <vmakarov@redhat.com>
8946         PR rtl-optimization/63620
8947         PR rtl-optimization/63799
8948         * lra-lives.c (process_bb_lives): Do not delete EH_REGION, trapped
8949         and setting PIC pseudo insns.
8950         (lra_create_live_ranges): Fix the typo.
8952 2014-11-10  Patrick Palka  <ppalka@gcc.gnu.org>
8954         PR middle-end/63748
8955         * tree-ssa-propagate.c (may_propagate_copy): Allow propagating
8956         SSA copies whose source and destination names both occur in
8957         abnormal PHIs.
8959 2014-11-10 Roman Gareev  <gareevroman@gmail.com>
8961         * Makefile.in: Remove the compilation of graphite-clast-to-gimple.o.
8962         * common.opt: Remove using of fgraphite-code-generator flag.
8963         * flag-types.h: Likewise.
8964         * graphite.c: Remove using of CLooG.
8965         * graphite-blocking.c: Likewise.
8966         * graphite-dependences.c: Likewise.
8967         * graphite-poly.c: Likewise.
8968         * graphite-poly.h: Likewise.
8969         * graphite-scop-detection.c: Likewise.
8970         * graphite-sese-to-poly.c: Likewise.
8971         * graphite-clast-to-gimple.c: Removed.
8972         * graphite-clast-to-gimple.h: Likewise.
8973         * graphite-htab.h: Likewise.
8975 2014-11-10  Paolo Carlini  <paolo.carlini@oracle.com>
8977         * doc/invoke.texi ([-Wshift-count-negative, -Wshift-count-overflow]):
8978         Add.
8980 2014-11-10  Richard Sandiford  <richard.sandiford@arm.com>
8982         * config/frv/frv.c (frv_io_handle_use_1): Delete.
8983         (frv_io_handle_use): Use find_all_hard_regs.
8985 2014-11-10  Richard Sandiford  <richard.sandiford@arm.com>
8987         * config/frv/frv.c (frv_registers_conflict_p_1): Take an rtx rather
8988         than an rtx *.  Take the regstate_t directly rather than via a void *.
8989         Return a bool rather than an int.  Iterate over all subrtxes here.
8990         (frv_registers_conflict_p): Update accordingly.
8992 2014-11-10  Richard Sandiford  <richard.sandiford@arm.com>
8994         * config/frv/frv.c: Include rtl-iter.h.
8995         (frv_acc_group_1): Delete.
8996         (frv_acc_group): Use FOR_EACH_SUBRTX.
8998 2014-11-10  Richard Sandiford  <richard.sandiford@arm.com>
9000         * config/frv/frv.c: Move include of rtl.h after hard-reg-set.h.
9001         (frv_clear_registers_used): Delete.
9002         (frv_ifcvt_modify_tests): Use find_all_hard_regs.
9004 2014-11-10  Jan Hubicka  <hubicka@ucw.cz>
9006         PR bootstrap/63573
9007         * calls.c (initialize_argument_information): When emitting thunk call
9008         use original memory placement of the argument.
9010 2014-11-10  Renlin Li  <renlin.li@arm.com>
9012         PR middle-end/61529
9013         * tree-ssa-threadupdate.c (compute_path_counts): Bound path_in_freq.
9015 2014-11-10  Thomas Preud'homme  <thomas.preudhomme@arm.com>
9017         * expmed.c (expand_shift_1): Expand 8 bit rotate of 16 bit value to
9018         bswaphi if available.
9020 2014-11-10  Bernd Schmidt  <bernds@codesourcery.com>
9022         * config/nvptx/nvptx.c: New file.
9023         * config/nvptx/nvptx.h: New file.
9024         * config/nvptx/nvptx-protos.h: New file.
9025         * config/nvptx/nvptx.md: New file.
9026         * config/nvptx/t-nvptx: New file.
9027         * config/nvptx/nvptx.opt: New file.
9028         * common/config/nvptx/nvptx-common.c: New file.
9029         * config.gcc: Handle nvptx-*-*.
9031 2014-11-10  Richard Biener  <rguenther@suse.de>
9033         * tree-ssa-operands.c (finalize_ssa_uses): Properly put
9034         released operands on the free list.
9036 2014-11-10  Richard Biener  <rguenther@suse.de>
9038         * match.pd: Implement pattern from simplify_mult.
9039         * tree-ssa-forwprop.c (simplify_mult): Remove.
9040         (pass_forwprop::execute): Do not call simplify_mult.
9042 2014-11-10  Richard Biener  <rguenther@suse.de>
9044         PR tree-optimization/63800
9045         * tree-ssa-pre.c (eliminate_push_avail): Push in a way so
9046         we can restore the previous availability in after_dom_children.
9047         (eliminate_dom_walker::after_dom_children): Restore
9048         previous availability.
9050 2014-11-10  Richard Biener  <rguenther@suse.de>
9052         PR middle-end/63798
9053         * expr.c (expand_expr_real_2): When expanding FMA_EXPRs
9054         properly treat the embedded multiplication as commutative
9055         when looking for feeding negates.
9057 2014-11-10  Joern Rennecke  <joern.rennecke@embecosm.com>
9059         * config/avr/avr.h (CPLUSPLUS_CPP_SPEC): Define.
9061 2014-11-10  Martin Liska  <mliska@suse.cz>
9063         * gcc.dg/tree-ssa/ldist-19.c: ICF is disabled
9064         for the test because of default char signedness
9065         on powerpc64 target.
9067 2014-11-10  Richard Biener  <rguenther@suse.de>
9069         * match.pd: Implement pattern from simplify_conversion_from_bitmask.
9070         * tree-ssa-forwprop.c (simplify_conversion_from_bitmask): Remove.
9071         (pass_forwprop::execute): Do not call simplify_conversion_from_bitmask.
9073 2014-11-10  Richard Biener  <rguenther@suse.de>
9075         * match.pd: Move rest of the conversion combining patterns
9076         from tree-ssa-forwprop.c.
9077         * tree-ssa-forwprop.c (combine_conversions): Remove.
9078         (pass_forwprop::execute): Do not call it.
9080 2014-11-10  Eric Botcazou  <ebotcazou@adacore.com>
9082         * gimple-low.c (lower_function_body): Clear the location of the first
9083         inserted representative return if it also fills in for the fallthru.
9085 2014-11-10  Yuri Rumyantsev  <ysrumyan@gmail.com>
9087         * tree-if-conv.c (add_to_predicate_list): Check unconditionally
9088         that bb is always executed to early exit. Use predicate of
9089         cd-equivalent block for join blocks if it exists.
9090         (if_convertible_loop_p_1): Recompute POST_DOMINATOR tree.
9091         (tree_if_conversion): Free post-dominance information.
9093 2014-11-09  Jason Merrill  <jason@redhat.com>
9095         * config/i386/avx512vldqintrin.h (_mm256_broadcast_f32x2): __mmask8.
9096         * config/i386/avx512vlintrin.h (_mm256_mask_cvtepi32_storeu_epi16)
9097         (_mm_mask_cvtusepi32_storeu_epi16)
9098         (_mm_mask_cvtsepi64_storeu_epi32): Return void.
9100 2014-11-09  Joern Rennecke  <joern.rennecke@embecosm.com>
9102         * config/avr/predicates.md (low_io_address_operand): Fix typo.
9104 2014-11-09  Vladimir Makarov  <vmakarov@redhat.com>
9106         PR rtl-optimization/63620
9107         * lra-constraints.c (substitute_pseudo): Add prefix lra_ to the
9108         name.  Move to lra.c.  Make it external.
9109         (substitute_pseudo_within_insn): Ditto.
9110         (inherit_reload_reg, split_reg, remove_inheritance_pseudos): Use
9111         the new names.
9112         (undo_optional_reloads): Ditto.
9113         * lra-int.h (lra_dump_bitmap_with_title, lra_substitute_pseudo):
9114         New prototypes.
9115         (lra_substitute_pseudo_within_insn): Ditto.
9116         * lra-lives.c (bb_killed_pseudos, bb_gen_pseudos): New.
9117         (mark_regno_live): Add parameter.  Update bb_gen_pseudos.
9118         (mark_regno_dead): Add parameter.  Update bb_gen_pseudos and
9119         bb_killed_pseudos.
9120         (struct bb_data, bb_data_t, bb_data): New.
9121         (get_bb_data, get_bb_data_by_index): Ditto.
9122         (all_hard_regs_bitmap): New.
9123         (live_trans_fun, live_con_fun_0, live_con_fun_n, all_blocks): New.
9124         (initiate_live_solver, finish_live_solver): New.
9125         (process_bb_lives): Change return type.  Add code updating local
9126         live data and removing dead insns.  Pass new argument to
9127         mark_regno_live and mark_regno_dead.  Check changing bb pseudo
9128         life info.  Return the result.
9129         (lra_create_live_ranges): Add code to do global pseudo live
9130         analysis.
9131         (lra_live_ranges_init): Call initiate_live_solver.
9132         (lra_live_ranges_finish): Call finish_live_solver.
9133         * lra.c (lra_dump_bitmap_with_title): New.
9134         (lra_substitute_pseudo, lra_substitute_pseudo_within_insn): Move
9135         from lra-constraints.c.
9137 2014-11-09  Richard Biener  <rguenther@suse.de>
9139         * match.pd: Add patterns convering two conversions in a row
9140         from fold-const.c.
9141         * fold-const.c (fold_unary_loc): Remove them here.
9142         * tree-ssa-forwprop.c (combine_conversions): Likewise.
9143         * genmatch.c (dt_node::gen_kids): Check whether we may
9144         follow SSA use-def chains.
9146 2014-11-08  Richard Sandiford  <richard.sandiford@arm.com>
9148         * config/aarch64/aarch64.c: Include rtl-iter.h.
9149         (aarch64_tls_operand_p_1): Delete.
9150         (aarch64_tls_operand_p): Use FOR_EACH_SUBRTX.
9152 2014-11-08  Richard Sandiford  <richard.sandiford@arm.com>
9154         * config/arm/arm.c (arm_note_pic_base): Delete.
9155         (arm_cannot_copy_insn_p): Use FOR_EACH_SUBRTX.
9157 2014-11-08  Richard Sandiford  <richard.sandiford@arm.com>
9159         * config/arm/arm.c: Include rtl-iter.h.
9160         (arm_tls_referenced_p_1): Delete.
9161         (arm_tls_referenced_p): Use FOR_EACH_SUBRTX.
9163 2014-11-08  Richard Sandiford  <richard.sandiford@arm.com>
9165         * config/arm/aarch-common.c: Include rtl-iter.h.
9166         (search_term, arm_find_sub_rtx_with_search_term): Delete.
9167         (arm_find_sub_rtx_with_code): Use FOR_EACH_SUBRTX_VAR.
9168         (arm_get_set_operands): Pass the insn pattern rather than the
9169         insn itself.
9170         (arm_no_early_store_addr_dep): Likewise.
9172 2014-11-08  Eric Botcazou  <ebotcazou@adacore.com>
9174         * config/arm/arm.c (arm_set_return_address): Mark the store as frame
9175         related, if any.
9176         (thumb_set_return_address): Likewise.
9178 2014-11-07  Jeff Law  <law@redhat.com>
9180         PR tree-optimization/61515
9181         * tree-ssa-threadedge.c (invalidate_equivalences): Walk the unwinding
9182         stack rather than looking at every SSA_NAME's value.
9184 2014-11-07  Richard Biener  <rguenther@suse.de>
9186         PR tree-optimization/63605
9187         * fold-const.c (fold_binary_loc): Properly use element_precision
9188         for types that may not be scalar.
9190 2014-11-07  Evgeny Stupachenko  <evstupac@gmail.com>
9192         PR target/63534
9193         * config/i386/i386.md (builtin_setjmp_receiver): Use
9194         pic_offset_table_rtx for PIC register.
9195         (nonlocal_goto_receiver): Delete.
9197 2014-11-07  Daniel Hellstrom  <daniel@gaisler.com>
9199         * config.gcc (sparc-*-rtems*): Clean away unused t-elf.
9200         * config/sparc/t-rtems: Add leon3v7 and muser-mode multilibs.
9202 2014-11-07  Martin Liska  <mliska@suse.cz>
9204         PR ipa/63580
9205         * cgraphunit.c (cgraph_node::create_wrapper):
9206         TREE_ADDRESSABLE is set to false for a newly created thunk.
9208 2014-11-07  Martin Liska  <mliska@suse.cz>
9210         PR ipa/63747
9211         * ipa-icf-gimple.c (func_checker::compare_gimple_switch):
9212         Missing checking for CASE_LOW and CASE_HIGH added.
9214 2014-11-07  Martin Liska  <mliska@suse.cz>
9216         PR ipa/63595
9217         * cgraphunit.c (cgraph_node::expand_thunk): DECL_BY_REFERENCE
9218         is correctly handled for thunks created by IPA ICF.
9220 2014-11-07  Jiong Wang  <jiong.wang@arm.com>
9221 2014-11-07  Richard Biener  <rguenther@suse.de>
9223         PR tree-optimization/63676
9224         * gimple-fold.c (fold_gimple_assign): Do not fold node when
9225         TREE_CLOBBER_P be true.
9227 2014-11-07  Richard Biener  <rguenther@suse.de>
9229         PR middle-end/63770
9230         * match.pd: Guard conflicting GENERIC pattern properly.
9232 2014-11-07  Richard Biener  <rguenther@suse.de>
9234         * match.pd: Add patterns for POINTER_PLUS_EXPR association
9235         and special patterns from tree-ssa-forwprop.c
9236         * fold-const.c (fold_binary_loc): Remove them here.
9237         * tree-ssa-forwprop.c (to_purge): New global bitmap.
9238         (fwprop_set_lattice_val): New function.
9239         (fwprop_invalidate_lattice): Likewise.
9240         (remove_prop_source_from_use): Instead of purging dead EH
9241         edges record blocks to do that in to_purge.
9242         (tidy_after_forward_propagate_addr): Likewise.
9243         (forward_propagate_addr_expr): Invalidate the lattice for
9244         SSA names we release.
9245         (simplify_conversion_from_bitmask): Likewise.
9246         (simplify_builtin_call): Likewise.
9247         (associate_pointerplus_align): Remove.
9248         (associate_pointerplus_diff): Likewise.
9249         (associate_pointerplus): Likewise.
9250         (fold_all_stmts): Merge with ...
9251         (pass_forwprop::execute): ... the original loop over all
9252         basic-blocks.  Delay purging dead EH edges and invalidate
9253         the lattice for SSA names we release.
9255 2014-11-07  Terry Guo  <terry.guo@arm.com>
9257         * config/arm/arm.opt (masm-syntax-unified): New option.
9258         * doc/invoke.texi (-masm-syntax-unified): Document new option.
9259         * config/arm/arm.h (TARGET_UNIFIED_ASM): Also include thumb1.
9260         (ASM_APP_ON): Redefined.
9261         * config/arm/arm.c (arm_option_override): Thumb2 inline assembly
9262         code always use UAL syntax.
9263         (arm_output_mi_thunk): Use UAL syntax for Thumb1 target.
9264         * config/arm/thumb1.md: Likewise.
9266 2014-11-06  John David Anglin  <danglin@gcc.gnu.org>
9268         * config/pa/pa.md (trap): New insn.  Add "trap" to attribute type.
9269         Don't allow trap insn in in_branch_delay, in_nullified_branch_delay
9270         or in_call_delay.
9272 2014-11-06  Steve Ellcey  <sellcey@imgtec.com>
9274         * config.gcc (mips*-mti-linux*): Remove gnu_ld and gas assignments.
9275         Set default_mips_arch and default_mips_abi instead of tm_defines.
9276         (mips*-*-linux*): Set default_mips_arch and default_mips_abi instead
9277         of tm_defines.
9278         (mips*-*-*): Check with_arch and with_abi.  Set tm_defines.
9279         * config/mips/mips.h (STANDARD_STARTFILE_PREFIX_1): Set default
9280         based on MIPS_ABI_DEFAULT.
9281         (STANDARD_STARTFILE_PREFIX_2): Ditto.
9283 2014-11-06  Joseph Myers  <joseph@codesourcery.com>
9285         * doc/invoke.texi (-std=c99, -std=c11): Don't refer to corner
9286         cases of extended identifiers.
9288 2014-11-06  Eric Botcazou  <ebotcazou@adacore.com>
9290         * tree-cfgcleanup.c (fixup_noreturn_call): Do not perform DCE here.
9292 2014-11-06  DJ Delorie  <dj@redhat.com>
9294         * config/m32c/cond.md (movqicc_<code>_<mode>): Remove mode of
9295         conditional.
9296         (movhicc_<code>_<mode>): Likewise.
9297         * config/m32c/m32c.c (encode_pattern_1): Specialise PSImode
9298         subregs.
9299         (m32c_eh_return_data_regno): Change to using memregs to avoid
9300         tying up all the compute regs.
9301         (m32c_legitimate_address_p) Subregs are not valid addresses.
9303 2014-11-06  Bernd Schmidt  <bernds@codesourcery.com>
9305         * function.c (thread_prologue_and_epilogue_insns): No longer static.
9306         * function.h (thread_prologue_and_epilogue_insns): Declare.
9308         * target.def (assemble_undefined_decl): New hooks.
9309         * hooks.c (hook_void_FILEptr_constcharptr_const_tree): New function.
9310         * hooks.h (hook_void_FILEptr_constcharptr_const_tree): Declare.
9311         * doc/tm.texi.in (TARGET_ASM_ASSEMBLE_UNDEFINED_DECL): Add.
9312         * doc/tm.texi: Regenerate.
9313         * output.h (assemble_undefined_decl): Declare.
9314         (get_fnname_from_decl): Declare.
9315         * varasm.c (assemble_undefined_decl): New function.
9316         (get_fnname_from_decl): New function.
9317         * final.c (rest_of_handle_final): Use it.
9318         * varpool.c (varpool_output_variables): Call assemble_undefined_decl
9319         for nodes without a definition.
9321         * target.def (call_args, end_call_args): New hooks.
9322         * hooks.c (hook_void_rtx_tree): New empty function.
9323         * hooks.h (hook_void_rtx_tree): Declare.
9324         * doc/tm.texi.in (TARGET_CALL_ARGS, TARGET_END_CALL_ARGS): Add.
9325         * doc/tm.texi: Regenerate.
9326         * calls.c (expand_call): Slightly rearrange the code.  Use the two new
9327         hooks.
9328         (expand_library_call_value_1): Use the two new hooks.
9330         * expr.c (use_reg_mode): Just return for pseudo registers.
9332         * combine.c (try_combine): Don't allow a call as one of the source
9333         insns.
9335         * target.def (decl_end): New hook.
9336         * varasm.c (assemble_variable_contents, assemble_constant_contents):
9337         Use it.
9338         * doc/tm.texi.in (TARGET_ASM_DECL_END): Add.
9339         * doc/tm.texi: Regenerate.
9341 2014-11-06  Renlin Li  <renlin.li@arm.com>
9343         * config/aarch64/aarch64.c (aarch64_architecture_version): New.
9344         (processor): New architecture_version field.
9345         (aarch64_override_options): Initialize aarch64_architecture_version.
9346         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Define __ARM_ARCH,
9347         __ARM_ARCH_PROFILE, aarch64_arch_name macro.
9349 2014-11-06  James Greenhalgh  <james.greenhalgh@arm.com>
9351         * params.def (sra-max-scalarization-size-Ospeed): New.
9352         (sra-max-scalarization-size-Osize): Likewise.
9353         * doc/invoke.texi (sra-max-scalarization-size-Ospeed): Document.
9354         (sra-max-scalarization-size-Osize): Likewise.
9355         * toplev.c (process_options): Set default values for new
9356         parameters.
9357         * tree-sra.c (analyze_all_variable_accesses): Use new parameters.
9358         * targhooks.c (get_move_ratio): Remove static designator.
9359         * target.h (get_move_ratio): Declare.
9361 2014-11-06  Marek Polacek  <polacek@redhat.com>
9363         * sanopt.c (sanopt_optimize_walker): Limit removal of the checks.
9364         Remove vector limit.
9366 2014-11-06  Richard Biener  <rguenther@suse.de>
9368         * match.pd: Implement bitwise binary and unary simplifications
9369         from tree-ssa-forwprop.c.
9370         * fold-const.c (fold_unary_loc): Remove them here.
9371         (fold_binary_loc): Likewise.
9372         * tree-ssa-forwprop.c (simplify_not_neg_expr): Remove.
9373         (truth_valued_ssa_name): Likewise.
9374         (lookup_logical_inverted_value): Likewise.
9375         (simplify_bitwise_binary_1): Likewise.
9376         (hoist_conversion_for_bitop_p): Likewise.
9377         (simplify_bitwise_binary_boolean): Likewise.
9378         (simplify_bitwise_binary): Likewise.
9379         (pass_forwprop::execute): Remove calls to simplify_not_neg_expr
9380         and simplify_bitwise_binary.
9381         * genmatch.c (dt_node::append_true_op): Use safe_as_a for parent.
9382         (decision_tree::insert): Also insert non-expressions.
9384 2014-11-06  Hale Wang  <hale.wang@arm.com>
9386         * config/arm/arm-cores.def: Add support for
9387         -mcpu=cortex-m0.small-multiply,cortex-m0plus.small-multiply,
9388         cortex-m1.small-multiply.
9389         * config/arm/arm-tables.opt: Regenerate.
9390         * config/arm/arm-tune.md: Regenerate.
9391         * config/arm/arm.c: Update the rtx-costs for MUL.
9392         * config/arm/bpabi.h: Handle
9393         -mcpu=cortex-m0.small-multiply,cortex-m0plus.small-multiply,
9394         cortex-m1.small-multiply.
9395         * doc/invoke.texi: Document
9396         -mcpu=cortex-m0.small-multiply,cortex-m0plus.small-multiply,
9397         cortex-m1.small-multiply.
9399 2014-11-06  Hale Wang  <hale.wang@arm.com>
9401         * config/arm/arm.c: Add cortex-m7 tune.
9402         * config/arm/arm-cores.def: Use cortex-m7 tune.
9404 2014-11-05  Uros Bizjak  <ubizjak@gmail.com>
9406         PR target/63538
9407         * config/i386/i386.c (in_large_data_p): Reject automatic variables.
9408         (ix86_encode_section_info): Do not check for non-automatic varibles
9409         when setting SYMBOL_FLAG_FAR_ADDR flag.
9410         (x86_64_elf_select_section): Do not check ix86_cmodel here.
9411         (x86_64_elf_unique_section): Ditto.
9412         (x86_elf_aligned_common): Emit tab before .largecomm.
9414 2014-11-05  Joseph Myers  <joseph@codesourcery.com>
9416         PR preprocessor/9449
9417         * doc/cpp.texi (Character sets, Tokenization)
9418         (Implementation-defined behavior): Don't refer to UCNs in
9419         identifiers requiring -fextended-identifiers.
9420         * doc/cppopts.texi (-fextended-identifiers): Document as enabled
9421         by default for C99 and later and C++.
9422         * doc/invoke.texi (-std=c99, -std=c11): Don't refer to extended
9423         identifiers needing -fextended-identifiers.
9425 2014-11-05  Ilya Tocar  <ilya.tocar@intel.com>
9427         * config/i386/i386.c (expand_vec_perm_pshufb): Try vpermq/vpermd
9428         for 512-bit wide modes.
9429         (expand_vec_perm_1): Use correct versions of patterns.
9430         * config/i386/sse.md (avx512f_vec_dup<mode>_1): New.
9431         (vashr<mode>3<mask_name>): Split V8HImode and V16QImode.
9433 2014-11-05  Ilya Enkovich  <ilya.enkovich@intel.com>
9435         * ipa-chkp.c: New.
9436         * ipa-chkp.h: New.
9437         * tree-chkp.c: New.
9438         * tree-chkp.h: New.
9439         * tree-chkp-opt.c: New.
9440         * rtl-chkp.c: New.
9441         * rtl-chkp.h: New.
9442         * Makefile.in (OBJS): Add ipa-chkp.o, rtl-chkp.o, tree-chkp.o
9443         tree-chkp-opt.o.
9444         (GTFILES): Add tree-chkp.c.
9445         * mode-classes.def (MODE_POINTER_BOUNDS): New.
9446         * tree.def (POINTER_BOUNDS_TYPE): New.
9447         * genmodes.c (complete_mode): Support MODE_POINTER_BOUNDS.
9448         (POINTER_BOUNDS_MODE): New.
9449         (make_pointer_bounds_mode): New.
9450         * machmode.h (POINTER_BOUNDS_MODE_P): New.
9451         * stor-layout.c (int_mode_for_mode): Support MODE_POINTER_BOUNDS.
9452         (layout_type): Support POINTER_BOUNDS_TYPE.
9453         * tree-pretty-print.c (dump_generic_node): Support POINTER_BOUNDS_TYPE.
9454         * tree-core.h (tree_index): Add TI_POINTER_BOUNDS_TYPE.
9455         * tree.c (build_int_cst_wide): Support POINTER_BOUNDS_TYPE.
9456         (type_contains_placeholder_1): Likewise.
9457         (build_common_tree_nodes): Initialize
9458         pointer_bounds_type_node.
9459         * tree.h (POINTER_BOUNDS_TYPE_P): New.
9460         (pointer_bounds_type_node): New.
9461         (POINTER_BOUNDS_P): New.
9462         (BOUNDED_TYPE_P): New.
9463         (BOUNDED_P): New.
9464         (CALL_WITH_BOUNDS_P): New.
9465         * gimple.h (gf_mask): Add GF_CALL_WITH_BOUNDS.
9466         (gimple_call_with_bounds_p): New.
9467         (gimple_call_set_with_bounds): New.
9468         (gimple_return_retbnd): New.
9469         (gimple_return_set_retbnd): New
9470         * gimple.c (gimple_build_return): Increase number of ops
9471         for return statement.
9472         (gimple_build_call_from_tree): Propagate CALL_WITH_BOUNDS_P
9473         flag.
9474         * gimple-pretty-print.c (dump_gimple_return): Print second op.
9475         * rtl.h (CALL_EXPR_WITH_BOUNDS_P): New.
9476         * gimplify.c (gimplify_init_constructor): Avoid infinite
9477         loop during gimplification of bounds initializer.
9478         * calls.c: Include tree-chkp.h, rtl-chkp.h, bitmap.h.
9479         (special_function_p): Use original decl name when analyzing
9480         instrumentation clone.
9481         (arg_data): Add fields special_slot, pointer_arg and
9482         pointer_offset.
9483         (store_bounds): New.
9484         (emit_call_1): Propagate instrumentation flag for CALL.
9485         (initialize_argument_information): Compute pointer_arg,
9486         pointer_offset and special_slot for pointer bounds arguments.
9487         (finalize_must_preallocate): Preallocate when storing bounds
9488         in bounds table.
9489         (compute_argument_addresses): Skip pointer bounds.
9490         (expand_call): Store bounds into tables separately.  Return
9491         result joined with resulting bounds.
9492         * cfgexpand.c: Include tree-chkp.h, rtl-chkp.h.
9493         (expand_call_stmt): Propagate bounds flag for CALL_EXPR.
9494         (expand_return): Add returned bounds arg.  Handle returned bounds.
9495         (expand_gimple_stmt_1): Adjust to new expand_return signature.
9496         (gimple_expand_cfg): Reset rtx bounds map.
9497         * expr.c: Include tree-chkp.h, rtl-chkp.h.
9498         (expand_assignment): Handle returned bounds.
9499         (store_expr_with_bounds): New.  Replaces store_expr with new bounds
9500         target argument.  Handle bounds returned by calls.
9501         (store_expr): Now wraps store_expr_with_bounds.
9502         * expr.h (store_expr_with_bounds): New.
9503         * function.c: Include tree-chkp.h, rtl-chkp.h.
9504         (bounds_parm_data): New.
9505         (use_register_for_decl): Do not registerize decls used for bounds
9506         stores and loads.
9507         (assign_parms_augmented_arg_list): Add bounds of the result
9508         structure pointer as the second argument.
9509         (assign_parm_find_entry_rtl): Mark bounds are never passed on
9510         the stack.
9511         (assign_parm_is_stack_parm): Likewise.
9512         (assign_parm_load_bounds): New.
9513         (assign_bounds): New.
9514         (assign_parms): Load bounds and determine a location for
9515         returned bounds.
9516         (diddle_return_value_1): New.
9517         (diddle_return_value): Handle returned bounds.
9518         * function.h (rtl_data): Add field for returned bounds.
9519         * varasm.c: Include tree-chkp.h.
9520         (output_constant): Support POINTER_BOUNDS_TYPE.
9521         (output_constant_pool_2): Support MODE_POINTER_BOUNDS.
9522         (ultimate_transparent_alias_target): Move up.
9523         (make_decl_rtl): For instrumented function use
9524         name of the original decl.
9525         (assemble_start_function): Mark function as global
9526         in case it is instrumentation clone of the global
9527         function.
9528         (do_assemble_alias): Follow transparent alias chain
9529         for identifier.  Check if original alias is public.
9530         (maybe_assemble_visibility): Use visibility of the
9531         original function for instrumented version.
9532         (default_unique_section): Likewise.
9533         * emit-rtl.c (immed_double_const): Support MODE_POINTER_BOUNDS.
9534         (init_emit_once): Build pointer bounds zero constants.
9535         * explow.c (trunc_int_for_mode): Support MODE_POINTER_BOUNDS.
9536         * target.def (builtin_chkp_function): New.
9537         (chkp_bound_type): New.
9538         (chkp_bound_mode): New.
9539         (chkp_make_bounds_constant): New.
9540         (chkp_initialize_bounds): New.
9541         (load_bounds_for_arg): New.
9542         (store_bounds_for_arg): New.
9543         (load_returned_bounds): New.
9544         (store_returned_bounds): New.
9545         (chkp_function_value_bounds): New.
9546         (setup_incoming_vararg_bounds): New.
9547         (function_arg): Update hook description with new possible return
9548         value CONST_INT.
9549         * targhooks.h (default_load_bounds_for_arg): New.
9550         (default_store_bounds_for_arg): New.
9551         (default_load_returned_bounds): New.
9552         (default_store_returned_bounds): New.
9553         (default_chkp_bound_type): New.
9554         (default_chkp_bound_mode): New.
9555         (default_builtin_chkp_function): New.
9556         (default_chkp_function_value_bounds): New.
9557         (default_chkp_make_bounds_constant): New.
9558         (default_chkp_initialize_bounds): New.
9559         (default_setup_incoming_vararg_bounds): New.
9560         * targhooks.c (default_load_bounds_for_arg): New.
9561         (default_store_bounds_for_arg): New.
9562         (default_load_returned_bounds): New.
9563         (default_store_returned_bounds): New.
9564         (default_chkp_bound_type): New.
9565         (default_chkp_bound_mode); New.
9566         (default_builtin_chkp_function): New.
9567         (default_chkp_function_value_bounds): New.
9568         (default_chkp_make_bounds_constant): New.
9569         (default_chkp_initialize_bounds): New.
9570         (default_setup_incoming_vararg_bounds): New.
9571         * builtin-types.def (BT_BND): New.
9572         (BT_FN_PTR_CONST_PTR): New.
9573         (BT_FN_CONST_PTR_CONST_PTR): New.
9574         (BT_FN_BND_CONST_PTR): New.
9575         (BT_FN_CONST_PTR_BND): New.
9576         (BT_FN_PTR_CONST_PTR_SIZE): New.
9577         (BT_FN_PTR_CONST_PTR_CONST_PTR): New.
9578         (BT_FN_VOID_PTRPTR_CONST_PTR): New.
9579         (BT_FN_VOID_CONST_PTR_SIZE): New.
9580         (BT_FN_VOID_PTR_BND): New.
9581         (BT_FN_CONST_PTR_CONST_PTR_CONST_PTR): New.
9582         (BT_FN_BND_CONST_PTR_SIZE): New.
9583         (BT_FN_PTR_CONST_PTR_CONST_PTR_SIZE): New.
9584         (BT_FN_VOID_CONST_PTR_BND_CONST_PTR): New.
9585         * chkp-builtins.def: New.
9586         * builtins.def: include chkp-builtins.def.
9587         (DEF_CHKP_BUILTIN): New.
9588         * builtins.c: Include tree-chkp.h and rtl-chkp.h.
9589         (expand_builtin): Support BUILT_IN_CHKP_INIT_PTR_BOUNDS,
9590         BUILT_IN_CHKP_NULL_PTR_BOUNDS, BUILT_IN_CHKP_COPY_PTR_BOUNDS,
9591         BUILT_IN_CHKP_CHECK_PTR_LBOUNDS, BUILT_IN_CHKP_CHECK_PTR_UBOUNDS,
9592         BUILT_IN_CHKP_CHECK_PTR_BOUNDS, BUILT_IN_CHKP_SET_PTR_BOUNDS,
9593         BUILT_IN_CHKP_NARROW_PTR_BOUNDS, BUILT_IN_CHKP_STORE_PTR_BOUNDS,
9594         BUILT_IN_CHKP_GET_PTR_LBOUND, BUILT_IN_CHKP_GET_PTR_UBOUND,
9595         BUILT_IN_CHKP_BNDMK, BUILT_IN_CHKP_BNDSTX, BUILT_IN_CHKP_BNDCL,
9596         BUILT_IN_CHKP_BNDCU, BUILT_IN_CHKP_BNDLDX, BUILT_IN_CHKP_BNDRET,
9597         BUILT_IN_CHKP_INTERSECT, BUILT_IN_CHKP_NARROW,
9598         BUILT_IN_CHKP_EXTRACT_LOWER, BUILT_IN_CHKP_EXTRACT_UPPER.
9599         (std_expand_builtin_va_start): Init bounds for va_list.
9600         * cppbuiltin.c (define_builtin_macros_for_compilation_flags): Add
9601         __CHKP__ macro when Pointer Bounds Checker is on.
9602         * params.def (PARAM_CHKP_MAX_CTOR_SIZE): New.
9603         * passes.def (pass_ipa_chkp_versioning): New.
9604         (pass_early_local_passes): Renamed to pass_build_ssa_passes.
9605         (pass_fixup_cfg): Moved to pass_chkp_instrumentation_passes.
9606         (pass_chkp_instrumentation_passes): New.
9607         (pass_ipa_chkp_produce_thunks): New.
9608         (pass_local_optimization_passes): New.
9609         (pass_chkp_opt): New.
9610         * tree-pass.h (make_pass_ipa_chkp_versioning): New.
9611         (make_pass_ipa_chkp_produce_thunks): New.
9612         (make_pass_chkp): New.
9613         (make_pass_chkp_opt): New.
9614         (make_pass_early_local_passes): Renamed to ...
9615         (make_pass_build_ssa_passes): This.
9616         (make_pass_chkp_instrumentation_passes): New.
9617         (make_pass_local_optimization_passes): New.
9618         * passes.c (pass_manager::execute_early_local_passes): Execute
9619         early passes in three steps.
9620         (execute_all_early_local_passes): Renamed to ...
9621         (execute_build_ssa_passes): This.
9622         (pass_data_early_local_passes): Renamed to ...
9623         (pass_data_build_ssa_passes): This.
9624         (pass_early_local_passes): Renamed to ...
9625         (pass_build_ssa_passes): This.
9626         (pass_data_chkp_instrumentation_passes): New.
9627         (pass_chkp_instrumentation_passes): New.
9628         (pass_data_local_optimization_passes): New.
9629         (pass_local_optimization_passes): New.
9630         (make_pass_early_local_passes): Renamed to ...
9631         (make_pass_build_ssa_passes): This.
9632         (make_pass_chkp_instrumentation_passes): New.
9633         (make_pass_local_optimization_passes): New.
9634         * c-family/c.opt (fcheck-pointer-bounds): New.
9635         (fchkp-check-incomplete-type): New.
9636         (fchkp-zero-input-bounds-for-main): New.
9637         (fchkp-first-field-has-own-bounds): New.
9638         (fchkp-narrow-bounds): New.
9639         (fchkp-narrow-to-innermost-array): New.
9640         (fchkp-optimize): New.
9641         (fchkp-use-fast-string-functions): New.
9642         (fchkp-use-nochk-string-functions): New.
9643         (fchkp-use-static-bounds): New.
9644         (fchkp-use-static-const-bounds): New.
9645         (fchkp-treat-zero-dynamic-size-as-infinite): New.
9646         (fchkp-check-read): New.
9647         (fchkp-check-write): New.
9648         (fchkp-store-bounds): New.
9649         (fchkp-instrument-calls): New.
9650         (fchkp-instrument-marked-only): New.
9651         (Wchkp): New.
9652         * c-family/c-common.c (handle_bnd_variable_size_attribute): New.
9653         (handle_bnd_legacy): New.
9654         (handle_bnd_instrument): New.
9655         (c_common_attribute_table): Add bnd_variable_size, bnd_legacy
9656         and bnd_instrument.  Fix documentation.
9657         (c_common_format_attribute_table): Likewsie.
9658         * toplev.c: include tree-chkp.h.
9659         (process_options): Check Pointer Bounds Checker is supported.
9660         (compile_file): Add chkp_finish_file call.
9661         * ipa-cp.c (initialize_node_lattices): Use cgraph_local_p
9662         to handle instrumentation clones properly.
9663         (propagate_constants_accross_call): Do not propagate
9664         through instrumentation thunks.
9665         * ipa-pure-const.c (propagate_pure_const): Support
9666         IPA_REF_CHKP.
9667         * ipa-inline.c (early_inliner): Check edge has summary allocated.
9668         * ipa-split.c: Include tree-chkp.h.
9669         (find_retbnd): New.
9670         (split_part_set_ssa_name_p): New.
9671         (consider_split): Do not split retbnd and retval
9672         producers.
9673         (insert_bndret_call_after): new.
9674         (split_function): Propagate Pointer Bounds Checker
9675         instrumentation marks and handle returned bounds.
9676         * tree-ssa-sccvn.h (vn_reference_op_struct): Transform opcode
9677         into bit field and add with_bounds field.
9678         * tree-ssa-sccvn.c (copy_reference_ops_from_call): Set
9679         with_bounds field for instrumented calls.
9680         * tree-ssa-pre.c (create_component_ref_by_pieces_1): Restore
9681         CALL_WITH_BOUNDS_P flag for calls.
9682         * tree-ssa-ccp.c: Include tree-chkp.h.
9683         (insert_clobber_before_stack_restore): Handle
9684         BUILT_IN_CHKP_BNDRET calls.
9685         * tree-ssa-dce.c: Include tree-chkp.h.
9686         (propagate_necessity): For free call fed by alloc check
9687         bounds are also provided by the same alloc.
9688         (eliminate_unnecessary_stmts): Handle BUILT_IN_CHKP_BNDRET
9689         used by free calls.
9690         * tree-inline.c: Include tree-chkp.h.
9691         (declare_return_variable): Add arg holding
9692         returned bounds slot.  Create and initialize returned bounds var.
9693         (remap_gimple_stmt): Handle returned bounds.
9694         Return sequence of statements instead of a single statement.
9695         (insert_init_stmt): Add declaration.
9696         (remap_gimple_seq): Adjust to new remap_gimple_stmt signature.
9697         (copy_bb): Adjust to changed return type of remap_gimple_stmt.
9698         Properly handle bounds in va_arg_pack and va_arg_pack_len.
9699         (expand_call_inline): Handle returned bounds.  Add bounds copy
9700         for generated mem to mem assignments.
9701         * tree-inline.h (copy_body_data): Add fields retbnd and
9702         assign_stmts.
9703         * value-prof.c: Include tree-chkp.h.
9704         (gimple_ic): Support returned bounds.
9705         * ipa.c (cgraph_build_static_cdtor_1): Support contructors
9706         with "chkp ctor" and "bnd_legacy" attributes.
9707         (symtab_remove_unreachable_nodes): Keep initial values for
9708         pointer bounds to be used for checks eliminations.
9709         (process_references): Handle IPA_REF_CHKP.
9710         (walk_polymorphic_call_targets): Likewise.
9711         * ipa-visibility.c (cgraph_externally_visible_p): Mark
9712         instrumented 'main' as externally visible.
9713         (function_and_variable_visibility): Filter instrumentation
9714         thunks.
9715         * cgraph.h (cgraph_thunk_info): Add add_pointer_bounds_args
9716         field.
9717         (cgraph_node): Add instrumented_version, orig_decl and
9718         instrumentation_clone fields.
9719         (symtab_node::get_alias_target): Allow IPA_REF_CHKP reference.
9720         (varpool_node): Add need_bounds_init field.
9721         (cgraph_local_p): New.
9722         * cgraph.c: Include tree-chkp.h.
9723         (cgraph_node::remove): Fix instrumented_version
9724         of the referenced node if any.
9725         (cgraph_node::dump): Dump instrumentation_clone and
9726         instrumented_version fields.
9727         (cgraph_node::verify_node): Check correctness of IPA_REF_CHKP
9728         references and instrumentation thunks.
9729         (cgraph_can_remove_if_no_direct_calls_and_refs_p): Keep
9730         all not instrumented instrumentation clones alive.
9731         (cgraph_redirect_edge_call_stmt_to_callee): Support
9732         returned bounds.
9733         * cgraphbuild.c (rebuild_cgraph_edges): Rebuild IPA_REF_CHKP
9734         reference.
9735         (cgraph_rebuild_references): Likewise.
9736         * cgraphunit.c: Include tree-chkp.h.
9737         (assemble_thunks_and_aliases): Skip thunks calling instrumneted
9738         function version.
9739         (varpool_finalize_decl): Register statically initialized decls
9740         in Pointer Bounds Checker.
9741         (walk_polymorphic_call_targets): Do not mark generated call to
9742         __builtin_unreachable as with_bounds.
9743         (output_weakrefs): If there are both instrumented and original
9744         versions, output only one of them.
9745         (cgraph_node::expand_thunk): Set with_bounds flag
9746         for created call statement.
9747         * ipa-ref.h (ipa_ref_use): Add IPA_REF_CHKP.
9748         (ipa_ref): increase size of use field.
9749         * symtab.c (ipa_ref_use_name): Add element for IPA_REF_CHKP.
9750         * varpool.c (dump_varpool_node): Dump need_bounds_init field.
9751         (ctor_for_folding): Do not fold constant bounds vars.
9752         * lto-streamer.h (LTO_minor_version): Change minor version from
9753         0 to 1.
9754         * lto-cgraph.c (compute_ltrans_boundary): Keep initial values for
9755         pointer bounds.
9756         (lto_output_node): Output instrumentation_clone,
9757         thunk.add_pointer_bounds_args and orig_decl field.
9758         (lto_output_ref): Adjust to new ipa_ref::use field size.
9759         (input_overwrite_node): Read instrumentation_clone field.
9760         (input_node): Read thunk.add_pointer_bounds_args and orig_decl
9761         fields.
9762         (input_ref): Adjust to new ipa_ref::use field size.
9763         (input_cgraph_1): Compute instrumented_version fields and restore
9764         IDENTIFIER_TRANSPARENT_ALIAS chains.
9765         (lto_output_varpool_node): Output
9766         need_bounds_init value.
9767         (input_varpool_node): Read need_bounds_init value.
9768         * lto-partition.c (add_symbol_to_partition_1): Keep original
9769         and instrumented versions together.
9770         (privatize_symbol_name): Restore transparent alias chain if required.
9771         (add_references_to_partition): Add references to pointer bounds vars.
9772         * dbxout.c (dbxout_type): Ignore POINTER_BOUNDS_TYPE.
9773         * dwarf2out.c (gen_subprogram_die): Ignore bound args.
9774         (gen_type_die_with_usage): Skip pointer bounds.
9775         (dwarf2out_global_decl): Likewise.
9776         (is_base_type): Support POINTER_BOUNDS_TYPE.
9777         (gen_formal_types_die): Skip pointer bounds.
9778         (gen_decl_die): Likewise.
9779         * var-tracking.c (vt_add_function_parameters): Skip
9780         bounds parameters.
9781         * ipa-icf.c (sem_function::merge): Do not merge when instrumentation
9782         thunk still exists.
9783         (sem_variable::merge): Reset need_bounds_init flag.
9784         * doc/extend.texi: Document Pointer Bounds Checker built-in functions
9785         and attributes.
9786         * doc/tm.texi.in (TARGET_LOAD_BOUNDS_FOR_ARG): New.
9787         (TARGET_STORE_BOUNDS_FOR_ARG): New.
9788         (TARGET_LOAD_RETURNED_BOUNDS): New.
9789         (TARGET_STORE_RETURNED_BOUNDS): New.
9790         (TARGET_CHKP_FUNCTION_VALUE_BOUNDS): New.
9791         (TARGET_SETUP_INCOMING_VARARG_BOUNDS): New.
9792         (TARGET_BUILTIN_CHKP_FUNCTION): New.
9793         (TARGET_CHKP_BOUND_TYPE): New.
9794         (TARGET_CHKP_BOUND_MODE): New.
9795         (TARGET_CHKP_MAKE_BOUNDS_CONSTANT): New.
9796         (TARGET_CHKP_INITIALIZE_BOUNDS): New.
9797         * doc/tm.texi: Regenerated.
9798         * doc/rtl.texi (MODE_POINTER_BOUNDS): New.
9799         (BND32mode): New.
9800         (BND64mode): New.
9801         * doc/invoke.texi (-mmpx): New.
9802         (-mno-mpx): New.
9803         (chkp-max-ctor-size): New.
9804         * config/i386/constraints.md (w): New.
9805         (Ti): New.
9806         (Tb): New.
9807         * config/i386/i386-c.c (ix86_target_macros_internal): Add __MPX__.
9808         * config/i386/i386-modes.def (BND32): New.
9809         (BND64): New.
9810         * config/i386/i386-protos.h (ix86_bnd_prefixed_insn_p): New.
9811         * config/i386/i386.c: Include tree-chkp.h, rtl-chkp.h, tree-iterator.h.
9812         (regclass_map): Add bound registers.
9813         (dbx_register_map): Likewise.
9814         (dbx64_register_map): Likewise.
9815         (svr4_dbx_register_map): Likewise.
9816         (isa_opts): Add -mmpx.
9817         (PTA_MPX): New.
9818         (ix86_option_override_internal): Support MPX ISA.
9819         (ix86_conditional_register_usage): Support bound registers.
9820         (ix86_code_end): Add MPX bnd prefix.
9821         (output_set_got): Likewise.
9822         (print_reg): Avoid prefixes for bound registers.
9823         (ix86_print_operand): Add '!' (MPX bnd) print prefix support.
9824         (ix86_print_operand_punct_valid_p): Likewise.
9825         (ix86_print_operand_address): Support UNSPEC_BNDMK_ADDR and
9826         UNSPEC_BNDLDX_ADDR.
9827         (ix86_output_call_insn): Add MPX bnd prefix to branch instructions.
9828         (ix86_class_likely_spilled_p): Add bound regs support.
9829         (ix86_hard_regno_mode_ok): Likewise.
9830         (x86_order_regs_for_local_alloc): Likewise.
9831         (ix86_bnd_prefixed_insn_p): New.
9832         (ix86_builtins): Add
9833         IX86_BUILTIN_BNDMK, IX86_BUILTIN_BNDSTX,
9834         IX86_BUILTIN_BNDLDX, IX86_BUILTIN_BNDCL,
9835         IX86_BUILTIN_BNDCU, IX86_BUILTIN_BNDRET,
9836         IX86_BUILTIN_BNDNARROW, IX86_BUILTIN_BNDINT,
9837         IX86_BUILTIN_SIZEOF, IX86_BUILTIN_BNDLOWER,
9838         IX86_BUILTIN_BNDUPPER.
9839         (builtin_isa): Add leaf_p and nothrow_p fields.
9840         (def_builtin): Initialize leaf_p and nothrow_p.
9841         (ix86_add_new_builtins): Handle leaf_p and nothrow_p
9842         flags.
9843         (bdesc_mpx): New.
9844         (bdesc_mpx_const): New.
9845         (ix86_init_mpx_builtins): New.
9846         (ix86_init_builtins): Call ix86_init_mpx_builtins.
9847         (ix86_emit_cmove): New.
9848         (ix86_emit_move_max): New.
9849         (ix86_expand_builtin): Expand IX86_BUILTIN_BNDMK,
9850         IX86_BUILTIN_BNDSTX, IX86_BUILTIN_BNDLDX,
9851         IX86_BUILTIN_BNDCL, IX86_BUILTIN_BNDCU,
9852         IX86_BUILTIN_BNDRET, IX86_BUILTIN_BNDNARROW,
9853         IX86_BUILTIN_BNDINT, IX86_BUILTIN_SIZEOF,
9854         IX86_BUILTIN_BNDLOWER, IX86_BUILTIN_BNDUPPER.
9855         (ix86_function_value_bounds): New.
9856         (ix86_builtin_mpx_function): New.
9857         (ix86_get_arg_address_for_bt): New.
9858         (ix86_load_bounds): New.
9859         (ix86_store_bounds): New.
9860         (ix86_load_returned_bounds): New.
9861         (ix86_store_returned_bounds): New.
9862         (ix86_mpx_bound_mode): New.
9863         (ix86_make_bounds_constant): New.
9864         (ix86_initialize_bounds):
9865         (TARGET_LOAD_BOUNDS_FOR_ARG): New.
9866         (TARGET_STORE_BOUNDS_FOR_ARG): New.
9867         (TARGET_LOAD_RETURNED_BOUNDS): New.
9868         (TARGET_STORE_RETURNED_BOUNDS): New.
9869         (TARGET_CHKP_BOUND_MODE): New.
9870         (TARGET_BUILTIN_CHKP_FUNCTION): New.
9871         (TARGET_CHKP_FUNCTION_VALUE_BOUNDS): New.
9872         (TARGET_CHKP_MAKE_BOUNDS_CONSTANT): New.
9873         (TARGET_CHKP_INITIALIZE_BOUNDS): New.
9874         (ix86_option_override_internal): Do not
9875         support x32 with MPX.
9876         (init_cumulative_args): Init stdarg, bnd_regno, bnds_in_bt
9877         and force_bnd_pass.
9878         (function_arg_advance_32): Return number of used integer
9879         registers.
9880         (function_arg_advance_64): Likewise.
9881         (function_arg_advance_ms_64): Likewise.
9882         (ix86_function_arg_advance): Handle pointer bounds.
9883         (ix86_function_arg): Likewise.
9884         (ix86_function_value_regno_p): Mark fisrt bounds registers as
9885         possible function value.
9886         (ix86_function_value_1): Handle pointer bounds type/mode
9887         (ix86_return_in_memory): Likewise.
9888         (ix86_print_operand): Analyse insn to decide abounf "bnd" prefix.
9889         (ix86_expand_call): Generate returned bounds.
9890         (ix86_setup_incoming_vararg_bounds): New.
9891         (ix86_va_start): Initialize bounds for pointers in va_list.
9892         (TARGET_SETUP_INCOMING_VARARG_BOUNDS): New.
9893         * config/i386/i386.h (TARGET_MPX): New.
9894         (TARGET_MPX_P): New.
9895         (FIRST_PSEUDO_REGISTER): Fix to new value.
9896         (FIXED_REGISTERS): Add bound registers.
9897         (CALL_USED_REGISTERS): Likewise.
9898         (REG_ALLOC_ORDER): Likewise.
9899         (HARD_REGNO_NREGS): Likewise.
9900         (VALID_BND_REG_MODE): New.
9901         (FIRST_BND_REG): New.
9902         (LAST_BND_REG): New.
9903         (reg_class): Add BND_REGS.
9904         (REG_CLASS_NAMES): Likewise.
9905         (REG_CLASS_CONTENTS): Likewise.
9906         (BND_REGNO_P): New.
9907         (ANY_BND_REG_P): New.
9908         (BNDmode): New.
9909         (HI_REGISTER_NAMES): Add bound registers.
9910         (ix86_args): Add bnd_regno, bnds_in_bt, force_bnd_pass and
9911         stdarg fields.
9912         * config/i386/i386.md (UNSPEC_BNDMK): New.
9913         (UNSPEC_BNDMK_ADDR): New.
9914         (UNSPEC_BNDSTX): New.
9915         (UNSPEC_BNDLDX): New.
9916         (UNSPEC_BNDLDX_ADDR): New.
9917         (UNSPEC_BNDCL): New.
9918         (UNSPEC_BNDCU): New.
9919         (UNSPEC_BNDCN): New.
9920         (UNSPEC_MPX_FENCE): New.
9921         (UNSPEC_SIZEOF): New.
9922         (BND0_REG): New.
9923         (BND1_REG): New.
9924         (type): Add mpxmov, mpxmk, mpxchk, mpxld, mpxst.
9925         (length_immediate): Support mpxmov, mpxmk, mpxchk, mpxld, mpxst.
9926         (prefix_rep): Check for bnd prefix.
9927         (prefix_0f): Support mpxmov, mpxmk, mpxchk, mpxld, mpxst.
9928         (length_nobnd): New.
9929         (length): Use length_nobnd when specified.
9930         (memory): Support mpxmov, mpxmk, mpxchk, mpxld, mpxst.
9931         (BND): New.
9932         (bnd_ptr): New.
9933         (BNDCHECK): New.
9934         (bndcheck): New.
9935         (*jcc_1): Add MPX bnd prefix.
9936         (*jcc_2): Likewise.
9937         (jump): Likewise.
9938         (*indirect_jump): Likewise.
9939         (*tablejump_1): Likewise.
9940         (simple_return_internal): Likewise.
9941         (simple_return_internal_long): Likewise.
9942         (simple_return_pop_internal): Likewise.
9943         (simple_return_indirect_internal): Likewise.
9944         (<mode>_mk): New.
9945         (*<mode>_mk): New.
9946         (mov<mode>): New.
9947         (*mov<mode>_internal_mpx): New.
9948         (<mode>_<bndcheck>): New.
9949         (*<mode>_<bndcheck>): New.
9950         (<mode>_ldx): New.
9951         (*<mode>_ldx): New.
9952         (<mode>_stx): New.
9953         (*<mode>_stx): New.
9954         move_size_reloc_<mode>): New.
9955         * config/i386/predicates.md (address_mpx_no_base_operand): New.
9956         (address_mpx_no_index_operand): New.
9957         (bnd_mem_operator): New.
9958         (symbol_operand): New.
9959         (x86_64_immediate_size_operand): New.
9960         * config/i386/i386.opt (mmpx): New.
9961         * config/i386/i386-builtin-types.def (BND): New.
9962         (ULONG): New.
9963         (BND_FTYPE_PCVOID_ULONG): New.
9964         (VOID_FTYPE_BND_PCVOID): New.
9965         (VOID_FTYPE_PCVOID_PCVOID_BND): New.
9966         (BND_FTYPE_PCVOID_PCVOID): New.
9967         (BND_FTYPE_PCVOID): New.
9968         (BND_FTYPE_BND_BND): New.
9969         (PVOID_FTYPE_PVOID_PVOID_ULONG): New.
9970         (PVOID_FTYPE_PCVOID_BND_ULONG): New.
9971         (ULONG_FTYPE_VOID): New.
9972         (PVOID_FTYPE_BND): New.
9974 2014-11-05  Bernd Schmidt  <bernds@codesourcery.com>
9976         * passes.def (pass_compute_alignments, pass_duplicate_computed_gotos,
9977         pass_variable_tracking, pass_free_cfg, pass_machine_reorg,
9978         pass_cleanup_barriers, pass_delay_slots,
9979         pass_split_for_shorten_branches, pass_convert_to_eh_region_ranges,
9980         pass_shorten_branches, pass_est_nothrow_function_flags,
9981         pass_dwarf2_frame, pass_final): Move outside of pass_postreload and
9982         into pass_late_compilation.
9983         (pass_late_compilation): Add.
9984         * passes.c (pass_data_late_compilation, pass_late_compilation,
9985         make_pass_late_compilation): New.
9986         * timevar.def (TV_LATE_COMPILATION): New.
9988         * target.def (omit_struct_return_reg): New data hook.
9989         * doc/tm.texi.in: Add @hook TARGET_OMIT_STRUCT_RETURN_REG.
9990         * doc/tm.texi: Regenerate.
9991         * function.c (expand_function_end): Use it.
9993         * target.def (no_register_allocation): New data hook.
9994         * doc/tm.texi.in: Add @hook TARGET_NO_REGISTER_ALLOCATION.
9995         * doc/tm.texi: Regenerate.
9996         * ira.c (gate_ira): New function.
9997         (pass_data_ira): Set has_gate.
9998         (pass_ira): Add a gate function.
9999         (pass_data_reload): Likewise.
10000         (pass_reload): Add a gate function.
10001         (pass_ira): Use it.
10002         * reload1.c (eliminate_regs): If reg_eliminate_is NULL, assert that
10003         no register allocation happens on the target and return.
10004         * final.c (alter_subreg): Ensure register is not a pseudo before
10005         calling simplify_subreg.
10006         (output_operand): Assert that x isn't a pseudo only if doing
10007         register allocation.
10009         * dbxout.c (dbxout_symbol): Don't call eliminate_regs on decls for
10010         global vars.
10012         * optabs.c (emit_indirect_jump): Test HAVE_indirect_jump and emit a
10013         sorry if necessary.
10015 2014-11-05  Alex Velenko  <Alex.Velenko@arm.com>
10017         * simplify-rtx.c (simplify_binary_operation_1): Div check added.
10018         * rtl.h (SUBREG_P): New macro added.
10020 2014-11-05  Tejas Belagod  <tejas.belagod@arm.com>
10022         * config/aarch64/aarch64-builtins.c
10023         (aarch64_build_scalar_type): Remove.
10024         (aarch64_scalar_builtin_types, aarch64_simd_type,
10025         aarch64_simd_type, aarch64_mangle_builtin_scalar_type,
10026         aarch64_mangle_builtin_vector_type,
10027         aarch64_mangle_builtin_type, aarch64_simd_builtin_std_type,
10028         aarch64_lookup_simd_builtin_type, aarch64_simd_builtin_type,
10029         aarch64_init_simd_builtin_types,
10030         aarch64_init_simd_builtin_scalar_types): New.
10031         (aarch64_init_simd_builtins): Refactor.
10032         (aarch64_init_crc32_builtins): Fixup with qualifier.
10033         * config/aarch64/aarch64-protos.h
10034         (aarch64_mangle_builtin_type): Export.
10035         * config/aarch64/aarch64-simd-builtin-types.def: New.
10036         * config/aarch64/aarch64.c (aarch64_simd_mangle_map): Remove.
10037         (aarch64_mangle_type): Refactor.
10038         * config/aarch64/arm_neon.h: Declare vector types based on
10039         internal types.
10040         * config/aarch64/t-aarch64: Update dependency.
10042 2014-11-04  Pat Haugen  <pthaugen@us.ibm.com>
10044         * config/rs6000/rs6000.c (atomic_hold_decl, atomic_clear_decl,
10045         atomic_update_decl): Guard declaration with #ifdef.
10047 2014-11-04  Marek Polacek  <polacek@redhat.com>
10049         * sanopt.c (sanopt_optimize_walker): Remove unused variables.
10051 2014-11-04  Marek Polacek  <polacek@redhat.com>
10053         * Makefile.in (OBJS): Add sanopt.o.
10054         (GTFILES): Add sanopt.c.
10055         * asan.h (asan_expand_check_ifn): Declare.
10056         * asan.c (asan_expand_check_ifn): No longer static.
10057         (class pass_sanopt, pass_sanopt::execute, make_pass_sanopt): Move...
10058         * sanopt.c: ...here.  New file.
10060 2014-11-04  Jiong Wang  <jiong.wang@arm.com>
10061             Wilco Dijkstra  <wilco.dijkstra@arm.com>
10063         PR target/63293
10064         * config/aarch64/aarch64.c (aarch64_expand_epiloue): Add barriers before
10065         stack adjustment.
10067 2014-11-04  Bernd Schmidt  <bernds@codesourcery.com>
10069         * combine.c (combine_simplify_rtx): In STORE_FLAG_VALUE == -1 case,
10070         also verify that mode is equal to the mode of op0.
10072         * bb-reorder.c (get_uncond_jump_length): Avoid using delete_insn,
10073         emit into a sequence instead.
10075 2014-11-04  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
10077         * config/sh/sh.c (emit_fpu_switch): Drop unused automatic variable.
10079 2014-11-04  Alan Lawrence  <alan.lawrence@arm.com>
10081         config/arm/neon.md (reduc_smin_<mode> *2): Rename to...
10082         (reduc_smin_scal_<mode> *2): ...this; extract scalar result.
10083         (reduc_smax_<mode> *2): Rename to...
10084         (reduc_smax_scal_<mode> *2): ...this; extract scalar result.
10085         (reduc_umin_<mode> *2): Rename to...
10086         (reduc_umin_scal_<mode> *2): ...this; extract scalar result.
10087         (reduc_umax_<mode> *2): Rename to...
10088         (reduc_umax_scal_<mode> *2): ...this; extract scalar result.
10090 2014-11-04  Alan Lawrence  <alan.lawrence@arm.com>
10092         config/arm/neon.md (reduc_plus_*): Rename to...
10093         (reduc_plus_scal_*): ...this; reduce to temp and extract scalar result.
10095 2014-11-04  Michael Collison <michael.collison@linaro.org>
10097         * config/aarch64/iterators.md (lconst_atomic): New mode attribute
10098         to support constraints for CONST_INT in atomic operations.
10099         * config/aarch64/atomics.md
10100         (atomic_<atomic_optab><mode>): Use lconst_atomic constraint.
10101         (atomic_nand<mode>): Likewise.
10102         (atomic_fetch_<atomic_optab><mode>): Likewise.
10103         (atomic_fetch_nand<mode>): Likewise.
10104         (atomic_<atomic_optab>_fetch<mode>): Likewise.
10105         (atomic_nand_fetch<mode>): Likewise.
10107 2014-11-04  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
10109         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Fix typo in definition
10110         of __ARM_FEATURE_IDIV.
10112 2014-11-04  Marek Polacek  <polacek@redhat.com>
10114         * ubsan.c (instrument_object_size): Optimize [x & CST] array accesses.
10116 2014-11-03  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
10118         * config/rx/rx.c (rx_handle_func_attribute): Mark unused argument.
10120 2014-11-04  Zhenqiang Chen  <zhenqiang.chen@arm.com>
10122         Revert:
10123         2014-11-03  Zhenqiang Chen  <zhenqiang.chen@arm.com>
10124         * ifcvt.c (noce_emit_cmove, noce_get_alt_condition, noce_get_condition):
10125         Allow CC mode if HAVE_cbranchcc4.
10127 2014-11-03  Dominik Vogt  <vogt@linux.vnet.ibm.com>
10129         * godump.c (go_format_type): Rewrite RECORD_TYPE nad UNION_TYPE support
10130         with -fdump-go-spec.  Anonymous substructures are now flattened and
10131         replaced by their fields (record) or the first named, non-bitfield
10132         field (union).
10134 2014-11-04  Manuel López-Ibáñez  <manu@gcc.gnu.org>
10136         * input.c (expand_location_to_spelling_point): Fix typo.
10137         (expansion_point_location_if_in_system_header): Fix comment.
10139 2014-11-03  Pitchumani Sivanupandi <pitchumani.s@atmel.com>
10141         * config/avr/gen-avr-mmcu-specs.c: Remove unnecessary format specifier.
10143 2014-11-03  Richard Biener  <rguenther@suse.de>
10145         * tree-eh.c (operation_could_trap_helper_p): Handle conversions
10146         like ordinary operations.
10147         * gimplify.c (gimplify_conversion): Gimplify CONVERT_EXPR
10148         as NOP_EXPR.
10150 2014-11-03  Joseph Myers  <joseph@codesourcery.com>
10152         * configure.ac (TARGET_GLIBC_MAJOR, TARGET_GLIBC_MINOR): Define
10153         macros.
10154         * configure, config.h.in: Regenerate.
10155         * config/rs6000/linux.h [TARGET_GLIBC_MAJOR > 2 ||
10156         (TARGET_GLIBC_MAJOR == 2 && TARGET_GLIBC_MINOR >= 19)]
10157         (RS6000_GLIBC_ATOMIC_FENV): New macro.
10158         * config/rs6000/linux64.h [TARGET_GLIBC_MAJOR > 2 ||
10159         (TARGET_GLIBC_MAJOR == 2 && TARGET_GLIBC_MINOR >= 19)]
10160         (RS6000_GLIBC_ATOMIC_FENV): New macro.
10161         * config/rs6000/rs6000.c (atomic_hold_decl, atomic_clear_decl)
10162         (atomic_update_decl): New static variables.
10163         (rs6000_atomic_assign_expand_fenv) [RS6000_GLIBC_ATOMIC_FENV]:
10164         Generate calls to __atomic_feholdexcept, __atomic_feclearexcept
10165         and __atomic_feupdateenv for soft-float and no-FPRs.
10167 2014-11-03  Richard Biener  <rguenther@suse.de>
10169         * match.pd: Add two abs patterns.  Announce tree_expr_nonnegative_p.
10170         Also drop bogus FLOAT_EXPR and FIX_TRUNC_EXPR.
10171         * fold-const.c (fold_unary_loc): Remove them here.
10172         (tree_unary_nonnegative_warnv_p): Use CASE_CONVERT.
10173         * gimple-fold.c (fold_gimple_assign): Remove now obsolete
10174         GIMPLE_UNARY_RHS case.
10175         (gimple_fold_stmt_to_constant_1): Likewise.
10176         (replace_stmt_with_simplification): Fix inverted comparison.
10178 2014-11-03  Marc Glisse  <marc.glisse@inria.fr>
10180         PR tree-optimization/60770
10181         * tree-into-ssa.c (rewrite_update_stmt): Return whether the
10182         statement should be removed.
10183         (maybe_register_def): Likewise. Replace clobbers with default
10184         definitions.
10185         (rewrite_dom_walker::before_dom_children): Remove statement if
10186         rewrite_update_stmt says so.
10187         * tree-ssa-live.c: Include tree-ssa.h.
10188         (set_var_live_on_entry): Do not mark undefined variables as live.
10189         (verify_live_on_entry): Do not check undefined variables.
10190         * tree-ssa.h (ssa_undefined_value_p): New parameter for the case
10191         of partially undefined variables.
10192         * tree-ssa.c (ssa_undefined_value_p): Likewise.
10193         (execute_update_addresses_taken): Do not drop clobbers.
10195 2014-11-03  Marc Glisse  <marc.glisse@inria.fr>
10197         PR tree-optimization/63666
10198         * fold-const.c: Include "optabs.h".
10199         (fold_ternary_loc) <VEC_PERM_EXPR>: Avoid canonicalizing a
10200         can_vec_perm_p permutation to one that is not.
10202 2014-11-03  Zhenqiang Chen  <zhenqiang.chen@arm.com>
10204         * ifcvt.c (noce_try_store_flag_mask): Check rtx cost.
10206 2014-11-03  Andrew Pinski  <apinski@cavium.com>
10208         * config/mips/mips-cpus.def (octeon3): New cpu.
10209         * config/mips/mips.c (mips_rtx_cost_data): Add octeon3.
10210         (mips_print_operand <case 'T', case 't'>): Fix a bug as the mode
10211         of the comparison no longer matches mode of the operands.
10212         (mips_issue_rate): Handle PROCESSOR_OCTEON3.
10213         * config/mips/mips.h (TARGET_OCTEON):  Add Octeon3.
10214         (TARGET_OCTEON2): Likewise.
10215         (TUNE_OCTEON): Add Octeon3.
10216         * config/mips/mips.md (processor): Add octeon3.
10217         * config/mips/octeon.md (octeon_fpu): New automaton and cpu_unit.
10218         (octeon_arith): Add octeon3.
10219         (octeon_condmove): Remove.
10220         (octeon_condmove_o1): New reservation.
10221         (octeon_condmove_o2): New reservation.
10222         (octeon_condmove_o3_int_on_cc): New reservation.
10223         (octeon_load_o2): Add octeon3.
10224         (octeon_cop_o2): Likewise.
10225         (octeon_store): Likewise.
10226         (octeon_brj_o2): Likewise.
10227         (octeon_imul3_o2): Likewise.
10228         (octeon_imul_o2): Likewise.
10229         (octeon_mfhilo_o2): Likewise.
10230         (octeon_imadd_o2): Likewise.
10231         (octeon_idiv_o2_si): Likewise.
10232         (octeon_idiv_o2_di): Likewise.
10233         (octeon_fpu): Add to the automaton.
10234         (octeon_fpu): New cpu unit.
10235         (octeon_condmove_o2): Check for non floating point modes.
10236         (octeon_load_o2): Add prefetchx.
10237         (octeon_cop_o2): Don't check for octeon3.
10238         (octeon3_faddsubcvt): New reservation.
10239         (octeon3_fmul): Likewise.
10240         (octeon3_fmadd): Likewise.
10241         (octeon3_div_sf): Likewise.
10242         (octeon3_div_df): Likewise.
10243         (octeon3_sqrt_sf): Likewise.
10244         (octeon3_sqrt_df): Likewise.
10245         (octeon3_rsqrt_sf): Likewise.
10246         (octeon3_rsqrt_df): Likewise.
10247         (octeon3_fabsnegmov): Likewise.
10248         (octeon_fcond): Likewise.
10249         (octeon_fcondmov): Likewise.
10250         (octeon_fpmtc1): Likewise.
10251         (octeon_fpmfc1): Likewise.
10252         (octeon_fpload): Likewise.
10253         (octeon_fpstore): Likewise.
10254         * config/mips/mips-tables.opt: Regenerate.
10255         * doc/invoke.texi (-march=@var{arch}): Add octeon3.
10257 2014-11-03  Zhenqiang Chen  <zhenqiang.chen@arm.com>
10259         * ifcvt.c (noce_emit_cmove, noce_get_alt_condition, noce_get_condition):
10260         Allow CC mode if HAVE_cbranchcc4.
10262 2014-11-02  Richard Sandiford  <richard.sandiford@arm.com>
10264         * config/arc/arc.c (write_ext_corereg_1): Delete.
10265         (arc_write_ext_corereg): Use FOR_EACH_SUBRTX.
10267 2014-11-02  Richard Sandiford  <richard.sandiford@arm.com>
10269         * config/arc/arc.c (arc600_corereg_hazard_1): Delete.
10270         (arc600_corereg_hazard): Use FOR_EACH_SUBRTX.
10272 2014-11-02  Richard Sandiford  <richard.sandiford@arm.com>
10274         * config/arc/arc.c (arc_rewrite_small_data_p): Constify argument.
10275         (small_data_pattern_1): Delete.
10276         (small_data_pattern): Use FOR_EACH_SUBRTX.
10278 2014-11-02  Richard Sandiford  <richard.sandiford@arm.com>
10280         * config/arc/arc.c: Include rtl-iter.h.
10281         (arc_rewrite_small_data_1): Delete.
10282         (arc_rewrite_small_data): Use FOR_EACH_SUBRTX_PTR.
10284 2014-11-02  Michael Collison  <michael.collison@linaro.org>
10286         * config/arm/arm.h (CLZ_DEFINED_VALUE_AT_ZERO) : Update
10287         to support vector modes.
10288         (CTZ_DEFINED_VALUE_AT_ZERO): Ditto.
10290 2014-11-01  Andrew MacLeod  <amacleod@redhat,com>
10292         * optabs.h: Flatten insn-codes.h to source files.  Move some prototypes
10293         and structs to genopinit.c.  Adjust protyoptypes to match optabs.c.
10294         * genopinit.c (main): Emit prototypes and structs into insn-opinit.h.
10295         * optabs.c: (gen_move_insn): Move to expr.c.
10296         * expr.h: Move protypes and enums to optabs.h.
10297         * expr.c: (gen_move_insn): Relocate from optabs.c.
10298         * genemit.c (main): Include insn-codes.h.
10299         * gengtype.c (open_base_files): Include insn-codes.h.
10300         * asan.c: Include insn-codes.h.
10301         * bb-reorder.c: Ditto.
10302         * builtins.c: Ditto.
10303         * calls.c: Ditto.
10304         * cfgexpand.c: Ditto.
10305         * cilk-common.c: Ditto.
10306         * combine.c: Ditto.
10307         * dojump.c: Ditto.
10308         * dse.c: Ditto.
10309         * except.c: Ditto.
10310         * explow.c: Ditto.
10311         * expmed.c: Ditto.
10312         * function.c: Ditto.
10313         * ifcvt.c: Ditto.
10314         * internal-fn.c: Ditto.
10315         * loop-unroll.c: Ditto.
10316         * lra.c: Ditto.
10317         * modulo-sched.c: Ditto.
10318         * omp-low.c: Ditto.
10319         * postreload.c: Ditto.
10320         * ree.c: Ditto.
10321         * reload.c: Ditto.
10322         * reload1.c: Ditto.
10323         * shrink-wrap.c: Ditto.
10324         * simplify-rtx.c: Ditto.
10325         * stmt.c: Ditto.
10326         * target-globals.c: Ditto.
10327         * targhooks.c: Ditto.
10328         * toplev.c: Ditto.
10329         * tree-if-conv.c: Ditto.
10330         * tree-ssa-forwprop.c: Ditto.
10331         * tree-ssa-loop-prefetch.c: Ditto.
10332         * tree-ssa-math-opts.c: Ditto.
10333         * tree-ssa-phiopt.c: Ditto.
10334         * tree-ssa-reassoc.c: Ditto.
10335         * tree-switch-conversion.c: Ditto.
10336         * tree-vect-data-refs.c: Ditto.
10337         * tree-vect-generic.c: Ditto.
10338         * tree-vect-loop.c: Ditto.
10339         * tree-vect-patterns.c: Ditto.
10340         * tree-vect-slp.c: Ditto.
10341         * tree-vect-stmts.c: Ditto.
10342         * tree-vrp.c: Ditto.
10343         * value-prof.c: Ditto.
10344         * config/aarch64/aarch64-builtins.c: Ditto.
10345         * config/alpha/alpha.c: Ditto.
10346         * config/arm/arm.c: Ditto.
10347         * config/cris/cris.c: Ditto.
10348         * config/epiphany/epiphany.c: Ditto.
10349         * config/frv/frv.c: Ditto.
10350         * config/h8300/h8300.c: Ditto.
10351         * config/ia64/ia64.c: Ditto.
10352         * config/iq2000/iq2000.c: Ditto.
10353         * config/m32c/m32c.c: Ditto.
10354         * config/mep/mep.c: Ditto.
10355         * config/microblaze/microblaze.c: Ditto.
10356         * config/mips/mips.c: Ditto.
10357         * config/mn10300/mn10300.c: Ditto.
10358         * config/moxie/moxie.c: Ditto.
10359         * config/msp430/msp430.c: Ditto.
10360         * config/nios2/nios2.c: Ditto.
10361         * config/pa/pa.c: Ditto.
10362         * config/rl78/rl78.c: Ditto.
10363         * config/rs6000/rs6000.c: Ditto.
10364         * config/rx/rx.c: Ditto.
10365         * config/s390/s390.c: Ditto.
10366         * config/sh/sh.c: Ditto.
10367         * config/sh/sh_treg_combine.cc: Ditto.
10368         * config/spu/spu.c: Ditto.
10369         * config/stormy16/stormy16.c: Ditto.
10370         * config/tilegx/mul-tables.c: Ditto.
10371         * config/tilegx/tilegx.c: Ditto.
10372         * config/tilepro/mul-tables.c: Ditto.
10373         * config/tilepro/tilepro.c: Ditto.
10374         * config/vax/vax.c: Ditto.
10376 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10378         * doc/tm.texi.in (MOVE_BY_PIECES_P): Remove.
10379         (CLEAR_BY_PIECES_P): Likewise.
10380         (SET_BY_PIECES_P): Likewise.
10381         (STORE_BY_PIECES_P): Likewise.
10382         * doc/tm.texi: Regenerate.
10383         * system.h: Poison MOVE_BY_PIECES_P, CLEAR_BY_PIECES_P,
10384         SET_BY_PIECES_P, STORE_BY_PIECES_P.
10385         * expr.c (MOVE_BY_PIECES_P): Remove.
10386         (CLEAR_BY_PIECES_P): Likewise.
10387         (SET_BY_PIECES_P): Likewise.
10388         (STORE_BY_PIECES_P): Likewise.
10389         (can_move_by_pieces): Rewrite in terms of
10390         targetm.use_by_pieces_infrastructure_p.
10391         (emit_block_move_hints): Likewise.
10392         (can_store_by_pieces): Likewise.
10393         (store_by_pieces): Likewise.
10394         (clear_storage_hints): Likewise.
10395         (emit_push_insn): Likewise.
10396         (expand_constructor): Likewise.
10398 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10400         * config/aarch64/aarch64.c
10401         (aarch64_use_by_pieces_infrastructre_p): New.
10402         (TARGET_USE_BY_PIECES_INFRASTRUCTURE): Likewise.
10403         * config/aarch64/aarch64.h (STORE_BY_PIECES_P): Delete.
10405 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10407         * config/mips/mips.h (MOVE_BY_PIECES_P): Remove.
10408         (STORE_BY_PIECES_P): Likewise.
10409         * config/mips/mips.c (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): New.
10410         (mips_move_by_pieces_p): Rename to...
10411         (mips_use_by_pieces_infrastructure_p): ...this, use new hook
10412         parameters, use the default hook implementation as a
10413         fall-back.
10415 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10417         * config/sh/sh.c (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): New.
10418         (sh_use_by_pieces_infrastructure_p): Likewise.
10419         * config/sh/sh.h (MOVE_BY_PIECES_P): Remove.
10420         (STORE_BY_PIECES_P): Likewise.
10421         (SET_BY_PIECES_P): Likewise.
10423 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10425         * config/arc/arc.c (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): New.
10426         (arc_use_by_pieces_infrastructure_p): Likewise.
10427         * confir/arc/arc.h (MOVE_BY_PIECES_P): Delete.
10428         (CAN_MOVE_BY_PIECES): Likewise.
10430 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10432         * config/s390/s390.c (s390_use_by_pieces_infrastructure_p): New.
10433         (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): Likewise.
10434         * config/s390/s390.h (MOVE_BY_PIECES_P): Remove.
10435         (CLEAR_BY_PIECES): Likewise.
10436         (SET_BY_PIECES): Likewise.
10437         (STORE_BY_PIECES): Likewise.
10439 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10441         * target.def (use_by_pieces_infrastructure_p): New.
10442         * doc/tm.texi.in (MOVE_BY_PIECES_P): Describe that this macro
10443         is deprecated.
10444         (STORE_BY_PIECES_P): Likewise.
10445         (CLEAR_BY_PIECES_P): Likewise.
10446         (SET_BY_PIECES_P): Likewise.
10447         (TARGET_MOVE_BY_PIECES_PROFITABLE_P): Add hook.
10448         * doc/tm.texi: Regenerate.
10449         * expr.c (MOVE_BY_PIECES_P): Rewrite in terms of
10450         TARGET_USE_BY_PIECES_INFRASTRUCTURE_P.
10451         (STORE_BY_PIECES_P): Likewise.
10452         (CLEAR_BY_PIECES_P): Likewise.
10453         (SET_BY_PIECES_P): Likewise.
10454         (STORE_MAX_PIECES): Move to...
10455         * defaults.h (STORE_MAX_PIECES): ...here.
10456         * targhooks.c (get_move_ratio): New.
10457         (default_use_by_pieces_infrastructure_p): Likewise.
10458         * targhooks.h (default_use_by_pieces_infrastructure_p): New.
10459         * target.h (by_pieces_operation): New.
10461 2014-10-31  Uros Bizjak  <ubizjak@gmail.com>
10463         PR target/63702
10464         * config/i386/i386.c (ix86_expand_args_builtin): Remove extra
10465         assignment to 'nargs' variable.
10467 2014-10-31  Uros Bizjak  <ubizjak@gmail.com>
10469         PR target/63620
10470         * config/i386/i386-protos.h (ix86_use_pseudo_pic_reg): Declare.
10471         * config/i386/i386.c (ix86_use_pseudo_pic_reg): Export.
10472         * config/i386/i386.md (*pushtf): Allow only CONST_DOUBLEs that won't
10473         be reloaded through memory.
10474         (*pushxf): Ditto.
10475         (*pushdf): Ditto.
10477 2014-10-31  Jakub Jelinek  <jakub@redhat.com>
10479         PR rtl-optimization/63659
10480         * ree.c (update_reg_equal_equiv_notes): New function.
10481         (combine_set_extension, transform_ifelse): Use it.
10483 2014-10-31  Jeff Law  <law@redhat.com>
10485         * doc/contrib.texi: Add contribution notes for Balaji Iyer (Cilk+)
10486         and Jonny Grant (collect2).
10488 2014-10-31  Richard Biener  <rguenther@suse.de>
10490         * builtins.c (fold_builtin_atomic_always_lock_free): Use
10491         CONVERT_EXPR_P, CONVERT_EXPR_CODE_P and CASE_CONVERT where
10492         approprate.
10493         (fold_builtin_expect): Likewise.
10494         (integer_valued_real_p): Likewise.
10495         * cfgexpand.c (expand_debug_expr): Likewise.
10496         * ipa-inline-analysis.c (eliminated_by_inlining_prob): Likewise.
10497         (find_foldable_builtin_expect): Likewise.
10498         * trans-mem.c (thread_private_new_memory): Likewise.
10499         * tree-affine.c (aff_combination_expand): Likewise.
10500         * tree-data-ref.c (initialize_matrix_A): Likewise.
10501         * tree-inline.c (copy_bb): Likewise.
10502         * tree-pretty-print.c (dump_function_name): Likewise.
10503         (print_call_name): Likewise.
10504         * tree-ssa-forwprop.c (constant_pointer_difference): Likewise.
10505         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Likewise.
10506         * tree-vect-generic.c (expand_vector_operations_1): Likewise.
10507         * tree-vect-patterns.c (vect_handle_widen_op_by_const): Likewise.
10508         (vect_recog_widen_mult_pattern): Likewise.
10509         (vect_operation_fits_smaller_type): Likewise.
10510         * tree-vrp.c (find_assert_locations_1): Likewise.
10511         * tree-ssa-dom.c (initialize_hash_element): Canonicalize
10512         converts to NOP_EXPR.
10514 2014-10-31  Richard Biener  <rguenther@suse.de>
10516         * genmatch.c (expr::gen_transform): Use NOP_EXPRs instead of
10517         CONVERT_EXPRs in generated code.
10518         (dt_simplify::gen): Likewise.
10520 2014-10-31  Evgeny Stupachenko  <evstupac@gmail.com>
10522         PR target/63534
10523         * config/i386/i386.c (ix86_init_pic_reg): Emit SET_GOT to
10524         REAL_PIC_OFFSET_TABLE_REGNUM for mcount profiling.
10525         (ix86_save_reg): Save REAL_PIC_OFFSET_TABLE_REGNUM when profiling
10526         using mcount in 32bit PIC mode.
10527         (ix86_elim_entry_set_got): New.
10528         (ix86_expand_prologue): For the mcount profiling emit new SET_GOT
10529         in PROLOGUE, delete initial if possible.
10531 2014-10-31  Eric Botcazou  <ebotcazou@adacore.com>
10533         * ipa-inline.c (want_inline_small_function_p): Fix typo and formatting.
10534         (want_inline_function_to_all_callers_p): Fix formatting and simplify.
10536 2014-10-31  Thomas Preud'homme  <thomas.preudhomme@arm.com>
10538         PR tree-optimization/63259
10539         * tree-ssa-math-opts.c (bswap_replace): Replace expression by a
10540         rotation left if it is a 16 bit byte swap.
10541         (pass_optimize_bswap::execute): Also consider bswap in LROTATE_EXPR
10542         and RROTATE_EXPR statements if it is a byte rotation.
10544 2014-10-31  Jakub Jelinek  <jakub@redhat.com>
10546         PR sanitizer/63697
10547         * tree-vrp.c (simplify_internal_call_using_ranges): For subcode ==
10548         MINUS_EXPR, check overflow on vr0.min - vr1.max and vr0.max - vr1.min
10549         instead of vr0.min - vr1.min and vr0.max - vr1.max.
10551 2014-10-31  Max Ostapenko  <m.ostapenko@partner.samsung.com>
10553         PR ipa/63696
10554         * ipa-icf.c (sem_function::~sem_function): Change free to delete
10555         to avoid alloc-dealloc mismatch with new, called in
10556         ipa_icf::sem_function::init.
10558 2014-10-30  Felix Yang  <felix.yang@huawei.com>
10560         * config/xtensa/xtensa.h (TARGET_LOOPS): New Macro.
10561         * config/xtensa/xtensa.c: Include dumpfile.h and hw-doloop.h.
10562         (xtensa_reorg, xtensa_reorg_loops): New.
10563         (xtensa_can_use_doloop_p, xtensa_invalid_within_doloop): New.
10564         (hwloop_optimize, hwloop_fail, hwloop_pattern_reg): New.
10565         (xtensa_emit_loop_end): Emit the zero-overhead loop end label.
10566         (xtensa_doloop_hooks): Define.
10567         * config/xtensa/xtensa.md (doloop_end, loop_end): New
10568         (zero_cost_loop_start): Rewritten.
10569         (zero_cost_loop_end): Likewise.
10571 2014-10-30  Steve Ellcey  <sellcey@imgtec.com>
10573         * config.gcc (mips*-*-linux*): Combine 32 and 64 bit cases.
10575 2014-10-30  Richard Biener  <rguenther@suse.de>
10577         * genmatch.c: Remove <map>, <utility> and <string> includes.
10578         Include ggc.h and hash-map.h.
10579         (ggc_internal_cleared_alloc): Provide stub definition.
10580         (ggc_free): Likewise.
10581         (struct capture_id_map_hasher): New traits for hash_map.
10582         (cid_map_t): New typedef.
10583         (everywhere else): Replace std::map use with cid_map_t.
10584         * hash-map.h (hash_map::elements): New member function.
10585         * Makefile.in (build/genmatch.o): Add $(HASH_TABLE_H),
10586         hash-map.h and $(GGC_H) as dependency.
10588 2014-10-30  Richard Biener  <rguenther@suse.de>
10590         * genmatch.c (capture_info::walk_c_expr): Ignore capture
10591         uses inside TREE_TYPE ().
10592         * gimple-ssa-strength-reduction.c (stmt_cost): Use CASE_CONVERT.
10593         (find_candidates_dom_walker::before_dom_children): Likewise.
10594         (replace_mult_candidate): Use CONVERT_EXPR_CODE_P.
10595         (replace_profitable_candidates): Likewise.
10596         * tree-ssa-dom.c (initialize_hash_element): Canonicalize
10597         CONVERT_EXPR_CODE_P to CONVERT_EXPR.
10598         * convert.c (convert_to_integer): Use CASE_CONVERT.
10600 2014-10-30  Richard Biener  <rguenther@suse.de>
10602         * match.pd: Implement more patterns that simplify to a single value.
10603         * fold-const.c (fold_binary_loc): Remove them here.
10604         * tree-ssa-forwprop.c (simplify_bitwise_binary): Likewise.
10605         (fwprop_ssa_val): Remove restriction on single uses.
10607 2014-10-30  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
10609         * config/avr/driver-avr.c (avr_set_current_device): Remove.
10611 2014-10-30  Martin Liska  <mliska@suse.cz>
10613         PR ipa/63574
10614         PR ipa/63664
10615         * ipa-icf-gimple.c (func_checker::parse_labels): Missing comment added.
10616         (func_checker::compare_gimple_label): Simlified comparison introduced.
10617         * ipa-icf-gimple.h: Missing comment added.
10619 2014-10-30  Jeff Law  <law@redhat.com>
10621         * config/pa/pa-protos.h (pa_output_arg_descriptor): Strengthen
10622         argument from rtx to rtx_insn *.
10623         (compute_movmem_length, compute_clrmem_length): Likewise.
10624         (copy_fp_args, length_fp_args): Likewise.
10625         * config/pa/pa.c (legitimize_pic_address): Promote local variable
10626         "insn" from rtx to rtx_insn *.
10627         (legitimize_tls_address, pa_emit_move_sequence): Likewise.
10628         (pa_output_block_move, store_reg, store_reg_modify): Likewise.
10629         (set_reg_plus_d, pa_expand_prologue, hppa_profile_hook): Likewise.
10630         (branch_to_delay_slot_p, branch_needs_nop_p, use_skip_p): Likewise.
10631         (pa_output_arg_descriptor): Strengthen argument to an rtx_insn *.
10632         (compute_movmem_length, compute_clrmem_length): Likewise.
10633         (copy_fp-args, length_fp_args): Likewise.
10635 2014-10-29  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
10637         * config/arm/arm.h (MACHMODE): Treat machine_mode as a
10638         scalar typedef.
10639         (CUMULATIVE_ARGS): Guard against target includes.
10640         (machine_function): Likewise.
10642 2014-10-29  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
10644         * config/aarch64/aarch64.c (aarch64_madd_needs_nop): Restore
10645         recog state after aarch64_prev_real_insn call.
10647 2014-10-29  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
10649         * config/aarch64/aarch64.h (MACHMODE): Add 'enum' to machine_mode.
10651 2014-10-29  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
10653         * config/arm/arm.h (MACHMODE): Add 'enum' to machine_mode.
10654         (struct machine_function): Gate definition on
10655         !defined(USED_FOR_TARGET).
10657 2014-10-29  DJ Delorie  <dj@redhat.com>
10659         * expmed.c (strict_volatile_bitfield_p): Fix off-by-one error.
10661 2014-10-29  Martin Liska  <mliska@suse.cz>
10663         PR ipa/63587
10664         * cgraphunit.c (cgraph_node::expand_thunk): Only VAR_DECLs are put
10665         to local declarations.
10666         * function.c (add_local_decl): Implementation moved from header
10667         file, assert introduced for tree type.
10668         * function.h: Likewise.
10670 2014-10-29  Dominik Vogt  <vogt@linux.vnet.ibm.com>
10672         * godump.c (go_format_type): Represent "float _Complex" and
10673         "double _Complex" as complex64 or complex128 in Go, as appropriate.
10675 2014-10-29  Richard Biener  <rguenther@suse.de>
10677         * match.pd: Implement a first set of conversion patterns.
10678         * fold-const.c (fold_unary_loc): Remove them here.
10679         * tree-ssa-forwprop.c (simplify_vce): Remove.
10680         (pass_forwprop::execute): Do not call simplify_vce.
10682 2014-10-29  Richard Sandiford  <richard.sandiford@arm.com>
10684         * addresses.h, alias.c, asan.c, auto-inc-dec.c, bt-load.c, builtins.c,
10685         builtins.h, caller-save.c, calls.c, calls.h, cfgexpand.c, cfgloop.h,
10686         cfgrtl.c, combine.c, compare-elim.c, config/aarch64/aarch64-builtins.c,
10687         config/aarch64/aarch64-protos.h, config/aarch64/aarch64-simd.md,
10688         config/aarch64/aarch64.c, config/aarch64/aarch64.h,
10689         config/aarch64/aarch64.md, config/alpha/alpha-protos.h,
10690         config/alpha/alpha.c, config/arc/arc-protos.h, config/arc/arc.c,
10691         config/arc/arc.h, config/arc/predicates.md,
10692         config/arm/aarch-common-protos.h, config/arm/aarch-common.c,
10693         config/arm/arm-protos.h, config/arm/arm.c, config/arm/arm.h,
10694         config/arm/arm.md, config/arm/neon.md, config/arm/thumb2.md,
10695         config/avr/avr-log.c, config/avr/avr-protos.h, config/avr/avr.c,
10696         config/avr/avr.md, config/bfin/bfin-protos.h, config/bfin/bfin.c,
10697         config/c6x/c6x-protos.h, config/c6x/c6x.c, config/c6x/c6x.md,
10698         config/cr16/cr16-protos.h, config/cr16/cr16.c,
10699         config/cris/cris-protos.h, config/cris/cris.c, config/cris/cris.md,
10700         config/darwin-protos.h, config/darwin.c,
10701         config/epiphany/epiphany-protos.h, config/epiphany/epiphany.c,
10702         config/epiphany/epiphany.md, config/fr30/fr30.c,
10703         config/frv/frv-protos.h, config/frv/frv.c, config/frv/predicates.md,
10704         config/h8300/h8300-protos.h, config/h8300/h8300.c,
10705         config/i386/i386-builtin-types.awk, config/i386/i386-protos.h,
10706         config/i386/i386.c, config/i386/i386.md, config/i386/predicates.md,
10707         config/i386/sse.md, config/i386/sync.md, config/ia64/ia64-protos.h,
10708         config/ia64/ia64.c, config/iq2000/iq2000-protos.h,
10709         config/iq2000/iq2000.c, config/iq2000/iq2000.md,
10710         config/lm32/lm32-protos.h, config/lm32/lm32.c,
10711         config/m32c/m32c-protos.h, config/m32c/m32c.c,
10712         config/m32r/m32r-protos.h, config/m32r/m32r.c,
10713         config/m68k/m68k-protos.h, config/m68k/m68k.c,
10714         config/mcore/mcore-protos.h, config/mcore/mcore.c,
10715         config/mcore/mcore.md, config/mep/mep-protos.h, config/mep/mep.c,
10716         config/microblaze/microblaze-protos.h, config/microblaze/microblaze.c,
10717         config/mips/mips-protos.h, config/mips/mips.c,
10718         config/mmix/mmix-protos.h, config/mmix/mmix.c,
10719         config/mn10300/mn10300-protos.h, config/mn10300/mn10300.c,
10720         config/moxie/moxie.c, config/msp430/msp430-protos.h,
10721         config/msp430/msp430.c, config/nds32/nds32-cost.c,
10722         config/nds32/nds32-intrinsic.c, config/nds32/nds32-md-auxiliary.c,
10723         config/nds32/nds32-protos.h, config/nds32/nds32.c,
10724         config/nios2/nios2-protos.h, config/nios2/nios2.c,
10725         config/pa/pa-protos.h, config/pa/pa.c, config/pdp11/pdp11-protos.h,
10726         config/pdp11/pdp11.c, config/rl78/rl78-protos.h, config/rl78/rl78.c,
10727         config/rs6000/altivec.md, config/rs6000/rs6000-c.c,
10728         config/rs6000/rs6000-protos.h, config/rs6000/rs6000.c,
10729         config/rs6000/rs6000.h, config/rx/rx-protos.h, config/rx/rx.c,
10730         config/s390/predicates.md, config/s390/s390-protos.h,
10731         config/s390/s390.c, config/s390/s390.h, config/s390/s390.md,
10732         config/sh/predicates.md, config/sh/sh-protos.h, config/sh/sh.c,
10733         config/sh/sh.md, config/sparc/predicates.md,
10734         config/sparc/sparc-protos.h, config/sparc/sparc.c,
10735         config/sparc/sparc.md, config/spu/spu-protos.h, config/spu/spu.c,
10736         config/stormy16/stormy16-protos.h, config/stormy16/stormy16.c,
10737         config/tilegx/tilegx-protos.h, config/tilegx/tilegx.c,
10738         config/tilegx/tilegx.md, config/tilepro/tilepro-protos.h,
10739         config/tilepro/tilepro.c, config/v850/v850-protos.h,
10740         config/v850/v850.c, config/v850/v850.md, config/vax/vax-protos.h,
10741         config/vax/vax.c, config/vms/vms-c.c, config/xtensa/xtensa-protos.h,
10742         config/xtensa/xtensa.c, coverage.c, cprop.c, cse.c, cselib.c, cselib.h,
10743         dbxout.c, ddg.c, df-problems.c, dfp.c, dfp.h, doc/md.texi,
10744         doc/rtl.texi, doc/tm.texi, doc/tm.texi.in, dojump.c, dse.c,
10745         dwarf2cfi.c, dwarf2out.c, dwarf2out.h, emit-rtl.c, emit-rtl.h,
10746         except.c, explow.c, expmed.c, expmed.h, expr.c, expr.h, final.c,
10747         fixed-value.c, fixed-value.h, fold-const.c, function.c, function.h,
10748         fwprop.c, gcse.c, gengenrtl.c, genmodes.c, genopinit.c, genoutput.c,
10749         genpreds.c, genrecog.c, gensupport.c, gimple-ssa-strength-reduction.c,
10750         graphite-clast-to-gimple.c, haifa-sched.c, hooks.c, hooks.h, ifcvt.c,
10751         internal-fn.c, ira-build.c, ira-color.c, ira-conflicts.c, ira-costs.c,
10752         ira-emit.c, ira-int.h, ira-lives.c, ira.c, ira.h, jump.c, langhooks.h,
10753         libfuncs.h, lists.c, loop-doloop.c, loop-invariant.c, loop-iv.c,
10754         loop-unroll.c, lower-subreg.c, lower-subreg.h, lra-assigns.c,
10755         lra-constraints.c, lra-eliminations.c, lra-int.h, lra-lives.c,
10756         lra-spills.c, lra.c, lra.h, machmode.h, omp-low.c, optabs.c, optabs.h,
10757         output.h, postreload.c, print-tree.c, read-rtl.c, real.c, real.h,
10758         recog.c, recog.h, ree.c, reg-stack.c, regcprop.c, reginfo.c,
10759         regrename.c, regs.h, reload.c, reload.h, reload1.c, rtl.c, rtl.h,
10760         rtlanal.c, rtlhash.c, rtlhooks-def.h, rtlhooks.c, sched-deps.c,
10761         sel-sched-dump.c, sel-sched-ir.c, sel-sched-ir.h, sel-sched.c,
10762         simplify-rtx.c, stmt.c, stor-layout.c, stor-layout.h, target.def,
10763         targhooks.c, targhooks.h, tree-affine.c, tree-call-cdce.c,
10764         tree-complex.c, tree-data-ref.c, tree-dfa.c, tree-if-conv.c,
10765         tree-inline.c, tree-outof-ssa.c, tree-scalar-evolution.c,
10766         tree-ssa-address.c, tree-ssa-ccp.c, tree-ssa-loop-ivopts.c,
10767         tree-ssa-loop-ivopts.h, tree-ssa-loop-manip.c,
10768         tree-ssa-loop-prefetch.c, tree-ssa-math-opts.c, tree-ssa-reassoc.c,
10769         tree-ssa-sccvn.c, tree-streamer-in.c, tree-switch-conversion.c,
10770         tree-vect-data-refs.c, tree-vect-generic.c, tree-vect-loop.c,
10771         tree-vect-patterns.c, tree-vect-slp.c, tree-vect-stmts.c,
10772         tree-vrp.c, tree.c, tree.h, tsan.c, ubsan.c, valtrack.c,
10773         var-tracking.c, varasm.c: Remove redundant enum from
10774         machine_mode.
10775         * gengtype.c (main): Treat machine_mode as a scalar typedef.
10776         * genmodes.c (emit_insn_modes_h): Hide inline functions if
10777         USED_FOR_TARGET.
10779 2014-10-29  Richard Sandiford  <richard.sandiford@arm.com>
10781         PR rtl-optimization/63340 (part 2)
10782         * rtl.h (invalid_mode_change_p): Delete.
10783         (valid_mode_changes_for_regno): New function.
10784         * reginfo.c (invalid_mode_change_p): Delete.
10785         (valid_mode_changes_for_regno): New function.
10786         * ira-costs.c (setup_regno_cost_classes_by_aclass): Restrict the
10787         classes to registers that are allowed by valid_mode_changes_for_regno.
10788         (setup_regno_cost_classes_by_mode): Likewise.
10789         (print_allocno_costs): Remove invalid_mode_change_p test.
10790         (print_pseudo_costs, find_costs_and_classes): Likewise.
10792 2014-10-29  Richard Sandiford  <richard.sandiford@arm.com>
10794         PR rtl-optimization/63340 (part 1)
10795         * ira-costs.c (all_cost_classes): New variable.
10796         (complete_cost_classes): New function, split out from...
10797         (setup_cost_classes): ...here.
10798         (initiate_regno_cost_classes): Set up all_cost_classes.
10799         (restrict_cost_classes): New function.
10800         (setup_regno_cost_classes_by_aclass): Restrict the cost classes to
10801         registers that are valid for the register's mode.
10802         (setup_regno_cost_classes_by_mode): Model the mode cache as a
10803         restriction of all_cost_classes to a particular mode.
10804         (print_allocno_costs): Remove contains_reg_of_mode check.
10805         (print_pseudo_costs, find_costs_and_classes): Likewise.
10807 2014-10-29  Richard Biener  <rguenther@suse.de>
10809         PR tree-optimization/63666
10810         * tree-vect-slp.c (vect_get_mask_element): Properly handle
10811         accessing out-of-bound elements.
10813 2014-10-29  Alexander Ivchenko  <alexander.ivchenko@intel.com>
10814             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
10815             Anna Tikhonova  <anna.tikhonova@intel.com>
10816             Ilya Tocar  <ilya.tocar@intel.com>
10817             Andrey Turetskiy  <andrey.turetskiy@intel.com>
10818             Ilya Verbin  <ilya.verbin@intel.com>
10819             Kirill Yukhin  <kirill.yukhin@intel.com>
10820             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
10822         * config/i386/i386.md
10823         (movhi_internal): Always detect maskmov.
10824         (movqi_internal): Fix target check.
10826 2014-10-29  Alexander Ivchenko  <alexander.ivchenko@intel.com>
10827             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
10828             Anna Tikhonova  <anna.tikhonova@intel.com>
10829             Ilya Tocar  <ilya.tocar@intel.com>
10830             Andrey Turetskiy  <andrey.turetskiy@intel.com>
10831             Ilya Verbin  <ilya.verbin@intel.com>
10832             Kirill Yukhin  <kirill.yukhin@intel.com>
10833             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
10835         * config/i386/avx512bwintrin.h: Add new intrinsics.
10836         * config/i386/avx512vlbwintrin.h: Ditto.
10837         * config/i386/avx512vlintrin.h: Ditto.
10839 2014-10-28  Dominik Vogt  <vogt@linux.vnet.ibm.com>
10841         * godump.c (precision_to_units): New helper function.
10842         (go_append_artificial_name): Ditto.
10843         (go_append_decl_name): Ditto.
10844         (go_append_bitfield): Ditto.
10845         (go_get_uinttype_for_precision): Ditto.
10846         (go_append_padding): Ditto.
10847         (go_force_record_alignment): Ditto.
10848         (go_format_type): Represent unions with an array of uints of the size
10849         of the alignment in go.  This fixes the 'random' size of the union's
10850         representation using just the first field.
10851         (go_format_type): Add argument that indicates whether a record is
10852         nested (used for generation of artificial go names).
10853         (go_output_fndecl): Adapt to new go_format_type signature.
10854         (go_output_typedef): Ditto.
10855         (go_output_var): Ditto.
10856         (go_output_var): Prefer to output type as alias (typedef).
10857         (go_format_type): Bitfields in records are simulated as arrays of bytes
10858         in go.
10860         * godump.c (go_format_type): Fix handling of arrays with zero elements.
10862 2014-10-28  Andrew MacLeod  <amacleod@redhat.com>
10864         * cgraph.h: Flatten.  Remove all include files.
10865         (symbol_table::initialize): Move to cgraph.c.
10866         * cgraph.c: Adjust include files.
10867         (symbol_table::initialize): Relocate from cgraph.h.
10868         * gengtype.c (open_base_files): Adjust include files.
10869         * gccplugin.h: Add hash-map.h, is-a.h, plugin-api.h, and ipa-ref.h to
10870         included files.
10871         * ipa-inline.h: Remove all include files.
10872         * ipa-prop.h: Ditto.
10873         * ipa-reference.h: Ditto.
10874         * ipa-utils.h: Ditto:
10875         * lto-streamer.h: Remove cgraph.h from include list.
10876         * asan.c: Adjust include files.
10877         * auto-profile.c: Ditto.
10878         * bb-reorder.c: Ditto.
10879         * calls.c: Ditto.
10880         * cfgexpand.c: Ditto.
10881         * cgraphbuild.c: Ditto.
10882         * cgraphclones.c: Ditto.
10883         * cgraphunit.c: Ditto.
10884         * combine.c: Ditto.
10885         * coverage.c: Ditto.
10886         * data-streamer.c: Ditto.
10887         * data-streamer-in.c: Ditto.
10888         * data-streamer-out.c: Ditto.
10889         * dbxout.c: Ditto.
10890         * dwarf2out.c: Ditto.
10891         * except.c: Ditto.
10892         * expr.c: Ditto.
10893         * final.c: Ditto.
10894         * fold-const.c: Ditto.
10895         * ggc-page.c: Ditto.
10896         * gimple-fold.c: Ditto.
10897         * gimple-iterator.c: Ditto.
10898         * gimple-pretty-print.c: Ditto.
10899         * gimple-streamer-in.c: Ditto.
10900         * gimple-streamer-out.c: Ditto.
10901         * gimplify.c: Ditto.
10902         * ipa.c: Ditto.
10903         * ipa-comdats.c: Ditto.
10904         * ipa-cp.c: Ditto.
10905         * ipa-devirt.c: Ditto.
10906         * ipa-icf.c: Ditto.
10907         * ipa-icf-gimple.c: Ditto.
10908         * ipa-inline-analysis.c: Ditto.
10909         * ipa-inline.c: Ditto.
10910         * ipa-inline-transform.c: Ditto.
10911         * ipa-polymorphic-call.c: Ditto.
10912         * ipa-profile.c: Ditto.
10913         * ipa-prop.c: Ditto.
10914         * ipa-pure-const.c: Ditto.
10915         * ipa-ref.c: Ditto.
10916         * ipa-reference.c: Ditto.
10917         * ipa-split.c: Ditto.
10918         * ipa-utils.c: Ditto.
10919         * ipa-visibility.c: Ditto.
10920         * langhooks.c: Ditto.
10921         * lto-cgraph.c: Ditto.
10922         * lto-compress.c: Ditto.
10923         * lto-opts.c: Ditto.
10924         * lto-section-in.c: Ditto.
10925         * lto-section-out.c: Ditto.
10926         * lto-streamer.c: Ditto.
10927         * lto-streamer-in.c: Ditto.
10928         * lto-streamer-out.c: Ditto.
10929         * omp-low.c: Ditto.
10930         * opts-global.c: Ditto.
10931         * passes.c: Ditto.
10932         * predict.c: Ditto.
10933         * print-tree.c: Ditto.
10934         * profile.c: Ditto.
10935         * ree.c: Ditto.
10936         * stor-layout.c: Ditto.
10937         * symtab.c: Ditto.
10938         * toplev.c: Ditto.
10939         * trans-mem.c: Ditto.
10940         * tree.c: Ditto.
10941         * tree-cfg.c: Ditto.
10942         * tree-eh.c: Ditto.
10943         * tree-emutls.c: Ditto.
10944         * tree-inline.c: Ditto.
10945         * tree-nested.c: Ditto.
10946         * tree-pretty-print.c: Ditto.
10947         * tree-profile.c: Ditto.
10948         * tree-sra.c: Ditto.
10949         * tree-ssa-alias.c: Ditto.
10950         * tree-ssa-loop-ivcanon.c: Ditto.
10951         * tree-ssa-loop-ivopts.c: Ditto.
10952         * tree-ssa-pre.c: Ditto.
10953         * tree-ssa-structalias.c: Ditto.
10954         * tree-streamer.c: Ditto.
10955         * tree-streamer-in.c: Ditto.
10956         * tree-streamer-out.c: Ditto.
10957         * tree-switch-conversion.c: Ditto.
10958         * tree-tailcall.c: Ditto.
10959         * tree-vect-data-refs.c: Ditto.
10960         * tree-vectorizer.c: Ditto.
10961         * tree-vect-stmts.c: Ditto.
10962         * tsan.c: Ditto.
10963         * ubsan.c: Ditto.
10964         * value-prof.c: Ditto.
10965         * varasm.c: Ditto.
10966         * varpool.c: Ditto.
10967         * config/arm/arm.c: Ditto.
10968         * config/bfin/bfin.c: Ditto.
10969         * config/c6x/c6x.c: Ditto.
10970         * config/cris/cris.c: Ditto.
10971         * config/darwin.c: Ditto.
10972         * config/darwin-c.c: Ditto.
10973         * config/i386/i386.c: Ditto.
10974         * config/i386/winnt.c: Ditto.
10975         * config/microblaze/microblaze.c: Ditto.
10976         * config/mips/mips.c: Ditto.
10977         * config/rs6000/rs6000.c: Ditto.
10978         * config/rx/rx.c: Ditto.
10980 2014-10-28  Richard Biener  <rguenther@suse.de>
10982         * gimple-fold.h (follow_single_use_edges): Declare.
10983         * gimple-fold.c (follow_single_use_edges): New function.
10984         (gimple_fold_stmt_to_constant_1): Dispatch to gimple_simplify.
10985         * tree-ssa-propagate.c
10986         (substitute_and_fold_dom_walker::before_dom_children): Allow
10987         following single-use edges when folding stmts we propagated into.
10989 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
10990             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
10991             Anna Tikhonova  <anna.tikhonova@intel.com>
10992             Ilya Tocar  <ilya.tocar@intel.com>
10993             Andrey Turetskiy  <andrey.turetskiy@intel.com>
10994             Ilya Verbin  <ilya.verbin@intel.com>
10995             Kirill Yukhin  <kirill.yukhin@intel.com>
10996             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
10998         * config/i386/avx512bwintrin.h: New.
10999         * config/i386/avx512dqintrin.h: Ditto.
11000         * config/i386/avx512vlbwintrin.h: Ditto.
11001         * config/i386/avx512vldqintrin.h: Ditto.
11002         * config/i386/avx512vlintrin.h: Ditto.
11003         * config/i386/immintrin.h: Include avx512vlintrin.h, avx512bwintrin.h,
11004         avx512dqintrin.h, avx512vlbwintrin.h, avx512vldqintrin.h.
11006 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11007             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11008             Anna Tikhonova  <anna.tikhonova@intel.com>
11009             Ilya Tocar  <ilya.tocar@intel.com>
11010             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11011             Ilya Verbin  <ilya.verbin@intel.com>
11012             Kirill Yukhin  <kirill.yukhin@intel.com>
11013             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11015         * config/i386/i386.c
11016         (ix86_expand_args_builtin): Handle avx_vpermilv4df_mask,
11017         avx_shufpd256_mask, avx_vpermilv2df_mask.
11019 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11020             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11021             Anna Tikhonova  <anna.tikhonova@intel.com>
11022             Ilya Tocar  <ilya.tocar@intel.com>
11023             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11024             Ilya Verbin  <ilya.verbin@intel.com>
11025             Kirill Yukhin  <kirill.yukhin@intel.com>
11026             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11028         * config/i386/i386.c
11029         (ix86_init_mmx_sse_builtins):
11030         Define __builtin_ia32_gather3siv2df, __builtin_ia32_gather3siv4df,
11031         __builtin_ia32_gather3div2df, __builtin_ia32_gather3div4df,
11032         __builtin_ia32_gather3siv4sf, __builtin_ia32_gather3siv8sf,
11033         __builtin_ia32_gather3div4sf, __builtin_ia32_gather3div8sf,
11034         __builtin_ia32_gather3siv2di, __builtin_ia32_gather3siv4di,
11035         __builtin_ia32_gather3div2di, __builtin_ia32_gather3div4di,
11036         __builtin_ia32_gather3siv4si, __builtin_ia32_gather3siv8si,
11037         __builtin_ia32_gather3div4si, __builtin_ia32_gather3div8si,
11038         __builtin_ia32_gather3altsiv4df, __builtin_ia32_gather3altdiv8sf,
11039         __builtin_ia32_gather3altsiv4di, __builtin_ia32_gather3altdiv8si,
11040         __builtin_ia32_scattersiv8sf, __builtin_ia32_scattersiv4sf,
11041         __builtin_ia32_scattersiv4df, __builtin_ia32_scattersiv2df,
11042         __builtin_ia32_scatterdiv8sf, __builtin_ia32_scatterdiv4sf,
11043         __builtin_ia32_scatterdiv4df, __builtin_ia32_scatterdiv2df,
11044         __builtin_ia32_scattersiv8si, __builtin_ia32_scattersiv4si,
11045         __builtin_ia32_scattersiv4di, __builtin_ia32_scattersiv2di,
11046         __builtin_ia32_scatterdiv8si, __builtin_ia32_scatterdiv4si,
11047         __builtin_ia32_scatterdiv4di, __builtin_ia32_scatterdiv2di.
11049 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11050             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11051             Anna Tikhonova  <anna.tikhonova@intel.com>
11052             Ilya Tocar  <ilya.tocar@intel.com>
11053             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11054             Ilya Verbin  <ilya.verbin@intel.com>
11055             Kirill Yukhin  <kirill.yukhin@intel.com>
11056             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11058         * config/i386/i386.c
11059         (ix86_builtins): Add IX86_BUILTIN_GATHER3ALTSIV4DF,
11060         IX86_BUILTIN_GATHER3ALTDIV8SF, IX86_BUILTIN_GATHER3ALTSIV4DI,
11061         IX86_BUILTIN_GATHER3ALTDIV8SI.
11062         (ix86_expand_builtin):
11063         Handle IX86_BUILTIN_GATHER3ALTDIV8SF, IX86_BUILTIN_GATHER3ALTDIV8SI,
11064         IX86_BUILTIN_SCATTERSIV4DF, IX86_BUILTIN_SCATTERSIV4DI,
11065         IX86_BUILTIN_SCATTERDIV2DF, IX86_BUILTIN_SCATTERDIV4DF,
11066         IX86_BUILTIN_GATHER3ALTSIV4DI, IX86_BUILTIN_GATHER3ALTSIV4DF,
11067         IX86_BUILTIN_SCATTERDIV4DI, IX86_BUILTIN_SCATTERDIV2DI,
11068         IX86_BUILTIN_GATHER3SIV8SI, IX86_BUILTIN_GATHER3DIV8SI,
11069         IX86_BUILTIN_GATHER3SIV4DF, IX86_BUILTIN_GATHER3SIV4DI,
11070         IX86_BUILTIN_GATHER3DIV8SF, IX86_BUILTIN_GATHER3SIV8SF,
11071         IX86_BUILTIN_GATHER3DIV4DF, IX86_BUILTIN_GATHER3DIV2DF,
11072         IX86_BUILTIN_GATHER3DIV2DI, IX86_BUILTIN_GATHER3DIV4DI,
11073         IX86_BUILTIN_SCATTERDIV4SF, IX86_BUILTIN_SCATTERSIV2DI,
11074         IX86_BUILTIN_GATHER3SIV2DI, IX86_BUILTIN_GATHER3SIV4SI,
11075         IX86_BUILTIN_GATHER3SIV4SF, IX86_BUILTIN_GATHER3SIV2DF,
11076         IX86_BUILTIN_SCATTERSIV2DF, IX86_BUILTIN_SCATTERDIV4SI,
11077         IX86_BUILTIN_SCATTERSIV4SF, IX86_BUILTIN_SCATTERSIV4SI,
11078         IX86_BUILTIN_SCATTERDIV8SI, IX86_BUILTIN_GATHER3DIV4SI,
11079         IX86_BUILTIN_SCATTERSIV8SI, IX86_BUILTIN_SCATTERSIV8SF,
11080         IX86_BUILTIN_GATHER3DIV4SF, IX86_BUILTIN_SCATTERDIV8SF.
11081         (ix86_vectorize_builtin_gather): Update V2DFmode, V4DFmode, V2DImode,
11082         V4DImode, V4SFmode, V8SFmode, V4SImode, V8SImode.
11084 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11085             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11086             Anna Tikhonova  <anna.tikhonova@intel.com>
11087             Ilya Tocar  <ilya.tocar@intel.com>
11088             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11089             Ilya Verbin  <ilya.verbin@intel.com>
11090             Kirill Yukhin  <kirill.yukhin@intel.com>
11091             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11093         * config/i386/i386-builtin-types.def
11094         (SHORT): New.
11095         (V32HI): Ditto.
11096         (V12QI): Ditto.
11097         (V14QI): Ditto.
11098         (V32SI): Ditto.
11099         (V8UDI): Ditto.
11100         (V16USI): Ditto.
11101         (V32UHI): Ditto.
11102         (PSHORT): Ditto.
11103         (PV32QI): Ditto.
11104         (PV32HI): Ditto.
11105         (PV64QI): Ditto.
11106         (PCV8HI): Ditto.
11107         (PCV16QI): Ditto.
11108         (PCV16HI): Ditto.
11109         (PCV32QI): Ditto.
11110         (PCV32HI): Ditto.
11111         (PCV64QI): Ditto.
11112         (V4SF_FTYPE_V2DF_V4SF_QI): Ditto.
11113         (V4SF_FTYPE_V4DF_V4SF_QI): Ditto.
11114         (V4SF_FTYPE_V8HI_V4SF_QI): Ditto.
11115         (V8SF_FTYPE_V8HI_V8SF_QI): Ditto.
11116         (V16SF_FTYPE_V16HI): Ditto.
11117         (V16SF_FTYPE_V16HI_V16SF_HI): Ditto.
11118         (V16SF_FTYPE_V16SI): Ditto.
11119         (V4DI_FTYPE_V4DI): Ditto.
11120         (V16SI_FTYPE_V16SF): Ditto.
11121         (V8DI_FTYPE_PV2DI): Ditto.
11122         (V8DF_FTYPE_PV2DF): Ditto.
11123         (V4DI_FTYPE_PV2DI): Ditto.
11124         (V4DF_FTYPE_PV2DF): Ditto.
11125         (V16SI_FTYPE_PV2SI): Ditto.
11126         (V16SF_FTYPE_PV2SF): Ditto.
11127         (V8SF_FTYPE_FLOAT): Ditto.
11128         (V4SF_FTYPE_FLOAT): Ditto.
11129         (V4DF_FTYPE_DOUBLE): Ditto.
11130         (V8SF_FTYPE_PV4SF): Ditto.
11131         (V8SI_FTYPE_PV4SI): Ditto.
11132         (V4SI_FTYPE_PV2SI): Ditto.
11133         (V8SF_FTYPE_PV2SF): Ditto.
11134         (V8SI_FTYPE_PV2SI): Ditto.
11135         (V16SF_FTYPE_PV8SF): Ditto.
11136         (V16SI_FTYPE_PV8SI): Ditto.
11137         (V8DI_FTYPE_V8SF): Ditto.
11138         (V4DI_FTYPE_V4SF): Ditto.
11139         (V2DI_FTYPE_V4SF): Ditto.
11140         (V64QI_FTYPE_QI): Ditto.
11141         (V32HI_FTYPE_HI): Ditto.
11142         (V16UHI_FTYPE_V16UHI): Ditto.
11143         (V32UHI_FTYPE_V32UHI): Ditto.
11144         (V2UDI_FTYPE_V2UDI): Ditto.
11145         (V4UDI_FTYPE_V4UDI): Ditto.
11146         (V8UDI_FTYPE_V8UDI): Ditto.
11147         (V4USI_FTYPE_V4USI): Ditto.
11148         (V16USI_FTYPE_V16USI): Ditto.
11149         (V2DF_FTYPE_V4DF_INT_V2DF_QI): Ditto.
11150         (V2DF_FTYPE_V8DF_INT): Ditto.
11151         (V2DF_FTYPE_V8DF_INT_V2DF_QI): Ditto.
11152         (V2DI_FTYPE_V2DI_INT_V2DI_QI): Ditto.
11153         (V8DF_FTYPE_V8DF_INT): Ditto.
11154         (V4SF_FTYPE_V8SF_INT_V4SF_QI): Ditto.
11155         (V4SI_FTYPE_V2DF_V4SI_QI): Ditto.
11156         (V4SI_FTYPE_V4SI_INT_V4SI_QI): Ditto.
11157         (V4SI_FTYPE_V8HI_V8HI_V4SI_QI): Ditto.
11158         (V4SI_FTYPE_V8SI_INT_V4SI_QI): Ditto.
11159         (V8HI_FTYPE_V16QI_V16QI_V8HI_QI): Ditto.
11160         (V8DI_FTYPE_V8DI_INT): Ditto.
11161         (V8HI_FTYPE_V8SF_INT_V8HI_QI): Ditto.
11162         (V8HI_FTYPE_V4SF_INT_V8HI_QI): Ditto.
11163         (V8SF_FTYPE_V16SF_INT): Ditto.
11164         (V8SF_FTYPE_V16SF_INT_V8SF_QI): Ditto.
11165         (V64QI_FTYPE_V32HI_V32HI): Ditto.
11166         (V32HI_FTYPE_V16SI_V16SI): Ditto.
11167         (V8DF_FTYPE_V8DF_V2DF_INT): Ditto.
11168         (V8DF_FTYPE_V8DF_V2DF_INT_V8DF_QI): Ditto.
11169         (V8DF_FTYPE_V8DF_V8DF_INT): Ditto.
11170         (V8DF_FTYPE_V8DF_V8DF_INT_V8DF_QI_INT): Ditto.
11171         (V8DF_FTYPE_V8DF_V8DF_V8DI_INT): Ditto.
11172         (V8DF_FTYPE_V8DF_V8DF_V8DI_INT_QI): Ditto.
11173         (V4DF_FTYPE_V4DF_V4DF_V4DI_INT_QI): Ditto.
11174         (V2DF_FTYPE_V2DF_V2DF_V2DI_INT_QI): Ditto.
11175         (V16SF_FTYPE_V16SF_V16SF_INT_V16SF_HI_INT): Ditto.
11176         (V8SF_FTYPE_V8SF_V8SF_V8SI_INT_QI): Ditto.
11177         (V16SF_FTYPE_V16SF_V8SF_INT_V16SF_HI): Ditto.
11178         (V32HI_FTYPE_V64QI_V64QI): Ditto.
11179         (V16HI_FTYPE_V32QI_V32QI_V16HI_HI): Ditto.
11180         (V32HI_FTYPE_V64QI_V64QI_V32HI_SI): Ditto.
11181         (V32HI_FTYPE_V32HI_V32HI): Ditto.
11182         (V32HI_FTYPE_V32HI_INT): Ditto.
11183         (V16SI_FTYPE_V16SI_V8SI_INT_V16SI_HI): Ditto.
11184         (V16SI_FTYPE_V32HI_V32HI): Ditto.
11185         (V8SI_FTYPE_V16HI_V16HI_V8SI_QI): Ditto.
11186         (V16SI_FTYPE_V32HI_V32HI_V16SI_HI): Ditto.
11187         (V8SI_FTYPE_V8SI_INT_V8SI_QI): Ditto.
11188         (V8SI_FTYPE_V16SI_INT): Ditto.
11189         (V8SI_FTYPE_V16SI_INT_V8SI_QI): Ditto.
11190         (V8DI_FTYPE_V8DI_V8DI_INT_V8DI_DI): Ditto.
11191         (V4DI_FTYPE_V4DI_V4DI_INT_V4DI_SI): Ditto.
11192         (V2DI_FTYPE_V2DI_V2DI_INT_V2DI_HI): Ditto.
11193         (V8DI_FTYPE_V8DI_V4DI_INT): Ditto.
11194         (V8DI_FTYPE_V8DI_V2DI_INT): Ditto.
11195         (V8DI_FTYPE_V8DI_V2DI_INT_V8DI_QI): Ditto.
11196         (V8DI_FTYPE_V16SI_V16SI): Ditto.
11197         (V8DI_FTYPE_V64QI_V64QI): Ditto.
11198         (V4DI_FTYPE_V4DI_INT_V4DI_QI): Ditto.
11199         (V2DI_FTYPE_V4DI_INT_V2DI_QI): Ditto.
11200         (V2DI_FTYPE_V8DI_INT): Ditto.
11201         (V2DI_FTYPE_V8DI_INT_V2DI_QI): Ditto.
11202         (QI_FTYPE_QI): Ditto.
11203         (SI_FTYPE_SI): Ditto.
11204         (DI_FTYPE_DI): Ditto.
11205         (HI_FTYPE_V16QI): Ditto.
11206         (SI_FTYPE_V32QI): Ditto.
11207         (DI_FTYPE_V64QI): Ditto.
11208         (QI_FTYPE_V8HI): Ditto.
11209         (HI_FTYPE_V16HI): Ditto.
11210         (SI_FTYPE_V32HI): Ditto.
11211         (QI_FTYPE_V4SI): Ditto.
11212         (QI_FTYPE_V8SI): Ditto.
11213         (HI_FTYPE_V16SI): Ditto.
11214         (QI_FTYPE_V2DI): Ditto.
11215         (QI_FTYPE_V4DI): Ditto.
11216         (QI_FTYPE_V8DI): Ditto.
11217         (V16QI_FTYPE_HI): Ditto.
11218         (V32QI_FTYPE_SI): Ditto.
11219         (V64QI_FTYPE_DI): Ditto.
11220         (V8HI_FTYPE_QI): Ditto.
11221         (V16HI_FTYPE_HI): Ditto.
11222         (V32HI_FTYPE_SI): Ditto.
11223         (V4SI_FTYPE_QI): Ditto.
11224         (V4SI_FTYPE_HI): Ditto.
11225         (V8SI_FTYPE_QI): Ditto.
11226         (V8SI_FTYPE_HI): Ditto.
11227         (V2DI_FTYPE_QI): Ditto.
11228         (V4DI_FTYPE_QI): Ditto.
11229         (QI_FTYPE_QI_QI): Ditto.
11230         (SI_FTYPE_SI_SI): Ditto.
11231         (DI_FTYPE_DI_DI): Ditto.
11232         (QI_FTYPE_QI_INT): Ditto.
11233         (SI_FTYPE_SI_INT): Ditto.
11234         (DI_FTYPE_DI_INT): Ditto.
11235         (HI_FTYPE_V16QI_V16QI): Ditto.
11236         (HI_FTYPE_V16QI_V16QI_HI): Ditto.
11237         (HI_FTYPE_V16QI_V16QI_INT_HI): Ditto.
11238         (SI_FTYPE_V32QI_V32QI): Ditto.
11239         (SI_FTYPE_V32QI_V32QI_SI): Ditto.
11240         (SI_FTYPE_V32QI_V32QI_INT_SI): Ditto.
11241         (DI_FTYPE_V64QI_V64QI): Ditto.
11242         (DI_FTYPE_V64QI_V64QI_DI): Ditto.
11243         (DI_FTYPE_V64QI_V64QI_INT_DI): Ditto.
11244         (QI_FTYPE_V8HI_V8HI): Ditto.
11245         (QI_FTYPE_V8HI_V8HI_QI): Ditto.
11246         (QI_FTYPE_V8HI_V8HI_INT_QI): Ditto.
11247         (HI_FTYPE_V16HI_V16HI): Ditto.
11248         (HI_FTYPE_V16HI_V16HI_HI): Ditto.
11249         (HI_FTYPE_V16HI_V16HI_INT_HI): Ditto.
11250         (SI_FTYPE_V32HI_V32HI): Ditto.
11251         (SI_FTYPE_V32HI_V32HI_SI): Ditto.
11252         (SI_FTYPE_V32HI_V32HI_INT_SI): Ditto.
11253         (QI_FTYPE_V4SI_V4SI): Ditto.
11254         (QI_FTYPE_V4SI_V4SI_QI): Ditto.
11255         (QI_FTYPE_V4SI_V4SI_INT_QI): Ditto.
11256         (QI_FTYPE_V8SI_V8SI): Ditto.
11257         (QI_FTYPE_V8SI_V8SI_QI): Ditto.
11258         (QI_FTYPE_V8SI_V8SI_INT_QI): Ditto.
11259         (QI_FTYPE_V2DI_V2DI): Ditto.
11260         (QI_FTYPE_V2DI_V2DI_QI): Ditto.
11261         (QI_FTYPE_V2DI_V2DI_INT_QI): Ditto.
11262         (QI_FTYPE_V4DI_V4DI): Ditto.
11263         (QI_FTYPE_V4DI_V4DI_QI): Ditto.
11264         (QI_FTYPE_V4DI_V4DI_INT_QI): Ditto.
11265         (V32HI_FTYPE_V32HI_V32HI_V32HI): Ditto.
11266         (V4DF_FTYPE_V4DF_V4DI_INT): Ditto.
11267         (V2DF_FTYPE_V2DI_V2DF_V2DF_QI): Ditto.
11268         (V2DF_FTYPE_V2DF_V2DI_V2DF_QI): Ditto.
11269         (V4DF_FTYPE_V4DF_V2DF_INT_V4DF_QI): Ditto.
11270         (V8DI_FTYPE_V8DI_V8DI_INT): Ditto.
11271         (V4SF_FTYPE_V4SI_V4SF_V4SF_QI): Ditto.
11272         (V4SF_FTYPE_V4SF_V4SI_V4SF_QI): Ditto.
11273         (V4SF_FTYPE_V4SF_V4SF_V4SF_QI): Ditto.
11274         (V4SF_FTYPE_V4SF_V2DF_V4SF_QI): Ditto.
11275         (V8SF_FTYPE_V8SF_V4SF_INT_V8SF_QI): Ditto.
11276         (V8SI_FTYPE_V8SI_V4SI_INT_V8SI_QI): Ditto.
11277         (V4DI_FTYPE_V4DI_V2DI_INT_V4DI_QI): Ditto.
11278         (V2DF_FTYPE_V2DF_V2DF_QI): Ditto.
11279         (V2DF_FTYPE_V4SF_V2DF_QI): Ditto.
11280         (V2DF_FTYPE_V4SI_V2DF_QI): Ditto.
11281         (V4DF_FTYPE_V4DF_V4DF_QI): Ditto.
11282         (V4DF_FTYPE_V4SF_V4DF_QI): Ditto.
11283         (V4DF_FTYPE_V4SI_V4DF_QI): Ditto.
11284         (V2DI_FTYPE_V4SI_V2DI_QI): Ditto.
11285         (V2DI_FTYPE_V8HI_V2DI_QI): Ditto.
11286         (V8DI_FTYPE_V8DF_V8DI_QI): Ditto.
11287         (V4DI_FTYPE_V4DF_V4DI_QI): Ditto.
11288         (V2DI_FTYPE_V2DF_V2DI_QI): Ditto.
11289         (V2DI_FTYPE_V2DI_V2DI_V2DI_QI): Ditto.
11290         (V2DI_FTYPE_V2DI_V2DI_INT_V2DI_QI): Ditto.
11291         (V4DI_FTYPE_V4DI_V4DI_V4DI_QI): Ditto.
11292         (V4DI_FTYPE_V4DI_V4DI_INT_V4DI_QI): Ditto.
11293         (V2DI_FTYPE_V16QI_V2DI_QI): Ditto.
11294         (V4DI_FTYPE_V16QI_V4DI_QI): Ditto.
11295         (V4DI_FTYPE_V4DI_V4DI_QI): Ditto.
11296         (V4DI_FTYPE_V4SI_V4DI_QI): Ditto.
11297         (V4DI_FTYPE_V8HI_V4DI_QI): Ditto.
11298         (V4DF_FTYPE_V4DI_V4DF_V4DF_QI): Ditto.
11299         (V4DF_FTYPE_V4DF_V4DI_V4DF_QI): Ditto.
11300         (V4DF_FTYPE_V4DF_V4DF_V4DF_QI): Ditto.
11301         (V16QI_FTYPE_V16QI_V16QI_V16QI_HI): Ditto.
11302         (V16HI_FTYPE_V16HI_V16HI_V16HI_HI): Ditto.
11303         (V32HI_FTYPE_V32HI_V32HI_V32HI_SI): Ditto.
11304         (V64QI_FTYPE_V64QI_V64QI_V64QI_DI): Ditto.
11305         (V32QI_FTYPE_V32QI_V32QI_V32QI_SI): Ditto.
11306         (V8HI_FTYPE_V8HI_V8HI_V8HI_QI): Ditto.
11307         (V4SF_FTYPE_V4SF_V4SF_QI): Ditto.
11308         (V4SF_FTYPE_V4SI_V4SF_QI): Ditto.
11309         (V8SF_FTYPE_V8SF_V8SF_QI): Ditto.
11310         (V8SF_FTYPE_V8SI_V8SF_QI): Ditto.
11311         (V4SI_FTYPE_V16QI_V4SI_QI): Ditto.
11312         (V4SI_FTYPE_V8HI_V4SI_QI): Ditto.
11313         (V8SI_FTYPE_V8SI_V8SI_QI): Ditto.
11314         (V8SI_FTYPE_V8HI_V8SI_QI): Ditto.
11315         (V8SI_FTYPE_V16QI_V8SI_QI): Ditto.
11316         (V4SI_FTYPE_V4SI_V4SI_V4SI_QI): Ditto.
11317         (V4SI_FTYPE_V4SI_V4SI_INT_V4SI_QI): Ditto.
11318         (V8SF_FTYPE_V8SF_V8SF_V8SF_QI): Ditto.
11319         (V8SF_FTYPE_V8SI_V8SF_V8SF_QI): Ditto.
11320         (V8SF_FTYPE_V8SF_V8SI_V8SF_QI): Ditto.
11321         (V8SI_FTYPE_V8SI_V8SI_V8SI_QI): Ditto.
11322         (V8SI_FTYPE_V8SI_V8SI_INT_V8SI_QI): Ditto.
11323         (V16SF_FTYPE_V8SF_V16SF_HI): Ditto.
11324         (V16SI_FTYPE_V8SI_V16SI_HI): Ditto.
11325         (V4SI_FTYPE_V4DF_V4SI_QI): Ditto.
11326         (V8DI_FTYPE_PCCHAR_V8DI_QI): Ditto.
11327         (V8SF_FTYPE_PCFLOAT_V8SF_QI): Ditto.
11328         (V4SF_FTYPE_PCFLOAT_V4SF_QI): Ditto.
11329         (V4DF_FTYPE_PCDOUBLE_V4DF_QI): Ditto.
11330         (V2DF_FTYPE_PCDOUBLE_V2DF_QI): Ditto.
11331         (V8SI_FTYPE_PCCHAR_V8SI_QI): Ditto.
11332         (V4SI_FTYPE_PCCHAR_V4SI_QI): Ditto.
11333         (V4DI_FTYPE_PCCHAR_V4DI_QI): Ditto.
11334         (V2DI_FTYPE_PCCHAR_V2DI_QI): Ditto.
11335         (V16QI_FTYPE_V16SI_V16QI_HI): Ditto.
11336         (V16QI_FTYPE_V8DI_V16QI_QI): Ditto.
11337         (V32HI_FTYPE_V32HI_V32HI_SI): Ditto.
11338         (V32HI_FTYPE_V64QI_V64QI_INT): Ditto.
11339         (V32HI_FTYPE_V32QI_V32HI_SI): Ditto.
11340         (V16HI_FTYPE_V16HI_V16HI_HI): Ditto.
11341         (V16HI_FTYPE_V32QI_V32QI_INT): Ditto.
11342         (V16HI_FTYPE_V16QI_V16HI_HI): Ditto.
11343         (V8HI_FTYPE_V16QI_V8HI_QI): Ditto.
11344         (V8HI_FTYPE_V16QI_V16QI_INT): Ditto.
11345         (V8SF_FTYPE_V4SF_V8SF_QI): Ditto.
11346         (V4DF_FTYPE_V2DF_V4DF_QI): Ditto.
11347         (V8SI_FTYPE_V4SI_V8SI_QI): Ditto.
11348         (V8SI_FTYPE_SI_V8SI_QI): Ditto.
11349         (V4SI_FTYPE_V4SI_V4SI_QI): Ditto.
11350         (V4SI_FTYPE_SI_V4SI_QI): Ditto.
11351         (V4DI_FTYPE_V2DI_V4DI_QI): Ditto.
11352         (V4DI_FTYPE_DI_V4DI_QI): Ditto.
11353         (V2DI_FTYPE_V2DI_V2DI_QI): Ditto.
11354         (V2DI_FTYPE_DI_V2DI_QI): Ditto.
11355         (V64QI_FTYPE_V64QI_V64QI_DI): Ditto.
11356         (V64QI_FTYPE_V16QI_V64QI_DI): Ditto.
11357         (V64QI_FTYPE_QI_V64QI_DI): Ditto.
11358         (V32QI_FTYPE_V32QI_V32QI_SI): Ditto.
11359         (V32QI_FTYPE_V16QI_V32QI_SI): Ditto.
11360         (V32QI_FTYPE_QI_V32QI_SI): Ditto.
11361         (V16QI_FTYPE_V16QI_V16QI_HI): Ditto.
11362         (V16QI_FTYPE_QI_V16QI_HI): Ditto.
11363         (V32HI_FTYPE_V8HI_V32HI_SI): Ditto.
11364         (V32HI_FTYPE_HI_V32HI_SI): Ditto.
11365         (V16HI_FTYPE_V8HI_V16HI_HI): Ditto.
11366         (V16HI_FTYPE_HI_V16HI_HI): Ditto.
11367         (V8HI_FTYPE_V8HI_V8HI_QI): Ditto.
11368         (V8HI_FTYPE_HI_V8HI_QI): Ditto.
11369         (V64QI_FTYPE_PCV64QI_V64QI_DI): Ditto.
11370         (V32HI_FTYPE_PCV32HI_V32HI_SI): Ditto.
11371         (V32QI_FTYPE_PCV32QI_V32QI_SI): Ditto.
11372         (V16SF_FTYPE_PCV8SF_V16SF_HI): Ditto.
11373         (V16SI_FTYPE_PCV8SI_V16SI_HI): Ditto.
11374         (V16HI_FTYPE_PCV16HI_V16HI_HI): Ditto.
11375         (V16QI_FTYPE_PCV16QI_V16QI_HI): Ditto.
11376         (V8DF_FTYPE_PCV2DF_V8DF_QI): Ditto.
11377         (V8SF_FTYPE_PCV8SF_V8SF_QI): Ditto.
11378         (V8SF_FTYPE_PCV4SF_V8SF_QI): Ditto.
11379         (V8DI_FTYPE_PCV2DI_V8DI_QI): Ditto.
11380         (V8SI_FTYPE_PCV8SI_V8SI_QI): Ditto.
11381         (V8SI_FTYPE_PCV4SI_V8SI_QI): Ditto.
11382         (V8HI_FTYPE_PCV8HI_V8HI_QI): Ditto.
11383         (V4DF_FTYPE_PCV2DF_V4DF_QI): Ditto.
11384         (V4DF_FTYPE_PCV4DF_V4DF_QI): Ditto.
11385         (V4SF_FTYPE_PCV4SF_V4SF_QI): Ditto.
11386         (V4DI_FTYPE_PCV4DI_V4DI_QI): Ditto.
11387         (V4DI_FTYPE_PCV2DI_V4DI_QI): Ditto.
11388         (V4SI_FTYPE_PCV4SI_V4SI_QI): Ditto.
11389         (V2DF_FTYPE_PCV2DF_V2DF_QI): Ditto.
11390         (V2DI_FTYPE_PCV2DI_V2DI_QI): Ditto.
11391         (V16QI_FTYPE_V8HI_V16QI_QI): Ditto.
11392         (V16QI_FTYPE_V16HI_V16QI_HI): Ditto.
11393         (V16QI_FTYPE_V4SI_V16QI_QI): Ditto.
11394         (V16QI_FTYPE_V8SI_V16QI_QI): Ditto.
11395         (V8HI_FTYPE_V4SI_V8HI_QI): Ditto.
11396         (V8HI_FTYPE_V8SI_V8HI_QI): Ditto.
11397         (V16QI_FTYPE_V2DI_V16QI_QI): Ditto.
11398         (V16QI_FTYPE_V4DI_V16QI_QI): Ditto.
11399         (V8HI_FTYPE_V2DI_V8HI_QI): Ditto.
11400         (V8HI_FTYPE_V4DI_V8HI_QI): Ditto.
11401         (V4SI_FTYPE_V2DI_V4SI_QI): Ditto.
11402         (V4SI_FTYPE_V4DI_V4SI_QI): Ditto.
11403         (V32QI_FTYPE_V32HI_V32QI_SI): Ditto.
11404         (V2DF_FTYPE_V2DF_INT_V2DF_QI): Ditto.
11405         (V4DF_FTYPE_V4DF_INT_V4DF_QI): Ditto.
11406         (V4SF_FTYPE_V4SF_INT_V4SF_QI): Ditto.
11407         (V8SF_FTYPE_V8SF_INT_V8SF_QI): Ditto.
11408         (V4DF_FTYPE_V4DF_V4DF_INT_V4DF_QI): Ditto.
11409         (V2DF_FTYPE_V2DF_V2DF_INT_V2DF_QI): Ditto.
11410         (V8SF_FTYPE_V8SF_V8SF_INT_V8SF_QI): Ditto.
11411         (V4SF_FTYPE_V4SF_V4SF_INT_V4SF_QI): Ditto.
11412         (VOID_FTYPE_PV8HI_V4DI_QI): Ditto.
11413         (VOID_FTYPE_PV8HI_V2DI_QI): Ditto.
11414         (VOID_FTYPE_PV4SI_V4DI_QI): Ditto.
11415         (VOID_FTYPE_PV4SI_V2DI_QI): Ditto.
11416         (VOID_FTYPE_PV8HI_V8SI_QI): Ditto.
11417         (VOID_FTYPE_PV8HI_V4SI_QI): Ditto.
11418         (VOID_FTYPE_PV4DF_V4DF_QI): Ditto.
11419         (VOID_FTYPE_PV2DF_V2DF_QI): Ditto.
11420         (VOID_FTYPE_PV8SF_V8SF_QI): Ditto.
11421         (VOID_FTYPE_PV4SF_V4SF_QI): Ditto.
11422         (VOID_FTYPE_PV4DI_V4DI_QI): Ditto.
11423         (VOID_FTYPE_PV2DI_V2DI_QI): Ditto.
11424         (VOID_FTYPE_PV16QI_V8SI_QI): Ditto.
11425         (VOID_FTYPE_PV16QI_V4SI_QI): Ditto.
11426         (VOID_FTYPE_PV16QI_V4DI_QI): Ditto.
11427         (VOID_FTYPE_PV16QI_V2DI_QI): Ditto.
11428         (VOID_FTYPE_PV8SI_V8SI_QI): Ditto.
11429         (VOID_FTYPE_PV4SI_V4SI_QI): Ditto.
11430         (VOID_FTYPE_PV32HI_V32HI_SI): Ditto.
11431         (VOID_FTYPE_PV16HI_V16HI_HI): Ditto.
11432         (VOID_FTYPE_PV8HI_V8HI_QI): Ditto.
11433         (VOID_FTYPE_PV64QI_V64QI_DI): Ditto.
11434         (VOID_FTYPE_PV32QI_V32QI_SI): Ditto.
11435         (VOID_FTYPE_PV16QI_V16QI_HI): Ditto.
11436         (V8SI_FTYPE_V8SF_V8SI_QI): Ditto.
11437         (V4SI_FTYPE_V4SF_V4SI_QI): Ditto.
11438         (V8DI_FTYPE_V8SF_V8DI_QI): Ditto.
11439         (V4DI_FTYPE_V4SF_V4DI_QI): Ditto.
11440         (V2DI_FTYPE_V4SF_V2DI_QI): Ditto.
11441         (V8SF_FTYPE_V8DI_V8SF_QI): Ditto.
11442         (V4SF_FTYPE_V4DI_V4SF_QI): Ditto.
11443         (V4SF_FTYPE_V2DI_V4SF_QI): Ditto.
11444         (V8DF_FTYPE_V8DI_V8DF_QI): Ditto.
11445         (V4DF_FTYPE_V4DI_V4DF_QI): Ditto.
11446         (V2DF_FTYPE_V2DI_V2DF_QI): Ditto.
11447         (V32HI_FTYPE_V32HI_INT_V32HI_SI): Ditto.
11448         (V32HI_FTYPE_V32HI_V8HI_V32HI_SI): Ditto.
11449         (V16HI_FTYPE_V16HI_INT_V16HI_HI): Ditto.
11450         (V16HI_FTYPE_V16HI_V8HI_V16HI_HI): Ditto.
11451         (V8HI_FTYPE_V8HI_INT_V8HI_QI): Ditto.
11452         (V32HI_FTYPE_V64QI_V64QI_INT_V32HI_SI): Ditto.
11453         (V16HI_FTYPE_V32QI_V32QI_INT_V16HI_HI): Ditto.
11454         (V8HI_FTYPE_V16QI_V16QI_INT_V8HI_QI): Ditto.
11455         (V64QI_FTYPE_V32HI_V32HI_V64QI_DI): Ditto.
11456         (V32QI_FTYPE_V16HI_V16HI_V32QI_SI): Ditto.
11457         (V16QI_FTYPE_V8HI_V8HI_V16QI_HI): Ditto.
11458         (V32HI_FTYPE_V16SI_V16SI_V32HI_SI): Ditto.
11459         (V16HI_FTYPE_V8SI_V8SI_V16HI_HI): Ditto.
11460         (V8HI_FTYPE_V4SI_V4SI_V8HI_QI): Ditto.
11461         (V8DI_FTYPE_V16SI_V16SI_V8DI_QI): Ditto.
11462         (V4DI_FTYPE_V8SI_V8SI_V4DI_QI): Ditto.
11463         (V2DI_FTYPE_V4SI_V4SI_V2DI_QI): Ditto.
11464         (V8SI_FTYPE_V8SI_V8SI_V8SI_INT_QI): Ditto.
11465         (V4DI_FTYPE_V4DI_V4DI_V4DI_INT_QI): Ditto.
11466         (V4SI_FTYPE_V4SI_V4SI_V4SI_INT_QI): Ditto.
11467         (V2DI_FTYPE_V2DI_V2DI_V2DI_INT_QI): Ditto.
11468         (V2DF_FTYPE_V2DF_V2DI_V2DF): Ditto.
11469         (V4DF_FTYPE_V4DF_V4DI_V4DF): Ditto.
11470         (V4SF_FTYPE_V4SF_V4SI_V4SF): Ditto.
11471         (V8SF_FTYPE_V8SF_V8SI_V8SF): Ditto.
11472         (V8SI_FTYPE_V8SI_V4SI_V8SI_QI): Ditto.
11473         (V4DI_FTYPE_V4DI_V2DI_V4DI_QI): Ditto.
11474         (QI_FTYPE_V8DF_INT): Ditto.
11475         (QI_FTYPE_V4DF_INT): Ditto.
11476         (QI_FTYPE_V4DF_V4DF_INT_QI): Ditto.
11477         (QI_FTYPE_V2DF_INT): Ditto.
11478         (HI_FTYPE_V16SF_INT): Ditto.
11479         (QI_FTYPE_V8SF_INT): Ditto.
11480         (QI_FTYPE_V8SF_V8SF_INT_QI): Ditto.
11481         (QI_FTYPE_V4SF_INT): Ditto.
11482         (QI_FTYPE_V8DF_INT_QI): Ditto.
11483         (QI_FTYPE_V4DF_INT_QI): Ditto.
11484         (QI_FTYPE_V2DF_INT_QI): Ditto.
11485         (HI_FTYPE_V16SF_INT_HI): Ditto.
11486         (QI_FTYPE_V8SF_INT_QI): Ditto.
11487         (QI_FTYPE_V4SF_INT_QI): Ditto.
11488         (V8DI_FTYPE_V8DF_V8DI_QI_INT): Ditto.
11489         (V8DI_FTYPE_V8SF_V8DI_QI_INT): Ditto.
11490         (V8DF_FTYPE_V8DI_V8DF_QI_INT): Ditto.
11491         (V8SF_FTYPE_V8DI_V8SF_QI_INT): Ditto.
11492         (V2DF_FTYPE_V2DF_PCDOUBLE_V4SI_QI_INT): Ditto.
11493         (V4DF_FTYPE_V4DF_PCDOUBLE_V4SI_QI_INT): Ditto.
11494         (V4DF_FTYPE_V4DF_PCDOUBLE_V8SI_QI_INT): Ditto.
11495         (V2DF_FTYPE_V2DF_PCDOUBLE_V2DI_QI_INT): Ditto.
11496         (V4DF_FTYPE_V4DF_PCDOUBLE_V4DI_QI_INT): Ditto.
11497         (V4SF_FTYPE_V4SF_PCFLOAT_V4SI_QI_INT): Ditto.
11498         (V8SF_FTYPE_V8SF_PCFLOAT_V8SI_QI_INT): Ditto.
11499         (V4SF_FTYPE_V4SF_PCFLOAT_V2DI_QI_INT): Ditto.
11500         (V4SF_FTYPE_V4SF_PCFLOAT_V4DI_QI_INT): Ditto.
11501         (V8SF_FTYPE_V8SF_PCFLOAT_V4DI_QI_INT): Ditto.
11502         (V2DI_FTYPE_V2DI_PCINT64_V4SI_QI_INT): Ditto.
11503         (V4DI_FTYPE_V4DI_PCINT64_V4SI_QI_INT): Ditto.
11504         (V4DI_FTYPE_V4DI_PCINT64_V8SI_QI_INT): Ditto.
11505         (V2DI_FTYPE_V2DI_PCINT64_V2DI_QI_INT): Ditto.
11506         (V4DI_FTYPE_V4DI_PCINT64_V4DI_QI_INT): Ditto.
11507         (V4SI_FTYPE_V4SI_PCINT_V4SI_QI_INT): Ditto.
11508         (V8SI_FTYPE_V8SI_PCINT_V8SI_QI_INT): Ditto.
11509         (V4SI_FTYPE_V4SI_PCINT_V2DI_QI_INT): Ditto.
11510         (V4SI_FTYPE_V4SI_PCINT_V4DI_QI_INT): Ditto.
11511         (V8SI_FTYPE_V8SI_PCINT_V4DI_QI_INT): Ditto.
11512         (VOID_FTYPE_PFLOAT_QI_V8SI_V8SF_INT): Ditto.
11513         (VOID_FTYPE_PFLOAT_QI_V4SI_V4SF_INT): Ditto.
11514         (VOID_FTYPE_PDOUBLE_QI_V4SI_V4DF_INT): Ditto.
11515         (VOID_FTYPE_PDOUBLE_QI_V4SI_V2DF_INT): Ditto.
11516         (VOID_FTYPE_PFLOAT_QI_V4DI_V4SF_INT): Ditto.
11517         (VOID_FTYPE_PFLOAT_QI_V2DI_V4SF_INT): Ditto.
11518         (VOID_FTYPE_PDOUBLE_QI_V4DI_V4DF_INT): Ditto.
11519         (VOID_FTYPE_PDOUBLE_QI_V2DI_V2DF_INT): Ditto.
11520         (VOID_FTYPE_PINT_QI_V8SI_V8SI_INT): Ditto.
11521         (VOID_FTYPE_PINT_QI_V4SI_V4SI_INT): Ditto.
11522         (VOID_FTYPE_PLONGLONG_QI_V4SI_V4DI_INT): Ditto.
11523         (VOID_FTYPE_PLONGLONG_QI_V4SI_V2DI_INT): Ditto.
11524         (VOID_FTYPE_PINT_QI_V4DI_V4SI_INT): Ditto.
11525         (VOID_FTYPE_PINT_QI_V2DI_V4SI_INT): Ditto.
11526         (VOID_FTYPE_PLONGLONG_QI_V4DI_V4DI_INT): Ditto.
11527         (VOID_FTYPE_PLONGLONG_QI_V2DI_V2DI_INT): Ditto.
11528         (V8DI_FTYPE_V8DI_INT): Ditto.
11529         (V8DI_FTYPE_V8DI_V8DI_INT): Ditto.
11530         (V8DI_FTYPE_V8DI_V8DI_INT_V8DI_DI): Ditto.
11531         (V4DI_FTYPE_V4DI_V4DI_INT_V4DI_SI): Ditto.
11532         (V2DI_FTYPE_V2DI_V2DI_INT_V2DI_HI): Ditto.
11533         (V2DF_FTYPE_ V2DF_ V2DF_ V2DI_ INT_ QI): Remove.
11534         (V4SF_FTYPE_ V4SF_ V2DF_ V4SF_ QI): Ditto.
11535         (V4SF_FTYPE_ V4SF_ V4SF_ V4SF_ QI): Ditto.
11536         (V2DF_FTYPE_ PCDOUBLE_ V2DF_ QI): Ditto.
11537         (V4SF_FTYPE_ PCFLOAT_ V4SF_ QI): Ditto.
11538         (V16QI_FTYPE_ V16SI_ V16QI_ HI): Ditto.
11539         (V16QI_FTYPE_ V8DI_ V16QI_ QI): Ditto.
11540         (V4SF_FTYPE_ V4SF_ V4SF_ INT_ V4SF_ QI): Ditto.
11541         (V2DF_FTYPE_ V2DF_ V2DF_ INT_ V2DF_ QI): Ditto.
11542         (V8DI_FTYPE_ V16SI_ V16SI_ V8DI_ QI): Ditto.
11543         * config/i386/i386.c (ix86_builtins):
11544         Add IX86_BUILTIN_PMOVUSQD256_MEM, IX86_BUILTIN_PMOVUSQD128_MEM,
11545         IX86_BUILTIN_PMOVSQD256_MEM, IX86_BUILTIN_PMOVSQD128_MEM,
11546         IX86_BUILTIN_PMOVQD256_MEM, IX86_BUILTIN_PMOVQD128_MEM,
11547         IX86_BUILTIN_PMOVUSQW256_MEM, IX86_BUILTIN_PMOVUSQW128_MEM,
11548         IX86_BUILTIN_PMOVSQW256_MEM, IX86_BUILTIN_PMOVSQW128_MEM,
11549         IX86_BUILTIN_PMOVQW256_MEM, IX86_BUILTIN_PMOVQW128_MEM,
11550         IX86_BUILTIN_PMOVUSQB256_MEM, IX86_BUILTIN_PMOVUSQB128_MEM,
11551         IX86_BUILTIN_PMOVSQB256_MEM, IX86_BUILTIN_PMOVSQB128_MEM,
11552         IX86_BUILTIN_PMOVQB256_MEM, IX86_BUILTIN_PMOVQB128_MEM,
11553         IX86_BUILTIN_PMOVUSDW256_MEM, IX86_BUILTIN_PMOVUSDW128_MEM,
11554         IX86_BUILTIN_PMOVSDW256_MEM, IX86_BUILTIN_PMOVSDW128_MEM,
11555         IX86_BUILTIN_PMOVDW256_MEM, IX86_BUILTIN_PMOVDW128_MEM,
11556         IX86_BUILTIN_PMOVUSDB256_MEM, IX86_BUILTIN_PMOVUSDB128_MEM,
11557         IX86_BUILTIN_PMOVSDB256_MEM, IX86_BUILTIN_PMOVSDB128_MEM,
11558         IX86_BUILTIN_PMOVDB256_MEM, IX86_BUILTIN_PMOVDB128_MEM,
11559         IX86_BUILTIN_MOVDQA64LOAD256_MASK, IX86_BUILTIN_MOVDQA64LOAD128_MASK,
11560         IX86_BUILTIN_MOVDQA32LOAD256_MASK, IX86_BUILTIN_MOVDQA32LOAD128_MASK,
11561         IX86_BUILTIN_MOVDQA64STORE256_MASK, IX86_BUILTIN_MOVDQA64STORE128_MASK,
11562         IX86_BUILTIN_MOVDQA32STORE256_MASK, IX86_BUILTIN_MOVDQA32STORE128_MASK,
11563         IX86_BUILTIN_LOADAPD256_MASK, IX86_BUILTIN_LOADAPD128_MASK,
11564         IX86_BUILTIN_LOADAPS256_MASK, IX86_BUILTIN_LOADAPS128_MASK,
11565         IX86_BUILTIN_STOREAPD256_MASK, IX86_BUILTIN_STOREAPD128_MASK,
11566         IX86_BUILTIN_STOREAPS256_MASK, IX86_BUILTIN_STOREAPS128_MASK,
11567         IX86_BUILTIN_LOADUPD256_MASK, IX86_BUILTIN_LOADUPD128_MASK,
11568         IX86_BUILTIN_LOADUPS256_MASK, IX86_BUILTIN_LOADUPS128_MASK,
11569         IX86_BUILTIN_STOREUPD256_MASK, IX86_BUILTIN_STOREUPD128_MASK,
11570         IX86_BUILTIN_STOREUPS256_MASK, IX86_BUILTIN_STOREUPS128_MASK,
11571         IX86_BUILTIN_LOADDQUDI256_MASK, IX86_BUILTIN_LOADDQUDI128_MASK,
11572         IX86_BUILTIN_LOADDQUSI256_MASK, IX86_BUILTIN_LOADDQUSI128_MASK,
11573         IX86_BUILTIN_LOADDQUHI256_MASK, IX86_BUILTIN_LOADDQUHI128_MASK,
11574         IX86_BUILTIN_LOADDQUQI256_MASK, IX86_BUILTIN_LOADDQUQI128_MASK,
11575         IX86_BUILTIN_STOREDQUDI256_MASK, IX86_BUILTIN_STOREDQUDI128_MASK,
11576         IX86_BUILTIN_STOREDQUSI256_MASK, IX86_BUILTIN_STOREDQUSI128_MASK,
11577         IX86_BUILTIN_STOREDQUHI256_MASK, IX86_BUILTIN_STOREDQUHI128_MASK,
11578         IX86_BUILTIN_STOREDQUQI256_MASK, IX86_BUILTIN_STOREDQUQI128_MASK,
11579         IX86_BUILTIN_COMPRESSPDSTORE256, IX86_BUILTIN_COMPRESSPDSTORE128,
11580         IX86_BUILTIN_COMPRESSPSSTORE256, IX86_BUILTIN_COMPRESSPSSTORE128,
11581         IX86_BUILTIN_PCOMPRESSQSTORE256, IX86_BUILTIN_PCOMPRESSQSTORE128,
11582         IX86_BUILTIN_PCOMPRESSDSTORE256, IX86_BUILTIN_PCOMPRESSDSTORE128,
11583         IX86_BUILTIN_EXPANDPDLOAD256, IX86_BUILTIN_EXPANDPDLOAD128,
11584         IX86_BUILTIN_EXPANDPSLOAD256, IX86_BUILTIN_EXPANDPSLOAD128,
11585         IX86_BUILTIN_PEXPANDQLOAD256, IX86_BUILTIN_PEXPANDQLOAD128,
11586         IX86_BUILTIN_PEXPANDDLOAD256, IX86_BUILTIN_PEXPANDDLOAD128,
11587         IX86_BUILTIN_EXPANDPDLOAD256Z, IX86_BUILTIN_EXPANDPDLOAD128Z,
11588         IX86_BUILTIN_EXPANDPSLOAD256Z, IX86_BUILTIN_EXPANDPSLOAD128Z,
11589         IX86_BUILTIN_PEXPANDQLOAD256Z, IX86_BUILTIN_PEXPANDQLOAD128Z,
11590         IX86_BUILTIN_PEXPANDDLOAD256Z, IX86_BUILTIN_PEXPANDDLOAD128Z,
11591         IX86_BUILTIN_PALIGNR256_MASK, IX86_BUILTIN_PALIGNR128_MASK,
11592         IX86_BUILTIN_MOVDQA64_256_MASK, IX86_BUILTIN_MOVDQA64_128_MASK,
11593         IX86_BUILTIN_MOVDQA32_256_MASK, IX86_BUILTIN_MOVDQA32_128_MASK,
11594         IX86_BUILTIN_MOVAPD256_MASK, IX86_BUILTIN_MOVAPD128_MASK,
11595         IX86_BUILTIN_MOVAPS256_MASK, IX86_BUILTIN_MOVAPS128_MASK,
11596         IX86_BUILTIN_MOVDQUHI256_MASK, IX86_BUILTIN_MOVDQUHI128_MASK,
11597         IX86_BUILTIN_MOVDQUQI256_MASK, IX86_BUILTIN_MOVDQUQI128_MASK,
11598         IX86_BUILTIN_MINPS128_MASK, IX86_BUILTIN_MAXPS128_MASK,
11599         IX86_BUILTIN_MINPD128_MASK, IX86_BUILTIN_MAXPD128_MASK,
11600         IX86_BUILTIN_MAXPD256_MASK, IX86_BUILTIN_MAXPS256_MASK,
11601         IX86_BUILTIN_MINPD256_MASK, IX86_BUILTIN_MINPS256_MASK,
11602         IX86_BUILTIN_MULPS128_MASK, IX86_BUILTIN_DIVPS128_MASK,
11603         IX86_BUILTIN_MULPD128_MASK, IX86_BUILTIN_DIVPD128_MASK,
11604         IX86_BUILTIN_DIVPD256_MASK, IX86_BUILTIN_DIVPS256_MASK,
11605         IX86_BUILTIN_MULPD256_MASK, IX86_BUILTIN_MULPS256_MASK,
11606         IX86_BUILTIN_ADDPD128_MASK, IX86_BUILTIN_ADDPD256_MASK,
11607         IX86_BUILTIN_ADDPS128_MASK, IX86_BUILTIN_ADDPS256_MASK,
11608         IX86_BUILTIN_SUBPD128_MASK, IX86_BUILTIN_SUBPD256_MASK,
11609         IX86_BUILTIN_SUBPS128_MASK, IX86_BUILTIN_SUBPS256_MASK,
11610         IX86_BUILTIN_XORPD256_MASK, IX86_BUILTIN_XORPD128_MASK,
11611         IX86_BUILTIN_XORPS256_MASK, IX86_BUILTIN_XORPS128_MASK,
11612         IX86_BUILTIN_ORPD256_MASK, IX86_BUILTIN_ORPD128_MASK,
11613         IX86_BUILTIN_ORPS256_MASK, IX86_BUILTIN_ORPS128_MASK,
11614         IX86_BUILTIN_BROADCASTF32x2_256, IX86_BUILTIN_BROADCASTI32x2_256,
11615         IX86_BUILTIN_BROADCASTI32x2_128, IX86_BUILTIN_BROADCASTF64X2_256,
11616         IX86_BUILTIN_BROADCASTI64X2_256, IX86_BUILTIN_BROADCASTF32X4_256,
11617         IX86_BUILTIN_BROADCASTI32X4_256, IX86_BUILTIN_EXTRACTF32X4_256,
11618         IX86_BUILTIN_EXTRACTI32X4_256, IX86_BUILTIN_DBPSADBW256,
11619         IX86_BUILTIN_DBPSADBW128, IX86_BUILTIN_CVTTPD2QQ256,
11620         IX86_BUILTIN_CVTTPD2QQ128, IX86_BUILTIN_CVTTPD2UQQ256,
11621         IX86_BUILTIN_CVTTPD2UQQ128, IX86_BUILTIN_CVTPD2QQ256,
11622         IX86_BUILTIN_CVTPD2QQ128, IX86_BUILTIN_CVTPD2UQQ256,
11623         IX86_BUILTIN_CVTPD2UQQ128, IX86_BUILTIN_CVTPD2UDQ256_MASK,
11624         IX86_BUILTIN_CVTPD2UDQ128_MASK, IX86_BUILTIN_CVTTPS2QQ256,
11625         IX86_BUILTIN_CVTTPS2QQ128, IX86_BUILTIN_CVTTPS2UQQ256,
11626         IX86_BUILTIN_CVTTPS2UQQ128, IX86_BUILTIN_CVTTPS2DQ256_MASK,
11627         IX86_BUILTIN_CVTTPS2DQ128_MASK, IX86_BUILTIN_CVTTPS2UDQ256,
11628         IX86_BUILTIN_CVTTPS2UDQ128, IX86_BUILTIN_CVTTPD2DQ256_MASK,
11629         IX86_BUILTIN_CVTTPD2DQ128_MASK, IX86_BUILTIN_CVTTPD2UDQ256_MASK,
11630         IX86_BUILTIN_CVTTPD2UDQ128_MASK, IX86_BUILTIN_CVTPD2DQ256_MASK,
11631         IX86_BUILTIN_CVTPD2DQ128_MASK, IX86_BUILTIN_CVTDQ2PD256_MASK,
11632         IX86_BUILTIN_CVTDQ2PD128_MASK, IX86_BUILTIN_CVTUDQ2PD256_MASK,
11633         IX86_BUILTIN_CVTUDQ2PD128_MASK, IX86_BUILTIN_CVTDQ2PS256_MASK,
11634         IX86_BUILTIN_CVTDQ2PS128_MASK, IX86_BUILTIN_CVTUDQ2PS256_MASK,
11635         IX86_BUILTIN_CVTUDQ2PS128_MASK, IX86_BUILTIN_CVTPS2PD256_MASK,
11636         IX86_BUILTIN_CVTPS2PD128_MASK, IX86_BUILTIN_PBROADCASTB256_MASK,
11637         IX86_BUILTIN_PBROADCASTB256_GPR_MASK, IX86_BUILTIN_PBROADCASTB128_MASK,
11638         IX86_BUILTIN_PBROADCASTB128_GPR_MASK, IX86_BUILTIN_PBROADCASTW256_MASK,
11639         IX86_BUILTIN_PBROADCASTW256_GPR_MASK, IX86_BUILTIN_PBROADCASTW128_MASK,
11640         IX86_BUILTIN_PBROADCASTW128_GPR_MASK, IX86_BUILTIN_PBROADCASTD256_MASK,
11641         IX86_BUILTIN_PBROADCASTD256_GPR_MASK, IX86_BUILTIN_PBROADCASTD128_MASK,
11642         IX86_BUILTIN_PBROADCASTD128_GPR_MASK, IX86_BUILTIN_PBROADCASTQ256_MASK,
11643         IX86_BUILTIN_PBROADCASTQ256_GPR_MASK, IX86_BUILTIN_PBROADCASTQ256_MEM_MASK,
11644         IX86_BUILTIN_PBROADCASTQ128_MASK, IX86_BUILTIN_PBROADCASTQ128_GPR_MASK,
11645         IX86_BUILTIN_PBROADCASTQ128_MEM_MASK, IX86_BUILTIN_BROADCASTSS256,
11646         IX86_BUILTIN_BROADCASTSS128, IX86_BUILTIN_BROADCASTSD256,
11647         IX86_BUILTIN_EXTRACTF64X2_256, IX86_BUILTIN_EXTRACTI64X2_256,
11648         IX86_BUILTIN_INSERTF32X4_256, IX86_BUILTIN_INSERTI32X4_256,
11649         IX86_BUILTIN_PMOVSXBW256_MASK, IX86_BUILTIN_PMOVSXBW128_MASK,
11650         IX86_BUILTIN_PMOVSXBD256_MASK, IX86_BUILTIN_PMOVSXBD128_MASK,
11651         IX86_BUILTIN_PMOVSXBQ256_MASK, IX86_BUILTIN_PMOVSXBQ128_MASK,
11652         IX86_BUILTIN_PMOVSXWD256_MASK, IX86_BUILTIN_PMOVSXWD128_MASK,
11653         IX86_BUILTIN_PMOVSXWQ256_MASK, IX86_BUILTIN_PMOVSXWQ128_MASK,
11654         IX86_BUILTIN_PMOVSXDQ256_MASK, IX86_BUILTIN_PMOVSXDQ128_MASK,
11655         IX86_BUILTIN_PMOVZXBW256_MASK, IX86_BUILTIN_PMOVZXBW128_MASK,
11656         IX86_BUILTIN_PMOVZXBD256_MASK, IX86_BUILTIN_PMOVZXBD128_MASK,
11657         IX86_BUILTIN_PMOVZXBQ256_MASK, IX86_BUILTIN_PMOVZXBQ128_MASK,
11658         IX86_BUILTIN_PMOVZXWD256_MASK, IX86_BUILTIN_PMOVZXWD128_MASK,
11659         IX86_BUILTIN_PMOVZXWQ256_MASK, IX86_BUILTIN_PMOVZXWQ128_MASK,
11660         IX86_BUILTIN_PMOVZXDQ256_MASK, IX86_BUILTIN_PMOVZXDQ128_MASK,
11661         IX86_BUILTIN_REDUCEPD256_MASK, IX86_BUILTIN_REDUCEPD128_MASK,
11662         IX86_BUILTIN_REDUCEPS256_MASK, IX86_BUILTIN_REDUCEPS128_MASK,
11663         IX86_BUILTIN_REDUCESD_MASK, IX86_BUILTIN_REDUCESS_MASK,
11664         IX86_BUILTIN_VPERMVARHI256_MASK, IX86_BUILTIN_VPERMVARHI128_MASK,
11665         IX86_BUILTIN_VPERMT2VARHI256, IX86_BUILTIN_VPERMT2VARHI256_MASKZ,
11666         IX86_BUILTIN_VPERMT2VARHI128, IX86_BUILTIN_VPERMT2VARHI128_MASKZ,
11667         IX86_BUILTIN_VPERMI2VARHI256, IX86_BUILTIN_VPERMI2VARHI128,
11668         IX86_BUILTIN_RCP14PD256, IX86_BUILTIN_RCP14PD128,
11669         IX86_BUILTIN_RCP14PS256, IX86_BUILTIN_RCP14PS128,
11670         IX86_BUILTIN_RSQRT14PD256_MASK, IX86_BUILTIN_RSQRT14PD128_MASK,
11671         IX86_BUILTIN_RSQRT14PS256_MASK, IX86_BUILTIN_RSQRT14PS128_MASK,
11672         IX86_BUILTIN_SQRTPD256_MASK, IX86_BUILTIN_SQRTPD128_MASK,
11673         IX86_BUILTIN_SQRTPS256_MASK, IX86_BUILTIN_SQRTPS128_MASK,
11674         IX86_BUILTIN_PADDB128_MASK, IX86_BUILTIN_PADDW128_MASK,
11675         IX86_BUILTIN_PADDD128_MASK, IX86_BUILTIN_PADDQ128_MASK,
11676         IX86_BUILTIN_PSUBB128_MASK, IX86_BUILTIN_PSUBW128_MASK,
11677         IX86_BUILTIN_PSUBD128_MASK, IX86_BUILTIN_PSUBQ128_MASK,
11678         IX86_BUILTIN_PADDSB128_MASK, IX86_BUILTIN_PADDSW128_MASK,
11679         IX86_BUILTIN_PSUBSB128_MASK, IX86_BUILTIN_PSUBSW128_MASK,
11680         IX86_BUILTIN_PADDUSB128_MASK, IX86_BUILTIN_PADDUSW128_MASK,
11681         IX86_BUILTIN_PSUBUSB128_MASK, IX86_BUILTIN_PSUBUSW128_MASK,
11682         IX86_BUILTIN_PADDB256_MASK, IX86_BUILTIN_PADDW256_MASK,
11683         IX86_BUILTIN_PADDD256_MASK, IX86_BUILTIN_PADDQ256_MASK,
11684         IX86_BUILTIN_PADDSB256_MASK, IX86_BUILTIN_PADDSW256_MASK,
11685         IX86_BUILTIN_PADDUSB256_MASK, IX86_BUILTIN_PADDUSW256_MASK,
11686         IX86_BUILTIN_PSUBB256_MASK, IX86_BUILTIN_PSUBW256_MASK,
11687         IX86_BUILTIN_PSUBD256_MASK, IX86_BUILTIN_PSUBQ256_MASK,
11688         IX86_BUILTIN_PSUBSB256_MASK, IX86_BUILTIN_PSUBSW256_MASK,
11689         IX86_BUILTIN_PSUBUSB256_MASK, IX86_BUILTIN_PSUBUSW256_MASK,
11690         IX86_BUILTIN_SHUF_F64x2_256, IX86_BUILTIN_SHUF_I64x2_256,
11691         IX86_BUILTIN_SHUF_I32x4_256, IX86_BUILTIN_SHUF_F32x4_256,
11692         IX86_BUILTIN_PMOVWB128, IX86_BUILTIN_PMOVWB256,
11693         IX86_BUILTIN_PMOVSWB128, IX86_BUILTIN_PMOVSWB256,
11694         IX86_BUILTIN_PMOVUSWB128, IX86_BUILTIN_PMOVUSWB256,
11695         IX86_BUILTIN_PMOVDB128, IX86_BUILTIN_PMOVDB256,
11696         IX86_BUILTIN_PMOVSDB128, IX86_BUILTIN_PMOVSDB256,
11697         IX86_BUILTIN_PMOVUSDB128, IX86_BUILTIN_PMOVUSDB256,
11698         IX86_BUILTIN_PMOVDW128, IX86_BUILTIN_PMOVDW256,
11699         IX86_BUILTIN_PMOVSDW128, IX86_BUILTIN_PMOVSDW256,
11700         IX86_BUILTIN_PMOVUSDW128, IX86_BUILTIN_PMOVUSDW256,
11701         IX86_BUILTIN_PMOVQB128, IX86_BUILTIN_PMOVQB256,
11702         IX86_BUILTIN_PMOVSQB128, IX86_BUILTIN_PMOVSQB256,
11703         IX86_BUILTIN_PMOVUSQB128, IX86_BUILTIN_PMOVUSQB256,
11704         IX86_BUILTIN_PMOVQW128, IX86_BUILTIN_PMOVQW256,
11705         IX86_BUILTIN_PMOVSQW128, IX86_BUILTIN_PMOVSQW256,
11706         IX86_BUILTIN_PMOVUSQW128, IX86_BUILTIN_PMOVUSQW256,
11707         IX86_BUILTIN_PMOVQD128, IX86_BUILTIN_PMOVQD256,
11708         IX86_BUILTIN_PMOVSQD128, IX86_BUILTIN_PMOVSQD256,
11709         IX86_BUILTIN_PMOVUSQD128, IX86_BUILTIN_PMOVUSQD256,
11710         IX86_BUILTIN_RANGEPD256, IX86_BUILTIN_RANGEPD128,
11711         IX86_BUILTIN_RANGEPS256, IX86_BUILTIN_RANGEPS128,
11712         IX86_BUILTIN_GETEXPPS256, IX86_BUILTIN_GETEXPPD256,
11713         IX86_BUILTIN_GETEXPPS128, IX86_BUILTIN_GETEXPPD128,
11714         IX86_BUILTIN_FIXUPIMMPD256_MASK, IX86_BUILTIN_FIXUPIMMPD256_MASKZ,
11715         IX86_BUILTIN_FIXUPIMMPS256_MASK, IX86_BUILTIN_FIXUPIMMPS256_MASKZ,
11716         IX86_BUILTIN_FIXUPIMMPD128_MASK, IX86_BUILTIN_FIXUPIMMPD128_MASKZ,
11717         IX86_BUILTIN_FIXUPIMMPS128_MASK, IX86_BUILTIN_FIXUPIMMPS128_MASKZ,
11718         IX86_BUILTIN_PABSQ256, IX86_BUILTIN_PABSQ128,
11719         IX86_BUILTIN_PABSD256_MASK, IX86_BUILTIN_PABSD128_MASK,
11720         IX86_BUILTIN_PMULHRSW256_MASK, IX86_BUILTIN_PMULHRSW128_MASK,
11721         IX86_BUILTIN_PMULHUW128_MASK, IX86_BUILTIN_PMULHUW256_MASK,
11722         IX86_BUILTIN_PMULHW256_MASK, IX86_BUILTIN_PMULHW128_MASK,
11723         IX86_BUILTIN_PMULLW256_MASK, IX86_BUILTIN_PMULLW128_MASK,
11724         IX86_BUILTIN_PMULLQ256, IX86_BUILTIN_PMULLQ128,
11725         IX86_BUILTIN_ANDPD256_MASK, IX86_BUILTIN_ANDPD128_MASK,
11726         IX86_BUILTIN_ANDPS256_MASK, IX86_BUILTIN_ANDPS128_MASK,
11727         IX86_BUILTIN_ANDNPD256_MASK, IX86_BUILTIN_ANDNPD128_MASK,
11728         IX86_BUILTIN_ANDNPS256_MASK, IX86_BUILTIN_ANDNPS128_MASK,
11729         IX86_BUILTIN_PSLLWI128_MASK, IX86_BUILTIN_PSLLDI128_MASK,
11730         IX86_BUILTIN_PSLLQI128_MASK, IX86_BUILTIN_PSLLW128_MASK,
11731         IX86_BUILTIN_PSLLD128_MASK, IX86_BUILTIN_PSLLQ128_MASK,
11732         IX86_BUILTIN_PSLLWI256_MASK , IX86_BUILTIN_PSLLW256_MASK,
11733         IX86_BUILTIN_PSLLDI256_MASK, IX86_BUILTIN_PSLLD256_MASK,
11734         IX86_BUILTIN_PSLLQI256_MASK, IX86_BUILTIN_PSLLQ256_MASK,
11735         IX86_BUILTIN_PSRADI128_MASK, IX86_BUILTIN_PSRAD128_MASK,
11736         IX86_BUILTIN_PSRADI256_MASK, IX86_BUILTIN_PSRAD256_MASK,
11737         IX86_BUILTIN_PSRAQI128_MASK, IX86_BUILTIN_PSRAQ128_MASK,
11738         IX86_BUILTIN_PSRAQI256_MASK, IX86_BUILTIN_PSRAQ256_MASK,
11739         IX86_BUILTIN_PANDD256, IX86_BUILTIN_PANDD128,
11740         IX86_BUILTIN_PSRLDI128_MASK, IX86_BUILTIN_PSRLD128_MASK,
11741         IX86_BUILTIN_PSRLDI256_MASK, IX86_BUILTIN_PSRLD256_MASK,
11742         IX86_BUILTIN_PSRLQI128_MASK, IX86_BUILTIN_PSRLQ128_MASK,
11743         IX86_BUILTIN_PSRLQI256_MASK, IX86_BUILTIN_PSRLQ256_MASK,
11744         IX86_BUILTIN_PANDQ256, IX86_BUILTIN_PANDQ128,
11745         IX86_BUILTIN_PANDND256, IX86_BUILTIN_PANDND128,
11746         IX86_BUILTIN_PANDNQ256, IX86_BUILTIN_PANDNQ128,
11747         IX86_BUILTIN_PORD256, IX86_BUILTIN_PORD128,
11748         IX86_BUILTIN_PORQ256, IX86_BUILTIN_PORQ128,
11749         IX86_BUILTIN_PXORD256, IX86_BUILTIN_PXORD128,
11750         IX86_BUILTIN_PXORQ256, IX86_BUILTIN_PXORQ128,
11751         IX86_BUILTIN_PACKSSWB256_MASK, IX86_BUILTIN_PACKSSWB128_MASK,
11752         IX86_BUILTIN_PACKUSWB256_MASK, IX86_BUILTIN_PACKUSWB128_MASK,
11753         IX86_BUILTIN_RNDSCALEPS256, IX86_BUILTIN_RNDSCALEPD256,
11754         IX86_BUILTIN_RNDSCALEPS128, IX86_BUILTIN_RNDSCALEPD128,
11755         IX86_BUILTIN_VTERNLOGQ256_MASK, IX86_BUILTIN_VTERNLOGQ256_MASKZ,
11756         IX86_BUILTIN_VTERNLOGD256_MASK, IX86_BUILTIN_VTERNLOGD256_MASKZ,
11757         IX86_BUILTIN_VTERNLOGQ128_MASK, IX86_BUILTIN_VTERNLOGQ128_MASKZ,
11758         IX86_BUILTIN_VTERNLOGD128_MASK, IX86_BUILTIN_VTERNLOGD128_MASKZ,
11759         IX86_BUILTIN_SCALEFPD256, IX86_BUILTIN_SCALEFPS256,
11760         IX86_BUILTIN_SCALEFPD128, IX86_BUILTIN_SCALEFPS128,
11761         IX86_BUILTIN_VFMADDPD256_MASK, IX86_BUILTIN_VFMADDPD256_MASK3,
11762         IX86_BUILTIN_VFMADDPD256_MASKZ, IX86_BUILTIN_VFMADDPD128_MASK,
11763         IX86_BUILTIN_VFMADDPD128_MASK3, IX86_BUILTIN_VFMADDPD128_MASKZ,
11764         IX86_BUILTIN_VFMADDPS256_MASK, IX86_BUILTIN_VFMADDPS256_MASK3,
11765         IX86_BUILTIN_VFMADDPS256_MASKZ, IX86_BUILTIN_VFMADDPS128_MASK,
11766         IX86_BUILTIN_VFMADDPS128_MASK3, IX86_BUILTIN_VFMADDPS128_MASKZ,
11767         IX86_BUILTIN_VFMSUBPD256_MASK3, IX86_BUILTIN_VFMSUBPD128_MASK3,
11768         IX86_BUILTIN_VFMSUBPS256_MASK3, IX86_BUILTIN_VFMSUBPS128_MASK3,
11769         IX86_BUILTIN_VFNMADDPD256_MASK, IX86_BUILTIN_VFNMADDPD128_MASK,
11770         IX86_BUILTIN_VFNMADDPS256_MASK, IX86_BUILTIN_VFNMADDPS128_MASK,
11771         IX86_BUILTIN_VFNMSUBPD256_MASK, IX86_BUILTIN_VFNMSUBPD256_MASK3,
11772         IX86_BUILTIN_VFNMSUBPD128_MASK, IX86_BUILTIN_VFNMSUBPD128_MASK3,
11773         IX86_BUILTIN_VFNMSUBPS256_MASK, IX86_BUILTIN_VFNMSUBPS256_MASK3,
11774         IX86_BUILTIN_VFNMSUBPS128_MASK, IX86_BUILTIN_VFNMSUBPS128_MASK3,
11775         IX86_BUILTIN_VFMADDSUBPD256_MASK, IX86_BUILTIN_VFMADDSUBPD256_MASK3,
11776         IX86_BUILTIN_VFMADDSUBPD256_MASKZ, IX86_BUILTIN_VFMADDSUBPD128_MASK,
11777         IX86_BUILTIN_VFMADDSUBPD128_MASK3, IX86_BUILTIN_VFMADDSUBPD128_MASKZ,
11778         IX86_BUILTIN_VFMADDSUBPS256_MASK, IX86_BUILTIN_VFMADDSUBPS256_MASK3,
11779         IX86_BUILTIN_VFMADDSUBPS256_MASKZ, IX86_BUILTIN_VFMADDSUBPS128_MASK,
11780         IX86_BUILTIN_VFMADDSUBPS128_MASK3, IX86_BUILTIN_VFMADDSUBPS128_MASKZ,
11781         IX86_BUILTIN_VFMSUBADDPD256_MASK3, IX86_BUILTIN_VFMSUBADDPD128_MASK3,
11782         IX86_BUILTIN_VFMSUBADDPS256_MASK3, IX86_BUILTIN_VFMSUBADDPS128_MASK3,
11783         IX86_BUILTIN_INSERTF64X2_256, IX86_BUILTIN_INSERTI64X2_256,
11784         IX86_BUILTIN_PSRAVV16HI, IX86_BUILTIN_PSRAVV8HI,
11785         IX86_BUILTIN_PMADDUBSW256_MASK, IX86_BUILTIN_PMADDUBSW128_MASK,
11786         IX86_BUILTIN_PMADDWD256_MASK, IX86_BUILTIN_PMADDWD128_MASK,
11787         IX86_BUILTIN_PSRLVV16HI, IX86_BUILTIN_PSRLVV8HI,
11788         IX86_BUILTIN_CVTPS2DQ256_MASK, IX86_BUILTIN_CVTPS2DQ128_MASK,
11789         IX86_BUILTIN_CVTPS2UDQ256, IX86_BUILTIN_CVTPS2UDQ128,
11790         IX86_BUILTIN_CVTPS2QQ256, IX86_BUILTIN_CVTPS2QQ128,
11791         IX86_BUILTIN_CVTPS2UQQ256, IX86_BUILTIN_CVTPS2UQQ128,
11792         IX86_BUILTIN_GETMANTPS256, IX86_BUILTIN_GETMANTPS128,
11793         IX86_BUILTIN_GETMANTPD256, IX86_BUILTIN_GETMANTPD128,
11794         IX86_BUILTIN_MOVDDUP256_MASK, IX86_BUILTIN_MOVDDUP128_MASK,
11795         IX86_BUILTIN_MOVSHDUP256_MASK, IX86_BUILTIN_MOVSHDUP128_MASK,
11796         IX86_BUILTIN_MOVSLDUP256_MASK, IX86_BUILTIN_MOVSLDUP128_MASK,
11797         IX86_BUILTIN_CVTQQ2PS256, IX86_BUILTIN_CVTQQ2PS128,
11798         IX86_BUILTIN_CVTUQQ2PS256, IX86_BUILTIN_CVTUQQ2PS128,
11799         IX86_BUILTIN_CVTQQ2PD256, IX86_BUILTIN_CVTQQ2PD128,
11800         IX86_BUILTIN_CVTUQQ2PD256, IX86_BUILTIN_CVTUQQ2PD128,
11801         IX86_BUILTIN_VPERMT2VARQ256, IX86_BUILTIN_VPERMT2VARQ256_MASKZ,
11802         IX86_BUILTIN_VPERMT2VARD256, IX86_BUILTIN_VPERMT2VARD256_MASKZ,
11803         IX86_BUILTIN_VPERMI2VARQ256, IX86_BUILTIN_VPERMI2VARD256,
11804         IX86_BUILTIN_VPERMT2VARPD256, IX86_BUILTIN_VPERMT2VARPD256_MASKZ,
11805         IX86_BUILTIN_VPERMT2VARPS256, IX86_BUILTIN_VPERMT2VARPS256_MASKZ,
11806         IX86_BUILTIN_VPERMI2VARPD256, IX86_BUILTIN_VPERMI2VARPS256,
11807         IX86_BUILTIN_VPERMT2VARQ128, IX86_BUILTIN_VPERMT2VARQ128_MASKZ,
11808         IX86_BUILTIN_VPERMT2VARD128, IX86_BUILTIN_VPERMT2VARD128_MASKZ,
11809         IX86_BUILTIN_VPERMI2VARQ128, IX86_BUILTIN_VPERMI2VARD128,
11810         IX86_BUILTIN_VPERMT2VARPD128, IX86_BUILTIN_VPERMT2VARPD128_MASKZ,
11811         IX86_BUILTIN_VPERMT2VARPS128, IX86_BUILTIN_VPERMT2VARPS128_MASKZ,
11812         IX86_BUILTIN_VPERMI2VARPD128, IX86_BUILTIN_VPERMI2VARPS128,
11813         IX86_BUILTIN_PSHUFB256_MASK, IX86_BUILTIN_PSHUFB128_MASK,
11814         IX86_BUILTIN_PSHUFHW256_MASK, IX86_BUILTIN_PSHUFHW128_MASK,
11815         IX86_BUILTIN_PSHUFLW256_MASK, IX86_BUILTIN_PSHUFLW128_MASK,
11816         IX86_BUILTIN_PSHUFD256_MASK, IX86_BUILTIN_PSHUFD128_MASK,
11817         IX86_BUILTIN_SHUFPD256_MASK, IX86_BUILTIN_SHUFPD128_MASK,
11818         IX86_BUILTIN_SHUFPS256_MASK, IX86_BUILTIN_SHUFPS128_MASK,
11819         IX86_BUILTIN_PROLVQ256, IX86_BUILTIN_PROLVQ128,
11820         IX86_BUILTIN_PROLQ256, IX86_BUILTIN_PROLQ128,
11821         IX86_BUILTIN_PRORVQ256, IX86_BUILTIN_PRORVQ128,
11822         IX86_BUILTIN_PRORQ256, IX86_BUILTIN_PRORQ128,
11823         IX86_BUILTIN_PSRAVQ128, IX86_BUILTIN_PSRAVQ256,
11824         IX86_BUILTIN_PSLLVV4DI_MASK, IX86_BUILTIN_PSLLVV2DI_MASK,
11825         IX86_BUILTIN_PSLLVV8SI_MASK, IX86_BUILTIN_PSLLVV4SI_MASK,
11826         IX86_BUILTIN_PSRAVV8SI_MASK, IX86_BUILTIN_PSRAVV4SI_MASK,
11827         IX86_BUILTIN_PSRLVV4DI_MASK, IX86_BUILTIN_PSRLVV2DI_MASK,
11828         IX86_BUILTIN_PSRLVV8SI_MASK, IX86_BUILTIN_PSRLVV4SI_MASK,
11829         IX86_BUILTIN_PSRAWI256_MASK, IX86_BUILTIN_PSRAW256_MASK,
11830         IX86_BUILTIN_PSRAWI128_MASK, IX86_BUILTIN_PSRAW128_MASK,
11831         IX86_BUILTIN_PSRLWI256_MASK, IX86_BUILTIN_PSRLW256_MASK,
11832         IX86_BUILTIN_PSRLWI128_MASK, IX86_BUILTIN_PSRLW128_MASK,
11833         IX86_BUILTIN_PRORVD256, IX86_BUILTIN_PROLVD256,
11834         IX86_BUILTIN_PRORD256, IX86_BUILTIN_PROLD256,
11835         IX86_BUILTIN_PRORVD128, IX86_BUILTIN_PROLVD128,
11836         IX86_BUILTIN_PRORD128, IX86_BUILTIN_PROLD128,
11837         IX86_BUILTIN_FPCLASSPD256, IX86_BUILTIN_FPCLASSPD128,
11838         IX86_BUILTIN_FPCLASSSD, IX86_BUILTIN_FPCLASSPS256,
11839         IX86_BUILTIN_FPCLASSPS128, IX86_BUILTIN_FPCLASSSS,
11840         IX86_BUILTIN_CVTB2MASK128, IX86_BUILTIN_CVTB2MASK256,
11841         IX86_BUILTIN_CVTW2MASK128, IX86_BUILTIN_CVTW2MASK256,
11842         IX86_BUILTIN_CVTD2MASK128, IX86_BUILTIN_CVTD2MASK256,
11843         IX86_BUILTIN_CVTQ2MASK128, IX86_BUILTIN_CVTQ2MASK256,
11844         IX86_BUILTIN_CVTMASK2B128, IX86_BUILTIN_CVTMASK2B256,
11845         IX86_BUILTIN_CVTMASK2W128, IX86_BUILTIN_CVTMASK2W256,
11846         IX86_BUILTIN_CVTMASK2D128, IX86_BUILTIN_CVTMASK2D256,
11847         IX86_BUILTIN_CVTMASK2Q128, IX86_BUILTIN_CVTMASK2Q256,
11848         IX86_BUILTIN_PCMPEQB128_MASK, IX86_BUILTIN_PCMPEQB256_MASK,
11849         IX86_BUILTIN_PCMPEQW128_MASK, IX86_BUILTIN_PCMPEQW256_MASK,
11850         IX86_BUILTIN_PCMPEQD128_MASK, IX86_BUILTIN_PCMPEQD256_MASK,
11851         IX86_BUILTIN_PCMPEQQ128_MASK, IX86_BUILTIN_PCMPEQQ256_MASK,
11852         IX86_BUILTIN_PCMPGTB128_MASK, IX86_BUILTIN_PCMPGTB256_MASK,
11853         IX86_BUILTIN_PCMPGTW128_MASK, IX86_BUILTIN_PCMPGTW256_MASK,
11854         IX86_BUILTIN_PCMPGTD128_MASK, IX86_BUILTIN_PCMPGTD256_MASK,
11855         IX86_BUILTIN_PCMPGTQ128_MASK, IX86_BUILTIN_PCMPGTQ256_MASK,
11856         IX86_BUILTIN_PTESTMB128, IX86_BUILTIN_PTESTMB256,
11857         IX86_BUILTIN_PTESTMW128, IX86_BUILTIN_PTESTMW256,
11858         IX86_BUILTIN_PTESTMD128, IX86_BUILTIN_PTESTMD256,
11859         IX86_BUILTIN_PTESTMQ128, IX86_BUILTIN_PTESTMQ256,
11860         IX86_BUILTIN_PTESTNMB128, IX86_BUILTIN_PTESTNMB256,
11861         IX86_BUILTIN_PTESTNMW128, IX86_BUILTIN_PTESTNMW256,
11862         IX86_BUILTIN_PTESTNMD128, IX86_BUILTIN_PTESTNMD256,
11863         IX86_BUILTIN_PTESTNMQ128, IX86_BUILTIN_PTESTNMQ256,
11864         IX86_BUILTIN_PBROADCASTMB128, IX86_BUILTIN_PBROADCASTMB256,
11865         IX86_BUILTIN_PBROADCASTMW128, IX86_BUILTIN_PBROADCASTMW256,
11866         IX86_BUILTIN_COMPRESSPD256, IX86_BUILTIN_COMPRESSPD128,
11867         IX86_BUILTIN_COMPRESSPS256, IX86_BUILTIN_COMPRESSPS128,
11868         IX86_BUILTIN_PCOMPRESSQ256, IX86_BUILTIN_PCOMPRESSQ128,
11869         IX86_BUILTIN_PCOMPRESSD256, IX86_BUILTIN_PCOMPRESSD128,
11870         IX86_BUILTIN_EXPANDPD256, IX86_BUILTIN_EXPANDPD128,
11871         IX86_BUILTIN_EXPANDPS256, IX86_BUILTIN_EXPANDPS128,
11872         IX86_BUILTIN_PEXPANDQ256, IX86_BUILTIN_PEXPANDQ128,
11873         IX86_BUILTIN_PEXPANDD256, IX86_BUILTIN_PEXPANDD128,
11874         IX86_BUILTIN_EXPANDPD256Z, IX86_BUILTIN_EXPANDPD128Z,
11875         IX86_BUILTIN_EXPANDPS256Z, IX86_BUILTIN_EXPANDPS128Z,
11876         IX86_BUILTIN_PEXPANDQ256Z, IX86_BUILTIN_PEXPANDQ128Z,
11877         IX86_BUILTIN_PEXPANDD256Z, IX86_BUILTIN_PEXPANDD128Z,
11878         IX86_BUILTIN_PMAXSD256_MASK, IX86_BUILTIN_PMINSD256_MASK,
11879         IX86_BUILTIN_PMAXUD256_MASK, IX86_BUILTIN_PMINUD256_MASK,
11880         IX86_BUILTIN_PMAXSD128_MASK, IX86_BUILTIN_PMINSD128_MASK,
11881         IX86_BUILTIN_PMAXUD128_MASK, IX86_BUILTIN_PMINUD128_MASK,
11882         IX86_BUILTIN_PMAXSQ256_MASK, IX86_BUILTIN_PMINSQ256_MASK,
11883         IX86_BUILTIN_PMAXUQ256_MASK, IX86_BUILTIN_PMINUQ256_MASK,
11884         IX86_BUILTIN_PMAXSQ128_MASK, IX86_BUILTIN_PMINSQ128_MASK,
11885         IX86_BUILTIN_PMAXUQ128_MASK, IX86_BUILTIN_PMINUQ128_MASK,
11886         IX86_BUILTIN_PMINSB256_MASK, IX86_BUILTIN_PMINUB256_MASK,
11887         IX86_BUILTIN_PMAXSB256_MASK, IX86_BUILTIN_PMAXUB256_MASK,
11888         IX86_BUILTIN_PMINSB128_MASK, IX86_BUILTIN_PMINUB128_MASK,
11889         IX86_BUILTIN_PMAXSB128_MASK, IX86_BUILTIN_PMAXUB128_MASK,
11890         IX86_BUILTIN_PMINSW256_MASK, IX86_BUILTIN_PMINUW256_MASK,
11891         IX86_BUILTIN_PMAXSW256_MASK, IX86_BUILTIN_PMAXUW256_MASK,
11892         IX86_BUILTIN_PMINSW128_MASK, IX86_BUILTIN_PMINUW128_MASK,
11893         IX86_BUILTIN_PMAXSW128_MASK, IX86_BUILTIN_PMAXUW128_MASK,
11894         IX86_BUILTIN_VPCONFLICTQ256, IX86_BUILTIN_VPCONFLICTD256,
11895         IX86_BUILTIN_VPCLZCNTQ256, IX86_BUILTIN_VPCLZCNTD256,
11896         IX86_BUILTIN_UNPCKHPD256_MASK, IX86_BUILTIN_UNPCKHPD128_MASK,
11897         IX86_BUILTIN_UNPCKHPS256_MASK, IX86_BUILTIN_UNPCKHPS128_MASK,
11898         IX86_BUILTIN_UNPCKLPD256_MASK, IX86_BUILTIN_UNPCKLPD128_MASK,
11899         IX86_BUILTIN_UNPCKLPS256_MASK, IX86_BUILTIN_VPCONFLICTQ128,
11900         IX86_BUILTIN_VPCONFLICTD128, IX86_BUILTIN_VPCLZCNTQ128,
11901         IX86_BUILTIN_VPCLZCNTD128, IX86_BUILTIN_UNPCKLPS128_MASK,
11902         IX86_BUILTIN_ALIGND256, IX86_BUILTIN_ALIGNQ256,
11903         IX86_BUILTIN_ALIGND128, IX86_BUILTIN_ALIGNQ128,
11904         IX86_BUILTIN_CVTPS2PH256_MASK, IX86_BUILTIN_CVTPS2PH_MASK,
11905         IX86_BUILTIN_CVTPH2PS_MASK, IX86_BUILTIN_CVTPH2PS256_MASK,
11906         IX86_BUILTIN_PUNPCKHDQ128_MASK, IX86_BUILTIN_PUNPCKHDQ256_MASK,
11907         IX86_BUILTIN_PUNPCKHQDQ128_MASK, IX86_BUILTIN_PUNPCKHQDQ256_MASK,
11908         IX86_BUILTIN_PUNPCKLDQ128_MASK, IX86_BUILTIN_PUNPCKLDQ256_MASK,
11909         IX86_BUILTIN_PUNPCKLQDQ128_MASK, IX86_BUILTIN_PUNPCKLQDQ256_MASK,
11910         IX86_BUILTIN_PUNPCKHBW128_MASK, IX86_BUILTIN_PUNPCKHBW256_MASK,
11911         IX86_BUILTIN_PUNPCKHWD128_MASK, IX86_BUILTIN_PUNPCKHWD256_MASK,
11912         IX86_BUILTIN_PUNPCKLBW128_MASK, IX86_BUILTIN_PUNPCKLBW256_MASK,
11913         IX86_BUILTIN_PUNPCKLWD128_MASK, IX86_BUILTIN_PUNPCKLWD256_MASK,
11914         IX86_BUILTIN_PSLLVV16HI, IX86_BUILTIN_PSLLVV8HI,
11915         IX86_BUILTIN_PACKSSDW256_MASK, IX86_BUILTIN_PACKSSDW128_MASK,
11916         IX86_BUILTIN_PACKUSDW256_MASK, IX86_BUILTIN_PACKUSDW128_MASK,
11917         IX86_BUILTIN_PAVGB256_MASK, IX86_BUILTIN_PAVGW256_MASK,
11918         IX86_BUILTIN_PAVGB128_MASK, IX86_BUILTIN_PAVGW128_MASK,
11919         IX86_BUILTIN_VPERMVARSF256_MASK, IX86_BUILTIN_VPERMVARDF256_MASK,
11920         IX86_BUILTIN_VPERMDF256_MASK, IX86_BUILTIN_PABSB256_MASK,
11921         IX86_BUILTIN_PABSB128_MASK, IX86_BUILTIN_PABSW256_MASK,
11922         IX86_BUILTIN_PABSW128_MASK, IX86_BUILTIN_VPERMILVARPD_MASK,
11923         IX86_BUILTIN_VPERMILVARPS_MASK, IX86_BUILTIN_VPERMILVARPD256_MASK,
11924         IX86_BUILTIN_VPERMILVARPS256_MASK, IX86_BUILTIN_VPERMILPD_MASK,
11925         IX86_BUILTIN_VPERMILPS_MASK, IX86_BUILTIN_VPERMILPD256_MASK,
11926         IX86_BUILTIN_VPERMILPS256_MASK, IX86_BUILTIN_BLENDMQ256,
11927         IX86_BUILTIN_BLENDMD256, IX86_BUILTIN_BLENDMPD256,
11928         IX86_BUILTIN_BLENDMPS256, IX86_BUILTIN_BLENDMQ128,
11929         IX86_BUILTIN_BLENDMD128, IX86_BUILTIN_BLENDMPD128,
11930         IX86_BUILTIN_BLENDMPS128, IX86_BUILTIN_BLENDMW256,
11931         IX86_BUILTIN_BLENDMB256, IX86_BUILTIN_BLENDMW128,
11932         IX86_BUILTIN_BLENDMB128, IX86_BUILTIN_PMULLD256_MASK,
11933         IX86_BUILTIN_PMULLD128_MASK, IX86_BUILTIN_PMULUDQ256_MASK,
11934         IX86_BUILTIN_PMULDQ256_MASK, IX86_BUILTIN_PMULDQ128_MASK,
11935         IX86_BUILTIN_PMULUDQ128_MASK, IX86_BUILTIN_CVTPD2PS256_MASK,
11936         IX86_BUILTIN_CVTPD2PS_MASK, IX86_BUILTIN_VPERMVARSI256_MASK,
11937         IX86_BUILTIN_VPERMVARDI256_MASK, IX86_BUILTIN_VPERMDI256_MASK,
11938         IX86_BUILTIN_CMPQ256, IX86_BUILTIN_CMPD256,
11939         IX86_BUILTIN_UCMPQ256, IX86_BUILTIN_UCMPD256,
11940         IX86_BUILTIN_CMPB256, IX86_BUILTIN_CMPW256,
11941         IX86_BUILTIN_UCMPB256, IX86_BUILTIN_UCMPW256,
11942         IX86_BUILTIN_CMPPD256_MASK, IX86_BUILTIN_CMPPS256_MASK,
11943         IX86_BUILTIN_CMPQ128, IX86_BUILTIN_CMPD128,
11944         IX86_BUILTIN_UCMPQ128, IX86_BUILTIN_UCMPD128,
11945         IX86_BUILTIN_CMPB128, IX86_BUILTIN_CMPW128,
11946         IX86_BUILTIN_UCMPB128, IX86_BUILTIN_UCMPW128,
11947         IX86_BUILTIN_CMPPD128_MASK, IX86_BUILTIN_CMPPS128_MASK,
11948         IX86_BUILTIN_GATHER3SIV8SF, IX86_BUILTIN_GATHER3SIV4SF,
11949         IX86_BUILTIN_GATHER3SIV4DF, IX86_BUILTIN_GATHER3SIV2DF,
11950         IX86_BUILTIN_GATHER3DIV8SF, IX86_BUILTIN_GATHER3DIV4SF,
11951         IX86_BUILTIN_GATHER3DIV4DF, IX86_BUILTIN_GATHER3DIV2DF,
11952         IX86_BUILTIN_GATHER3SIV8SI, IX86_BUILTIN_GATHER3SIV4SI,
11953         IX86_BUILTIN_GATHER3SIV4DI, IX86_BUILTIN_GATHER3SIV2DI,
11954         IX86_BUILTIN_GATHER3DIV8SI, IX86_BUILTIN_GATHER3DIV4SI,
11955         IX86_BUILTIN_GATHER3DIV4DI, IX86_BUILTIN_GATHER3DIV2DI,
11956         IX86_BUILTIN_SCATTERSIV8SF, IX86_BUILTIN_SCATTERSIV4SF,
11957         IX86_BUILTIN_SCATTERSIV4DF, IX86_BUILTIN_SCATTERSIV2DF,
11958         IX86_BUILTIN_SCATTERDIV8SF, IX86_BUILTIN_SCATTERDIV4SF,
11959         IX86_BUILTIN_SCATTERDIV4DF, IX86_BUILTIN_SCATTERDIV2DF,
11960         IX86_BUILTIN_SCATTERSIV8SI, IX86_BUILTIN_SCATTERSIV4SI,
11961         IX86_BUILTIN_SCATTERSIV4DI, IX86_BUILTIN_SCATTERSIV2DI,
11962         IX86_BUILTIN_SCATTERDIV8SI, IX86_BUILTIN_SCATTERDIV4SI,
11963         IX86_BUILTIN_SCATTERDIV4DI, IX86_BUILTIN_SCATTERDIV2DI,
11964         IX86_BUILTIN_RANGESD128, IX86_BUILTIN_RANGESS128,
11965         IX86_BUILTIN_KUNPCKWD, IX86_BUILTIN_KUNPCKDQ,
11966         IX86_BUILTIN_BROADCASTF32x2_512, IX86_BUILTIN_BROADCASTI32x2_512,
11967         IX86_BUILTIN_BROADCASTF64X2_512, IX86_BUILTIN_BROADCASTI64X2_512,
11968         IX86_BUILTIN_BROADCASTF32X8_512, IX86_BUILTIN_BROADCASTI32X8_512,
11969         IX86_BUILTIN_EXTRACTF64X2_512, IX86_BUILTIN_EXTRACTF32X8,
11970         IX86_BUILTIN_EXTRACTI64X2_512, IX86_BUILTIN_EXTRACTI32X8,
11971         IX86_BUILTIN_REDUCEPD512_MASK, IX86_BUILTIN_REDUCEPS512_MASK,
11972         IX86_BUILTIN_PMULLQ512, IX86_BUILTIN_XORPD512,
11973         IX86_BUILTIN_XORPS512, IX86_BUILTIN_ORPD512,
11974         IX86_BUILTIN_ORPS512, IX86_BUILTIN_ANDPD512,
11975         IX86_BUILTIN_ANDPS512, IX86_BUILTIN_ANDNPD512,
11976         IX86_BUILTIN_ANDNPS512, IX86_BUILTIN_INSERTF32X8,
11977         IX86_BUILTIN_INSERTI32X8, IX86_BUILTIN_INSERTF64X2_512,
11978         IX86_BUILTIN_INSERTI64X2_512, IX86_BUILTIN_FPCLASSPD512,
11979         IX86_BUILTIN_FPCLASSPS512, IX86_BUILTIN_CVTD2MASK512,
11980         IX86_BUILTIN_CVTQ2MASK512, IX86_BUILTIN_CVTMASK2D512,
11981         IX86_BUILTIN_CVTMASK2Q512, IX86_BUILTIN_CVTPD2QQ512,
11982         IX86_BUILTIN_CVTPS2QQ512, IX86_BUILTIN_CVTPD2UQQ512,
11983         IX86_BUILTIN_CVTPS2UQQ512, IX86_BUILTIN_CVTQQ2PS512,
11984         IX86_BUILTIN_CVTUQQ2PS512, IX86_BUILTIN_CVTQQ2PD512,
11985         IX86_BUILTIN_CVTUQQ2PD512, IX86_BUILTIN_CVTTPS2QQ512,
11986         IX86_BUILTIN_CVTTPS2UQQ512, IX86_BUILTIN_CVTTPD2QQ512,
11987         IX86_BUILTIN_CVTTPD2UQQ512, IX86_BUILTIN_RANGEPS512,
11988         IX86_BUILTIN_RANGEPD512, IX86_BUILTIN_PACKUSDW512,
11989         IX86_BUILTIN_PACKSSDW512, IX86_BUILTIN_LOADDQUHI512_MASK,
11990         IX86_BUILTIN_LOADDQUQI512_MASK, IX86_BUILTIN_PSLLDQ512,
11991         IX86_BUILTIN_PSRLDQ512, IX86_BUILTIN_STOREDQUHI512_MASK,
11992         IX86_BUILTIN_STOREDQUQI512_MASK, IX86_BUILTIN_PALIGNR512,
11993         IX86_BUILTIN_PALIGNR512_MASK, IX86_BUILTIN_MOVDQUHI512_MASK,
11994         IX86_BUILTIN_MOVDQUQI512_MASK, IX86_BUILTIN_PSADBW512,
11995         IX86_BUILTIN_DBPSADBW512, IX86_BUILTIN_PBROADCASTB512,
11996         IX86_BUILTIN_PBROADCASTB512_GPR, IX86_BUILTIN_PBROADCASTW512,
11997         IX86_BUILTIN_PBROADCASTW512_GPR, IX86_BUILTIN_PMOVSXBW512_MASK,
11998         IX86_BUILTIN_PMOVZXBW512_MASK, IX86_BUILTIN_VPERMVARHI512_MASK,
11999         IX86_BUILTIN_VPERMT2VARHI512, IX86_BUILTIN_VPERMT2VARHI512_MASKZ,
12000         IX86_BUILTIN_VPERMI2VARHI512, IX86_BUILTIN_PAVGB512,
12001         IX86_BUILTIN_PAVGW512, IX86_BUILTIN_PADDB512,
12002         IX86_BUILTIN_PSUBB512, IX86_BUILTIN_PSUBSB512,
12003         IX86_BUILTIN_PADDSB512, IX86_BUILTIN_PSUBUSB512,
12004         IX86_BUILTIN_PADDUSB512, IX86_BUILTIN_PSUBW512,
12005         IX86_BUILTIN_PADDW512, IX86_BUILTIN_PSUBSW512,
12006         IX86_BUILTIN_PADDSW512, IX86_BUILTIN_PSUBUSW512,
12007         IX86_BUILTIN_PADDUSW512, IX86_BUILTIN_PMAXUW512,
12008         IX86_BUILTIN_PMAXSW512, IX86_BUILTIN_PMINUW512,
12009         IX86_BUILTIN_PMINSW512, IX86_BUILTIN_PMAXUB512,
12010         IX86_BUILTIN_PMAXSB512, IX86_BUILTIN_PMINUB512,
12011         IX86_BUILTIN_PMINSB512, IX86_BUILTIN_PMOVWB512,
12012         IX86_BUILTIN_PMOVSWB512, IX86_BUILTIN_PMOVUSWB512,
12013         IX86_BUILTIN_PMULHRSW512_MASK, IX86_BUILTIN_PMULHUW512_MASK,
12014         IX86_BUILTIN_PMULHW512_MASK, IX86_BUILTIN_PMULLW512_MASK,
12015         IX86_BUILTIN_PSLLWI512_MASK, IX86_BUILTIN_PSLLW512_MASK,
12016         IX86_BUILTIN_PACKSSWB512, IX86_BUILTIN_PACKUSWB512,
12017         IX86_BUILTIN_PSRAVV32HI, IX86_BUILTIN_PMADDUBSW512_MASK,
12018         IX86_BUILTIN_PMADDWD512_MASK, IX86_BUILTIN_PSRLVV32HI,
12019         IX86_BUILTIN_PUNPCKHBW512, IX86_BUILTIN_PUNPCKHWD512,
12020         IX86_BUILTIN_PUNPCKLBW512, IX86_BUILTIN_PUNPCKLWD512,
12021         IX86_BUILTIN_PSHUFB512, IX86_BUILTIN_PSHUFHW512,
12022         IX86_BUILTIN_PSHUFLW512, IX86_BUILTIN_PSRAWI512,
12023         IX86_BUILTIN_PSRAW512, IX86_BUILTIN_PSRLWI512,
12024         IX86_BUILTIN_PSRLW512, IX86_BUILTIN_CVTB2MASK512,
12025         IX86_BUILTIN_CVTW2MASK512, IX86_BUILTIN_CVTMASK2B512,
12026         IX86_BUILTIN_CVTMASK2W512, IX86_BUILTIN_PCMPEQB512_MASK,
12027         IX86_BUILTIN_PCMPEQW512_MASK, IX86_BUILTIN_PCMPGTB512_MASK,
12028         IX86_BUILTIN_PCMPGTW512_MASK, IX86_BUILTIN_PTESTMB512,
12029         IX86_BUILTIN_PTESTMW512, IX86_BUILTIN_PTESTNMB512,
12030         IX86_BUILTIN_PTESTNMW512, IX86_BUILTIN_PSLLVV32HI,
12031         IX86_BUILTIN_PABSB512, IX86_BUILTIN_PABSW512,
12032         IX86_BUILTIN_BLENDMW512, IX86_BUILTIN_BLENDMB512,
12033         IX86_BUILTIN_CMPB512, IX86_BUILTIN_CMPW512,
12034         IX86_BUILTIN_UCMPB512, IX86_BUILTIN_UCMPW512.
12035         (bdesc_special_args):
12036         Add __builtin_ia32_loaddquhi512_mask, __builtin_ia32_loaddquqi512_mask,
12037         __builtin_ia32_storedquhi512_mask, __builtin_ia32_storedquqi512_mask,
12038         __builtin_ia32_loaddquhi256_mask, __builtin_ia32_loaddquhi128_mask,
12039         __builtin_ia32_loaddquqi256_mask, __builtin_ia32_loaddquqi128_mask,
12040         __builtin_ia32_movdqa64load256_mask, __builtin_ia32_movdqa64load128_mask,
12041         __builtin_ia32_movdqa32load256_mask, __builtin_ia32_movdqa32load128_mask,
12042         __builtin_ia32_movdqa64store256_mask, __builtin_ia32_movdqa64store128_mask,
12043         __builtin_ia32_movdqa32store256_mask, __builtin_ia32_movdqa32store128_mask,
12044         __builtin_ia32_loadapd256_mask, __builtin_ia32_loadapd128_mask,
12045         __builtin_ia32_loadaps256_mask, __builtin_ia32_loadaps128_mask,
12046         __builtin_ia32_storeapd256_mask, __builtin_ia32_storeapd128_mask,
12047         __builtin_ia32_storeaps256_mask, __builtin_ia32_storeaps128_mask,
12048         __builtin_ia32_loadupd256_mask, __builtin_ia32_loadupd128_mask,
12049         __builtin_ia32_loadups256_mask, __builtin_ia32_loadups128_mask,
12050         __builtin_ia32_storeupd256_mask, __builtin_ia32_storeupd128_mask,
12051         __builtin_ia32_storeups256_mask, __builtin_ia32_storeups128_mask,
12052         __builtin_ia32_loaddqudi256_mask, __builtin_ia32_loaddqudi128_mask,
12053         __builtin_ia32_loaddqusi256_mask, __builtin_ia32_loaddqusi128_mask,
12054         __builtin_ia32_storedqudi256_mask, __builtin_ia32_storedqudi128_mask,
12055         __builtin_ia32_storedqusi256_mask, __builtin_ia32_storedqusi128_mask,
12056         __builtin_ia32_storedquhi256_mask, __builtin_ia32_storedquhi128_mask,
12057         __builtin_ia32_storedquqi256_mask, __builtin_ia32_storedquqi128_mask,
12058         __builtin_ia32_compressstoredf256_mask, __builtin_ia32_compressstoredf128_mask,
12059         __builtin_ia32_compressstoresf256_mask, __builtin_ia32_compressstoresf128_mask,
12060         __builtin_ia32_compressstoredi256_mask, __builtin_ia32_compressstoredi128_mask,
12061         __builtin_ia32_compressstoresi256_mask, __builtin_ia32_compressstoresi128_mask,
12062         __builtin_ia32_expandloaddf256_mask, __builtin_ia32_expandloaddf128_mask,
12063         __builtin_ia32_expandloadsf256_mask, __builtin_ia32_expandloadsf128_mask,
12064         __builtin_ia32_expandloaddi256_mask, __builtin_ia32_expandloaddi128_mask,
12065         __builtin_ia32_expandloadsi256_mask, __builtin_ia32_expandloadsi128_mask,
12066         __builtin_ia32_expandloaddf256_maskz, __builtin_ia32_expandloaddf128_maskz,
12067         __builtin_ia32_expandloadsf256_maskz, __builtin_ia32_expandloadsf128_maskz,
12068         __builtin_ia32_expandloaddi256_maskz, __builtin_ia32_expandloaddi128_maskz,
12069         __builtin_ia32_expandloadsi256_maskz, __builtin_ia32_expandloadsi128_maskz,
12070         __builtin_ia32_pmovqd256mem_mask, __builtin_ia32_pmovqd128mem_mask,
12071         __builtin_ia32_pmovsqd256mem_mask, __builtin_ia32_pmovsqd128mem_mask,
12072         __builtin_ia32_pmovusqd256mem_mask, __builtin_ia32_pmovusqd128mem_mask,
12073         __builtin_ia32_pmovqw256mem_mask, __builtin_ia32_pmovqw128mem_mask,
12074         __builtin_ia32_pmovsqw256mem_mask, __builtin_ia32_pmovsqw128mem_mask,
12075         __builtin_ia32_pmovusqw256mem_mask, __builtin_ia32_pmovusqw128mem_mask,
12076         __builtin_ia32_pmovqb256mem_mask, __builtin_ia32_pmovqb128mem_mask,
12077         __builtin_ia32_pmovsqb256mem_mask, __builtin_ia32_pmovsqb128mem_mask,
12078         __builtin_ia32_pmovusqb256mem_mask, __builtin_ia32_pmovusqb128mem_mask,
12079         __builtin_ia32_pmovdb256mem_mask, __builtin_ia32_pmovdb128mem_mask,
12080         __builtin_ia32_pmovsdb256mem_mask, __builtin_ia32_pmovsdb128mem_mask,
12081         __builtin_ia32_pmovusdb256mem_mask, __builtin_ia32_pmovusdb128mem_mask,
12082         __builtin_ia32_pmovdw256mem_mask, __builtin_ia32_pmovdw128mem_mask,
12083         __builtin_ia32_pmovsdw256mem_mask, __builtin_ia32_pmovsdw128mem_mask,
12084         __builtin_ia32_pmovusdw256mem_mask, __builtin_ia32_pmovusdw128mem_mask,
12085         __builtin_ia32_palignr256_mask, __builtin_ia32_palignr128_mask,
12086         __builtin_ia32_movdqa64_256_mask, __builtin_ia32_movdqa64_128_mask,
12087         __builtin_ia32_movdqa32_256_mask, __builtin_ia32_movdqa32_128_mask,
12088         __builtin_ia32_movapd256_mask, __builtin_ia32_movapd128_mask,
12089         __builtin_ia32_movaps256_mask, __builtin_ia32_movaps128_mask,
12090         __builtin_ia32_movdquhi256_mask, __builtin_ia32_movdquhi128_mask,
12091         __builtin_ia32_movdquqi256_mask, __builtin_ia32_movdquqi128_mask,
12092         __builtin_ia32_minps_mask, __builtin_ia32_maxps_mask,
12093         __builtin_ia32_minpd_mask, __builtin_ia32_maxpd_mask,
12094         __builtin_ia32_maxpd256_mask, __builtin_ia32_maxps256_mask,
12095         __builtin_ia32_minpd256_mask, __builtin_ia32_minps256_mask,
12096         __builtin_ia32_mulps_mask, __builtin_ia32_divps_mask,
12097         __builtin_ia32_mulpd_mask, __builtin_ia32_divpd_mask,
12098         __builtin_ia32_divpd256_mask, __builtin_ia32_divps256_mask,
12099         __builtin_ia32_mulpd256_mask, __builtin_ia32_mulps256_mask,
12100         __builtin_ia32_addpd128_mask, __builtin_ia32_addpd256_mask,
12101         __builtin_ia32_addps128_mask, __builtin_ia32_addps256_mask,
12102         __builtin_ia32_subpd128_mask, __builtin_ia32_subpd256_mask,
12103         __builtin_ia32_subps128_mask, __builtin_ia32_subps256_mask,
12104         __builtin_ia32_xorpd256_mask, __builtin_ia32_xorpd128_mask,
12105         __builtin_ia32_xorps256_mask, __builtin_ia32_xorps128_mask,
12106         __builtin_ia32_orpd256_mask, __builtin_ia32_orpd128_mask,
12107         __builtin_ia32_orps256_mask, __builtin_ia32_orps128_mask,
12108         __builtin_ia32_broadcastf32x2_256_mask, __builtin_ia32_broadcasti32x2_256_mask,
12109         __builtin_ia32_broadcasti32x2_128_mask, __builtin_ia32_broadcastf64x2_256_mask,
12110         __builtin_ia32_broadcasti64x2_256_mask, __builtin_ia32_broadcastf32x4_256_mask,
12111         __builtin_ia32_broadcasti32x4_256_mask, __builtin_ia32_extractf32x4_256_mask,
12112         __builtin_ia32_extracti32x4_256_mask, __builtin_ia32_dbpsadbw256_mask,
12113         __builtin_ia32_dbpsadbw128_mask, __builtin_ia32_cvttpd2qq256_mask,
12114         __builtin_ia32_cvttpd2qq128_mask, __builtin_ia32_cvttpd2uqq256_mask,
12115         __builtin_ia32_cvttpd2uqq128_mask, __builtin_ia32_cvtpd2qq256_mask,
12116         __builtin_ia32_cvtpd2qq128_mask, __builtin_ia32_cvtpd2uqq256_mask,
12117         __builtin_ia32_cvtpd2uqq128_mask, __builtin_ia32_cvtpd2udq256_mask,
12118         __builtin_ia32_cvtpd2udq128_mask, __builtin_ia32_cvttps2qq256_mask,
12119         __builtin_ia32_cvttps2qq128_mask, __builtin_ia32_cvttps2uqq256_mask,
12120         __builtin_ia32_cvttps2uqq128_mask, __builtin_ia32_cvttps2dq256_mask,
12121         __builtin_ia32_cvttps2dq128_mask, __builtin_ia32_cvttps2udq256_mask,
12122         __builtin_ia32_cvttps2udq128_mask, __builtin_ia32_cvttpd2dq256_mask,
12123         __builtin_ia32_cvttpd2dq128_mask, __builtin_ia32_cvttpd2udq256_mask,
12124         __builtin_ia32_cvttpd2udq128_mask, __builtin_ia32_cvtpd2dq256_mask,
12125         __builtin_ia32_cvtpd2dq128_mask, __builtin_ia32_cvtdq2pd256_mask,
12126         __builtin_ia32_cvtdq2pd128_mask, __builtin_ia32_cvtudq2pd256_mask,
12127         __builtin_ia32_cvtudq2pd128_mask, __builtin_ia32_cvtdq2ps256_mask,
12128         __builtin_ia32_cvtdq2ps128_mask, __builtin_ia32_cvtudq2ps256_mask,
12129         __builtin_ia32_cvtudq2ps128_mask, __builtin_ia32_cvtps2pd256_mask,
12130         __builtin_ia32_cvtps2pd128_mask, __builtin_ia32_pbroadcastb256_mask,
12131         __builtin_ia32_pbroadcastb256_gpr_mask, __builtin_ia32_pbroadcastb128_mask,
12132         __builtin_ia32_pbroadcastb128_gpr_mask, __builtin_ia32_pbroadcastw256_mask,
12133         __builtin_ia32_pbroadcastw256_gpr_mask, __builtin_ia32_pbroadcastw128_mask,
12134         __builtin_ia32_pbroadcastw128_gpr_mask, __builtin_ia32_pbroadcastd256_mask,
12135         __builtin_ia32_pbroadcastd256_gpr_mask, __builtin_ia32_pbroadcastd128_mask,
12136         __builtin_ia32_pbroadcastd128_gpr_mask, __builtin_ia32_pbroadcastq256_mask,
12137         __builtin_ia32_pbroadcastq256_gpr_mask, __builtin_ia32_pbroadcastq256_mem_mask,
12138         __builtin_ia32_pbroadcastq128_mask, __builtin_ia32_pbroadcastq128_gpr_mask,
12139         __builtin_ia32_pbroadcastq128_mem_mask, __builtin_ia32_broadcastss256_mask,
12140         __builtin_ia32_broadcastss128_mask, __builtin_ia32_broadcastsd256_mask,
12141         __builtin_ia32_extractf64x2_256_mask, __builtin_ia32_extracti64x2_256_mask,
12142         __builtin_ia32_insertf32x4_256_mask, __builtin_ia32_inserti32x4_256_mask,
12143         __builtin_ia32_pmovsxbw256_mask, __builtin_ia32_pmovsxbw128_mask,
12144         __builtin_ia32_pmovsxbd256_mask, __builtin_ia32_pmovsxbd128_mask,
12145         __builtin_ia32_pmovsxbq256_mask, __builtin_ia32_pmovsxbq128_mask,
12146         __builtin_ia32_pmovsxwd256_mask, __builtin_ia32_pmovsxwd128_mask,
12147         __builtin_ia32_pmovsxwq256_mask, __builtin_ia32_pmovsxwq128_mask,
12148         __builtin_ia32_pmovsxdq256_mask, __builtin_ia32_pmovsxdq128_mask,
12149         __builtin_ia32_pmovzxbw256_mask, __builtin_ia32_pmovzxbw128_mask,
12150         __builtin_ia32_pmovzxbd256_mask, __builtin_ia32_pmovzxbd128_mask,
12151         __builtin_ia32_pmovzxbq256_mask, __builtin_ia32_pmovzxbq128_mask,
12152         __builtin_ia32_pmovzxwd256_mask, __builtin_ia32_pmovzxwd128_mask,
12153         __builtin_ia32_pmovzxwq256_mask, __builtin_ia32_pmovzxwq128_mask,
12154         __builtin_ia32_pmovzxdq256_mask, __builtin_ia32_pmovzxdq128_mask,
12155         __builtin_ia32_reducepd256_mask, __builtin_ia32_reducepd128_mask,
12156         __builtin_ia32_reduceps256_mask, __builtin_ia32_reduceps128_mask,
12157         __builtin_ia32_reducesd, __builtin_ia32_reducess,
12158         __builtin_ia32_permvarhi256_mask, __builtin_ia32_permvarhi128_mask,
12159         __builtin_ia32_vpermt2varhi256_mask, __builtin_ia32_vpermt2varhi256_maskz,
12160         __builtin_ia32_vpermt2varhi128_mask, __builtin_ia32_vpermt2varhi128_maskz,
12161         __builtin_ia32_vpermi2varhi256_mask, __builtin_ia32_vpermi2varhi128_mask,
12162         __builtin_ia32_rcp14pd256_mask, __builtin_ia32_rcp14pd128_mask,
12163         __builtin_ia32_rcp14ps256_mask, __builtin_ia32_rcp14ps128_mask,
12164         __builtin_ia32_rsqrt14pd256_mask, __builtin_ia32_rsqrt14pd128_mask,
12165         __builtin_ia32_rsqrt14ps256_mask, __builtin_ia32_rsqrt14ps128_mask,
12166         __builtin_ia32_sqrtpd256_mask, __builtin_ia32_sqrtpd128_mask,
12167         __builtin_ia32_sqrtps256_mask, __builtin_ia32_sqrtps128_mask,
12168         __builtin_ia32_paddb128_mask, __builtin_ia32_paddw128_mask,
12169         __builtin_ia32_paddd128_mask, __builtin_ia32_paddq128_mask,
12170         __builtin_ia32_psubb128_mask, __builtin_ia32_psubw128_mask,
12171         __builtin_ia32_psubd128_mask, __builtin_ia32_psubq128_mask,
12172         __builtin_ia32_paddsb128_mask, __builtin_ia32_paddsw128_mask,
12173         __builtin_ia32_psubsb128_mask, __builtin_ia32_psubsw128_mask,
12174         __builtin_ia32_paddusb128_mask, __builtin_ia32_paddusw128_mask,
12175         __builtin_ia32_psubusb128_mask, __builtin_ia32_psubusw128_mask,
12176         __builtin_ia32_paddb256_mask, __builtin_ia32_paddw256_mask,
12177         __builtin_ia32_paddd256_mask, __builtin_ia32_paddq256_mask,
12178         __builtin_ia32_paddsb256_mask, __builtin_ia32_paddsw256_mask,
12179         __builtin_ia32_paddusb256_mask, __builtin_ia32_paddusw256_mask,
12180         __builtin_ia32_psubb256_mask, __builtin_ia32_psubw256_mask,
12181         __builtin_ia32_psubd256_mask, __builtin_ia32_psubq256_mask,
12182         __builtin_ia32_psubsb256_mask, __builtin_ia32_psubsw256_mask,
12183         __builtin_ia32_psubusb256_mask, __builtin_ia32_psubusw256_mask,
12184         __builtin_ia32_shuf_f64x2_256_mask, __builtin_ia32_shuf_i64x2_256_mask,
12185         __builtin_ia32_shuf_i32x4_256_mask, __builtin_ia32_shuf_f32x4_256_mask,
12186         __builtin_ia32_pmovwb128_mask, __builtin_ia32_pmovwb256_mask,
12187         __builtin_ia32_pmovswb128_mask, __builtin_ia32_pmovswb256_mask,
12188         __builtin_ia32_pmovuswb128_mask, __builtin_ia32_pmovuswb256_mask,
12189         __builtin_ia32_pmovdb128_mask, __builtin_ia32_pmovdb256_mask,
12190         __builtin_ia32_pmovsdb128_mask, __builtin_ia32_pmovsdb256_mask,
12191         __builtin_ia32_pmovusdb128_mask, __builtin_ia32_pmovusdb256_mask,
12192         __builtin_ia32_pmovdw128_mask, __builtin_ia32_pmovdw256_mask,
12193         __builtin_ia32_pmovsdw128_mask, __builtin_ia32_pmovsdw256_mask,
12194         __builtin_ia32_pmovusdw128_mask, __builtin_ia32_pmovusdw256_mask,
12195         __builtin_ia32_pmovqb128_mask, __builtin_ia32_pmovqb256_mask,
12196         __builtin_ia32_pmovsqb128_mask, __builtin_ia32_pmovsqb256_mask,
12197         __builtin_ia32_pmovusqb128_mask, __builtin_ia32_pmovusqb256_mask,
12198         __builtin_ia32_pmovqw128_mask, __builtin_ia32_pmovqw256_mask,
12199         __builtin_ia32_pmovsqw128_mask, __builtin_ia32_pmovsqw256_mask,
12200         __builtin_ia32_pmovusqw128_mask, __builtin_ia32_pmovusqw256_mask,
12201         __builtin_ia32_pmovqd128_mask, __builtin_ia32_pmovqd256_mask,
12202         __builtin_ia32_pmovsqd128_mask, __builtin_ia32_pmovsqd256_mask,
12203         __builtin_ia32_pmovusqd128_mask, __builtin_ia32_pmovusqd256_mask,
12204         __builtin_ia32_rangepd256_mask, __builtin_ia32_rangepd128_mask,
12205         __builtin_ia32_rangeps256_mask, __builtin_ia32_rangeps128_mask,
12206         __builtin_ia32_getexpps256_mask, __builtin_ia32_getexppd256_mask,
12207         __builtin_ia32_getexpps128_mask, __builtin_ia32_getexppd128_mask,
12208         __builtin_ia32_fixupimmpd256, __builtin_ia32_fixupimmpd256_mask,
12209         __builtin_ia32_fixupimmpd256_maskz, __builtin_ia32_fixupimmps256,
12210         __builtin_ia32_fixupimmps256_mask, __builtin_ia32_fixupimmps256_maskz,
12211         __builtin_ia32_fixupimmpd128, __builtin_ia32_fixupimmpd128_mask,
12212         __builtin_ia32_fixupimmpd128_maskz, __builtin_ia32_fixupimmps128,
12213         __builtin_ia32_fixupimmps128_mask, __builtin_ia32_fixupimmps128_maskz,
12214         __builtin_ia32_pabsq256_mask, __builtin_ia32_pabsq128_mask,
12215         __builtin_ia32_pabsd256_mask, __builtin_ia32_pabsd128_mask,
12216         __builtin_ia32_pmulhrsw256_mask, __builtin_ia32_pmulhrsw128_mask,
12217         __builtin_ia32_pmulhuw128_mask, __builtin_ia32_pmulhuw256_mask,
12218         __builtin_ia32_pmulhw256_mask, __builtin_ia32_pmulhw128_mask,
12219         __builtin_ia32_pmullw256_mask, __builtin_ia32_pmullw128_mask,
12220         __builtin_ia32_pmullq256_mask, __builtin_ia32_pmullq128_mask,
12221         __builtin_ia32_andpd256_mask, __builtin_ia32_andpd128_mask,
12222         __builtin_ia32_andps256_mask, __builtin_ia32_andps128_mask,
12223         __builtin_ia32_andnpd256_mask, __builtin_ia32_andnpd128_mask,
12224         __builtin_ia32_andnps256_mask, __builtin_ia32_andnps128_mask,
12225         __builtin_ia32_psllwi128_mask, __builtin_ia32_pslldi128_mask,
12226         __builtin_ia32_psllqi128_mask, __builtin_ia32_psllw128_mask,
12227         __builtin_ia32_pslld128_mask, __builtin_ia32_psllq128_mask,
12228         __builtin_ia32_psllwi256_mask, __builtin_ia32_psllw256_mask,
12229         __builtin_ia32_pslldi256_mask, __builtin_ia32_pslld256_mask,
12230         __builtin_ia32_psllqi256_mask, __builtin_ia32_psllq256_mask,
12231         __builtin_ia32_psradi128_mask, __builtin_ia32_psrad128_mask,
12232         __builtin_ia32_psradi256_mask, __builtin_ia32_psrad256_mask,
12233         __builtin_ia32_psraqi128_mask, __builtin_ia32_psraq128_mask,
12234         __builtin_ia32_psraqi256_mask, __builtin_ia32_psraq256_mask,
12235         __builtin_ia32_pandd256_mask, __builtin_ia32_pandd128_mask,
12236         __builtin_ia32_psrldi128_mask, __builtin_ia32_psrld128_mask,
12237         __builtin_ia32_psrldi256_mask, __builtin_ia32_psrld256_mask,
12238         __builtin_ia32_psrlqi128_mask, __builtin_ia32_psrlq128_mask,
12239         __builtin_ia32_psrlqi256_mask, __builtin_ia32_psrlq256_mask,
12240         __builtin_ia32_pandq256_mask, __builtin_ia32_pandq128_mask,
12241         __builtin_ia32_pandnd256_mask, __builtin_ia32_pandnd128_mask,
12242         __builtin_ia32_pandnq256_mask, __builtin_ia32_pandnq128_mask,
12243         __builtin_ia32_pord256_mask, __builtin_ia32_pord128_mask,
12244         __builtin_ia32_porq256_mask, __builtin_ia32_porq128_mask,
12245         __builtin_ia32_pxord256_mask, __builtin_ia32_pxord128_mask,
12246         __builtin_ia32_pxorq256_mask, __builtin_ia32_pxorq128_mask,
12247         __builtin_ia32_packsswb256_mask, __builtin_ia32_packsswb128_mask,
12248         __builtin_ia32_packuswb256_mask, __builtin_ia32_packuswb128_mask,
12249         __builtin_ia32_rndscaleps_256_mask, __builtin_ia32_rndscalepd_256_mask,
12250         __builtin_ia32_rndscaleps_128_mask, __builtin_ia32_rndscalepd_128_mask,
12251         __builtin_ia32_pternlogq256_mask, __builtin_ia32_pternlogq256_maskz,
12252         __builtin_ia32_pternlogd256_mask, __builtin_ia32_pternlogd256_maskz,
12253         __builtin_ia32_pternlogq128_mask, __builtin_ia32_pternlogq128_maskz,
12254         __builtin_ia32_pternlogd128_mask, __builtin_ia32_pternlogd128_maskz,
12255         __builtin_ia32_scalefpd256_mask, __builtin_ia32_scalefps256_mask,
12256         __builtin_ia32_scalefpd128_mask, __builtin_ia32_scalefps128_mask,
12257         __builtin_ia32_vfmaddpd256_mask, __builtin_ia32_vfmaddpd256_mask3,
12258         __builtin_ia32_vfmaddpd256_maskz, __builtin_ia32_vfmaddpd128_mask,
12259         __builtin_ia32_vfmaddpd128_mask3, __builtin_ia32_vfmaddpd128_maskz,
12260         __builtin_ia32_vfmaddps256_mask, __builtin_ia32_vfmaddps256_mask3,
12261         __builtin_ia32_vfmaddps256_maskz, __builtin_ia32_vfmaddps128_mask,
12262         __builtin_ia32_vfmaddps128_mask3, __builtin_ia32_vfmaddps128_maskz,
12263         __builtin_ia32_vfmsubpd256_mask3, __builtin_ia32_vfmsubpd128_mask3,
12264         __builtin_ia32_vfmsubps256_mask3, __builtin_ia32_vfmsubps128_mask3,
12265         __builtin_ia32_vfnmaddpd256_mask, __builtin_ia32_vfnmaddpd128_mask,
12266         __builtin_ia32_vfnmaddps256_mask, __builtin_ia32_vfnmaddps128_mask,
12267         __builtin_ia32_vfnmsubpd256_mask, __builtin_ia32_vfnmsubpd256_mask3,
12268         __builtin_ia32_vfnmsubpd128_mask, __builtin_ia32_vfnmsubpd128_mask3,
12269         __builtin_ia32_vfnmsubps256_mask, __builtin_ia32_vfnmsubps256_mask3,
12270         __builtin_ia32_vfnmsubps128_mask, __builtin_ia32_vfnmsubps128_mask3,
12271         __builtin_ia32_vfmaddsubpd256_mask, __builtin_ia32_vfmaddsubpd256_mask3,
12272         __builtin_ia32_vfmaddsubpd256_maskz, __builtin_ia32_vfmaddsubpd128_mask,
12273         __builtin_ia32_vfmaddsubpd128_mask3, __builtin_ia32_vfmaddsubpd128_maskz,
12274         __builtin_ia32_vfmaddsubps256_mask, __builtin_ia32_vfmaddsubps256_mask3,
12275         __builtin_ia32_vfmaddsubps256_maskz, __builtin_ia32_vfmaddsubps128_mask,
12276         __builtin_ia32_vfmaddsubps128_mask3, __builtin_ia32_vfmaddsubps128_maskz,
12277         __builtin_ia32_vfmsubaddpd256_mask3, __builtin_ia32_vfmsubaddpd128_mask3,
12278         __builtin_ia32_vfmsubaddps256_mask3, __builtin_ia32_vfmsubaddps128_mask3,
12279         __builtin_ia32_insertf64x2_256_mask, __builtin_ia32_inserti64x2_256_mask,
12280         __builtin_ia32_psrav16hi_mask, __builtin_ia32_psrav8hi_mask,
12281         __builtin_ia32_pmaddubsw256_mask, __builtin_ia32_pmaddubsw128_mask,
12282         __builtin_ia32_pmaddwd256_mask, __builtin_ia32_pmaddwd128_mask,
12283         __builtin_ia32_psrlv16hi_mask, __builtin_ia32_psrlv8hi_mask,
12284         __builtin_ia32_cvtps2dq256_mask, __builtin_ia32_cvtps2dq128_mask,
12285         __builtin_ia32_cvtps2udq256_mask, __builtin_ia32_cvtps2udq128_mask,
12286         __builtin_ia32_cvtps2qq256_mask, __builtin_ia32_cvtps2qq128_mask,
12287         __builtin_ia32_cvtps2uqq256_mask, __builtin_ia32_cvtps2uqq128_mask,
12288         __builtin_ia32_getmantps256_mask, __builtin_ia32_getmantps128_mask,
12289         __builtin_ia32_getmantpd256_mask, __builtin_ia32_getmantpd128_mask,
12290         __builtin_ia32_movddup256_mask, __builtin_ia32_movddup128_mask,
12291         __builtin_ia32_movshdup256_mask, __builtin_ia32_movshdup128_mask,
12292         __builtin_ia32_movsldup256_mask, __builtin_ia32_movsldup128_mask,
12293         __builtin_ia32_cvtqq2ps256_mask, __builtin_ia32_cvtqq2ps128_mask,
12294         __builtin_ia32_cvtuqq2ps256_mask, __builtin_ia32_cvtuqq2ps128_mask,
12295         __builtin_ia32_cvtqq2pd256_mask, __builtin_ia32_cvtqq2pd128_mask,
12296         __builtin_ia32_cvtuqq2pd256_mask, __builtin_ia32_cvtuqq2pd128_mask,
12297         __builtin_ia32_vpermt2varq256_mask, __builtin_ia32_vpermt2varq256_maskz,
12298         __builtin_ia32_vpermt2vard256_mask, __builtin_ia32_vpermt2vard256_maskz,
12299         __builtin_ia32_vpermi2varq256_mask, __builtin_ia32_vpermi2vard256_mask,
12300         __builtin_ia32_vpermt2varpd256_mask, __builtin_ia32_vpermt2varpd256_maskz,
12301         __builtin_ia32_vpermt2varps256_mask, __builtin_ia32_vpermt2varps256_maskz,
12302         __builtin_ia32_vpermi2varpd256_mask, __builtin_ia32_vpermi2varps256_mask,
12303         __builtin_ia32_vpermt2varq128_mask, __builtin_ia32_vpermt2varq128_maskz,
12304         __builtin_ia32_vpermt2vard128_mask, __builtin_ia32_vpermt2vard128_maskz,
12305         __builtin_ia32_vpermi2varq128_mask, __builtin_ia32_vpermi2vard128_mask,
12306         __builtin_ia32_vpermt2varpd128_mask, __builtin_ia32_vpermt2varpd128_maskz,
12307         __builtin_ia32_vpermt2varps128_mask, __builtin_ia32_vpermt2varps128_maskz,
12308         __builtin_ia32_vpermi2varpd128_mask, __builtin_ia32_vpermi2varps128_mask,
12309         __builtin_ia32_pshufb256_mask, __builtin_ia32_pshufb128_mask,
12310         __builtin_ia32_pshufhw256_mask, __builtin_ia32_pshufhw128_mask,
12311         __builtin_ia32_pshuflw256_mask, __builtin_ia32_pshuflw128_mask,
12312         __builtin_ia32_pshufd256_mask, __builtin_ia32_pshufd128_mask,
12313         __builtin_ia32_shufpd256_mask, __builtin_ia32_shufpd128_mask,
12314         __builtin_ia32_shufps256_mask, __builtin_ia32_shufps128_mask,
12315         __builtin_ia32_prolvq256_mask, __builtin_ia32_prolvq128_mask,
12316         __builtin_ia32_prolq256_mask, __builtin_ia32_prolq128_mask,
12317         __builtin_ia32_prorvq256_mask, __builtin_ia32_prorvq128_mask,
12318         __builtin_ia32_prorq256_mask, __builtin_ia32_prorq128_mask,
12319         __builtin_ia32_psravq128_mask, __builtin_ia32_psravq256_mask,
12320         __builtin_ia32_psllv4di_mask, __builtin_ia32_psllv2di_mask,
12321         __builtin_ia32_psllv8si_mask, __builtin_ia32_psllv4si_mask,
12322         __builtin_ia32_psrav8si_mask, __builtin_ia32_psrav4si_mask,
12323         __builtin_ia32_psrlv4di_mask, __builtin_ia32_psrlv2di_mask,
12324         __builtin_ia32_psrlv8si_mask, __builtin_ia32_psrlv4si_mask,
12325         __builtin_ia32_psrawi256_mask, __builtin_ia32_psraw256_mask,
12326         __builtin_ia32_psrawi128_mask, __builtin_ia32_psraw128_mask,
12327         __builtin_ia32_psrlwi256_mask, __builtin_ia32_psrlw256_mask,
12328         __builtin_ia32_psrlwi128_mask, __builtin_ia32_psrlw128_mask,
12329         __builtin_ia32_prorvd256_mask, __builtin_ia32_prolvd256_mask,
12330         __builtin_ia32_prord256_mask, __builtin_ia32_prold256_mask,
12331         __builtin_ia32_prorvd128_mask, __builtin_ia32_prolvd128_mask,
12332         __builtin_ia32_prord128_mask, __builtin_ia32_prold128_mask,
12333         __builtin_ia32_fpclasspd256_mask, __builtin_ia32_fpclasspd128_mask,
12334         __builtin_ia32_fpclasssd, __builtin_ia32_fpclassps256_mask,
12335         __builtin_ia32_fpclassps128_mask, __builtin_ia32_fpclassss,
12336         __builtin_ia32_cvtb2mask128, __builtin_ia32_cvtb2mask256,
12337         __builtin_ia32_cvtw2mask128, __builtin_ia32_cvtw2mask256,
12338         __builtin_ia32_cvtd2mask128, __builtin_ia32_cvtd2mask256,
12339         __builtin_ia32_cvtq2mask128, __builtin_ia32_cvtq2mask256,
12340         __builtin_ia32_cvtmask2b128, __builtin_ia32_cvtmask2b256,
12341         __builtin_ia32_cvtmask2w128, __builtin_ia32_cvtmask2w256,
12342         __builtin_ia32_cvtmask2d128, __builtin_ia32_cvtmask2d256,
12343         __builtin_ia32_cvtmask2q128, __builtin_ia32_cvtmask2q256,
12344         __builtin_ia32_pcmpeqb128_mask, __builtin_ia32_pcmpeqb256_mask,
12345         __builtin_ia32_pcmpeqw128_mask, __builtin_ia32_pcmpeqw256_mask,
12346         __builtin_ia32_pcmpeqd128_mask, __builtin_ia32_pcmpeqd256_mask,
12347         __builtin_ia32_pcmpeqq128_mask, __builtin_ia32_pcmpeqq256_mask,
12348         __builtin_ia32_pcmpgtb128_mask, __builtin_ia32_pcmpgtb256_mask,
12349         __builtin_ia32_pcmpgtw128_mask, __builtin_ia32_pcmpgtw256_mask,
12350         __builtin_ia32_pcmpgtd128_mask, __builtin_ia32_pcmpgtd256_mask,
12351         __builtin_ia32_pcmpgtq128_mask, __builtin_ia32_pcmpgtq256_mask,
12352         __builtin_ia32_ptestmb128, __builtin_ia32_ptestmb256,
12353         __builtin_ia32_ptestmw128, __builtin_ia32_ptestmw256,
12354         __builtin_ia32_ptestmd128, __builtin_ia32_ptestmd256,
12355         __builtin_ia32_ptestmq128, __builtin_ia32_ptestmq256,
12356         __builtin_ia32_ptestnmb128, __builtin_ia32_ptestnmb256,
12357         __builtin_ia32_ptestnmw128, __builtin_ia32_ptestnmw256,
12358         __builtin_ia32_ptestnmd128, __builtin_ia32_ptestnmd256,
12359         __builtin_ia32_ptestnmq128, __builtin_ia32_ptestnmq256,
12360         __builtin_ia32_broadcastmb128, __builtin_ia32_broadcastmb256,
12361         __builtin_ia32_broadcastmw128, __builtin_ia32_broadcastmw256,
12362         __builtin_ia32_compressdf256_mask, __builtin_ia32_compressdf128_mask,
12363         __builtin_ia32_compresssf256_mask, __builtin_ia32_compresssf128_mask,
12364         __builtin_ia32_compressdi256_mask, __builtin_ia32_compressdi128_mask,
12365         __builtin_ia32_compresssi256_mask, __builtin_ia32_compresssi128_mask,
12366         __builtin_ia32_expanddf256_mask, __builtin_ia32_expanddf128_mask,
12367         __builtin_ia32_expandsf256_mask, __builtin_ia32_expandsf128_mask,
12368         __builtin_ia32_expanddi256_mask, __builtin_ia32_expanddi128_mask,
12369         __builtin_ia32_expandsi256_mask, __builtin_ia32_expandsi128_mask,
12370         __builtin_ia32_expanddf256_maskz, __builtin_ia32_expanddf128_maskz,
12371         __builtin_ia32_expandsf256_maskz, __builtin_ia32_expandsf128_maskz,
12372         __builtin_ia32_expanddi256_maskz, __builtin_ia32_expanddi128_maskz,
12373         __builtin_ia32_expandsi256_maskz, __builtin_ia32_expandsi128_maskz,
12374         __builtin_ia32_pmaxsd256_mask, __builtin_ia32_pminsd256_mask,
12375         __builtin_ia32_pmaxud256_mask, __builtin_ia32_pminud256_mask,
12376         __builtin_ia32_pmaxsd128_mask, __builtin_ia32_pminsd128_mask,
12377         __builtin_ia32_pmaxud128_mask, __builtin_ia32_pminud128_mask,
12378         __builtin_ia32_pmaxsq256_mask, __builtin_ia32_pminsq256_mask,
12379         __builtin_ia32_pmaxuq256_mask, __builtin_ia32_pminuq256_mask,
12380         __builtin_ia32_pmaxsq128_mask, __builtin_ia32_pminsq128_mask,
12381         __builtin_ia32_pmaxuq128_mask, __builtin_ia32_pminuq128_mask,
12382         __builtin_ia32_pminsb256_mask, __builtin_ia32_pminub256_mask,
12383         __builtin_ia32_pmaxsb256_mask, __builtin_ia32_pmaxub256_mask,
12384         __builtin_ia32_pminsb128_mask, __builtin_ia32_pminub128_mask,
12385         __builtin_ia32_pmaxsb128_mask, __builtin_ia32_pmaxub128_mask,
12386         __builtin_ia32_pminsw256_mask, __builtin_ia32_pminuw256_mask,
12387         __builtin_ia32_pmaxsw256_mask, __builtin_ia32_pmaxuw256_mask,
12388         __builtin_ia32_pminsw128_mask, __builtin_ia32_pminuw128_mask,
12389         __builtin_ia32_pmaxsw128_mask, __builtin_ia32_pmaxuw128_mask,
12390         __builtin_ia32_vpconflictdi_256_mask, __builtin_ia32_vpconflictsi_256_mask,
12391         __builtin_ia32_vplzcntq_256_mask, __builtin_ia32_vplzcntd_256_mask,
12392         __builtin_ia32_unpckhpd256_mask, __builtin_ia32_unpckhpd128_mask,
12393         __builtin_ia32_unpckhps256_mask, __builtin_ia32_unpckhps128_mask,
12394         __builtin_ia32_unpcklpd256_mask, __builtin_ia32_unpcklpd128_mask,
12395         __builtin_ia32_unpcklps256_mask, __builtin_ia32_vpconflictdi_128_mask,
12396         __builtin_ia32_vpconflictsi_128_mask, __builtin_ia32_vplzcntq_128_mask,
12397         __builtin_ia32_vplzcntd_128_mask, __builtin_ia32_unpcklps128_mask,
12398         __builtin_ia32_alignd256_mask, __builtin_ia32_alignq256_mask,
12399         __builtin_ia32_alignd128_mask, __builtin_ia32_alignq128_mask,
12400         __builtin_ia32_vcvtps2ph256_mask, __builtin_ia32_vcvtps2ph_mask,
12401         __builtin_ia32_vcvtph2ps_mask, __builtin_ia32_vcvtph2ps256_mask,
12402         __builtin_ia32_punpckhdq128_mask, __builtin_ia32_punpckhdq256_mask,
12403         __builtin_ia32_punpckhqdq128_mask, __builtin_ia32_punpckhqdq256_mask,
12404         __builtin_ia32_punpckldq128_mask, __builtin_ia32_punpckldq256_mask,
12405         __builtin_ia32_punpcklqdq128_mask, __builtin_ia32_punpcklqdq256_mask,
12406         __builtin_ia32_punpckhbw128_mask, __builtin_ia32_punpckhbw256_mask,
12407         __builtin_ia32_punpckhwd128_mask, __builtin_ia32_punpckhwd256_mask,
12408         __builtin_ia32_punpcklbw128_mask, __builtin_ia32_punpcklbw256_mask,
12409         __builtin_ia32_punpcklwd128_mask, __builtin_ia32_punpcklwd256_mask,
12410         __builtin_ia32_psllv16hi_mask, __builtin_ia32_psllv8hi_mask,
12411         __builtin_ia32_packssdw256_mask, __builtin_ia32_packssdw128_mask,
12412         __builtin_ia32_packusdw256_mask, __builtin_ia32_packusdw128_mask,
12413         __builtin_ia32_pavgb256_mask, __builtin_ia32_pavgw256_mask,
12414         __builtin_ia32_pavgb128_mask, __builtin_ia32_pavgw128_mask,
12415         __builtin_ia32_permvarsf256_mask, __builtin_ia32_permvardf256_mask,
12416         __builtin_ia32_permdf256_mask, __builtin_ia32_pabsb256_mask,
12417         __builtin_ia32_pabsb128_mask, __builtin_ia32_pabsw256_mask,
12418         __builtin_ia32_pabsw128_mask, __builtin_ia32_vpermilvarpd_mask,
12419         __builtin_ia32_vpermilvarps_mask, __builtin_ia32_vpermilvarpd256_mask,
12420         __builtin_ia32_vpermilvarps256_mask, __builtin_ia32_vpermilpd_mask,
12421         __builtin_ia32_vpermilps_mask, __builtin_ia32_vpermilpd256_mask,
12422         __builtin_ia32_vpermilps256_mask, __builtin_ia32_blendmq_256_mask,
12423         __builtin_ia32_blendmd_256_mask, __builtin_ia32_blendmpd_256_mask,
12424         __builtin_ia32_blendmps_256_mask, __builtin_ia32_blendmq_128_mask,
12425         __builtin_ia32_blendmd_128_mask, __builtin_ia32_blendmpd_128_mask,
12426         __builtin_ia32_blendmps_128_mask, __builtin_ia32_blendmw_256_mask,
12427         __builtin_ia32_blendmb_256_mask, __builtin_ia32_blendmw_128_mask,
12428         __builtin_ia32_blendmb_128_mask, __builtin_ia32_pmulld256_mask,
12429         __builtin_ia32_pmulld128_mask, __builtin_ia32_pmuludq256_mask,
12430         __builtin_ia32_pmuldq256_mask, __builtin_ia32_pmuldq128_mask,
12431         __builtin_ia32_pmuludq128_mask, __builtin_ia32_cvtpd2ps256_mask,
12432         __builtin_ia32_cvtpd2ps_mask, __builtin_ia32_permvarsi256_mask,
12433         __builtin_ia32_permvardi256_mask, __builtin_ia32_permdi256_mask,
12434         __builtin_ia32_cmpq256_mask, __builtin_ia32_cmpd256_mask,
12435         __builtin_ia32_ucmpq256_mask, __builtin_ia32_ucmpd256_mask,
12436         __builtin_ia32_cmpb256_mask, __builtin_ia32_cmpw256_mask,
12437         __builtin_ia32_ucmpb256_mask, __builtin_ia32_ucmpw256_mask,
12438         __builtin_ia32_cmppd256_mask, __builtin_ia32_cmpps256_mask,
12439         __builtin_ia32_cmpq128_mask, __builtin_ia32_cmpd128_mask,
12440         __builtin_ia32_ucmpq128_mask, __builtin_ia32_ucmpd128_mask,
12441         __builtin_ia32_cmpb128_mask, __builtin_ia32_cmpw128_mask,
12442         __builtin_ia32_ucmpb128_mask, __builtin_ia32_ucmpw128_mask,
12443         __builtin_ia32_cmppd128_mask, __builtin_ia32_cmpps128_mask,
12444         __builtin_ia32_broadcastf32x2_512_mask, __builtin_ia32_broadcasti32x2_512_mask,
12445         __builtin_ia32_broadcastf64x2_512_mask, __builtin_ia32_broadcasti64x2_512_mask,
12446         __builtin_ia32_broadcastf32x8_512_mask, __builtin_ia32_broadcasti32x8_512_mask,
12447         __builtin_ia32_extractf64x2_512_mask, __builtin_ia32_extractf32x8_mask,
12448         __builtin_ia32_extracti64x2_512_mask, __builtin_ia32_extracti32x8_mask,
12449         __builtin_ia32_reducepd512_mask, __builtin_ia32_reduceps512_mask,
12450         __builtin_ia32_pmullq512_mask, __builtin_ia32_xorpd512_mask,
12451         __builtin_ia32_xorps512_mask, __builtin_ia32_orpd512_mask,
12452         __builtin_ia32_orps512_mask, __builtin_ia32_andpd512_mask,
12453         __builtin_ia32_andps512_mask, __builtin_ia32_andnpd512_mask,
12454         __builtin_ia32_andnps512_mask, __builtin_ia32_insertf32x8_mask,
12455         __builtin_ia32_inserti32x8_mask, __builtin_ia32_insertf64x2_512_mask,
12456         __builtin_ia32_inserti64x2_512_mask, __builtin_ia32_fpclasspd512_mask,
12457         __builtin_ia32_fpclassps512_mask, __builtin_ia32_cvtd2mask512,
12458         __builtin_ia32_cvtq2mask512, __builtin_ia32_cvtmask2d512,
12459         __builtin_ia32_cvtmask2q512, __builtin_ia32_kunpcksi,
12460         __builtin_ia32_kunpckdi, __builtin_ia32_packusdw512_mask,
12461         __builtin_ia32_pslldq512, __builtin_ia32_psrldq512,
12462         __builtin_ia32_packssdw512_mask, __builtin_ia32_palignr512,
12463         __builtin_ia32_palignr512_mask, __builtin_ia32_movdquhi512_mask,
12464         __builtin_ia32_movdquqi512_mask, __builtin_ia32_psadbw512,
12465         __builtin_ia32_dbpsadbw512_mask, __builtin_ia32_pbroadcastb512_mask,
12466         __builtin_ia32_pbroadcastb512_gpr_mask, __builtin_ia32_pbroadcastw512_mask,
12467         __builtin_ia32_pbroadcastw512_gpr_mask, __builtin_ia32_pmovsxbw512_mask,
12468         __builtin_ia32_pmovzxbw512_mask, __builtin_ia32_permvarhi512_mask,
12469         __builtin_ia32_vpermt2varhi512_mask, __builtin_ia32_vpermt2varhi512_maskz,
12470         __builtin_ia32_vpermi2varhi512_mask, __builtin_ia32_pavgb512_mask,
12471         __builtin_ia32_pavgw512_mask, __builtin_ia32_paddb512_mask,
12472         __builtin_ia32_psubb512_mask, __builtin_ia32_psubsb512_mask,
12473         __builtin_ia32_paddsb512_mask, __builtin_ia32_psubusb512_mask,
12474         __builtin_ia32_paddusb512_mask, __builtin_ia32_psubw512_mask,
12475         __builtin_ia32_paddw512_mask, __builtin_ia32_psubsw512_mask,
12476         __builtin_ia32_paddsw512_mask, __builtin_ia32_psubusw512_mask,
12477         __builtin_ia32_paddusw512_mask, __builtin_ia32_pmaxuw512_mask,
12478         __builtin_ia32_pmaxsw512_mask, __builtin_ia32_pminuw512_mask,
12479         __builtin_ia32_pminsw512_mask, __builtin_ia32_pmaxub512_mask,
12480         __builtin_ia32_pmaxsb512_mask, __builtin_ia32_pminub512_mask,
12481         __builtin_ia32_pminsb512_mask, __builtin_ia32_pmovwb512_mask,
12482         __builtin_ia32_pmovswb512_mask, __builtin_ia32_pmovuswb512_mask,
12483         __builtin_ia32_pmulhrsw512_mask, __builtin_ia32_pmulhuw512_mask,
12484         __builtin_ia32_pmulhw512_mask, __builtin_ia32_pmullw512_mask,
12485         __builtin_ia32_psllwi512_mask, __builtin_ia32_psllw512_mask,
12486         __builtin_ia32_packsswb512_mask, __builtin_ia32_packuswb512_mask,
12487         __builtin_ia32_psrav32hi_mask, __builtin_ia32_pmaddubsw512_mask,
12488         __builtin_ia32_pmaddwd512_mask, __builtin_ia32_psrlv32hi_mask,
12489         __builtin_ia32_punpckhbw512_mask, __builtin_ia32_punpckhwd512_mask,
12490         __builtin_ia32_punpcklbw512_mask, __builtin_ia32_punpcklwd512_mask,
12491         __builtin_ia32_pshufb512_mask, __builtin_ia32_pshufhw512_mask,
12492         __builtin_ia32_pshuflw512_mask, __builtin_ia32_psrawi512_mask,
12493         __builtin_ia32_psraw512_mask, __builtin_ia32_psrlwi512_mask,
12494         __builtin_ia32_psrlw512_mask, __builtin_ia32_cvtb2mask512,
12495         __builtin_ia32_cvtw2mask512, __builtin_ia32_cvtmask2b512,
12496         __builtin_ia32_cvtmask2w512, __builtin_ia32_pcmpeqb512_mask,
12497         __builtin_ia32_pcmpeqw512_mask, __builtin_ia32_pcmpgtb512_mask,
12498         __builtin_ia32_pcmpgtw512_mask, __builtin_ia32_ptestmb512,
12499         __builtin_ia32_ptestmw512, __builtin_ia32_ptestnmb512,
12500         __builtin_ia32_ptestnmw512, __builtin_ia32_psllv32hi_mask,
12501         __builtin_ia32_pabsb512_mask, __builtin_ia32_pabsw512_mask,
12502         __builtin_ia32_blendmw_512_mask, __builtin_ia32_blendmb_512_mask,
12503         __builtin_ia32_cmpb512_mask, __builtin_ia32_cmpw512_mask,
12504         __builtin_ia32_ucmpb512_mask, __builtin_ia32_ucmpw512_mask,
12505         __builtin_ia32_rangesd128_round, __builtin_ia32_rangess128_round,
12506         __builtin_ia32_cvtpd2qq512_mask, __builtin_ia32_cvtps2qq512_mask,
12507         __builtin_ia32_cvtpd2uqq512_mask, __builtin_ia32_cvtps2uqq512_mask,
12508         __builtin_ia32_cvtqq2ps512_mask, __builtin_ia32_cvtuqq2ps512_mask,
12509         __builtin_ia32_cvtqq2pd512_mask, __builtin_ia32_cvtuqq2pd512_mask,
12510         __builtin_ia32_cvttps2qq512_mask, __builtin_ia32_cvttps2uqq512_mask,
12511         __builtin_ia32_cvttpd2qq512_mask, __builtin_ia32_cvttpd2uqq512_mask,
12512         __builtin_ia32_rangeps512_mask, __builtin_ia32_rangepd512_mask.
12513         (ix86_expand_args_builtin): Handle HI_FTYPE_V16QI, SI_FTYPE_V32QI,
12514         DI_FTYPE_V64QI, V16QI_FTYPE_HI, V32QI_FTYPE_SI, V64QI_FTYPE_DI,
12515         V8HI_FTYPE_QI, V16HI_FTYPE_HI, V32HI_FTYPE_SI, V4SI_FTYPE_QI,
12516         V8SI_FTYPE_QI, V4SI_FTYPE_HI, V8SI_FTYPE_HI, QI_FTYPE_V8HI,
12517         HI_FTYPE_V16HI, SI_FTYPE_V32HI, QI_FTYPE_V4SI, QI_FTYPE_V8SI,
12518         HI_FTYPE_V16SI, QI_FTYPE_V2DI, QI_FTYPE_V4DI, QI_FTYPE_V8DI,
12519         V2DI_FTYPE_QI, V4DI_FTYPE_QI, V8DI_FTYPE_V64QI_V64QI,
12520         SI_FTYPE_SI_SI,DI_FTYPE_DI_DI, V8DI_FTYPE_V8DI_INT_CONVERT,
12521         QI_FTYPE_V4SF_INT, QI_FTYPE_V2DF_INT,
12522         V8SF_FTYPE_V4SF_V8SF_QI, V4DF_FTYPE_V2DF_V4DF_QI,
12523         V8SI_FTYPE_V4SI_V8SI_QI, V8SI_FTYPE_SI_V8SI_QI,
12524         V4SI_FTYPE_V4SI_V4SI_QI, V4SI_FTYPE_SI_V4SI_QI,
12525         V4DI_FTYPE_V2DI_V4DI_QI, V4DI_FTYPE_DI_V4DI_QI,
12526         V2DI_FTYPE_V2DI_V2DI_QI, V2DI_FTYPE_DI_V2DI_QI,
12527         V64QI_FTYPE_V64QI_V64QI_DI, V64QI_FTYPE_V16QI_V64QI_DI,
12528         V64QI_FTYPE_QI_V64QI_DI, V32QI_FTYPE_V32QI_V32QI_SI,
12529         V32QI_FTYPE_V16QI_V32QI_SI, V32QI_FTYPE_QI_V32QI_SI,
12530         V16QI_FTYPE_V16QI_V16QI_HI, V16QI_FTYPE_QI_V16QI_HI,
12531         V32HI_FTYPE_V8HI_V32HI_SI, V32HI_FTYPE_HI_V32HI_SI,
12532         V16HI_FTYPE_V8HI_V16HI_HI, V16HI_FTYPE_HI_V16HI_HI,
12533         V8HI_FTYPE_V8HI_V8HI_QI, V8HI_FTYPE_HI_V8HI_QI,
12534         V8SF_FTYPE_V8HI_V8SF_QI, V4SF_FTYPE_V8HI_V4SF_QI,
12535         V8SI_FTYPE_V8SF_V8SI_QI, V4SI_FTYPE_V4SF_V4SI_QI,
12536         V8DI_FTYPE_V8SF_V8DI_QI, V4DI_FTYPE_V4SF_V4DI_QI,
12537         V2DI_FTYPE_V4SF_V2DI_QI, V8SF_FTYPE_V8DI_V8SF_QI,
12538         V4SF_FTYPE_V4DI_V4SF_QI, V4SF_FTYPE_V2DI_V4SF_QI,
12539         V8DF_FTYPE_V8DI_V8DF_QI, V4DF_FTYPE_V4DI_V4DF_QI,
12540         V2DF_FTYPE_V2DI_V2DF_QI, V16QI_FTYPE_V8HI_V16QI_QI,
12541         V16QI_FTYPE_V16HI_V16QI_HI, V16QI_FTYPE_V4SI_V16QI_QI,
12542         V16QI_FTYPE_V8SI_V16QI_QI, V8HI_FTYPE_V4SI_V8HI_QI,
12543         V8HI_FTYPE_V8SI_V8HI_QI, V16QI_FTYPE_V2DI_V16QI_QI,
12544         V16QI_FTYPE_V4DI_V16QI_QI, V8HI_FTYPE_V2DI_V8HI_QI,
12545         V8HI_FTYPE_V4DI_V8HI_QI, V4SI_FTYPE_V2DI_V4SI_QI,
12546         V4SI_FTYPE_V4DI_V4SI_QI, V32QI_FTYPE_V32HI_V32QI_SI,
12547         HI_FTYPE_V16QI_V16QI_HI, SI_FTYPE_V32QI_V32QI_SI,
12548         DI_FTYPE_V64QI_V64QI_DI, QI_FTYPE_V8HI_V8HI_QI,
12549         HI_FTYPE_V16HI_V16HI_HI, SI_FTYPE_V32HI_V32HI_SI,
12550         QI_FTYPE_V4SI_V4SI_QI, QI_FTYPE_V8SI_V8SI_QI,
12551         QI_FTYPE_V2DI_V2DI_QI, QI_FTYPE_V4DI_V4DI_QI,
12552         V4SF_FTYPE_V2DF_V4SF_QI, V4SF_FTYPE_V4DF_V4SF_QI,
12553         V2DI_FTYPE_V4SI_V2DI_QI, V2DI_FTYPE_V8HI_V2DI_QI,
12554         V2DI_FTYPE_V16QI_V2DI_QI, V4DI_FTYPE_V4DI_V4DI_QI,
12555         V4DI_FTYPE_V4SI_V4DI_QI, V4DI_FTYPE_V8HI_V4DI_QI,
12556         V4DI_FTYPE_V16QI_V4DI_QI, V8DI_FTYPE_V8DF_V8DI_QI,
12557         V4DI_FTYPE_V4DF_V4DI_QI, V2DI_FTYPE_V2DF_V2DI_QI,
12558         V4SI_FTYPE_V4DF_V4SI_QI, V4SI_FTYPE_V2DF_V4SI_QI,
12559         V4SI_FTYPE_V8HI_V4SI_QI, V4SI_FTYPE_V16QI_V4SI_QI,
12560         V8SI_FTYPE_V8SI_V8SI_V8SI, V8SF_FTYPE_V8SF_V8SF_QI,
12561         V8SF_FTYPE_V8SI_V8SF_QI, V4DF_FTYPE_V4DF_V4DF_QI,
12562         V4SF_FTYPE_V4SF_V4SF_QI, V2DF_FTYPE_V2DF_V2DF_QI,
12563         V2DF_FTYPE_V4SF_V2DF_QI, V2DF_FTYPE_V4SI_V2DF_QI,
12564         V4SF_FTYPE_V4SI_V4SF_QI, V4DF_FTYPE_V4SF_V4DF_QI,
12565         V4DF_FTYPE_V4SI_V4DF_QI, V8SI_FTYPE_V8SI_V8SI_QI,
12566         V8SI_FTYPE_V8HI_V8SI_QI, V8SI_FTYPE_V16QI_V8SI_QI,
12567         V16SF_FTYPE_V8SF_V16SF_HI, V16SI_FTYPE_V8SI_V16SI_HI,
12568         V16HI_FTYPE_V16HI_V16HI_HI, V8HI_FTYPE_V16QI_V8HI_QI,
12569         V16HI_FTYPE_V16QI_V16HI_HI, V32HI_FTYPE_V32HI_V32HI_SI,
12570         V32HI_FTYPE_V32QI_V32HI_SI, V8DI_FTYPE_V8DI_V8DI_INT_CONVERT,
12571         V8DI_FTYPE_V8DI_V8DI_INT_V8DI_DI_CONVERT, QI_FTYPE_V8DF_INT_QI,
12572         QI_FTYPE_V4DF_INT_QI, QI_FTYPE_V2DF_INT_QI,
12573         HI_FTYPE_V16SF_INT_HI, QI_FTYPE_V8SF_INT_QI,
12574         QI_FTYPE_V4SF_INT_QI, V4DI_FTYPE_V4DI_V4DI_INT_V4DI_SI_CONVERT,
12575         V2DI_FTYPE_V2DI_V2DI_INT_V2DI_HI_CONVERT, V32QI_FTYPE_V32QI_V32QI_V32QI_SI,
12576         V32HI_FTYPE_V32HI_V32HI_V32HI_SI, V32HI_FTYPE_V64QI_V64QI_V32HI_SI,
12577         V16SI_FTYPE_V32HI_V32HI_V16SI_HI, V64QI_FTYPE_V64QI_V64QI_V64QI_DI,
12578         V32HI_FTYPE_V32HI_V8HI_V32HI_SI, V16HI_FTYPE_V16HI_V8HI_V16HI_HI,
12579         V8SI_FTYPE_V8SI_V4SI_V8SI_QI, V4DI_FTYPE_V4DI_V2DI_V4DI_QI,
12580         V64QI_FTYPE_V32HI_V32HI_V64QI_DI, V32QI_FTYPE_V16HI_V16HI_V32QI_SI,
12581         V16QI_FTYPE_V8HI_V8HI_V16QI_HI, V32HI_FTYPE_V16SI_V16SI_V32HI_SI,
12582         V16HI_FTYPE_V8SI_V8SI_V16HI_HI, V8HI_FTYPE_V4SI_V4SI_V8HI_QI,
12583         V4DF_FTYPE_V4DF_V4DI_V4DF_QI, V8SF_FTYPE_V8SF_V8SI_V8SF_QI,
12584         V4SF_FTYPE_V4SF_V4SI_V4SF_QI, V2DF_FTYPE_V2DF_V2DI_V2DF_QI,
12585         V2DI_FTYPE_V4SI_V4SI_V2DI_QI, V4DI_FTYPE_V8SI_V8SI_V4DI_QI,
12586         V4DF_FTYPE_V4DI_V4DF_V4DF_QI, V8SF_FTYPE_V8SI_V8SF_V8SF_QI,
12587         V2DF_FTYPE_V2DI_V2DF_V2DF_QI, V4SF_FTYPE_V4SI_V4SF_V4SF_QI,
12588         V8HI_FTYPE_V8HI_V8HI_V8HI_QI, V8SI_FTYPE_V8SI_V8SI_V8SI_QI,
12589         V4SI_FTYPE_V4SI_V4SI_V4SI_QI, V8SF_FTYPE_V8SF_V8SF_V8SF_QI,
12590         V16QI_FTYPE_V16QI_V16QI_V16QI_HI, V16HI_FTYPE_V16HI_V16HI_V16HI_HI,
12591         V2DI_FTYPE_V2DI_V2DI_V2DI_QI, V4DI_FTYPE_V4DI_V4DI_V4DI_QI,
12592         V4DF_FTYPE_V4DF_V4DF_V4DF_QI, V8HI_FTYPE_V16QI_V16QI_V8HI_QI,
12593         V16HI_FTYPE_V32QI_V32QI_V16HI_HI, V8SI_FTYPE_V16HI_V16HI_V8SI_QI,
12594         V4SI_FTYPE_V8HI_V8HI_V4SI_QI, QI_FTYPE_V4DI_V4DI_INT_QI,
12595         QI_FTYPE_V8SI_V8SI_INT_QI, QI_FTYPE_V4DF_V4DF_INT_QI,
12596         QI_FTYPE_V8SF_V8SF_INT_QI, QI_FTYPE_V2DI_V2DI_INT_QI,
12597         QI_FTYPE_V4SI_V4SI_INT_QI, DI_FTYPE_V64QI_V64QI_INT_DI,
12598         SI_FTYPE_V32QI_V32QI_INT_SI, HI_FTYPE_V16QI_V16QI_INT_HI,
12599         SI_FTYPE_V32HI_V32HI_INT_SI, HI_FTYPE_V16HI_V16HI_INT_HI,
12600         QI_FTYPE_V8HI_V8HI_INT_QI, V8SF_FTYPE_V8SF_INT_V8SF_QI,
12601         V4SF_FTYPE_V4SF_INT_V4SF_QI, V2DF_FTYPE_V4DF_INT_V2DF_QI,
12602         V2DI_FTYPE_V4DI_INT_V2DI_QI, V8SF_FTYPE_V16SF_INT_V8SF_QI,
12603         V8SI_FTYPE_V16SI_INT_V8SI_QI, V2DF_FTYPE_V8DF_INT_V2DF_QI,
12604         V2DI_FTYPE_V8DI_INT_V2DI_QI, V4SF_FTYPE_V8SF_INT_V4SF_QI,
12605         V4SI_FTYPE_V8SI_INT_V4SI_QI, V8HI_FTYPE_V8SF_INT_V8HI_QI,
12606         V8HI_FTYPE_V4SF_INT_V8HI_QI, V32HI_FTYPE_V32HI_INT_V32HI_SI,
12607         V16HI_FTYPE_V16HI_INT_V16HI_HI, V8HI_FTYPE_V8HI_INT_V8HI_QI,
12608         V4DI_FTYPE_V4DI_INT_V4DI_QI, V2DI_FTYPE_V2DI_INT_V2DI_QI,
12609         V8SI_FTYPE_V8SI_INT_V8SI_QI, V4SI_FTYPE_V4SI_INT_V4SI_QI,
12610         V4DF_FTYPE_V4DF_INT_V4DF_QI, V2DF_FTYPE_V2DF_INT_V2DF_QI,
12611         V4DF_FTYPE_V4DF_V4DF_INT_V4DF_QI, V8SF_FTYPE_V8SF_V8SF_INT_V8SF_QI,
12612         V8DF_FTYPE_V8DF_V2DF_INT_V8DF_QI, V8DI_FTYPE_V8DI_V2DI_INT_V8DI_QI,
12613         V8SI_FTYPE_V8SI_V8SI_INT_V8SI_QI, V4DI_FTYPE_V4DI_V4DI_INT_V4DI_QI,
12614         V4SI_FTYPE_V4SI_V4SI_INT_V4SI_QI, V2DI_FTYPE_V2DI_V2DI_INT_V2DI_QI,
12615         V32HI_FTYPE_V64QI_V64QI_INT_V32HI_SI, V16HI_FTYPE_V32QI_V32QI_INT_V16HI_HI,
12616         V8HI_FTYPE_V16QI_V16QI_INT_V8HI_QI, V16SF_FTYPE_V16SF_V8SF_INT_V16SF_HI,
12617         V16SI_FTYPE_V16SI_V8SI_INT_V16SI_HI, V8SF_FTYPE_V8SF_V4SF_INT_V8SF_QI,
12618         V8SI_FTYPE_V8SI_V4SI_INT_V8SI_QI, V4DI_FTYPE_V4DI_V2DI_INT_V4DI_QI,
12619         V4DF_FTYPE_V4DF_V2DF_INT_V4DF_QI, V8SF_FTYPE_V8SF_V8SF_V8SI_INT_QI,
12620         V8SI_FTYPE_V8SI_V8SI_V8SI_INT_QI, V4DF_FTYPE_V4DF_V4DF_V4DI_INT_QI,
12621         V4DI_FTYPE_V4DI_V4DI_V4DI_INT_QI, V4SI_FTYPE_V4SI_V4SI_V4SI_INT_QI,
12622         V2DI_FTYPE_V2DI_V2DI_V2DI_INT_QI, V8DI_FTYPE_V8DF_V8DI_QI_INT,
12623         V8SF_FTYPE_V8DI_V8SF_QI_INT, V8DF_FTYPE_V8DI_V8DF_QI_INT,
12624         V8DI_FTYPE_V8SF_V8DI_QI_INT, V16SF_FTYPE_V16SF_V16SF_INT_V16SF_HI_INT,
12625         V8DF_FTYPE_V8DF_V8DF_INT_V8DF_QI_INT, VOID_FTYPE_PV4DI_V4DI_QI,
12626         VOID_FTYPE_PV2DI_V2DI_QI, VOID_FTYPE_PV8SI_V8SI_QI,
12627         VOID_FTYPE_PV4SI_V4SI_QI, VOID_FTYPE_PV4SI_V4DI_QI,
12628         VOID_FTYPE_PV4SI_V2DI_QI, VOID_FTYPE_PV8HI_V4DI_QI,
12629         VOID_FTYPE_PV8HI_V2DI_QI, VOID_FTYPE_PV8HI_V8SI_QI,
12630         VOID_FTYPE_PV8HI_V4SI_QI, VOID_FTYPE_PV16QI_V4DI_QI,
12631         VOID_FTYPE_PV16QI_V2DI_QI, VOID_FTYPE_PV16QI_V8SI_QI,
12632         VOID_FTYPE_PV16QI_V4SI_QI, VOID_FTYPE_PV8HI_V8HI_QI,
12633         VOID_FTYPE_PV16HI_V16HI_HI, VOID_FTYPE_PV32HI_V32HI_SI,
12634         VOID_FTYPE_PV16QI_V16QI_HI, VOID_FTYPE_PV32QI_V32QI_SI,
12635         VOID_FTYPE_PV64QI_V64QI_DI, VOID_FTYPE_PV4DF_V4DF_QI,
12636         VOID_FTYPE_PV2DF_V2DF_QI, VOID_FTYPE_PV8SF_V8SF_QI,
12637         VOID_FTYPE_PV4SF_V4SF_QI, V4SF_FTYPE_PCV4SF_V4SF_QI,
12638         V8SF_FTYPE_PCV8SF_V8SF_QI, V4SI_FTYPE_PCV4SI_V4SI_QI,
12639         V8SI_FTYPE_PCV8SI_V8SI_QI, V2DF_FTYPE_PCV2DF_V2DF_QI,
12640         V4DF_FTYPE_PCV4DF_V4DF_QI, V2DI_FTYPE_PCV2DI_V2DI_QI,
12641         V4DI_FTYPE_PCV4DI_V4DI_QI, V8HI_FTYPE_PCV8HI_V8HI_QI,
12642         V16HI_FTYPE_PCV16HI_V16HI_HI, V32HI_FTYPE_PCV32HI_V32HI_SI,
12643         V16QI_FTYPE_PCV16QI_V16QI_HI, V32QI_FTYPE_PCV32QI_V32QI_SI,
12644         V64QI_FTYPE_PCV64QI_V64QI_DI, do not handle V8USI_FTYPE_V8USI.
12646 2014-10-28  Jakub Jelinek  <jakub@redhat.com>
12648         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Use uint64_t
12649         type for the left shift in CASE_CONVERT case.
12651 2014-10-28  Max Ostapenko  <m.ostapenko@partner.samsung.com>
12653         * asan.h (asan_intercepted_p): New function.
12654         * asan.c (asan_mem_ref_hasher::hash): Remove MEM_REF access size from
12655         hash value construction.  Call iterative_hash_expr instead of explicit
12656         hash building.
12657         (asan_mem_ref_hasher::equal): Change condition.
12658         (has_mem_ref_been_instrumented): Likewise.
12659         (update_mem_ref_hash_table): Likewise.
12660         (maybe_update_mem_ref_hash_table): New function.
12661         (instrument_strlen_call): Removed.
12662         (get_mem_refs_of_builtin_call): Handle new parameter.
12663         (instrument_builtin_call): Call maybe_update_mem_ref_hash_table instead
12664         of instrument_mem_region_access if intercepted_p is true.
12665         (instrument_mem_region_access): Instrument only base with len instead of
12666         base and end with 1.
12667         (build_check_stmt): Remove start_instrumented and end_instrumented
12668         parameters.
12669         (enum asan_check_flags): Remove ASAN_CHECK_START_INSTRUMENTED and
12670         ASAN_CHECK_END_INSTRUMENTED.  Change ASAN_CHECK_LAST.
12671         (asan_expand_check_ifn): Remove start_instrumented and end_instrumented.
12672         * builtins.c (expand_builtin): Include asan.h.  Don't expand
12673         string/memory builtin functions that have interceptors if ASan is
12674         enabled.
12676 2014-10-28  Richard Biener  <rguenther@suse.de>
12678         PR middle-end/63665
12679         * fold-const.c (fold_comparison): Properly guard simplifying
12680         against INT_MAX/INT_MIN with !TYPE_OVERFLOW_WRAPS.
12682 2014-10-28  Alan Lawrence  <alan.lawrence@arm.com>
12684         * expr.c (expand_expr_real_2): Remove code handling VEC_LSHIFT_EXPR.
12685         * fold-const.c (const_binop): Likewise.
12686         * cfgexpand.c (expand_debug_expr): Likewise.
12687         * tree-inline.c (estimate_operator_cost): Likewise.
12688         * tree-vect-generic.c (expand_vector_operations_1): Likewise.
12689         * optabs.c (optab_for_tree_code): Likewise.
12690         (expand_vec_shift_expr): Likewise, update comment.
12691         * tree.def: Delete VEC_LSHIFT_EXPR, remove comment.
12692         * optabs.h (expand_vec_shift_expr): Remove comment re. VEC_LSHIFT_EXPR.
12693         * optabs.def: Remove vec_shl_optab.
12694         * doc/md.texi: Remove references to vec_shr_m.
12696 2014-10-28  Yury Gribov  <y.gribov@samsung.com>
12698         * asan.c (report_error_func): Add noabort path.
12699         (check_func): Ditto.  Formatting.
12700         (asan_expand_check_ifn): Handle noabort path.
12701         * common.opt (flag_sanitize_recover): Add SANITIZE_KERNEL_ADDRESS
12702         to default value.
12703         * doc/invoke.texi (-fsanitize-recover=): Mention KASan.
12704         * opts.c (finish_options): Reword comment.
12705         * sanitizer.def: Add noabort ASan builtins.
12707 2014-10-28  Yury Gribov  <y.gribov@samsung.com>
12709         * asan.c (set_asan_shadow_offset): New function.
12710         (asan_shadow_offset): Likewise.
12711         (asan_emit_stack_protection): Call asan_shadow_offset.
12712         (build_shadow_mem_access): Likewise.
12713         * asan.h (set_asan_shadow_offset): Declare.
12714         * common.opt (fasan-shadow-offset): New option.
12715         (frandom-seed): Fixed parameter name.
12716         * doc/invoke.texi (fasan-shadow-offset): Describe new option.
12717         (frandom-seed): Fixed parameter name.
12718         * opts-global.c (handle_common_deferred_options): Handle
12719         -fasan-shadow-offset.
12720         * opts.c (common_handle_option): Likewise.
12722 2014-10-27  Jiong Wang <jiong.wang@arm.com>
12724         PR target/63442
12725         * optabs.c (prepare_cmp_insn): Use "ret_mode" instead of "word_mode".
12727 2014-10-27  DJ Delorie  <dj@redhat.com>
12729         * tree.c (build_common_tree_nodes): Don't even store the
12730         __int128 types if they're not supported.
12732 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12734         * config/i386/i386.c (ix86_loop_memcount): Delete.
12735         (ix86_loop_unroll_adjust): Use FOR_EACH_SUBRTX.
12737 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12739         * config/i386/i386.c (find_constant_1): Delete.
12740         (find_constant): Use FOR_EACH_SUBRTX.
12742 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12744         * config/i386/i386.c (extended_reg_mentioned_1): Delete.
12745         (x86_extended_reg_mentioned_p): Use FOR_EACH_SUBRTX.
12747 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12749         * config/i386/i386.c: Include rtl-iter.h
12750         (ix86_check_avx256_register): Take a const_rtx and return a bool.
12751         (ix86_check_avx256_stores): Update call accordingly.
12752         (ix86_avx_u128_mode_entry, ix86_avx_u128_mode_exit): Likewise.
12753         (ix86_avx_u128_mode_needed): Likewise.  Use FOR_EACH_SUBRTX.
12755 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12757         * config/alpha/alpha-protos.h (some_small_symbolic_operand_int):
12758         Take an rtx and return a bool.
12759         * config/alpha/alpha.c (some_small_symbolic_operand_int): Likewise.
12760         Use FOR_EACH_SUBRTX_VAR.
12761         * config/alpha/predicates.md (some_small_symbolic_operand): Update
12762         accordingly.
12764 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12766         * config/alpha/alpha-protos.h (alpha_find_lo_sum_using_gp): Return
12767         a bool.
12768         * config/alpha/alpha.c (find_lo_sum_using_gp): Delete.
12769         (alpha_find_lo_sum_using_gp): Use FOR_EACH_SUBRTX.  Return a bool.
12771 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12773         * config/alpha/alpha.c (alpha_set_memflags_1): Delete.
12774         (alpha_set_memflags): Use FOR_EACH_SUBRTX_VAR.
12776 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12778         * config/alpha/alpha.c: Include rtl-iter.h.
12779         (split_small_symbolic_operand_1): Delete.
12780         (split_small_symbolic_operand): Use FOR_EACH_SUBRTX_PTR.
12782 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12784         * config/s390/s390.c: Include rtl-iter.h.
12785         (check_dpu): Delete.
12786         (s390_loop_unroll_adjust): Only iterate over patterns.
12787         Use FOR_EACH_SUBRTX.
12789 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12791         * config/spu/spu.c: Include rtl-iter.h
12792         (ea_symbol_ref): Replace with...
12793         (ea_symbol_ref_p): ...this new function.
12794         (spu_legitimate_address_p): Update call accordingly.
12795         (spu_legitimate_constant_p): Likewise.  Use FOR_EACH_SUBRTX.
12797 2014-10-27  Phil Muldoon  <pmuldoon@redhat.com>
12798             Tom Tromey  <tromey@redhat.com>
12800         * aclocal.m4, configure: Rebuild.
12801         * Makefile.in (aclocal_deps): Add gcc-plugin.m4.
12802         * configure.ac: Use GCC_ENABLE_PLUGINS.
12803         * stor-layout.c (finish_bitfield_layout): Now public.  Change
12804         argument type to 'tree'.
12805         (finish_record_layout): Update.
12806         * stor-layout.h (finish_bitfield_layout): Declare.
12808 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12810         * config/aarch64/aarch64.c (TARGET_GIMPLE_FOLD_BUILTIN): Define again.
12811         * config/aarch64/aarch64-builtins.c (aarch64_gimple_fold_builtin):
12812         Restore, enable for bigendian, update to use __builtin..._scal...
12814 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12816         * config/aarch64/aarch64-simd-builtins.def (reduc_smax_, reduc_smin_,
12817         reduc_umax_, reduc_umin_, reduc_smax_nan_, reduc_smin_nan_): Remove.
12818         (reduc_smax_scal_, reduc_smin_scal_, reduc_umax_scal_,
12819         reduc_umin_scal_, reduc_smax_nan_scal_, reduc_smin_nan_scal_): New.
12821         * config/aarch64/aarch64-simd.md
12822         (reduc_<maxmin_uns>_<mode>): Rename VDQV_S variant to...
12823         (reduc_<maxmin_uns>_internal<mode>): ...this.
12824         (reduc_<maxmin_uns>_<mode>): New (VDQ_BHSI).
12825         (reduc_<maxmin_uns>_scal_<mode>): New (*2).
12827         (reduc_<maxmin_uns>_v2si): Combine with below, renaming...
12828         (reduc_<maxmin_uns>_<mode>): Combine V2F with above, renaming...
12829         (reduc_<maxmin_uns>_internal_<mode>): ...to this (VDQF).
12831         * config/aarch64/arm_neon.h (vmaxv_f32, vmaxv_s8, vmaxv_s16,
12832         vmaxv_s32, vmaxv_u8, vmaxv_u16, vmaxv_u32, vmaxvq_f32, vmaxvq_f64,
12833         vmaxvq_s8, vmaxvq_s16, vmaxvq_s32, vmaxvq_u8, vmaxvq_u16, vmaxvq_u32,
12834         vmaxnmv_f32, vmaxnmvq_f32, vmaxnmvq_f64, vminv_f32, vminv_s8,
12835         vminv_s16, vminv_s32, vminv_u8, vminv_u16, vminv_u32, vminvq_f32,
12836         vminvq_f64, vminvq_s8, vminvq_s16, vminvq_s32, vminvq_u8, vminvq_u16,
12837         vminvq_u32, vminnmv_f32, vminnmvq_f32, vminnmvq_f64): Update to use
12838         __builtin_aarch64_reduc_..._scal; remove vget_lane wrapper.
12840 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12842         * config/aarch64/aarch64-simd-builtins.def
12843         (reduc_splus_<mode>/VDQF, reduc_uplus_<mode>/VDQF, reduc_splus_v4sf):
12844         Remove.
12845         (reduc_plus_scal_<mode>, reduc_plus_scal_v4sf): New.
12847         * config/aarch64/aarch64-simd.md (reduc_<sur>plus_mode): Remove.
12848         (reduc_splus_<mode>, reduc_uplus_<mode>, reduc_plus_scal_<mode>): New.
12850         (reduc_<sur>plus_mode): Change SUADDV -> UNSPEC_ADDV, rename to...
12851         (aarch64_reduc_plus_internal<mode>): ...this.
12853         (reduc_<sur>plus_v2si): Change SUADDV -> UNSPEC_ADDV, rename to...
12854         (aarch64_reduc_plus_internalv2si): ...this.
12856         (reduc_splus_<mode>/V2F): Rename to...
12857         (aarch64_reduc_plus_internal<mode>): ...this.
12859         * config/aarch64/iterators.md
12860         (UNSPEC_SADDV, UNSPEC_UADDV, SUADDV): Remove.
12861         (UNSPEC_ADDV): New.
12862         (sur): Remove elements for UNSPEC_SADDV and UNSPEC_UADDV.
12864         * config/aarch64/arm_neon.h (vaddv_s8, vaddv_s16, vaddv_s32, vaddv_u8,
12865         vaddv_u16, vaddv_u32, vaddvq_s8, vaddvq_s16, vaddvq_s32, vaddvq_s64,
12866         vaddvq_u8, vaddvq_u16, vaddvq_u32, vaddvq_u64, vaddv_f32, vaddvq_f32,
12867         vaddvq_f64): Change __builtin_aarch64_reduc_[us]plus_... to
12868         __builtin_aarch64_reduc_plus_scal, remove vget_lane wrapper.
12870 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12872         PR tree-optimization/61114
12873         * doc/md.texi (Standard Names): Add reduc_(plus,[us](min|max))|scal
12874         optabs, and note in reduc_[us](plus|min|max) to prefer the former.
12876         * expr.c (expand_expr_real_2): Use reduc_..._scal if available, fall
12877         back to old reduc_... + BIT_FIELD_REF only if not.
12879         * optabs.c (optab_for_tree_code): for REDUC_(MAX,MIN,PLUS)_EXPR,
12880         return the reduce-to-scalar (reduc_..._scal) optab.
12881         (scalar_reduc_to_vector): New.
12883         * optabs.def (reduc_smax_scal_optab, reduc_smin_scal_optab,
12884         reduc_plus_scal_optab, reduc_umax_scal_optab, reduc_umin_scal_optab):
12885         New.
12887         * optabs.h (scalar_reduc_to_vector): Declare.
12889         * tree-vect-loop.c (vectorizable_reduction): Look for optabs reducing
12890         to either scalar or vector.
12892 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12894         PR tree-optimization/61114
12895         * expr.c (expand_expr_real_2): For REDUC_{MIN,MAX,PLUS}_EXPR, add
12896         extract_bit_field around optab result.
12898         * fold-const.c (fold_unary_loc): For REDUC_{MIN,MAX,PLUS}_EXPR, produce
12899         scalar not vector.
12901         * tree-cfg.c (verify_gimple_assign_unary): Check result vs operand type
12902         for REDUC_{MIN,MAX,PLUS}_EXPR.
12904         * tree-vect-loop.c (vect_analyze_loop): Update comment.
12905         (vect_create_epilog_for_reduction): For direct vector reduction, use
12906         result of tree code directly without extract_bit_field.
12908         * tree.def (REDUC_MAX_EXPR, REDUC_MIN_EXPR, REDUC_PLUS_EXPR): Update
12909         comment.
12911 2014-10-27  Andrew MacLeod  <amacleod@redhat.com>
12913         * basic-block.h: Remove all includes.
12914         (enum profile_status_d, struct control_flow_graph): Move to cfg.h
12915         * cfg.h (profile_status_d, struct control_flow_graph): Relocate here.
12916         * Makefile.in (GTFILES): Add cfg.h to list.
12917         * cgraph.h (symbol_table::create_empty): Move to cgraph.c.
12918         * cgraph.c (symbol_table::create_empty): Relocate from cgraph.h.
12919         * genconditions.c (write_header): Add predict.h and basic-block.h to
12920         lits of includes.
12921         * genemit.c (main): Ditto.
12922         * genpreds.c (write_insn_preds_c): Ditto.
12923         * genrecog.c (write_header): Ditto.
12924         * gengtype.c (open_base_files): Add predict.h, basic-block.h, and cfg.h
12925         to list of includes.
12926         * alias.c: Adjust include files.
12927         * asan.c: Ditto.
12928         * auto-inc-dec.c: Ditto.
12929         * auto-profile.c: Ditto.
12930         * bb-reorder.c: Ditto.
12931         * bt-load.c: Ditto.
12932         * builtins.c: Ditto.
12933         * caller-save.c: Ditto.
12934         * calls.c: Ditto.
12935         * cfg.c: Ditto.
12936         * cfganal.c: Ditto.
12937         * cfgbuild.c: Ditto.
12938         * cfgcleanup.c: Ditto.
12939         * cfgexpand.c: Ditto.
12940         * cfghooks.c: Ditto.
12941         * cfgloop.c: Ditto.
12942         * cfgloopanal.c: Ditto.
12943         * cfgloopmanip.c: Ditto.
12944         * cfgrtl.c: Ditto.
12945         * cgraphbuild.c: Ditto.
12946         * cgraphclones.c: Ditto.
12947         * cgraphunit.c: Ditto.
12948         * combine-stack-adj.c: Ditto.
12949         * combine.c: Ditto.
12950         * compare-elim.c: Ditto.
12951         * coverage.c: Ditto.
12952         * cprop.c: Ditto.
12953         * cse.c: Ditto.
12954         * cselib.c: Ditto.
12955         * data-streamer-in.c: Ditto.
12956         * data-streamer-out.c: Ditto.
12957         * data-streamer.c: Ditto.
12958         * dce.c: Ditto.
12959         * ddg.c: Ditto.
12960         * ddg.h: Ditto.
12961         * df-core.c: Ditto.
12962         * df-problems.c: Ditto.
12963         * df-scan.c: Ditto.
12964         * df.h: Ditto.
12965         * dojump.c: Ditto.
12966         * dominance.c: Ditto.
12967         * domwalk.c: Ditto.
12968         * dse.c: Ditto.
12969         * dwarf2cfi.c: Ditto.
12970         * emit-rtl.c: Ditto.
12971         * et-forest.c: Ditto.
12972         * except.c: Ditto.
12973         * expmed.c: Ditto.
12974         * expr.c: Ditto.
12975         * final.c: Ditto.
12976         * fold-const.c: Ditto.
12977         * function.c: Ditto.
12978         * fwprop.c: Ditto.
12979         * gcc-plugin.h: Ditto.
12980         * gcse.c: Ditto.
12981         * generic-match-head.c: Ditto.
12982         * ggc-page.c: Ditto.
12983         * gimple-builder.c: Ditto.
12984         * gimple-expr.c: Ditto.
12985         * gimple-fold.c: Ditto.
12986         * gimple-iterator.c: Ditto.
12987         * gimple-low.c: Ditto.
12988         * gimple-match-head.c: Ditto.
12989         * gimple-pretty-print.c: Ditto.
12990         * gimple-ssa-isolate-paths.c: Ditto.
12991         * gimple-ssa-strength-reduction.c: Ditto.
12992         * gimple-streamer-in.c: Ditto.
12993         * gimple-streamer-out.c: Ditto.
12994         * gimple-streamer.h: Ditto.
12995         * gimple-walk.c: Ditto.
12996         * gimple.c: Ditto.
12997         * gimplify-me.c: Ditto.
12998         * gimplify.c: Ditto.
12999         * graph.c: Ditto.
13000         * graphite-blocking.c: Ditto.
13001         * graphite-clast-to-gimple.c: Ditto.
13002         * graphite-dependences.c: Ditto.
13003         * graphite-interchange.c: Ditto.
13004         * graphite-isl-ast-to-gimple.c: Ditto.
13005         * graphite-optimize-isl.c: Ditto.
13006         * graphite-poly.c: Ditto.
13007         * graphite-scop-detection.c: Ditto.
13008         * graphite-sese-to-poly.c: Ditto.
13009         * graphite.c: Ditto.
13010         * haifa-sched.c: Ditto.
13011         * hw-doloop.c: Ditto.
13012         * ifcvt.c: Ditto.
13013         * init-regs.c: Ditto.
13014         * internal-fn.c: Ditto.
13015         * ipa-cp.c: Ditto.
13016         * ipa-devirt.c: Ditto.
13017         * ipa-icf-gimple.c: Ditto.
13018         * ipa-icf.c: Ditto.
13019         * ipa-inline-analysis.c: Ditto.
13020         * ipa-inline.c: Ditto.
13021         * ipa-polymorphic-call.c: Ditto.
13022         * ipa-profile.c: Ditto.
13023         * ipa-prop.c: Ditto.
13024         * ipa-pure-const.c: Ditto.
13025         * ipa-reference.c: Ditto.
13026         * ipa-split.c: Ditto.
13027         * ipa-utils.c: Ditto.
13028         * ipa.c: Ditto.
13029         * ira-build.c: Ditto.
13030         * ira-color.c: Ditto.
13031         * ira-conflicts.c: Ditto.
13032         * ira-costs.c: Ditto.
13033         * ira-emit.c: Ditto.
13034         * ira-lives.c: Ditto.
13035         * ira.c: Ditto.
13036         * jump.c: Ditto.
13037         * lcm.c: Ditto.
13038         * loop-doloop.c: Ditto.
13039         * loop-init.c: Ditto.
13040         * loop-invariant.c: Ditto.
13041         * loop-iv.c: Ditto.
13042         * loop-unroll.c: Ditto.
13043         * lower-subreg.c: Ditto.
13044         * lra-assigns.c: Ditto.
13045         * lra-coalesce.c: Ditto.
13046         * lra-constraints.c: Ditto.
13047         * lra-eliminations.c: Ditto.
13048         * lra-lives.c: Ditto.
13049         * lra-spills.c: Ditto.
13050         * lra.c: Ditto.
13051         * lto-cgraph.c: Ditto.
13052         * lto-compress.c: Ditto.
13053         * lto-opts.c: Ditto.
13054         * lto-section-in.c: Ditto.
13055         * lto-section-out.c: Ditto.
13056         * lto-streamer-in.c: Ditto.
13057         * lto-streamer-out.c: Ditto.
13058         * lto-streamer.c: Ditto.
13059         * mcf.c: Ditto.
13060         * mode-switching.c: Ditto.
13061         * modulo-sched.c: Ditto.
13062         * omp-low.c: Ditto.
13063         * optabs.c: Ditto.
13064         * opts-global.c: Ditto.
13065         * passes.c: Ditto.
13066         * postreload-gcse.c: Ditto.
13067         * postreload.c: Ditto.
13068         * predict.c: Ditto.
13069         * print-rtl.c: Ditto.
13070         * profile.c: Ditto.
13071         * recog.c: Ditto.
13072         * ree.c: Ditto.
13073         * reg-stack.c: Ditto.
13074         * regcprop.c: Ditto.
13075         * regcprop.h: Ditto.
13076         * reginfo.c: Ditto.
13077         * regrename.c: Ditto.
13078         * regstat.c: Ditto.
13079         * reload.c: Ditto.
13080         * reload1.c: Ditto.
13081         * reorg.c: Ditto.
13082         * resource.c: Ditto.
13083         * rtlanal.c: Ditto.
13084         * sched-deps.c: Ditto.
13085         * sched-ebb.c: Ditto.
13086         * sched-int.h: Ditto.
13087         * sched-rgn.c: Ditto.
13088         * sched-vis.c: Ditto.
13089         * sel-sched-dump.c: Ditto.
13090         * sel-sched-ir.c: Ditto.
13091         * sel-sched-ir.h: Ditto.
13092         * sel-sched.c: Ditto.
13093         * sese.c: Ditto.
13094         * shrink-wrap.c: Ditto.
13095         * stack-ptr-mod.c: Ditto.
13096         * stmt.c: Ditto.
13097         * store-motion.c: Ditto.
13098         * symtab.c: Ditto.
13099         * toplev.c: Ditto.
13100         * tracer.c: Ditto.
13101         * trans-mem.c: Ditto.
13102         * tree-affine.c: Ditto.
13103         * tree-call-cdce.c: Ditto.
13104         * tree-cfg.c: Ditto.
13105         * tree-cfgcleanup.c: Ditto.
13106         * tree-chrec.c: Ditto.
13107         * tree-complex.c: Ditto.
13108         * tree-data-ref.c: Ditto.
13109         * tree-dfa.c: Ditto.
13110         * tree-eh.c: Ditto.
13111         * tree-emutls.c: Ditto.
13112         * tree-if-conv.c: Ditto.
13113         * tree-inline.c: Ditto.
13114         * tree-into-ssa.c: Ditto.
13115         * tree-loop-distribution.c: Ditto.
13116         * tree-nested.c: Ditto.
13117         * tree-nrv.c: Ditto.
13118         * tree-object-size.c: Ditto.
13119         * tree-outof-ssa.c: Ditto.
13120         * tree-parloops.c: Ditto.
13121         * tree-phinodes.c: Ditto.
13122         * tree-predcom.c: Ditto.
13123         * tree-pretty-print.c: Ditto.
13124         * tree-profile.c: Ditto.
13125         * tree-scalar-evolution.c: Ditto.
13126         * tree-sra.c: Ditto.
13127         * tree-ssa-address.c: Ditto.
13128         * tree-ssa-alias.c: Ditto.
13129         * tree-ssa-ccp.c: Ditto.
13130         * tree-ssa-coalesce.c: Ditto.
13131         * tree-ssa-copy.c: Ditto.
13132         * tree-ssa-copyrename.c: Ditto.
13133         * tree-ssa-dce.c: Ditto.
13134         * tree-ssa-dom.c: Ditto.
13135         * tree-ssa-dse.c: Ditto.
13136         * tree-ssa-forwprop.c: Ditto.
13137         * tree-ssa-ifcombine.c: Ditto.
13138         * tree-ssa-live.c: Ditto.
13139         * tree-ssa-loop-ch.c: Ditto.
13140         * tree-ssa-loop-im.c: Ditto.
13141         * tree-ssa-loop-ivcanon.c: Ditto.
13142         * tree-ssa-loop-ivopts.c: Ditto.
13143         * tree-ssa-loop-manip.c: Ditto.
13144         * tree-ssa-loop-niter.c: Ditto.
13145         * tree-ssa-loop-prefetch.c: Ditto.
13146         * tree-ssa-loop-unswitch.c: Ditto.
13147         * tree-ssa-loop.c: Ditto.
13148         * tree-ssa-math-opts.c: Ditto.
13149         * tree-ssa-operands.c: Ditto.
13150         * tree-ssa-phiopt.c: Ditto.
13151         * tree-ssa-phiprop.c: Ditto.
13152         * tree-ssa-pre.c: Ditto.
13153         * tree-ssa-propagate.c: Ditto.
13154         * tree-ssa-reassoc.c: Ditto.
13155         * tree-ssa-sccvn.c: Ditto.
13156         * tree-ssa-sink.c: Ditto.
13157         * tree-ssa-strlen.c: Ditto.
13158         * tree-ssa-structalias.c: Ditto.
13159         * tree-ssa-tail-merge.c: Ditto.
13160         * tree-ssa-ter.c: Ditto.
13161         * tree-ssa-threadedge.c: Ditto.
13162         * tree-ssa-threadupdate.c: Ditto.
13163         * tree-ssa-uncprop.c: Ditto.
13164         * tree-ssa-uninit.c: Ditto.
13165         * tree-ssa.c: Ditto.
13166         * tree-ssanames.c: Ditto.
13167         * tree-stdarg.c: Ditto.
13168         * tree-streamer-in.c: Ditto.
13169         * tree-streamer-out.c: Ditto.
13170         * tree-streamer.c: Ditto.
13171         * tree-switch-conversion.c: Ditto.
13172         * tree-tailcall.c: Ditto.
13173         * tree-vect-data-refs.c: Ditto.
13174         * tree-vect-generic.c: Ditto.
13175         * tree-vect-loop-manip.c: Ditto.
13176         * tree-vect-loop.c: Ditto.
13177         * tree-vect-patterns.c: Ditto.
13178         * tree-vect-slp.c: Ditto.
13179         * tree-vect-stmts.c: Ditto.
13180         * tree-vectorizer.c: Ditto.
13181         * tree-vrp.c: Ditto.
13182         * tree.c: Ditto.
13183         * tsan.c: Ditto.
13184         * ubsan.c: Ditto.
13185         * valtrack.c: Ditto.
13186         * valtrack.h: Ditto.
13187         * value-prof.c: Ditto.
13188         * var-tracking.c: Ditto.
13189         * varasm.c: Ditto.
13190         * varpool.c: Ditto.
13191         * vtable-verify.c: Ditto.
13192         * web.c: Ditto.
13193         * config/aarch64/aarch64-builtins.c: Ditto.
13194         * config/aarch64/aarch64.c: Ditto.
13195         * config/alpha/alpha.c: Ditto.
13196         * config/arc/arc.c: Ditto.
13197         * config/arm/arm.c: Ditto.
13198         * config/avr/avr.c: Ditto.
13199         * config/bfin/bfin.c: Ditto.
13200         * config/c6x/c6x.c: Ditto.
13201         * config/cr16/cr16.c: Ditto.
13202         * config/cris/cris.c: Ditto.
13203         * config/darwin-c.c: Ditto.
13204         * config/darwin.c: Ditto.
13205         * config/epiphany/epiphany.c: Ditto.
13206         * config/epiphany/mode-switch-use.c: Ditto.
13207         * config/epiphany/resolve-sw-modes.c: Ditto.
13208         * config/fr30/fr30.c: Ditto.
13209         * config/frv/frv.c: Ditto.
13210         * config/h8300/h8300.c: Ditto.
13211         * config/i386/i386.c: Ditto.
13212         * config/i386/winnt.c: Ditto.
13213         * config/ia64/ia64.c: Ditto.
13214         * config/iq2000/iq2000.c: Ditto.
13215         * config/lm32/lm32.c: Ditto.
13216         * config/m32c/m32c.c: Ditto.
13217         * config/m32r/m32r.c: Ditto.
13218         * config/m68k/m68k.c: Ditto.
13219         * config/mcore/mcore.c: Ditto.
13220         * config/mep/mep.c: Ditto.
13221         * config/microblaze/microblaze.c: Ditto.
13222         * config/mips/mips.c: Ditto.
13223         * config/mmix/mmix.c: Ditto.
13224         * config/mn10300/mn10300.c: Ditto.
13225         * config/moxie/moxie.c: Ditto.
13226         * config/msp430/msp430.c: Ditto.
13227         * config/nds32/nds32-cost.c: Ditto.
13228         * config/nds32/nds32-fp-as-gp.c: Ditto.
13229         * config/nds32/nds32-intrinsic.c: Ditto.
13230         * config/nds32/nds32-isr.c: Ditto.
13231         * config/nds32/nds32-md-auxiliary.c: Ditto.
13232         * config/nds32/nds32-memory-manipulation.c: Ditto.
13233         * config/nds32/nds32-pipelines-auxiliary.c: Ditto.
13234         * config/nds32/nds32-predicates.c: Ditto.
13235         * config/nds32/nds32.c: Ditto.
13236         * config/nios2/nios2.c: Ditto.
13237         * config/pa/pa.c: Ditto.
13238         * config/pdp11/pdp11.c: Ditto.
13239         * config/rl78/rl78.c: Ditto.
13240         * config/rs6000/rs6000.c: Ditto.
13241         * config/rx/rx.c: Ditto.
13242         * config/s390/s390.c: Ditto.
13243         * config/sh/sh-mem.cc: Ditto.
13244         * config/sh/sh.c: Ditto.
13245         * config/sh/sh_optimize_sett_clrt.cc: Ditto.
13246         * config/sh/sh_treg_combine.cc: Ditto.
13247         * config/sparc/sparc.c: Ditto.
13248         * config/spu/spu.c: Ditto.
13249         * config/stormy16/stormy16.c: Ditto.
13250         * config/tilegx/tilegx.c: Ditto.
13251         * config/tilepro/tilepro.c: Ditto.
13252         * config/v850/v850.c: Ditto.
13253         * config/vax/vax.c: Ditto.
13254         * config/xtensa/xtensa.c: Ditto.
13256 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
13258         * config/aarch64/aarch64.c (TARGET_GIMPLE_FOLD_BUILTIN): Comment out.
13259         * config/aarch64/aarch64-builtins.c (aarch64_gimple_fold_builtin):
13260         Remove using preprocessor directives.
13262 2014-10-27  Richard Biener  <rguenther@suse.de>
13264         * match.pd (0 % X): Properly use the iterator iterating over
13265         all modulo operators.
13266         (X % 1): Likewise.
13268 2014-10-27  Richard Biener  <rguenther@suse.de>
13270         * tree-ssa-forwprop.c: Include tree-cfgcleanup.h and tree-into-ssa.h.
13271         (lattice): New global.
13272         (fwprop_ssa_val): New function.
13273         (fold_all_stmts): Likewise.
13274         (pass_forwprop::execute): Finally fold all stmts.
13276 2014-10-26  Manuel López-Ibáñez  <manu@gcc.gnu.org>
13278         PR c++/53061
13279         * doc/invoke.texi (fmessage-length): Update text to match reality.
13281 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13283         * config/microblaze/microblaze.c: Include rtl-iter.h.
13284         (microblaze_tls_referenced_p_1): Delete.
13285         (microblaze_tls_referenced_p): Use FOR_EACH_SUBRTX.
13287 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13289         * config/mips/mips.c (mips_at_reg_p): Delete.
13290         (mips_need_noat_wrapper_p): Use FOR_EACH_SUBRTX.
13292 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13294         * config/mips/mips.c (mips_record_lo_sum): Replace with...
13295         (mips_record_lo_sums): ...this new function.
13296         (mips_reorg_process_insns): Update accordingly.
13298 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13300         * config/mips/mips.c (mips_sim_insn): Update comment.
13301         (mips_sim_wait_regs_2): Delete.
13302         (mips_sim_wait_regs_1): Use FOR_EACH_SUBRTX_VAR.
13304 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13306         * config/mips/mips.c (r10k_needs_protection_p_call): Take a const_rtx
13307         and return a bool.  Iterate over all subrtxes here.
13308         (r10k_needs_protection_p): Update accordingly.
13310 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13312         * config/mips/mips.c (r10k_needs_protection_p_1): Take an rtx
13313         rather than an rtx pointer.  Change type of insn from "void *"
13314         to its real type.  Return bool rather than int.  Iterate over
13315         all subrtxes here.
13316         (r10k_needs_protection_p_store): Update accordingly.
13317         (r10k_needs_protection_p): Likewise.
13319 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13321         * config/mips/mips.c (mips16_rewrite_pool_refs_info): Delete.
13322         (mips16_rewrite_pool_refs): Take the insn and constant pool as
13323         parameters.  Iterate over the instruction's pattern and return void.
13324         (mips16_lay_out_constants): Update accordingly.
13326 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13328         * config/mips/mips.c (mips_kernel_reg_p): Replace with...
13329         (mips_refers_to_kernel_reg_p): ...this new function.
13330         (mips_expand_prologue): Update accordingly.
13332 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13334         * config/mips/mips.c (mips_rewrite_small_data_1): Take the context
13335         as a parameter instead of the containing MEM.  Iterate over all
13336         subrtxes.  Don't return a value.
13337         (mips_rewrite_small_data): Update call accordingly.
13339 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13341         * config/mips/mips.c: Include rtl-iter.h.
13342         (mips_small_data_pattern_1): Take an rtx rather than an rtx pointer.
13343         Take the context as a parameter instead of the containing MEM.
13344         Iterate over all subrtxes.
13345         (mips_small_data_pattern_p): Update call accordingly.
13347 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13349         * config/mep/mep.c (mep_mul_hilo_bypass_1): Delete.
13350         (mep_mul_hilo_bypass_p): Use FOR_EACH_SUBRTX.
13352 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13354         * config/mep/mep.c (mep_store_find_set): Take a const_rtx and
13355         return a bool.  Replace "void *" with specific type.  Iterate
13356         over all subrtxes.
13357         (mep_store_data_bypass_1): Update calls accordingly.
13359 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13361         * config/mep/mep.c: Include rtl-iter.h.
13362         (global_reg_mentioned_p_1): Take a const_rtx and return a bool.
13363         (xtensa_tls_referenced_p): Return a bool.  Use FOR_EACH_SUBRTX.
13365 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13367         * config/xtensa/xtensa.c: Include rtl-iter.h.
13368         (xtensa_tls_referenced_p_1): Delete.
13369         (xtensa_tls_referenced_p): Use FOR_EACH_SUBRTX.
13371 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13373         * config/sh/sh.c (sh_contains_memref_p_1): Delete.
13374         (sh_contains_memref_p): Use FOR_EACH_SUBRTX.
13376 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13378         * config/sh/sh-protos.h (shmedia_cleanup_truncate): Take an
13379         rtx as argument and return the number of changes.
13380         * config/sh/sh.c: Include rtl-iter.h.
13381         (shmedia_cleanup_truncate): Take an rtx as argument and iterate
13382         over all subrtxes.  Return the number of changes made.
13383         * config/sh/sh.md: Update caller accordingly.
13385 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13387         * config/m68k/m68k.c (m68k_tls_reference_p_1): Delete.
13388         (m68k_tls_reference_p): Use FOR_EACH_SUBRTX_VAR.
13390 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13392         * config/m68k/m68k.c: Include rtl-iter.h.
13393         (m68k_final_prescan_insn_1): Delete.
13394         (m68k_final_prescan_insn): Use FOR_EACH_SUBRTX_VAR.
13396 2014-10-25  Jakub Jelinek  <jakub@redhat.com>
13398         PR tree-optimization/63641
13399         * tree-ssa-reassoc.c (optimize_range_tests_to_bit_test): Set high
13400         to low + prec - 1 - clz (mask) instead of low + prec - clz (mask).
13402 2014-10-25  Alan Modra  <amodra@gmail.com>
13404         PR rtl-optimization/63615
13405         * simplify-rtx.c (simplify_plus_minus): Set "canonicalized" on
13406         decomposing PLUS or MINUS if operands are not placed adjacent
13407         in the "ops" array.
13409 2014-10-25  Joseph Myers  <joseph@codesourcery.com>
13411         * config/rs6000/rs6000.c (rs6000_hard_regno_nregs_internal): Do
13412         not allow e500 double in registers not satisyfing
13413         SPE_SIMD_REGNO_P.
13415 2014-10-24  Aldy Hernandez  <aldyh@redhat.com>
13417         * dwarf2out.c (declare_in_namespace): Only emit external
13418         declarations in the local scope once.
13420 2014-10-24  Jonathan Wakely  <jwakely@redhat.com>
13422         * ginclude/stdbool.h: Do not define bool, true or false in C++11.
13424 2014-10-24  Charles Baylis  <charles.baylis@linaro.org>
13426         * config/aarch64/arm_neon.h (__LD2_LANE_FUNC): Rewrite using builtins,
13427         update uses to use new macro arguments.
13428         (__LD3_LANE_FUNC): Likewise.
13429         (__LD4_LANE_FUNC): Likewise.
13431 2014-10-24  Charles Baylis  <charles.baylis@linaro.org>
13433         * config/aarch64/aarch64-builtins.c
13434         (aarch64_types_loadstruct_lane_qualifiers): Define.
13435         * config/aarch64/aarch64-simd-builtins.def (ld2_lane, ld3_lane,
13436         ld4_lane): New builtins.
13437         * config/aarch64/aarch64-simd.md (aarch64_vec_load_lanesoi_lane<mode>):
13438         New pattern.
13439         (aarch64_vec_load_lanesci_lane<mode>): Likewise.
13440         (aarch64_vec_load_lanesxi_lane<mode>): Likewise.
13441         (aarch64_ld2_lane<mode>): New expand.
13442         (aarch64_ld3_lane<mode>): Likewise.
13443         (aarch64_ld4_lane<mode>): Likewise.
13444         * config/aarch64/aarch64.md (define_c_enum "unspec"): Add
13445         UNSPEC_LD2_LANE, UNSPEC_LD3_LANE, UNSPEC_LD4_LANE.
13447 2014-10-24  Georg-Johann Lay  <avr@gjlay.de>
13449         * avr-protos.h (avr_out_sign_extend): New.
13450         * avr.c (avr_adjust_insn_length) [ADJUST_LEN_SEXT]: Handle.
13451         (avr_out_sign_extend): New function.
13452         * avr.md (extendqihi2, extendqipsi2, extendqisi2, extendhipsi2)
13453         (extendhisi2, extendpsisi2): Use it.
13454         (adjust_len) [sext]: New.
13456 2014-10-24  Martin Liska  <mliska@suse.cz>
13458         * ipa-icf.c (sem_function::compare_phi_node): PHI result comparison
13459         added.
13461 2014-10-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
13463         * config/aarch64/aarch64-elf-raw.h (CA53_ERR_835769_SPEC): Define.
13464         (LINK_SPEC): Include CA53_ERR_835769_SPEC.
13465         * config/aarch64/aarch64-linux.h (CA53_ERR_835769_SPEC): Define.
13466         (LINK_SPEC): Include CA53_ERR_835769_SPEC.
13468 2014-10-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
13470         * config/aarch64/aarch64.h (ADJUST_INSN_LENGTH): Wrap definition in
13471         do while (0).
13472         * config/aarch64/aarch64.c (is_mem_p): Delete.
13473         (is_memory_op): Rename to...
13474         (has_memory_op): ... This.  Use FOR_EACH_SUBRTX.
13475         (dep_between_memop_and_curr): Assert that the input is a SET.
13476         (aarch64_madd_needs_nop): Add comment.  Do not call
13477         dep_between_memop_and_curr on NULL body.
13478         (aarch64_final_prescan_insn): Add comment.
13479         Include rtl-iter.h.
13481 2014-10-24  Richard Biener  <rguenther@suse.de>
13483         * Makefile.in (BUILD_CPPLIB): Move $(LIBINTL) $(LIBICONV)
13484         to genmatch BUILD_LIBS instead.
13486 2014-10-24  Richard Biener  <rguenther@suse.de>
13488         * genmatch.c (expr::gen_transform): Use fold_buildN_loc
13489         and build_call_expr_loc.
13490         (dt_simplify::gen): Drop non_lvalue for GIMPLE, use
13491         non_lvalue_loc to build it for GENERIC.
13492         (decision_tree::gen_generic): Add location argument to
13493         generic_simplify prototype.
13494         (capture_info): New class.
13495         (capture_info::capture_info): New constructor.
13496         (capture_info::walk_match): New method.
13497         (capture_info::walk_result): New method.
13498         (capture_info::walk_c_expr): New method.
13499         (dt_simplify::gen): Handle preserving side-effects for
13500         GENERIC code generation.
13501         (decision_tree::gen_generic): Do not reject operands
13502         with TREE_SIDE_EFFECTS.
13503         * generic-match.h: New file.
13504         * generic-match-head.c: Include generic-match.h, not gimple-match.h.
13505         * match.pd: Add some constant folding patterns from fold-const.c.
13506         * fold-const.c: Include generic-match.h.
13507         (fold_unary_loc): Dispatch to generic_simplify.
13508         (fold_ternary_loc): Likewise.
13509         (fold_binary_loc): Likewise.  Remove patterns now implemented
13510         by generic_simplify.
13511         * gimple-fold.c (replace_stmt_with_simplification): New function.
13512         (fold_stmt_1): Add valueize parameter, dispatch to gimple_simplify.
13513         (no_follow_ssa_edges): New function.
13514         (fold_stmt): New overload with valueization hook.  Use
13515         no_follow_ssa_edges for the overload without hook.
13516         (fold_stmt_inplace): Likewise.
13517         * gimple-fold.h (no_follow_ssa_edges): Declare.
13519 2014-10-24  Felix Yang  <felix.yang@huawei.com>
13520         Jiji Jiang  <jiangjiji@huawei.com>
13522         PR target/63173
13523         * config/aarch64/arm_neon.h (__LD2R_FUNC): Remove macro.
13524         (__LD3R_FUNC): Ditto.
13525         (__LD4R_FUNC): Ditto.
13526         (vld2_dup_s8, vld2_dup_s16, vld2_dup_s32, vld2_dup_f32, vld2_dup_f64,
13527          vld2_dup_u8, vld2_dup_u16, vld2_dup_u32, vld2_dup_p8, vld2_dup_p16
13528          vld2_dup_s64, vld2_dup_u64, vld2q_dup_s8, vld2q_dup_p8,
13529          vld2q_dup_s16, vld2q_dup_p16, vld2q_dup_s32, vld2q_dup_s64,
13530          vld2q_dup_u8, vld2q_dup_u16, vld2q_dup_u32, vld2q_dup_u64
13531          vld2q_dup_f32, vld2q_dup_f64): Rewrite using builtin functions.
13532         (vld3_dup_s64, vld3_dup_u64, vld3_dup_f64, vld3_dup_s8
13533          vld3_dup_p8, vld3_dup_s16, vld3_dup_p16, vld3_dup_s32
13534          vld3_dup_u8, vld3_dup_u16, vld3_dup_u32, vld3_dup_f32
13535          vld3q_dup_s8, vld3q_dup_p8, vld3q_dup_s16, vld3q_dup_p16
13536          vld3q_dup_s32, vld3q_dup_s64, vld3q_dup_u8, vld3q_dup_u16
13537          vld3q_dup_u32, vld3q_dup_u64, vld3q_dup_f32, vld3q_dup_f64): Likewise.
13538         (vld4_dup_s64, vld4_dup_u64, vld4_dup_f64, vld4_dup_s8
13539          vld4_dup_p8, vld4_dup_s16, vld4_dup_p16, vld4_dup_s32
13540          vld4_dup_u8, vld4_dup_u16, vld4_dup_u32, vld4_dup_f32
13541          vld4q_dup_s8, vld4q_dup_p8, vld4q_dup_s16, vld4q_dup_p16
13542          vld4q_dup_s32, vld4q_dup_s64, vld4q_dup_u8, vld4q_dup_u16
13543          vld4q_dup_u32, vld4q_dup_u64, vld4q_dup_f32, vld4q_dup_f64): Likewise.
13544         * config/aarch64/aarch64.md (define_c_enum "unspec"): Add
13545         UNSPEC_LD2_DUP, UNSPEC_LD3_DUP, UNSPEC_LD4_DUP.
13546         * config/aarch64/aarch64-simd-builtins.def (ld2r, ld3r, ld4r): New
13547         builtins.
13548         * config/aarch64/aarch64-simd.md (aarch64_simd_ld2r<mode>): New pattern.
13549         (aarch64_simd_ld3r<mode>): Likewise.
13550         (aarch64_simd_ld4r<mode>): Likewise.
13551         (aarch64_ld2r<mode>): New expand.
13552         (aarch64_ld3r<mode>): Likewise.
13553         (aarch64_ld4r<mode>): Likewise.
13555 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13557         * rtlanal.c (get_base_term): Handle SCRATCH.
13559 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13561         * haifa-sched.c (sched_init): Disable max_issue when scheduling for
13562         register pressure.
13564 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13566         * haifa-sched.c (cached_first_cycle_multipass_dfa_lookahead,)
13567         (cached_issue_rate): Remove.  Use dfa_lookahead and issue_rate instead.
13568         (max_issue, choose_ready, sched_init): Update.
13570 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13572         * sched-int.h (struct _haifa_insn_data:last_rfs_win): New field.
13573         * haifa-sched.c (INSN_LAST_RFS_WIN): New access macro.
13574         (rfs_result): Set INSN_LAST_RFS_WIN.  Update signature.
13575         (rank_for_schedule): Update calls to rfs_result to pass new parameters.
13576         (print_rank_for_schedule_stats): Print out elements of ready list that
13577         ended up on their respective places due to each of the sorting
13578         heuristics.
13579         (ready_sort): Update.
13580         (debug_ready_list_1): Improve printout for SCHED_PRESSURE_MODEL.
13581         (schedule_block): Update.
13583 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13585         * haifa-sched.c (sched_class_regs_num, call_used_regs_num): New static
13586         arrays.  Use sched_class_regs_num instead of ira_class_hard_regs_num.
13587         (print_curr_reg_pressure, setup_insn_reg_pressure_info,)
13588         (model_update_pressure, model_spill_cost): Use sched_class_regs_num.
13589         (model_start_schedule): Update.
13590         (sched_pressure_start_bb): New static function.  Calculate
13591         sched_class_regs_num.
13592         (schedule_block): Use it.
13593         (alloc_global_sched_pressure_data): Calculate call_used_regs_num.
13595 2014-10-24  Richard Biener  <rguenther@suse.de>
13597         * Makefile.in (BUILD_CPPLIB): When in stage2+ use the
13598         host library and make sure to pull in the required libintl
13599         and libiconv dependencies.
13601 2014-10-24  Richard Biener  <rguenther@suse.de>
13603         * fold-const.c (fold_binary_loc): Fix copy-and-pasto.
13605 2014-10-24  Markus Trippelsdorf  <markus@trippelsdorf.de>
13607         PR bootstrap/63632
13608         * collect2.c (main): Filter out -fno-lto.
13610 2014-10-24  Martin Liska  <mliska@suse.cz>
13612         * ipa-icf.c (sem_item_optimizer::parse_nonsingleton_classes): Guard
13613         division by zero in dumps.
13614         (sem_item_optimizer::merge_classes): Ditto.
13616 2014-10-23  John David Anglin  <danglin@gcc.gnu.org>
13618         * config/pa/pa.c (pa_can_combine_p): Fix typo in last change.
13620 2014-10-23  Ian Lance Taylor  <iant@google.com>
13622         * tree-vrp.c (extract_range_from_assert): Fix typo in comment.
13624 2014-10-23  Ian Lance Taylor  <iant@google.com>
13626         * config/mep/mep.h (TARGET_HAS_F_SETLKW): Don't undefine.
13628 2014-10-23  Jakub Jelinek  <jakub@redhat.com>
13630         PR debug/63623
13631         * var-tracking.c (stack_adjust_offset_pre_post_cb): New function.
13632         (stack_adjust_offset_pre_post): Use it through for_each_inc_dec,
13633         instead of only handling autoinc in dest if it is a MEM.
13634         (vt_stack_adjustments): Fix up formatting.
13636 2014-10-23  DJ Delorie  <dj@redhat.com>
13638         * config/msp430/msp430.c (msp430_print_operand): 'x' modifier is
13639         independend of -mlarge.
13640         * config/msp430/constraints.md (Ys): Update comment.
13642 2014-10-23  Evgeny Stupachenko  <evstupac@gmail.com>
13644         PR target/63534
13645         PR target/63618
13646         * cse.c (delete_trivially_dead_insns): Consider PIC register is used
13647         while it is pseudo.
13648         * dse.c (deletable_insn_p): Likewise.
13650 2014-10-23  Georg-Johann Lay  <avr@gjlay.de>
13652         * config/avr/avr.c: Fix GNU coding rules and typos.
13653         * config/avr/avr.h: Dito.
13654         * config/avr/avr-c.c: Dito.
13655         * config/avr/avr.md: Dito.
13657 2014-10-23  Kirill Yukhin  <kirill.yukhin@intel.com>
13659         * config/i386/sse.md (define_mode_iterator VI1248_AVX512VL_AVX512BW):
13660         New.
13661         (define_insn "*abs<mode>2"): Use VI1248_AVX512VL_AVX512BW mode
13662         iterator.
13663         (define_expand "abs<mode>2"): Ditto.
13665 2014-10-23  Kirill Yukhin  <kirill.yukhin@intel.com>
13667         * tree-core.h (tree_var_decl): Extend `function_code' field
13668         by one bit, move `regdecl_flag' field to ...
13669         (tree_decl_with_vis): Here.
13670         * tree.h (DECL_STATIC_CHAIN): Update struct name.
13672 2014-10-23  Richard Biener  <rguenther@suse.de>
13674         * Makefile.in (BUILD_CPPLIB): Add.
13675         (build/genmatch$(build_exeext)): Use BUILD_CPPLIB, not CPPLIB.
13676         Drop LIBIBERTY.
13678 2014-10-23  Richard Biener  <rguenther@suse.de>
13680         * fold-const.c (fold_binary_loc): Preserve side-effects of
13681         X - X when simplifying to 0.
13682         * stor-layout.c (finish_bitfield_representative): Strip
13683         side-effects of evaluating the difference of two DECL_FIELD_OFFSET.
13685 2014-10-22  Richard Biener  <rguenther@suse.de>
13686             Tobias Burnus <burnus@net-b.de>
13688         PR lto/63603
13689         * gcc.c (LINK_COMMAND_SPEC): Add %{fno-lto}.
13691 2014-10-22  Dehao Chen  <dehao@google.com>
13693         * auto-profile.c: Change order of header files.
13695 2014-10-22  Guozhi Wei  <carrot@google.com>
13697         PR tree-optimization/63530
13698         tree-vect-data-refs.c (vect_create_addr_base_for_vector_ref): Set
13699         pointer alignment according to DR_MISALIGNMENT.
13701 2014-10-22  David Malcolm  <dmalcolm@redhat.com>
13703         * ipa-icf.c (ipa_icf_driver): Set optimizer to NULL when done.
13705 2014-10-22  Andrew MacLeod  <amacleod@redhat.com>
13707         * cfgbuild.h: New.  Add prototypes for cfgbuild.c.
13708         * cfgcleanup.h: New.  Add prototypes for cfgcleanup.c.
13709         * cfgloopmanip.h: New.  Add prototypes for cfgloopmanip.c.
13710         * dominance.h: New.  Add prototypes for dominance.c.
13711         * cfgloop.h: Move some prototypes/enum to cfgloopmanip.h and include it.
13712         * cfghooks.h: (struct profile_record) Relocate here.
13713         Relocate 2 prototypes from basic-block.h.
13714         * basic-block.h: Move prototypes and struct to new header files.
13715         Include cfgbuild.h, cfgcleanup.h, and dominance.h.
13716         * rtl.h: Move a few prototypes to new header files.
13717         * cfgcleanup.c (merge_memattrs): Make static.
13718         * genopinit.c (main): Add predict.h to list of includes.
13719         * predict.h: Update prototype list to match predict.c.
13720         * predict.c (maybe_hot_count_p): Export.
13721         (cgraph_edge::maybe_hot_p): Move to cgraph.c.
13722         (cgraph_node::optimize_for_size_p): Move to cgraph.h.
13723         * cgraph.h (cgraph_node::optimize_for_size_p): Relocate here.
13724         * cgraph.c (cgraph_edge::maybe_hot_p): Relocate here.
13725         * profile.h: Adjust prototypes.
13726         * ifcvt.h: New.  Relocate struct ce_if_block here.
13727         * ifcvt.c: Include ifcvt.h.
13728         * config/frv/frv.c: Include ifcvt.h.
13729         * config/frv/frv-protos.h: Add 'struct' to ce_if_block * parameters.
13731 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13733         * lra.c (lra): Remove call to recog_init.
13734         * config/i386/i386.md (preferred_for_speed): New attribute
13735         (*float<SWI48:mode><MODEF:mode>2_sse): Override it instead of
13736         "enabled".  Remove check for sched1.
13738 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13740         * recog.h (recog_data_d): Remove enabled_alternatives.
13741         * recog.c (extract_insn): Don't set it.
13742         * reload.c (find_reloads): Call get_enabled_alternatives.
13744 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13746         * recog.h (constrain_operands): Add an alternative_mask parameter.
13747         (constrain_operands_cached): Likewise.
13748         (get_preferred_alternatives): Declare new form.
13749         * recog.c (get_preferred_alternatives): New bb-taking instance.
13750         (constrain_operands): Take the set of available alternatives as
13751         a parameter.
13752         (check_asm_operands, insn_invalid_p, extract_constrain_insn)
13753         (extract_constrain_insn_cached): Update calls to constrain_operands.
13754         * caller-save.c (reg_save_code): Likewise.
13755         * ira.c (setup_prohibited_mode_move_regs): Likewise.
13756         * postreload-gcse.c (eliminate_partially_redundant_load): Likewise.
13757         * ree.c (combine_reaching_defs): Likewise.
13758         * reload.c (can_reload_into): Likewise.
13759         * reload1.c (reload, reload_as_needed, inc_for_reload): Likewise.
13760         (gen_reload_chain_without_interm_reg_p, emit_input_reload_insns)
13761         (emit_insn_if_valid_for_reload): Likewise.
13762         * reorg.c (fill_slots_from_thread): Likewise.
13763         * config/i386/i386.c (ix86_attr_length_address_default): Likewise.
13764         * config/pa/pa.c (pa_can_combine_p): Likewise.
13765         * config/rl78/rl78.c (insn_ok_now): Likewise.
13766         * config/sh/sh.md (define_peephole2): Likewise.
13767         * final.c (final_scan_insn): Update call to constrain_operands_cached.
13769 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13771         * doc/md.texi: Document "preferred_for_size" and "preferred_for_speed"
13772         attributes.
13773         * genattr.c (main): Handle "preferred_for_size" and
13774         "preferred_for_speed" in the same way as "enabled".
13775         * recog.h (bool_attr): New enum.
13776         (target_recog): Replace x_enabled_alternatives with x_bool_attr_masks.
13777         (get_preferred_alternatives, check_bool_attrs): Declare.
13778         * recog.c (have_bool_attr, get_bool_attr, get_bool_attr_mask_uncached)
13779         (get_bool_attr_mask, get_preferred_alternatives, check_bool_attrs):
13780         New functions.
13781         (get_enabled_alternatives): Use get_bool_attr_mask.
13782         * ira-costs.c (record_reg_classes): Use get_preferred_alternatives
13783         instead of recog_data.enabled_alternatives.
13784         * ira.c (ira_setup_alts): Likewise.
13785         * postreload.c (reload_cse_simplify_operands): Likewise.
13786         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
13787         * ira-lives.c (preferred_alternatives): New variable.
13788         (process_bb_node_lives): Set it.
13789         (check_and_make_def_conflict, make_early_clobber_and_input_conflicts)
13790         (single_reg_class, ira_implicitly_set_insn_hard_regs): Use it instead
13791         of recog_data.enabled_alternatives.
13792         * lra-int.h (lra_insn_recog_data): Replace enabled_alternatives
13793         to preferred_alternatives.
13794         * lra-constraints.c (process_alt_operands): Update accordingly.
13795         * lra.c (lra_set_insn_recog_data): Likewise.
13796         (lra_update_insn_recog_data): Assert check_bool_attrs.
13798 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13800         * recog.h (extract_constrain_insn): Declare.
13801         * recog.c (extract_constrain_insn): New function.
13802         * lra.c (check_rtl): Use it.
13803         * postreload.c (reload_cse_simplify_operands): Likewise.
13804         * reg-stack.c (check_asm_stack_operands): Likewise.
13805         (subst_asm_stack_regs): Likewise.
13806         * regcprop.c (copyprop_hardreg_forward_1): Likewise.
13807         * regrename.c (build_def_use): Likewise.
13808         * sel-sched.c (get_reg_class): Likewise.
13809         * config/arm/arm.c (note_invalid_constants): Likewise.
13810         * config/s390/predicates.md (execute_operation): Likewise.
13812 2014-10-22  Jakub Jelinek  <jakub@redhat.com>
13813             Yury Gribov  <y.gribov@samsung.com>
13815         * common.opt (flag_sanitize_recover): New variable.
13816         (fsanitize-recover): Remove Var/Init, deprecate.
13817         (fsanitize-recover=): New option.
13818         * doc/invoke.texi (fsanitize-recover): Update docs.
13819         * opts.c (finish_options): Use opts->x_flag_sanitize
13820         instead of flag_sanitize.  Prohibit -fsanitize-recover
13821         for anything besides UBSan.  Formatting.
13822         (common_handle_option): Handle OPT_fsanitize_recover_
13823         and OPT_fsanitize_recover.  Use opts->x_flag_sanitize
13824         instead of flag_sanitize.
13825         * asan.c (pass_sanopt::execute): Fix up formatting.
13826         * ubsan.c (ubsan_expand_bounds_ifn, ubsan_expand_null_ifn,
13827         ubsan_expand_objsize_ifn, ubsan_build_overflow_builtin,
13828         instrument_bool_enum_load, ubsan_instrument_float_cast,
13829         instrument_nonnull_arg, instrument_nonnull_return): Check
13830         bits in flag_sanitize_recover bitmask instead of
13831         flag_sanitize_recover as bool flag.
13833 2014-10-22  Jiong Wang <jiong.wang@arm.com>
13835         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Add missing '\'.
13837 2014-10-22  Renlin Li <renlin.li@arm.com>
13839         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Define
13840         __ARM_FEATURE_IDIV__.
13842 2014-10-22  Richard Biener  <rguenther@suse.de>
13844         * Makefile.in (s-match): Adjust dependencies to only catch
13845         match.pd.
13847 2014-10-22  Richard Biener  <rguenther@suse.de>
13848         Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
13850         * Makefile.in (OBJS): Add gimple-match.o and generic-match.o.
13851         (MOSTLYCLEANFILES): Add gimple-match.c and generic-match.c.
13852         (gimple-match.c): Generate by triggering s-match.
13853         (generic-match.c): Likewise.
13854         (s-match): Rule to build gimple-match.c and generic-match.c
13855         by running the genmatch generator program.
13856         (build/hash-table.o): Dependencies to build hash-table.c for the host.
13857         (build/genmatch.o): Dependencies to build genmatch.
13858         (genprog): Add match.
13859         (build/genmatch): Likewise.
13860         (TEXI_GCCINT_FILES): Add match-and-simplify.texi.
13861         * generic-match-head.c: New file.
13862         * gimple-match-head.c: Likewise.
13863         * gimple-match.h: Likewise.
13864         * genmatch.c: Likewise.
13865         * match.pd: Likewise.
13866         * builtins.h (fold_builtin_n): Export.
13867         * builtins.c (fold_builtin_n): Likewise.
13868         * gimple-fold.h (gimple_build): Declare various overloads.
13869         (gimple_simplify): Likewise.
13870         (gimple_convert): Re-implement in terms of gimple_build.
13871         * gimple-fold.c (gimple_convert): Remove.
13872         (gimple_build): New functions.
13873         * doc/match-and-simplify.texi: New file.
13874         * doc/gccint.texi: Add menu item Match and Simplify and include
13875         match-and-simplify.texi.
13877 2014-10-22  Jakub Jelinek  <jakub@redhat.com>
13879         PR target/63594
13880         * config/i386/i386.c (ix86_expand_vector_init_duplicate): For
13881         V{8HI,16QI,16HI,32QI}mode call ix86_vector_duplicate_value
13882         even for just TARGET_AVX2, not only for
13883         TARGET_AVX512VL && TARGET_AVX512BW.  For V{32HI,64QI}mode,
13884         call ix86_vector_duplicate_value only if TARGET_AVX512BW,
13885         otherwise build it using concatenation of 256-bit
13886         broadcast.
13887         * config/i386/sse.md (AVX_VEC_DUP_MODE): Moved after
13888         avx512 broadcast patterns.
13889         (vec_dup<mode>): Likewise.  For avx2 use
13890         v<sseintprefix>broadcast<bcstscalarsuff> instead of
13891         vbroadcast<ssescalarmodesuffix>.
13892         (AVX2_VEC_DUP_MODE): New mode iterator.
13893         (*vec_dup<mode>): New TARGET_AVX2 define_insn with
13894         AVX2_VEC_DUP_MODE iterator, add a splitter for that.
13896         PR target/63542
13897         * config/i386/i386.c (ix86_pic_register_p): Also return
13898         true if x is a hard register with ORIGINAL_REGNO equal to
13899         pic_offset_table_rtx pseudo REGNO.
13900         (ix86_delegitimize_address): For ix86_use_pseudo_pic_reg ()
13901         after reload, subtract GOT_SYMBOL_NAME symbol if possible.
13903 2014-10-22  Alan Modra  <amodra@gmail.com>
13905         * gengtype.h (obstack_chunk_alloc, obstack_chunk_free): Remove cast.
13906         * coretypes.h (obstack_chunk_alloc, obstack_chunk_free): Likewise.
13907         (gcc_obstack_init): Use obstack_specify_allocation in place of
13908         _obstack_begin.
13909         * genautomata.c (next_sep_el): Cast result of obstack_base to (char *).
13910         (regexp_representation): Likewise.
13911         * godump.c (go_output_type): Likewise.
13913 2014-10-21  John David Anglin  <danglin@gcc.gnu.org>
13915         * config.gcc: Remove MASK_JUMP_IN_DELAY from target_cpu_default2.
13916         * config/pa/pa.h (TARGET_DEFAULT): Remove MASK_JUMP_IN_DELAY.
13917         * config/pa/pa.opt (mjump-in-delay): Ignore option.  Update comment.
13919 2014-10-21 Manuel López-Ibáñez  <manu@gcc.gnu.org>
13921         * doc/invoke.texi (pedantic-errors): Explain better.
13923 2014-10-21  Joern Rennecke  <joern.rennecke@embecosm.com>
13924             Vidya Praveen <vidya.praveen@atmel.com>
13925             Praveen Kumar Kaushik <Praveen_Kumar.Kaushik@atmel.com>
13926             Senthil Kumar Selvaraj <Senthil_Kumar.Selvaraj@atmel.com>
13927             Pitchumani Sivanupandi <Pitchumani.S@atmel.com>
13929         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Don't define
13930         __MEMX for avrtiny.
13931         * config/avr/avr.c (avr_insert_attributes): Reject __memx for avrtiny.
13932         (avr_nonconst_pointer_addrspace): Likewise.
13933         * config/avr/avr.h (AVR_HAVE_LPM): Define.
13935         Added AVRTINY architecture to avr target.
13936         * config/avr/avr-arch.h (avr_arch): Added AVRTINY architecture.
13937         (base_arch_s): member added for AVRTINY architecture.
13938         * config/avr/avr.c: Added TINY_ADIW, TINY_SBIW macros as AVRTINY
13939         alternate for adiw/sbiw instructions. Added AVR_TMP_REGNO and
13940         AVR_ZERO_REGNO macros for tmp and zero registers. Replaced TMP_REGNO
13941         and ZERO_REGNO occurrences by AVR_TMP_REGNO and AVR_ZERO_REGNO
13942         respectively. LAST_CALLEE_SAVED_REG macro added for the last register
13943         in callee saved register list.
13944         (avr_option_override): CCP address updated for AVRTINY.
13945         (avr_init_expanders): tmp and zero rtx initialized as per arch.
13946         Reset avr_have_dimode if AVRTINY.
13947         (sequent_regs_live): Use LAST_CALLEE_SAVED_REG instead magic number.
13948         (emit_push_sfr): Use AVR_TMP_REGNO for tmp register number.
13949         (avr_prologue_setup_frame): Don't minimize prologue if AVRTINY.
13950         Use LAST_CALLEE_SAVED_REG to refer last callee saved register.
13951         (expand_epilogue): Likewise.
13952         (avr_print_operand): Print CCP address in case of AVRTINY also.
13953         <TBD>bad address
13954         (function_arg_regno_p): Check different register list for arguments
13955         if AVRTINY.
13956         (init_cumulative_args): Check for AVRTINY to update number of argument
13957         registers.
13958         (tiny_valid_direct_memory_access_range): New function. Return false if
13959         direct memory access range is not in accepted range for AVRTINY.
13960         (avr_out_movqi_r_mr_reg_disp_tiny): New function to handle register
13961         indirect load (with displacement) for AVRTINY.
13962         (out_movqi_r_mr): Updated instruction length for AVRTINY. Call
13963         avr_out_movqi_r_mr_reg_disp_tiny for load from reg+displacement.
13964         (avr_out_movhi_r_mr_reg_no_disp_tiny): New function to handle register
13965         indirect load (no displacement) for AVRTINY.
13966         (avr_out_movhi_r_mr_reg_disp_tiny): New function to handle register
13967         indirect load (with displacement) for AVRTINY.
13968         (avr_out_movhi_r_mr_pre_dec_tiny): New function to handle register
13969         indirect load for pre-decrement address.
13970         (out_movhi_r_mr): In case of AVRTINY, call tiny register indirect load
13971         functions. Update instruction length for AVRTINY.
13972         (avr_out_movsi_r_mr_reg_no_disp_tiny): New function. Likewise, for
13973         SImode.
13974         (avr_out_movsi_r_mr_reg_disp_tiny): New function. Likewise, for SImode.
13975         (out_movsi_r_mr): Likewise, for SImode.
13976         (avr_out_movsi_mr_r_reg_no_disp_tiny): New function to handle register
13977         indirect store (no displacement) for AVRTINY.
13978         (avr_out_movsi_mr_r_reg_disp_tiny): New function to handle register
13979         indirect store (with displacement) for AVRTINY.
13980         (out_movsi_mr_r): Emit out insn for IO address store. Update store
13981         instruction's size for AVRTINY. For AVRTINY, call tiny SImode indirect
13982         store functions.
13983         (avr_out_load_psi_reg_no_disp_tiny): New function to handle register
13984         indirect load (no displacement) for PSImode in AVRTINY.
13985         (avr_out_load_psi_reg_disp_tiny): New function to handle register
13986         indirect load (with displacement) for PSImode in AVRTINY.
13987         (avr_out_load_psi): Call PSImode register indirect load functions for
13988         AVRTINY. Update instruction length for AVRTINY.
13989         (avr_out_store_psi_reg_no_disp_tiny): New function to handle register
13990         indirect store (no displacement) for PSImode in AVRTINY.
13991         (avr_out_store_psi_reg_disp_tiny): New function to handle register
13992         indirect store (with displacement) for PSImode in AVRTINY.
13993         (avr_out_store_psi): Update instruction length for AVRTINY. Call tiny
13994         register indirect store functions for AVRTINY.
13995         (avr_out_movqi_mr_r_reg_disp_tiny): New function to handle QImode
13996         register indirect store (with displacement) for AVRTINY.
13997         (out_movqi_mr_r): Update instruction length for AVRTINY. Call tiny
13998         register indirect store function for QImode in AVRTINY.
13999         (avr_out_movhi_mr_r_xmega): Update instruction length for AVRTINY.
14000         (avr_out_movhi_mr_r_reg_no_disp_tiny): New function to handle register
14001         indirect store (no displacement) for HImode in AVRTINY.
14002         (avr_out_movhi_mr_r_reg_disp_tiny): New function to handle register
14003         indirect store (with displacement) for HImode in AVRTINY.
14004         (avr_out_movhi_mr_r_post_inc_tiny): New function to handle register
14005         indirect store for post-increment address in HImode.
14006         (out_movhi_mr_r): Update instruction length for AVRTINY. Call tiny
14007         register indirect store function for HImode in AVRTINY.
14008         (avr_out_compare): Use TINY_SBIW/ TINY_ADIW in place of sbiw/adiw
14009         in case of AVRTINY.
14010         (order_regs_for_local_alloc): Updated register allocation order for
14011         AVRTINY.
14012         (avr_conditional_register_usage): New function. It is a target hook
14013         (TARGET_CONDITIONAL_REGISTER_USAGE) function which updates fixed, call
14014         used registers list and register allocation order for AVRTINY.
14015         (avr_return_in_memory): Update return value size for AVRTINY.
14016         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Added builtin macros
14017         for AVRTINY arch and tiny program memory base address.
14018         * config/avr/avr-devices.c (avr_arch_types): Added AVRTINY arch.
14019         (avr_texinfo): Added description for AVRTINY arch.
14020         * config/avr/avr.h: Added macro to identify AVRTINY arch. Updated
14021         STATIC_CHAIN_REGNUM for AVRTINY.
14022         * config/avr/avr-mcus.def: Added AVRTINY arch devices.
14023         * config/avr/avr.md: Added constants for tmp/ zero registers in
14024         AVRTINY. Attributes for AVRTINY added.
14025         (mov<mode>): Move src/ dest address to register if it is not in AVRTINY
14026         memory access range.
14027         (mov<mode>_insn): Avoid QImode direct load for AVRTINY if address not
14028         in AVRTINY memory access range.
14029         (*mov<mode>): Likewise for HImode and SImode.
14030         (*movsf): Likewise for SFmode.
14031         (delay_cycles_2): Updated instructions to be emitted as AVRTINY does
14032         not have sbiw.
14033         * config/avr/avr-protos.h: Added function prototype for
14034         tiny_valid_direct_memory_access_range.
14035         * config/avr/avr-tables.opt: Regenerate.
14036         * gcc/config/avr/t-multilib: Regenerate.
14037         * doc/avr-mmcu.texi: Regenerate.
14039 2014-10-21  Andrew Pinski  <apinski@cavium.com>
14041         * doc/invoke.texi (AARCH64/mtune): Document thunderx as an
14042         available option also.
14043         * config/aarch64/aarch64-cost-tables.h: New file.
14044         * config/aarch64/aarch64-cores.def (thunderx): New core.
14045         * config/aarch64/aarch64-tune.md: Regenerate.
14046         * config/aarch64/aarch64.c: Include aarch64-cost-tables.h instead
14047         of config/arm/aarch-cost-tables.h.
14048         (thunderx_regmove_cost): New variable.
14049         (thunderx_tunings): New variable.
14051 2014-10-21  Dehao Chen  <dehao@google.com>
14053         * auto-profile.c: New file.
14054         * auto-profile.h: New file.
14055         * basic-block.h (maybe_hot_count_p): New export func.
14056         (add_working_set): New export func.
14057         * gcov-io.h (GCOV_TAG_AFDO_FILE_NAMES): New tag.
14058         (GCOV_TAG_AFDO_FUNCTION): Likewise.
14059         (GCOV_TAG_AFDO_WORKING_SET): Likewise.
14060         * opts.c (enable_fdo_optimizations): New func.
14061         (common_handle_option): Handle -fauto-profile flag.
14062         * ipa-inline.c (want_early_inline_function_p): Iterative-einline.
14063         (class pass_early_inline): Export early_inliner.
14064         (early_inliner): Likewise.
14065         (pass_early_inline::execute): Likewise.
14066         * ipa-inline.h (early_inliner): Likewise.
14067         * predict.c (maybe_hot_count_p): New export func.
14068         (counts_to_freqs): AutoFDO logic.
14069         (rebuild_frequencies): Likewise.
14070         * tree-profile.c (pass_ipa_tree_profile::gate): Likewise.
14071         * profile.c (add_working_set): New func.
14072         * Makefile.in (auto-profile.o): New object file.
14073         * passes.def (pass_ipa_auto_profile): New pass.
14074         * tree-ssa-live.c (remove_unused_scope_block_p): AutoFDO logic.
14075         * tree-pass.h (make_pass_ipa_auto_profile): New pass.
14076         * toplev.c (compile_file): AutoFDO logic.
14077         * doc/invoke.texi (-fauto-profile): New doc.
14078         * coverage.c (coverage_init): AutoFDO logic.
14079         * common.opt (-fauto-profile): New flag.
14080         * timevar.def (TV_IPA_AUTOFDO): New tag.
14081         * value-prof.c (gimple_alloc_histogram_value): New export func.
14082         (check_ic_target): Likewise.
14083         * value-prof.h (gimple_alloc_histogram_value): Likewise.
14084         (check_ic_target): Likewise.
14086 2014-10-21  David Malcolm  <dmalcolm@redhat.com>
14088         * cgraph.c (cgraph_c_finalize): New function.
14089         * cgraph.h (cgraph_c_finalize): New prototype.
14090         (cgraphunit_c_finalize): New prototype.
14091         * cgraphunit.c (first_analyzed): Move from analyze_functions
14092         to file-scope.
14093         (first_analyzed_var): Likewise.
14094         (analyze_functions): Move static variables into file-scope.
14095         (cgraphunit_c_finalize): New function.
14096         * diagnostic.c (diagnostic_finish): Free the memory for
14097         context->classify_diagnostic and context->printer, running the
14098         destructor for the latter.
14099         (bt_stop): Use toplev::main.
14100         * dwarf2out.c (dwarf2out_finalize): New function.
14101         * dwarf2out.h (dwarf2out_c_finalize): New prototype.
14102         * gcse.c (gcse_c_finalize): New function.
14103         * gcse.h (gcse_c_finalize): New prototype.
14104         * ggc-page.c (init_ggc): Make idempotent.
14105         * input.c (input_location): Initialize to UNKNOWN_LOCATION.
14106         * ipa-cp.c (ipa_cp_c_finalize): New function.
14107         * ipa-prop.h (ipa_cp_c_finalize): New prototype.
14108         * ipa-pure-const.c (function_insertion_hook_holder): Move to be
14109         a field of class pass_ipa_pure_const.
14110         (node_duplication_hook_holder): Likewise.
14111         (node_removal_hook_holder): Likewise.
14112         (register_hooks): Convert to method...
14113         (pass_ipa_pure_const::register_hooks): ...here, converting
14114         static variable init_p into...
14115         (pass_ipa_pure_const::init_p): ...new field.
14116         (pure_const_generate_summary): Update invocation of
14117         register_hooks to invoke as a method of current_pass.
14118         (pure_const_read_summary): Likewise.
14119         (propagate): Convert to...
14120         (pass_ipa_pure_const::execute): ...method.
14121         * ipa-reference.c (ipa_init): Move static bool init_p from here
14122         to...
14123         (ipa_init_p): New file-scope variable, so that it can be reset
14124         when repeatedly invoking the compiler within one process by...
14125         (ipa_reference_c_finalize): New function.
14126         * ipa-reference.h (ipa_reference_c_finalize): New.
14127         * main.c (main): Replace invocation of toplev_main with
14128         construction of a toplev instance, and call its "main" method.
14129         * params.c (global_init_params): Add an assert that
14130         params_finished is false.
14131         (params_c_finalize): New.
14132         * params.h (params_c_finalize): New.
14133         * passes.c (execute_ipa_summary_passes): Set "current_pass" before
14134         invoking generate_summary, for the benefit of pass_ipa_pure_const.
14135         (ipa_write_summaries_2): Assign "pass" to "current_pass" global
14136         before calling write_summary hook.
14137         (ipa_write_optimization_summaries_1): Likewise when calling
14138         write_optimization_summary hook.
14139         (ipa_read_summaries_1): Likewise for read_summary hook.
14140         (ipa_read_optimization_summaries_1): Likewise for
14141         read_optimization_summary hook.
14142         (execute_ipa_stmt_fixups): Likewise.
14143         * stringpool.c (init_stringpool): Clean up if we're called more
14144         than once.
14145         * timevar.c (timevar_init): Ignore repeated calls.
14146         * toplev.c: Include "dwarf2out.h", "ipa-reference.h", "gcse.h",
14147         "ipa-prop.h".
14148         (general_init): Reset "input_location" to UNKNOWN_LOCATION.
14149         (initialize_rtl): Move static local "initialized_once"
14150         into file scope, and rename to...
14151         (rtl_initialized): New variable.
14152         (do_compile): Move timevar initialization from here to
14153         toplev::start_timevars.
14154         (toplev::toplev, toplev::~toplev, toplev::start_timevars,
14155         toplev::finalize): New functions.
14156         (toplev_main): Rename to...
14157         (toplev::main): ...this.
14158         * toplev.h (class toplev): New class.
14160 2014-10-21  Andrew MacLeod  <amacleod@redhat.com>
14162         * loop-doloop.c: Include loop-unroll.h.
14164 2014-10-21  Andrew MacLeod  <amacleod@redhat.com>
14166         * cfg.h: New.  Header file for cfg.c.
14167         * cfganal.h: New.  Header file for cfganal.c.
14168         * lcm.h: New.  Header file for lcm.c.
14169         * loop-unroll.h: New.  Header file for loop-unroll.h.
14170         * cfgloop.h: (unroll_loops): Remove prototype.
14171         * basic-block.h: Move prototypes and structs to new header files.
14172         Include cfg.h, cfganal.h, and lcm.h.
14173         * loop-init.c: Include loop-unroll.h.
14174         * loop-unroll.c: (referenced_in_one_insn_in_loop_p): Make static.
14175         * modulo-sched.c: Include loop-unroll.h.
14177 2014-10-21  Thomas Preud'homme  <thomas.preudhomme@arm.com>
14179         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Fix creation of
14180         MARKER_BYTE_UNKNOWN markers when handling casts.
14182 2014-10-21  Richard Biener  <rguenther@suse.de>
14184         * tree-ssa-phiopt.c (value_replacement): Properly verify we
14185         are the non-singleton PHI.
14187 2014-10-21  Jakub Jelinek  <jakub@redhat.com>
14189         PR tree-optimization/63563
14190         * tree-vect-data-refs.c (vect_analyze_data_ref_accesses): Bail out
14191         if either dra or drb stmts are not normal loads/stores.
14193 2014-10-21  Ilya Tocar  <ilya.tocar@intel.com>
14195         * config/i386/i386.c (expand_vec_perm_1): Fix
14196         expand_vec_perm_palignr case.
14197         * config/i386/sse.md (<ssse3_avx2>_palignr<mode>_mask): Use
14198         VI1_AVX512.
14200 2014-10-21  Zhenqiang Chen  <zhenqiang.chen@arm.com>
14202         * cfgloopanal.c (seq_cost): Delete.
14203         * rtl.h (seq_cost): New prototype.
14204         * rtlanal.c (seq_cost): New function.
14205         * tree-ssa-loop-ivopts.c (seq_cost): Delete.
14207 2014-10-20  Andrew MacLeod  <amacleod@redhat.com>
14209         * cfgrtl.h: New.  Add prototypes for cfgrtl.c.
14210         * basic-block.h: Remove prototypes for cfgrtl.c.
14211         * cfghooks.h (cfg_layout_initialize, cfg_layout_finalize): Move
14212         prototypes to cfgrtl.h.
14213         * profile.h (profile_info): Add extern export declaration.
14214         * rtl.h: Remove prototypes for cfgrtl.h.
14215         * tree-cfg.h (gt_ggc_mx, gt_pch_nx): Move prototypes to here.
14216         * ipa-inline.c: Include profile.h.
14217         * loop-unroll.c: Ditto.
14218         * modulo-sched.c: Ditto.
14219         * postreload-gcse.c: Ditto.
14220         * predict.c: Ditto.
14221         * sched-ebb.c: Ditto.
14222         * sched-rgn.c: Ditto.
14223         * tracer.c: Ditto.
14224         * tree-ssa-loop-ivcanon.c: Ditto.
14226 2014-10-20  Richard Biener  <rguenther@suse.de>
14228         * tree-vect-slp.c (vect_get_and_check_slp_defs): Try swapping
14229         operands to get a def operand kind match.  Signal mismatches
14230         to the parent so we can try swapping its operands.
14231         (vect_build_slp_tree): Try swapping operands if they have
14232         a mismatched operand kind.
14234 2014-10-20  Alan Modra  <amodra@gmail.com>
14236         PR debug/60655
14237         * simplify-rtx.c (simplify_plus_minus): Delete unused "input_ops".
14238         Increase "ops" array size.  Correct array size tests.  Init
14239         n_constants in loop.  Break out of innermost loop when finding
14240         a trivial CONST expression.
14242 2014-10-20  Martin Liska  <mliska@suse.cz>
14244         PR ipa/63583
14245         * ipa-icf-gimple.c (func_checker::compare_gimple_asm):
14246         Gimple tempate string is compared.
14248 2014-10-20  Uros Bizjak  <ubizjak@gmail.com>
14250         * varasm.c (const_alias_set): Remove.
14251         (init_varasm_once): Remove initialization of const_alias_set.
14252         (build_constant_desc): Do not set alias set to const_alias_set.
14254 2014-10-19  Ilya Verbin  <ilya.verbin@intel.com>
14256         * configure: Regenerate.
14257         * configure.ac: Move the test for section attribute specifier "e" in GAS
14258         out to all i[34567]86-*-* | x86_64-*-* targets and add --fatal-warnings.
14259         * langhooks.c (lhd_begin_section): Set SECTION_EXCLUDE flag.
14260         * varasm.c (default_elf_asm_named_section): Guard SECTION_EXCLUDE with
14261         ifdef HAVE_GAS_SECTION_EXCLUDE.
14263 2014-10-19  Andreas Schwab  <schwab@linux-m68k.org>
14265         * doc/md.texi (RTL Template) [match_scratch]: Correct equivalent
14266         match_operand expression.
14268 2014-10-19  Adhemerval Zanella  <azanella@linux.vnet.ibm.com>
14269             David Edelsohn  <dje.gcc@gmail.com>
14271         * config/rs6000/rs6000.c (rs6000_atomic_assign_expand_fenv): New
14272         function.
14273         (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): New define.
14275 2014-10-18  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14277         * doc/invoke.texi (Options to Request or Suppress Warnings):
14278         Explain options precedence.
14279         (Wtrampolines): Do not indent paragraph.
14281 2014-10-18  John David Anglin  <danglin@gcc.gnu.org>
14283         * doc/invoke.texi: Update documentation of hppa -mjump-in-delay option.
14284         * config/pa/pa-protos.h (pa_following_call): Delete declaration.
14285         (pa_jump_in_call_delay): Likewise.
14286         * config/pa/pa.c (pa_option_override): Remove jump in call delay
14287         override.
14288         (pa_output_millicode_call): Remove support for jump in call delay.
14289         (pa_output_call): Likewise.
14290         (pa_jump_in_call_delay): Delete.
14291         (pa_following_call): Likewise.
14292         * config/pa/pa.md (in_call_delay): Remove jump in delay check.
14293         (uncond_branch): Remove following call check from attribute length.
14295 2014-10-18  Oleg Endo  <olegendo@gcc.gnu.org>
14297         PR target/53513
14298         * config/sh/sh-modes.def (PSI): Remove.
14299         * config/sh/sh-protos.h (get_fpscr_rtx): Remove.
14300         * config/sh/sh.c (fpscr_rtx, get_fpscr_rtx): Remove.
14301         (sh_reorg): Remove commented out FPSCR code.
14302         (fpscr_set_from_mem): Use SImode instead of PSImode.  Emit lds_fpscr
14303         insn instead of move insn.
14304         (sh_hard_regno_mode_ok): Return SImode for FPSCR.
14305         (sh_legitimate_address_p, sh_legitimize_reload_address): Remove PSImode
14306         handling.
14307         (sh_emit_mode_set): Emit lds_fpscr and sts_fpscr insns.
14308         (sh1_builtin_p): Uncomment.
14309         (SH_BLTIN_UV 25, SH_BLTIN_VU 26): New macros.
14310         (bdesc): Add __builtin_sh_get_fpscr and __builtin_sh_set_fpscr.
14311         * config/sh/sh/predicates.md (fpscr_operand): Simplify.
14312         (fpscr_movsrc_operand, fpscr_movdst_operand): New predicates.
14313         (general_movsrc_operand, general_movdst_operand): Disallow
14314         fpscr_operand.
14315         * config/sh/sh.md (FPSCR_FR): New constant.
14316         (push_fpscr): Emit sts_fpscr insn.
14317         (pop_fpscr): Emit lds_fpscr_insn.
14318         (movsi_ie): Disallow FPSCR operands.
14319         (fpu_switch, unnamed related split, extend_psi_si,
14320         truncate_si_psi): Remove insns.
14321         (lds_fpscr, sts_fpscr): New insns.
14322         (toggle_sz, toggle_pr): Use SImode for FPSCR_REG instead of PSImode.
14324 2014-10-17  Eric Botcazou  <ebotcazou@adacore.com>
14326         * ipa-inline-transform.c (master_clone_with_noninline_clones_p): New.
14327         (clone_inlined_nodes): Do not overwrite the clone if above predicate
14328         returns true.
14330 2014-10-17  Ilya Tocar  <ilya.tocar@intel.com>
14332         * config/i386/i386.c (MAX_VECT_LEN): Move earlier.
14333         (expand_vec_perm_d): Ditto.
14334         (ix86_expand_vec_perm_vpermi2): Handle V8HImode, V16HImode, V32HImode,
14335         V32HImode, V4SImode, V8SImode, V4SFmode, V8SFmode, V2DImode, V4DImode,
14336         V4DFmode.
14337         (ix86_expand_vec_perm): Update call to ix86_expand_vec_perm_vpermi2.
14338         (ix86_expand_sse_unpack): Handle V64QImode.
14339         (expand_vec_perm_blend): Update conditions for TARGET, handle
14340         V8DFmode, V16SFmode, V32HImode, V64QImode, V16SImode, V8DImode.
14341         (expand_vec_perm_pshufb): Handle V64QImode.
14342         (expand_vec_perm_1): Handle V64QImode, V32HImode, V16SImode, V16SFmode,
14343         V8DFmode, V8DImode, V4DFmode, V2DFmode, V8SFmode, V4SFmode.
14344         (ix86_expand_vec_perm_const_1): Call  ix86_expand_vec_perm_vpermi2.
14345         (ix86_vectorize_vec_perm_const_ok): Handle V32HImode, V64QImode.
14346         (ix86_expand_vecop_qihi): Handle V64QImode.
14347         * config/i386/sse.md (define_mode_iterator VI1_AVX512): New.
14348         (define_mode_iterator VEC_PERM_AVX2): Add V32HI.
14349         (define_mode_iterator VEC_PERM_CONST): Add V32HI.
14350         (define_insn "<ssse3_avx2>_pshufb<mode>3<mask_name>"): Add masking.
14351         (mul<mode>3): Use VI1_AVX512.
14352         (<sse2_avx2>_packsswb): Ditto.
14353         (<sse2_avx2>_packuswb): Ditto.
14354         (<ssse3_avx2>_pshufb<mode>3): Ditto.
14355         (<shift_insn><mode>3): Ditto.
14357 2014-10-17  Kirill Yukhin  <kirill.yukhin@intel.com>
14359         * config/i386/i386.c (ix86_expand_sse2_mulvxdi3): Refactor
14360         conditions to fix bootstrap.
14362 2014-10-17  Andrew MacLeod  <amacleod@redhat.com>
14364         gcc-plugin.h:  Add tm.h and flattened includes from function.h.
14366 2014-10-17  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14367             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14368             Anna Tikhonova  <anna.tikhonova@intel.com>
14369             Ilya Tocar  <ilya.tocar@intel.com>
14370             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14371             Ilya Verbin  <ilya.verbin@intel.com>
14372             Kirill Yukhin  <kirill.yukhin@intel.com>
14373             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14375         * config/i386/i386.c (ix86_expand_vector_init_duplicate): Handle V64QI
14376         and V32HI modes, update V8HI, V16QI, V32QI modes handling.
14377         (ix86_expand_vector_init_general): Handle V64QI and V32HI modes.
14378         * config/i386/sse.md (define_mode_iterator VI48F_512): Rename to ...
14379         (define_mode_iterator VF48_I1248): ... this. Extend to AVX-512 modes.
14380         (define_expand "vec_init<mode>"): Use VF48_I1248.
14382 2014-10-17  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14383             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14384             Anna Tikhonova  <anna.tikhonova@intel.com>
14385             Ilya Tocar  <ilya.tocar@intel.com>
14386             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14387             Ilya Verbin  <ilya.verbin@intel.com>
14388             Kirill Yukhin  <kirill.yukhin@intel.com>
14389             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14391         * config/i386/i386.c (ix86_expand_sse2_mulvxdi3): Extend
14392         expand_sse2_mulvxdi3.
14394 2014-10-17  Richard Biener  <rguenther@suse.de>
14396         * fold-const.c (fold_comparison): Remove redundant constant
14397         folding and operand swapping.
14398         (fold_binary_loc): Do comparison operand swapping here.
14399         (fold_ternary_loc): Canonicalize operand order for
14400         commutative ternary operations.
14401         * tree.c (commutative_ternary_tree_code): Add DOT_PROD_EXPR
14402         and FMA_EXPR.
14404 2014-10-17  Jakub Jelinek  <jakub@redhat.com>
14406         PR tree-optimization/63464
14407         * gimple.h (gimple_seq_discard): New prototype.
14408         * gimple.c: Include stringpool.h and tree-ssanames.h.
14409         (gimple_seq_discard): New function.
14410         * optabs.h (lshift_cheap_p): New prototype.
14411         * optabs.c (lshift_cheap_p): New function, moved from...
14412         * tree-switch-conversion.c (lshift_cheap_p): ... here.
14413         * tree-ssa-reassoc.c: Include gimplify.h and optabs.h.
14414         (reassoc_branch_fixups): New variable.
14415         (update_range_test): Add otherrangep and seq arguments.
14416         Unshare exp.  If otherrange is NULL, use for other ranges
14417         array of pointers pointed by otherrangep instead.
14418         Emit seq before gimplified statements for tem.
14419         (optimize_range_tests_diff): Adjust update_range_test
14420         caller.
14421         (optimize_range_tests_xor): Likewise.  Fix up comment.
14422         (extract_bit_test_mask, optimize_range_tests_to_bit_test): New
14423         functions.
14424         (optimize_range_tests): Adjust update_range_test caller.
14425         Call optimize_range_tests_to_bit_test.
14426         (branch_fixup): New function.
14427         (execute_reassoc): Call branch_fixup.
14429         PR tree-optimization/63302
14430         * tree-ssa-reassoc.c (optimize_range_tests_xor,
14431         optimize_range_tests_diff): Use !integer_pow2p () instead of
14432         tree_log2 () < 0.
14434 2014-10-17  Martin Liska  <mliska@suse.cz>
14436         * ipa-icf.c (sem_function::merge): Local flags are set to false
14437         to enforce equal calling convention to be used.
14438         * opts.c (common_handle_option): Indentation fix.
14440 2014-10-17  Marc Glisse  <marc.glisse@inria.fr>
14442         * tree-into-ssa.c (is_old_name): Replace "new" with "old".
14444 2014-10-17  Tom de Vries  <tom@codesourcery.com>
14446         PR rtl-optimization/61605
14447         * regcprop.c (copyprop_hardreg_forward_1): Use
14448         regs_invalidated_by_this_call instead of regs_invalidated_by_call.
14450 2014-10-17  Tom de Vries  <tom@codesourcery.com>
14452         PR rtl-optimization/61605
14453         * regcprop.c (copyprop_hardreg_forward_1): Add copy_p and noop_p.
14454         Don't notice stores for noops.  Don't regard noops as copies.
14456 2014-10-17  Uros Bizjak  <ubizjak@gmail.com>
14458         * config/i386/cpuid.h (__cpuid): Remove definitions that handle %ebx
14459         register in a special way.
14460         (__cpuid_count): Ditto.
14461         * config/i386/driver-i386.h: Protect with
14462         "#if defined(__GNUC__) && (__GNUC__ >= 5 || !defined(__PIC__))".
14463         (host_detect_local_cpu): Mention that GCC with non-fixed %ebx
14464         is required to compile the function.
14466 2014-10-16  DJ Delorie  <dj@redhat.com>
14468         * flag-types.h (sanitize_code): Don't assume targets have 32-bit
14469         integers.
14471         * config/rs6000/rs6000-c.c (rid_int128): New.
14472         (rs6000_macro_to_expand): Use instead of RID_INT128.
14474 2014-10-16  Andrew MacLeod  <amacleod@redhat.com>
14476         * function.h: Flatten file.  Remove includes, adjust prototypes to
14477         reflect only what is in function.h.
14478         (enum direction, struct args_size, struct locate_and_pad_arg_data,
14479         ADD_PARM_SIZE, SUB_PARM_SIZE, ARGS_SIZE_TREE, ARGS_SIZE_RTX): Relocate
14480         from expr.h.
14481         (ASLK_REDUCE_ALIGN, ASLK_RECORD_PAD): Relocate from rtl.h.
14482         (optimize_function_for_size_p, optimize_function_for_speed_p): Move
14483         prototypes to predict.h.
14484         (init_varasm_status): Move prototype to varasm.h.
14485         * expr.h: Adjust include files.
14486         (enum direction, struct args_size, struct locate_and_pad_arg_data,
14487         ADD_PARM_SIZE, SUB_PARM_SIZE, ARGS_SIZE_TREE, ARGS_SIZE_RTX): Move
14488         to function.h.
14489         (locate_and_pad_parm): Move prototype to function.h.
14490         * rtl.h: (assign_stack_local, ASLK_REDUCE_ALIGN, ASLK_RECORD_PAD,
14491         assign_stack_local_1, assign_stack_temp, assign_stack_temp_for_type,
14492         assign_temp, reposition_prologue_and_epilogue_notes,
14493         prologue_epilogue_contains, sibcall_epilogue_contains,
14494         update_temp_slot_address, maybe_copy_prologue_epilogue_insn,
14495         set_return_jump_label): Move prototypes to function.h.
14496         * predict.h (optimize_function_for_size_p,
14497         optimize_function_for_speed_p): Relocate prototypes from function.h.
14498         * shrink-wrap.h (emit_return_into_block, active_insn_between,
14499         convert_jumps_to_returns, emit_return_for_exit): Move prototypes to
14500         function.h.
14501         * varasm.h (init_varasm_status): Relocate prototype from function.h.
14502         * genattrtab.c (write_header): Add predict.h to include list.
14503         * genconditions.c (write_header): Add predict.h to include list.
14504         * genemit.c (main): Adjust header file includes.
14505         * gengtype.c (ifiles): Add flattened function.h header files.
14506         * genoutput.c (output_prologue): Add predict.h to include list.
14507         * genpreds.c (write_insn_preds_c): Adjust header file includes.
14508         * genrecog.c (write_header): Add flattened function.h header files.
14509         * alias.c: Adjust include files.
14510         * auto-inc-dec.c: Likewise.
14511         * basic-block.h: Likewise.
14512         * bb-reorder.c: Likewise.
14513         * bt-load.c: Likewise.
14514         * builtins.c: Likewise.
14515         * caller-save.c: Likewise.
14516         * calls.c: Likewise.
14517         * cfgbuild.c: Likewise.
14518         * cfgcleanup.c: Likewise.
14519         * cfgexpand.c: Likewise.
14520         * cfgloop.c: Likewise.
14521         * cfgloop.h: Likewise.
14522         * cfgrtl.c: Likewise.
14523         * cgraph.h: Likewise.
14524         * cgraphclones.c: Likewise.
14525         * cgraphunit.c: Likewise.
14526         * combine-stack-adj.c: Likewise.
14527         * combine.c: Likewise.
14528         * coverage.c: Likewise.
14529         * cprop.c: Likewise.
14530         * cse.c: Likewise.
14531         * cselib.c: Likewise.
14532         * dbxout.c: Likewise.
14533         * ddg.c: Likewise.
14534         * df-core.c: Likewise.
14535         * df-problems.c: Likewise.
14536         * df-scan.c: Likewise.
14537         * dojump.c: Likewise.
14538         * dwarf2cfi.c: Likewise.
14539         * dwarf2out.c: Likewise.
14540         * emit-rtl.c: Likewise.
14541         * except.c: Likewise.
14542         * explow.c: Likewise.
14543         * expr.c: Likewise.
14544         * final.c: Likewise.
14545         * function.c: Likewise.
14546         * gcse.c: Likewise.
14547         * gimple-fold.c: Likewise.
14548         * gimple-low.c: Likewise.
14549         * gimple-streamer.h: Likewise.
14550         * haifa-sched.c: Likewise.
14551         * ifcvt.c: Likewise.
14552         * ira.c: Likewise.
14553         * jump.c: Likewise.
14554         * lcm.c: Likewise.
14555         * loop-invariant.c: Likewise.
14556         * lra-assigns.c: Likewise.
14557         * lra-coalesce.c: Likewise.
14558         * lra-constraints.c: Likewise.
14559         * lra-eliminations.c: Likewise.
14560         * lra-lives.c: Likewise.
14561         * lra-spills.c: Likewise.
14562         * lra.c: Likewise.
14563         * lto-cgraph.c: Likewise.
14564         * lto-section-in.c: Likewise.
14565         * lto-section-out.c: Likewise.
14566         * lto-streamer-in.c: Likewise.
14567         * lto-streamer-out.c: Likewise.
14568         * mode-switching.c: Likewise.
14569         * modulo-sched.c: Likewise.
14570         * omp-low.c: Likewise.
14571         * optabs.c: Likewise.
14572         * passes.c: Likewise.
14573         * postreload-gcse.c: Likewise.
14574         * postreload.c: Likewise.
14575         * predict.c: Likewise.
14576         * profile.c: Likewise.
14577         * recog.c: Likewise.
14578         * ree.c: Likewise.
14579         * reg-stack.c: Likewise.
14580         * regcprop.c: Likewise.
14581         * reginfo.c: Likewise.
14582         * regrename.c: Likewise.
14583         * reload.c: Likewise.
14584         * reload1.c: Likewise.
14585         * reorg.c: Likewise.
14586         * resource.c: Likewise.
14587         * rtlanal.c: Likewise.
14588         * sched-deps.c: Likewise.
14589         * sched-ebb.c: Likewise.
14590         * sched-rgn.c: Likewise.
14591         * sel-sched-dump.c: Likewise.
14592         * sel-sched-ir.c: Likewise.
14593         * sel-sched.c: Likewise.
14594         * shrink-wrap.c: Likewise.
14595         * simplify-rtx.c: Likewise.
14596         * statistics.c: Likewise.
14597         * stmt.c: Likewise.
14598         * stor-layout.c: Likewise.
14599         * store-motion.c: Likewise.
14600         * symtab.c: Likewise.
14601         * targhooks.c: Likewise.
14602         * toplev.c: Likewise.
14603         * trans-mem.c: Likewise.
14604         * tree-cfg.c: Likewise.
14605         * tree-cfgcleanup.c: Likewise.
14606         * tree-dfa.c: Likewise.
14607         * tree-eh.c: Likewise.
14608         * tree-inline.c: Likewise.
14609         * tree-into-ssa.c: Likewise.
14610         * tree-nested.c: Likewise.
14611         * tree-nrv.c: Likewise.
14612         * tree-profile.c: Likewise.
14613         * tree-ssa-alias.c: Likewise.
14614         * tree-ssa-ccp.c: Likewise.
14615         * tree-ssa-copy.c: Likewise.
14616         * tree-ssa-copyrename.c: Likewise.
14617         * tree-ssa-dom.c: Likewise.
14618         * tree-ssa-operands.c: Likewise.
14619         * tree-ssa-propagate.c: Likewise.
14620         * tree-ssa-structalias.c: Likewise.
14621         * tree-ssa-tail-merge.c: Likewise.
14622         * tree-ssa-threadedge.c: Likewise.
14623         * tree-ssa-threadupdate.c: Likewise.
14624         * tree-ssa-uncprop.c: Likewise.
14625         * tree-ssa-uninit.c: Likewise.
14626         * tree-ssa.c: Likewise.
14627         * tree-stdarg.c: Likewise.
14628         * tree-tailcall.c: Likewise.
14629         * tree.c: Likewise.
14630         * tsan.c: Likewise.
14631         * valtrack.c: Likewise.
14632         * varasm.c: Likewise.
14633         * vmsdbgout.c: Likewise.
14634         * web.c: Likewise.
14635         * config/aarch64/aarch64.c: Add flattened includes from function.h.
14636         * config/alpha/alpha.c: Likewise.
14637         * config/arc/arc.c: Likewise.
14638         * config/arm/arm.c: Likewise.
14639         * config/avr/avr-log.c: Likewise.
14640         * config/avr/avr.c: Likewise.
14641         * config/bfin/bfin.c: Likewise.
14642         * config/c6x/c6x.c: Likewise.
14643         * config/cr16/cr16.c: Likewise.
14644         * config/cris/cris.c: Likewise.
14645         * config/darwin.c: Likewise.
14646         * config/epiphany/epiphany.c: Likewise.
14647         * config/epiphany/mode-switch-use.c: Likewise.
14648         * config/epiphany/resolve-sw-modes.c: Likewise.
14649         * config/fr30/fr30.c: Likewise.
14650         * config/frv/frv.c: Likewise.
14651         * config/h8300/h8300.c: Likewise.
14652         * config/i386/i386.c: Likewise.
14653         * config/ia64/ia64.c: Likewise.
14654         * config/iq2000/iq2000.c: Likewise.
14655         * config/lm32/lm32.c: Likewise.
14656         * config/m32c/m32c.c: Likewise.
14657         * config/m32r/m32r.c: Likewise.
14658         * config/m68k/m68k.c: Likewise.
14659         * config/mcore/mcore.c: Likewise.
14660         * config/mep/mep-pragma.c: Likewise.
14661         * config/mep/mep.c: Likewise.
14662         * config/microblaze/microblaze.c: Likewise.
14663         * config/mips/mips.c: Likewise.
14664         * config/mmix/mmix.c: Likewise.
14665         * config/mn10300/mn10300.c: Likewise.
14666         * config/moxie/moxie.c: Likewise.
14667         * config/msp430/msp430.c: Likewise.
14668         * config/nds32/nds32-cost.c: Likewise.
14669         * config/nds32/nds32-fp-as-gp.c: Likewise.
14670         * config/nds32/nds32-intrinsic.c: Likewise.
14671         * config/nds32/nds32-isr.c: Likewise.
14672         * config/nds32/nds32-md-auxiliary.c: Likewise.
14673         * config/nds32/nds32-memory-manipulation.c: Likewise.
14674         * config/nds32/nds32-pipelines-auxiliary.c: Likewise.
14675         * config/nds32/nds32-predicates.c: Likewise.
14676         * config/nds32/nds32.c: Likewise.
14677         * config/nios2/nios2.c: Likewise.
14678         * config/pa/pa.c: Likewise.
14679         * config/pdp11/pdp11.c: Likewise.
14680         * config/rl78/rl78.c: Likewise.
14681         * config/rs6000/rs6000.c: Likewise.
14682         * config/rx/rx.c: Likewise.
14683         * config/s390/s390.c: Likewise.
14684         * config/score/score.c: Likewise.
14685         * config/sh/sh.c: Likewise.
14686         * config/sparc/sparc.c: Likewise.
14687         * config/spu/spu.c: Likewise.
14688         * config/stormy16/stormy16.c: Likewise.
14689         * config/tilegx/tilegx.c: Likewise.
14690         * config/tilepro/tilepro.c: Likewise.
14691         * config/v850/v850.c: Likewise.
14692         * config/vax/vax.c: Likewise.
14693         * config/xtensa/xtensa.c: Likewise.
14695 2014-10-16  Richard Earnshaw  <rearnsha@arm.com>
14697         * config/aarch64/aarch64.c (aarch64_legitimize_address): New function.
14698         (TARGET_LEGITIMIZE_ADDRESS): Redefine.
14700 2014-10-16  Oleg Endo  <olegendo@gcc.gnu.org>
14702         * config/sh/sh-protos.h (fldi_ok): Remove.
14703         * config/sh/sh.c (fldi_ok): Likewise.
14704         (sh_secondary_reload): Don't use fldi_ok.
14705         * config/sh/constraints.md (G constraint, H constraint): Don't use
14706         fldi_ok.
14708 2014-10-16  Martin Liska  <mliska@suse.cz>
14710         * ipa-icf.c (sem_item_optimizer::process_cong_reduction):
14711         Cast to unsigned long.
14712         (sem_item_optimizer::dump_cong_classes): Likewise.
14714 2014-10-16  Tom de Vries  <tom@codesourcery.com>
14716         * tree-into-ssa.c (update_ssa): Assert that there's no ssa use operand
14717         with SSA_NAME_IN_FREELIST.
14719 2014-10-16  Richard Biener  <rguenther@suse.de>
14721         PR middle-end/63554
14722         * builtins.c (fold_builtin_4): Do not call fold_builtin_strncat_chk.
14723         (fold_builtin_strncat_chk): Move ...
14724         * gimple-fold.c (gimple_fold_builtin_strncat_chk): ... here.
14725         (gimple_fold_builtin): Call gimple_fold_builtin_strncat_chk.
14727 2014-10-16  Oleg Endo  <olegendo@gcc.gnu.org>
14729         PR target/59401
14730         * config/sh/sh.h (CALL_REALLY_USED_REGISTERS): Expand macro and set
14731         GBR to 0.
14733 2014-10-16  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14734             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14735             Anna Tikhonova  <anna.tikhonova@intel.com>
14736             Ilya Tocar  <ilya.tocar@intel.com>
14737             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14738             Ilya Verbin  <ilya.verbin@intel.com>
14739             Kirill Yukhin  <kirill.yukhin@intel.com>
14740             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14742         * config/i386/i386.c (ix86_expand_mul_widen_hilo): Handle V32HI, V16SI,
14743         V64QI modes.
14745 2014-10-16  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14746             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14747             Anna Tikhonova  <anna.tikhonova@intel.com>
14748             Ilya Tocar  <ilya.tocar@intel.com>
14749             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14750             Ilya Verbin  <ilya.verbin@intel.com>
14751             Kirill Yukhin  <kirill.yukhin@intel.com>
14752             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14754         * config/i386/i386.c (ix86_expand_vector_set): Handle V8DF, V8DI, V16SF,
14755         V16SI, V32HI, V64QI modes.
14757 2014-10-16  Oleg Endo  <olegendo@gcc.gnu.org>
14759         PR target/53513
14760         * config/sh/sh-protos.h (emit_sf_insn, emit_df_insn, expand_sf_unop,
14761         expand_sf_binop, expand_df_unop, expand_df_binop): Remove.
14763         * config/sh/sh.c (sh_emit_set_t_insn): Adjust generated insn pattern
14764         to match fp insn patterns.
14765         (calc_live_regs): Add FPSCR_MODES_REG and FPSCR_STAT_REG to the ignore
14766         list.
14767         (emit_sf_insn, emit_df_insn, expand_sf_unop, expand_sf_binop,
14768         expand_df_unop, expand_df_binop): Remove.
14769         (sh_conditional_register_usage): Mark FPSCR_MODES_REG and
14770         FPSCR_STAT_REG as not call clobbered.
14771         (sh_emit_mode_set): Emit fpscr store-modify-load sequence instead of
14772         invoking fpscr_set_from_mem.
14774         * config/sh/sh.h (MAX_REGISTER_NAME_LENGTH): Increase to 6.
14775         (SH_REGISTER_NAMES_INITIALIZER): Add names for FPSCR_MODES_REG and
14776         FPSCR_STAT_REG.
14777         (REGISTER_NAMES): Adjust.
14778         (SPECIAL_REGISTER_P): Add FPSCR_MODES_REG and FPSCR_STAT_REG.
14779         (FIRST_PSEUDO_REGISTER): Increase to 156.
14780         (DWARF_FRAME_REGISTERS): Define as 153 to keep the original value.
14781         (FIXED_REGISTERS, CALL_USED_REGISTERS): Add FPSCR_MODES_REG and
14782         FPSCR_STAT_REG.
14783         (REG_CLASS_CONTENTS): Adjust ALL_REGS bit mask to include
14784         FPSCR_MODES_REG and FPSCR_STAT_REG.
14785         (REG_ALLOC_ORDER): Add FPSCR_MODES_REG and FPSCR_STAT_REG.
14787         * config/sh/sh.md (FPSCR_MODES_REG, FPSCR_STAT_REG, FPSCR_PR,
14788         FPSCR_SZ): Add new constants.
14789         (UNSPECV_FPSCR_MODES, UNSPECV_FPSCR_STAT): Add new unspecv constants.
14791         (movpsi): Use TARGET_FPU_ANY condition, invoke gen_fpu_switch.
14792         (fpu_switch): Add use and set of FPSCR_STAT_REG and FPSCR_MODES_REG.
14793         Use TARGET_FPU_ANY condition.
14794         (fpu_switch peephole2): Remove.
14795         (fpu_switch split): Use simple_mem_operand to capture the mem and
14796         adjust split implementation.
14797         (extend_psi_si, truncate_si_psi): New insns.
14798         (toggle_sz, toggle_pr): Use FPSCR_SZ, FPSCR_PR constants.  Add
14799         set of FPSCR_MODES_REG.
14801         (push_e, push_4, pop_e, pop_4, movdf_i4, reload_indf__frn, movsf_ie,
14802         reload_insf__frn, force_mode_for_call, calli, calli_tbr_rel,
14803         calli_pcrel, call_pcrel, call_compact, call_compact_rettramp,
14804         call_valuei, call_valuei_tbr_rel, call_valuei_pcrel, call_value_pcrel,
14805         call_value_compact, call_value_compact_rettramp, call,
14806         call_pop_compact, call_pop_compact_rettramp, call_value, sibcalli,
14807         sibcalli_pcrel, sibcalli_thunk, sibcall_pcrel, sibcall_compact,
14808         sibcall, sibcall_valuei, sibcall_valuei_pcrel, sibcall_value_pcrel,
14809         sibcall_value_compact, sibcall_value, call_value_pop_compact,
14810         call_value_pop_compact_rettramp, various unnamed splits):
14811         Replace use of FPSCR_REG with use of FPSCR_MODES_REG.  Adjust gen_*
14812         function uses.
14814         (floatsisf2_i4, *floatsisf2_ie): Merge into floatsisf2_i4.
14815         (fix_truncsfsi2_i4, *fixsfsi): Merge into fix_truncsfsi2_i4.
14816         (cmpgtsf_t, cmpgtsf_t_i4): Merge into cmpgtsf_t.
14817         (cmpeqsf_t, cmpeqsf_t_i4): Merge into cmpeqsf_t.
14818         (ieee_ccmpeqsf_t, *ieee_ccmpeqsf_t_4): Merge into ieee_ccmpeqsf_t.
14820         (udivsi3_i4, divsi3_i4, addsf3_i, subsf3_i, mulsf3_i, fmasf4_i,
14821         *fmasf4, divsf3_i, floatsisf2_i4, fix_truncsfsi2_i4, cmpgtsf_t,
14822         cmpeqsf_t, ieee_ccmpeqsf_t, sqrtsf2_i, rsqrtsf2, fsca, adddf3_i,
14823         subdf3_i, muldf3_i, divdf3_i, floatsidf2_i, fix_truncdfsi2_i,
14824         cmpgtdf_t, cmpeqdf_t, *ieee_ccmpeqdf_t, sqrtdf2_i, extendsfdf2_i4,
14825         truncdfsf2_i4): Replace use of FPSCR_REG with clobber of FPSCR_STAT_REG
14826         and use of FPSCR_MODES_REG.  Adjust gen_* function uses.
14828 2014-10-16  Martin Liska  <mliska@suse.cz>
14829             Jan Hubicka  <hubicka@ucw.cz>
14831         * Makefile.in: New object files included.
14832         * cgraph.c (cgraph_node::dump): New cgraph_node flag icf_merged
14833         is printed.
14834         (verify_edge_corresponds_to_fndecl): More sensitive verification
14835         of nodes that are merged by IPA ICF.
14836         * cgraph.h (cgraph_node::num_references): New function.
14837         * cgraphunit.c (cgraph_node::expand_thunk): White space fixed.
14838         * common.opt: New options ipa-icf, ipa-icf-functions and
14839         ipa-icf-variables introduced.
14840         * doc/invoke.texi: Documentation of new options introduced.
14841         * ipa-icf-gimple.c: New file.
14842         * ipa-icf-gimple.h: New file.
14843         * ipa-icf.c: New file.
14844         * ipa-icf.h: New file.
14845         * lto-cgraph.c (lto_output_node): Streaming of icf_merged flag added.
14846         (input_overwrite_node): Likewise.
14847         * lto-section-in.c: New icf section added.
14848         * lto-streamer.h (enum lto_section_type): Likewise.
14849         * opts.c (common_handle_option): New option added.
14850         * passes.def: New pass included.
14851         * timevar.def: Time variable for IPA ICF added.
14852         * tree-pass.h: New IPA ICF pass entry point added.
14854 2014-10-16  Richard Biener  <rguenther@suse.de>
14856         PR tree-optimization/63168
14857         * tree-cfg.c (gimple_can_merge_blocks_p): Only protect
14858         latches if after merging they are no longer simple.
14859         * cfghooks.c (merge_blocks): Handle merging a latch block
14860         into another block.
14862 2014-10-16  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14863             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14864             Anna Tikhonova  <anna.tikhonova@intel.com>
14865             Ilya Tocar  <ilya.tocar@intel.com>
14866             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14867             Ilya Verbin  <ilya.verbin@intel.com>
14868             Kirill Yukhin  <kirill.yukhin@intel.com>
14869             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14871         * config/i386/sse.md
14872         (define_expand "floatuns<sseintvecmodelower><mode>2"): Extend to
14873         support AVX-512VL instructions.
14875 2014-10-16  DJ Delorie  <dj@redhat.com>
14877         * tree-core.h: Fix comment to not assume pointers are multiples of
14878         bytes.
14880 2014-10-15  Tom Tromey  <tromey@redhat.com>
14882         * timevar.h (class auto_timevar): New class.
14884 2014-10-15  Uros Bizjak  <ubizjak@gmail.com>
14886         PR go/59432
14887         * config/i386/sync.md (atomic_compare_and_swap<dwi>_doubleword):
14888         Remove the second alternative.
14889         (regprefix): Remove mode attribute.
14890         (atomic_compare_and_swap<mode>): Do not fixup operand 2.
14891         * config/i386/predicates.md (cmpxchg8b_pic_memory_operand): Remove.
14893         Revert:
14894         2013-11-05  Ian Lance Taylor  <iant@google.com>
14896         * config/i386/sync.md (atomic_compare_and_swap<dwi>_doubleword):
14897         If possible, add .cfi directives to record change to bx.
14898         * config/i386/i386.c (ix86_emit_cfi): New function.
14899         * config/i386/i386-protos.h (ix86_emit_cfi): Declare.
14901 2014-10-15  Jan Hubicka  <hubicka@ucw.cz>
14903         PR lto/62026
14904         * cgraphclones.c (duplicate_thunk_for_node): Get body to have args
14905         to duplicate.
14906         * lto-streamer-out.c (lto_output): Handle correctly thunks that was
14907         born at WPA time.
14909 2014-10-15  Vladimir Makarov  <vmakarov@redhat.com>
14911         PR rtl-optimization/63448
14912         * lra-int.h (LRA_MAX_CONSTRAINT_ITERATION_NUMBER): Remove.
14913         (LRA_MAX_ASSIGNMENT_ITERATION_NUMBER): New.
14914         (LRA_MAX_INHERITANCE_PASSES): Use it.
14915         (lra_constraint_iter_after_spill): Remove.
14916         (lra_assignment_iter): New.
14917         (lra_assignment_iter_after_spill): New.
14918         * lra-assigns.c (lra_assignment_iter): New.
14919         (lra_assignment_iter_after_spill): New.
14920         (former_reload_pseudo_spill_p): New.
14921         (spill_for): Set up former_reload_pseudo_spill_p.
14922         (setup_live_pseudos_and_spill_after_risky): Ditto.
14923         (assign_by_spills): Ditto.
14924         (lra_assign): Increment lra_assignment_iter.  Print the iteration
14925         number.  Reset former_reload_pseudo_spill_p.  Check
14926         lra_assignment_iter_after_spill.
14927         * lra.c (lra): Remove lra_constraint_iter_after_spill.  Initialize
14928         lra_assignment_iter and lra_assignment_iter_after_spill.
14929         * lra-constraints.c (lra_constraint_iter_after_spill): Remove.
14930         (lra_constraints): Remove code with
14931         lra_assignment_iter_after_spill.
14933 2014-10-15  Teresa Johnson  <tejohnson@google.com>
14935         PR bootstrap/63432
14936         * tree-ssa-threadupdate.c (recompute_probabilities): Better
14937         overflow checking.
14939 2014-10-15  Renlin Li <renlin.li@arm.com>
14941         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Define
14942         __ARM_BIG_ENDIAN, __ARM_SIZEOF_MINIMAL_ENUM. Add __ARM_64BIT_STATE,
14943         __ARM_ARCH_ISA_A64, __ARM_FEATURE_CLZ, __ARM_FEATURE_IDIV,
14944         __ARM_FEATURE_UNALIGNED, __ARM_PCS_AAPCS64, __ARM_SIZEOF_WCHAR_T.
14946 2014-10-15  Richard Biener  <rguenther@suse.de>
14948         * gimple-fold.c (gimple_fold_call): Properly keep virtual
14949         SSA form up-to-date when devirtualizing a call to
14950         __builtin_unreachable and avoid fixing up EH info here.
14952 2014-10-15  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14953             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14954             Anna Tikhonova  <anna.tikhonova@intel.com>
14955             Ilya Tocar  <ilya.tocar@intel.com>
14956             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14957             Ilya Verbin  <ilya.verbin@intel.com>
14958             Kirill Yukhin  <kirill.yukhin@intel.com>
14959             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14961         * config/i386/sse.md (define_mode_iterator VI_AVX2): Extend
14962         to support AVX-512BW.
14963         (define_mode_iterator VI124_AVX2_48_AVX512F): Remove.
14964         (define_expand "<plusminus_insn><mode>3"): Remove masking support.
14965         (define_insn "*<plusminus_insn><mode>3"): Ditto.
14966         (define_expand "<plusminus_insn><VI48_AVX512VL:mode>3_mask"): New.
14967         (define_expand "<plusminus_insn><VI12_AVX512VL:mode>3_mask"): Ditto.
14968         (define_insn "*<plusminus_insn><VI48_AVX512VL:mode>3_mask"): Ditto.
14969         (define_insn "*<plusminus_insn><VI12_AVX512VL:mode>3_mask"): Ditto.
14970         (define_expand "<sse2_avx2>_andnot<mode>3"): Remove masking support.
14971         (define_insn "*andnot<mode>3"): Ditto.
14972         (define_expand "<sse2_avx2>_andnot<VI48_AVX512VL:mode>3_mask"): New.
14973         (define_expand "<sse2_avx2>_andnot<VI12_AVX512VL:mode>3_mask"): Ditto.
14974         (define_insn "*andnot<VI48_AVX512VL:mode>3<mask_name>"): Ditto.
14975         (define_insn "*andnot<VI12_AVX512VL:mode>3<mask_name>"): Ditto.
14976         (define_insn "*abs<mode>2"): Remove masking support.
14977         (define_insn "abs<VI48_AVX512VL:mode>2_mask"): New.
14978         (define_insn "abs<VI12_AVX512VL:mode>2_mask"): Ditto.
14979         (define_expand "abs<mode>2"): Use VI_AVX2 mode iterator.
14981 2014-10-15  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14982             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14983             Anna Tikhonova  <anna.tikhonova@intel.com>
14984             Ilya Tocar  <ilya.tocar@intel.com>
14985             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14986             Ilya Verbin  <ilya.verbin@intel.com>
14987             Kirill Yukhin  <kirill.yukhin@intel.com>
14988             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14990         * config/i386/predicates.md (define_predicate "constm1_operand"): New.
14991         * config/i386/sse.md
14992         (define_c_enum "unspec"): Add UNSPEC_CVTINT2MASK.
14993         (define_insn "<avx512>_cvt<ssemodesuffix>2mask<VI12_AVX512VL:mode>"): New.
14994         (define_insn "<avx512>_cvt<ssemodesuffix>2mask<VI48_AVX512VL:mode>"): Ditto.
14995         (define_expand "<avx512>_cvtmask2<ssemodesuffix><VI12_AVX512VL:mode>"): Ditto.
14996         (define_insn "*<avx512>_cvtmask2<ssemodesuffix><VI12_AVX512VL:mode>"): Ditto.
14997         (define_expand "<avx512>_cvtmask2<ssemodesuffix><VI48_AVX512VL:mode>"): Ditto.
14998         (define_insn "*<avx512>_cvtmask2<ssemodesuffix><VI48_AVX512VL:mode>"): Ditto.
15000 2014-10-15  Renlin Li <renlin.li@arm.com>
15002         * config/aarch64/aarch64.h (ARM_DEFAULT_PCS, arm_pcs_variant): Delete.
15004 2014-10-15  Jakub Jelinek  <jakub@redhat.com>
15006         * tree-ssa-reassoc.c (optimize_range_tests_diff): Perform
15007         MINUS_EXPR in unsigned type to avoid undefined behavior.
15009 2014-10-15  Eric Botcazou  <ebotcazou@adacore.com>
15011         * stor-layout.c (self_referential_size): Do not promote arguments.
15013 2014-10-15  Marek Polacek  <polacek@redhat.com>
15015         * doc/invoke.texi: Update to reflect that GNU11 is the default
15016         mode for C.
15017         * c-common.h (c_language_kind): Update comment.
15019 2014-10-15  Richard Biener  <rguenther@suse.de>
15021         * hash-table.c: Include bconfig.h if building for the host.
15022         * hash-table.h: Do not include ggc.h on the host but just declare
15023         a few ggc allocation templates.
15025 2014-10-15  Joern Rennecke  <joern.rennecke@embecosm.com>
15026             Jeff Law  <law@redhat.com>
15028         * caller-save.c (replace_reg_with_saved_mem): If saved_mode covers
15029         multiple hard registers, use smaller mode derived from MODE.
15031 2014-10-15  Andreas Schwab  <schwab@suse.de>
15033         * explow.c (convert_memory_address_addr_space_1): Mark in_const
15034         as ATTRIBUTE_UNUSED.
15036 2014-10-14  Jan Hubicka  <hubicka@ucw.cz>
15038         * loop-unroll.c (decide_unrolling_and_peeling): Rename to
15039         (decide_unrolling): ... this one.
15040         (peel_loops_completely): Remove.
15041         (decide_peel_simple): Remove.
15042         (decide_peel_once_rolling): Remove.
15043         (decide_peel_completely): Remove.
15044         (peel_loop_simple): Remove.
15045         (peel_loop_completely): Remove.
15046         (unroll_and_peel_loops): Rename to ...
15047         (unroll_loops): ... this one; handle only unrolling.
15048         * cfgloop.h (lpt_dec): Remove LPT_PEEL_COMPLETELY and LPT_PEEL_SIMPLE.
15049         (UAP_PEEL): Remove.
15050         (unroll_and_peel_loops): Remove.
15051         (unroll_loops): New.
15052         * passes.def: Replace pass_rtl_unroll_and_peel_loops
15053         by pass_rtl_unroll_loops.
15054         * loop-init.c (gate_rtl_unroll_and_peel_loops,
15055         rtl_unroll_and_peel_loops): Rename to ...
15056         (gate_rtl_unroll_loops, rtl_unroll_loops): ... these; update.
15057         (pass_rtl_unroll_and_peel_loops): Rename to ...
15058         (pass_rtl_unroll_loops): ... this one.
15059         * tree-pass.h (make_pass_rtl_unroll_and_peel_loops): Remove.
15060         (make_pass_rtl_unroll_loops): New.
15061         * tree-ssa-loop-ivcanon.c (estimated_peeled_sequence_size,
15062         try_peel_loop): New.
15063         (canonicalize_loop_induction_variables): Update.
15065 2014-10-14  Max Filippov  <jcmvbkbc@gmail.com>
15067         * config/xtensa/xtensa.h (TARGET_HARD_FLOAT_POSTINC): new macro.
15068         * config/xtensa/xtensa.md (*lsiu, *ssiu): add dependency on
15069         !TARGET_HARD_FLOAT_POSTINC.
15070         (*lsip, *ssip): new instructions.
15072 2014-10-14  Max Filippov  <jcmvbkbc@gmail.com>
15074         * config/xtensa/xtensa.md (divsf3, *recipsf2, sqrtsf2, *rsqrtsf2):
15075         remove.
15077 2014-10-14  Andrew Pinski  <apinski@cavium.com>
15079         * explow.c (convert_memory_address_addr_space): Rename to ...
15080         (convert_memory_address_addr_space_1): This.  Add in_const argument.
15081         Inside a CONST RTL, permute the conversion and addition of constant
15082         for zero and sign extended pointers.
15083         (convert_memory_address_addr_space): New function.
15085 2014-10-14  Andrew Pinski  <apinski@cavium.com>
15087         Revert:
15088         2011-08-19  H.J. Lu  <hongjiu.lu@intel.com>
15090         PR middle-end/49721
15091         * explow.c (convert_memory_address_addr_space): Also permute the
15092         conversion and addition of constant for zero-extend.
15094 2014-10-14  DJ Delorie  <dj@redhat.com>
15096         * config/msp430/msp430-modes.def (PSI): Add.
15098         * config/msp430/msp430-protos.h (msp430_hard_regno_nregs_has_padding):
15099         New.
15100         (msp430_hard_regno_nregs_with_padding): New.
15101         * config/msp430/msp430.c (msp430_scalar_mode_supported_p): New.
15102         (msp430_hard_regno_nregs_has_padding): New.
15103         (msp430_hard_regno_nregs_with_padding): New.
15104         (msp430_unwind_word_mode): Use PSImode instead of SImode.
15105         (msp430_addr_space_legitimate_address_p): New.
15106         (msp430_asm_integer): New.
15107         (msp430_init_dwarf_reg_sizes_extra): New.
15108         (msp430_print_operand): Use X suffix for PSImode even in small model.
15109         * config/msp430/msp430.h (POINTER_SIZE): Use 20 bits, not 32.
15110         (PTR_SIZE): ...but 4 bytes for EH.
15111         (SIZE_TYPE): Use __int20.
15112         (PTRDIFF_TYPE): Likewise.
15113         (INCOMING_FRAME_SP_OFFSET): Adjust.
15114         * config/msp430/msp430.md (movqi_topbyte): New.
15115         (movpsi): Use fixed suffixes.
15116         (movsipsi2): Enable for 430X, not large model.
15117         (extendhipsi2): Likewise.
15118         (zero_extendhisi2): Likewise.
15119         (zero_extendhisipsi2): Likewise.
15120         (extend_and_shift1_hipsi2): Likewise.
15121         (extendpsisi2): Likewise.
15122         (*bitbranch<mode>4_z): Fix suffix logic.
15124 2014-10-14  Eric Botcazou  <ebotcazou@adacore.com>
15126         PR ada/62019
15127         * tree-eh.c (tree_could_trap) <FUNCTION_DECL>: Revamp and really
15128         do not choke on null node.
15129         <VAR_DECL>: Likewise.
15131 2014-10-14  DJ Delorie  <dj@redhat.com>
15133         * machmode.h (int_n_data_t): New.
15134         (int_n_enabled_p): New.
15135         (int_n_data): New.
15136         * tree.c (int_n_enabled_p): New.
15137         (int_n_trees): New.
15138         (make_or_reuse_type): Check for all __intN types, not just __int128.
15139         (build_common_tree_nodes): Likewise.  Also fill in integer_typs[]
15140         entries.
15141         * tree.h (int128_integer_type_node): Remove.
15142         (int128_unsigned_type_node): Remove.
15143         (int_n_trees_t): New.
15144         (int_n_enabled_p): New.
15145         (int_n_trees): New.
15146         * toplev.c (standard_type_bitsize): New.
15147         (do_compile): Check which __intN types are enabled for the current run.
15148         * builtin-types.def (BT_INT128): Remove.
15149         (BT_UINT128): Remove.
15150         * machmode.def: Add macro to create __int128 for all targets.
15151         * stor-layout.c (mode_for_size): Support __intN types.
15152         (smallest_mode_for_size): Likewise.
15153         (initialize_sizetypes): Support __intN types.
15154         * genmodes.c (struct mode_data): Add int_n field.
15155         (blank_mode): Likewise.
15156         (INT_N): New.
15157         (make_int_n): New.
15158         (emit_insn_modes_h): Count __intN entries and define NUM_INT_N_ENTS.
15159         (emit_mode_int_n): New.
15160         (emit_insn_modes_c): Call it.
15161         * gimple.c (gimple_signed_or_unsigned_type): Check for all __intN
15162         types, not just __int128.
15163         * tree-core.h (integer_type_kind): Remove __int128-specific
15164         entries, reserve spots for __intN entries.
15166         * config/msp430/msp430-modes.def (PSI): Add.
15168 2014-10-14  Kito Cheng  <kito@0xlab.org>
15170         * ira.c: Fix typo in comment.
15171         * ira.h: Ditto.
15172         * ira-build.c: Ditto.
15173         * ira-color.c: Ditto.
15174         * ira-emit.c: Ditto.
15175         * ira-int.h: Ditto.
15176         * ira-lives.c: Ditto.
15178 2014-10-14  Uros Bizjak  <ubizjak@gmail.com>
15180         PR rtl-optimization/63475
15181         * alias.c (true_dependence_1): Always use get_addr to extract
15182         true address operands from x_addr and mem_addr.  Use extracted
15183         address operands to check for references with alignment ANDs.
15184         Use extracted address operands with find_base_term and
15185         base_alias_check. For noncanonicalized operands call canon_rtx with
15186         extracted address operand.
15187         (write_dependence_1): Ditto.
15188         (may_alias_p): Ditto.  Remove unused calls to canon_rtx.
15190 2014-10-14  Evgeny Stupachenko  <evstupac@gmail.com>
15192         PR target/63534
15193         * config/i386/i386.c (ix86_expand_split_stack_prologue): Make
15194         __morestack local.
15196 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15197             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15198             Anna Tikhonova  <anna.tikhonova@intel.com>
15199             Ilya Tocar  <ilya.tocar@intel.com>
15200             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15201             Ilya Verbin  <ilya.verbin@intel.com>
15202             Kirill Yukhin  <kirill.yukhin@intel.com>
15203             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15205         * config/i386/i386.c
15206         (ix86_expand_sse_movcc): Handle V64QI and V32HI mode.
15207         (ix86_expand_int_vcond): Ditto.
15209 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15210             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15211             Anna Tikhonova  <anna.tikhonova@intel.com>
15212             Ilya Tocar  <ilya.tocar@intel.com>
15213             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15214             Ilya Verbin  <ilya.verbin@intel.com>
15215             Kirill Yukhin  <kirill.yukhin@intel.com>
15216             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15218         * config/i386/i386.c
15219         (emit_reduc_half): Handle V64QI and V32HI mode.
15220         * config/i386/sse.md
15221         (define_mode_iterator VI_AVX512BW): New.
15222         (define_expand "reduc_<code>_<mode>"): Use VI512_48F_12BW.
15224 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15225             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15226             Anna Tikhonova  <anna.tikhonova@intel.com>
15227             Ilya Tocar  <ilya.tocar@intel.com>
15228             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15229             Ilya Verbin  <ilya.verbin@intel.com>
15230             Kirill Yukhin  <kirill.yukhin@intel.com>
15231             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15233         * config/i386/sse.md
15234         (define_mode_iterator REDUC_SMINMAX_MODE): Add V64QI and V32HI modes.
15236 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15237             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15238             Anna Tikhonova  <anna.tikhonova@intel.com>
15239             Ilya Tocar  <ilya.tocar@intel.com>
15240             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15241             Ilya Verbin  <ilya.verbin@intel.com>
15242             Kirill Yukhin  <kirill.yukhin@intel.com>
15243             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15245         * config/i386/i386.c
15246         (ix86_expand_vector_logical_operator): Handle V16SF and V8DF modes.
15247         * config/i386/sse.md
15248         (define_mode_iterator VI): Add V64QI and V32HI modes.
15250 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15251             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15252             Anna Tikhonova  <anna.tikhonova@intel.com>
15253             Ilya Tocar  <ilya.tocar@intel.com>
15254             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15255             Ilya Verbin  <ilya.verbin@intel.com>
15256             Kirill Yukhin  <kirill.yukhin@intel.com>
15257             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15259         * config/i386/sse.md (define_mode_attr avx2_avx512f): Remove.
15261 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15262             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15263             Anna Tikhonova  <anna.tikhonova@intel.com>
15264             Ilya Tocar  <ilya.tocar@intel.com>
15265             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15266             Ilya Verbin  <ilya.verbin@intel.com>
15267             Kirill Yukhin  <kirill.yukhin@intel.com>
15268             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15270         * config/i386/sse.md
15271         (define_insn "*sse4_1_<code><mode>3<mask_name>"): Add masking.
15272         (define_insn "*sse4_1_<code><mode>3<mask_name>"): Ditto.
15274 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15275             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15276             Anna Tikhonova  <anna.tikhonova@intel.com>
15277             Ilya Tocar  <ilya.tocar@intel.com>
15278             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15279             Ilya Verbin  <ilya.verbin@intel.com>
15280             Kirill Yukhin  <kirill.yukhin@intel.com>
15281             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15283         * config/i386/sse.md
15284         (define_insn "avx512bw_umulhrswv32hi3<mask_name>"): New.
15285         (define_expand "<ssse3_avx2>_pmulhrsw<mode>3_mask"): Ditto.
15287 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15288             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15289             Anna Tikhonova  <anna.tikhonova@intel.com>
15290             Ilya Tocar  <ilya.tocar@intel.com>
15291             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15292             Ilya Verbin  <ilya.verbin@intel.com>
15293             Kirill Yukhin  <kirill.yukhin@intel.com>
15294             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15296         * config/i386/sse.md
15297         (define_c_enum "unspec"): Add UNSPEC_PMADDWD512.
15298         (define_mode_iterator VI2_AVX2): Add V32HI mode.
15299         (define_expand "mul<mode>3<mask_name>"): Add masking.
15300         (define_insn "*mul<mode>3<mask_name>"): Ditto.
15301         (define_expand "<s>mul<mode>3_highpart<mask_name>"): Ditto.
15302         (define_insn "*<s>mul<mode>3_highpart<mask_name>"): Ditto.
15303         (define_insn "avx512bw_pmaddwd512<mode><mask_name>"): New.
15304         (define_mode_attr SDOT_PMADD_SUF): Ditto.
15305         (define_expand "sdot_prod<mode>"): Add <SDOT_PMADD_SUF>.
15306         (define_insn "<sse2_avx2>_packssdw<mask_name>"): Add masking.
15307         (define_insn "*<ssse3_avx2>_pmulhrsw<mode>3<mask_name>"): Ditto.
15308         (define_insn "avx2_packusdw"): Delete.
15309         (define_insn "sse4_1_packusdw"): Ditto.
15310         (define_insn "<sse4_1_avx2>_packusdw<mask_name>"): New.
15312 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15313             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15314             Anna Tikhonova  <anna.tikhonova@intel.com>
15315             Ilya Tocar  <ilya.tocar@intel.com>
15316             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15317             Ilya Verbin  <ilya.verbin@intel.com>
15318             Kirill Yukhin  <kirill.yukhin@intel.com>
15319             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15321         * config/i386/sse.md
15322         (define_insn "vec_dup<mode>"): Update constraints.
15324 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15325             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15326             Anna Tikhonova  <anna.tikhonova@intel.com>
15327             Ilya Tocar  <ilya.tocar@intel.com>
15328             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15329             Ilya Verbin  <ilya.verbin@intel.com>
15330             Kirill Yukhin  <kirill.yukhin@intel.com>
15331             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15333         * config/i386/sse.md
15334         (define_mode_iterator SSESCALARMODE): Add V4TI mode.
15335         (define_insn "<ssse3_avx2>_palignr<mode>_mask"): New.
15336         (define_insn "<ssse3_avx2>_palignr<mode>"): Add EVEX version.
15338 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15339             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15340             Anna Tikhonova  <anna.tikhonova@intel.com>
15341             Ilya Tocar  <ilya.tocar@intel.com>
15342             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15343             Ilya Verbin  <ilya.verbin@intel.com>
15344             Kirill Yukhin  <kirill.yukhin@intel.com>
15345             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15347         * config/i386/sse.md
15348         (define_expand "mul<mode>3<mask_name>"): Add masking.
15350 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15351             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15352             Anna Tikhonova  <anna.tikhonova@intel.com>
15353             Ilya Tocar  <ilya.tocar@intel.com>
15354             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15355             Ilya Verbin  <ilya.verbin@intel.com>
15356             Kirill Yukhin  <kirill.yukhin@intel.com>
15357             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15359         * config/i386/sse.md
15360         (define_insn "<sse2_avx2>_packsswb<mask_name>"): Add masking.
15361         (define_insn "<sse2_avx2>_packuswb<mask_name>"): Ditto.
15363 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15364             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15365             Anna Tikhonova  <anna.tikhonova@intel.com>
15366             Ilya Tocar  <ilya.tocar@intel.com>
15367             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15368             Ilya Verbin  <ilya.verbin@intel.com>
15369             Kirill Yukhin  <kirill.yukhin@intel.com>
15370             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15372         * config/i386/sse.md
15373         (define_c_enum "unspec"): Add UNSPEC_DBPSADBW, UNSPEC_PMADDUBSW512.
15374         (define_insn "avx512bw_pmaddubsw512<mode><mask_name>"): New.
15375         (define_insn "<mask_codefor>avx512bw_dbpsadbw<mode><mask_name>"):
15376         Ditto.
15378 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15379             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15380             Anna Tikhonova  <anna.tikhonova@intel.com>
15381             Ilya Tocar  <ilya.tocar@intel.com>
15382             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15383             Ilya Verbin  <ilya.verbin@intel.com>
15384             Kirill Yukhin  <kirill.yukhin@intel.com>
15385             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15387         * config/i386/sse.md
15388         (define_insn "<sse>_andnot<VF_128_256:mode>3<mask_name>"): Add masking,
15389         use VF_128_256 mode iterator and update assembler emit code.
15390         (define_insn "<sse>_andnot<VF_512:mode>3<mask_name>"): New.
15391         (define_expand "<any_logic:code><VF_128_256:mode>3<mask_name>"):
15392         Add masking, use VF_128_256 mode iterator.
15393         (define_expand "<any_logic:code><VF_512:mode>3<mask_name>"): New.
15394         (define_insn "*<any_logic:code><VF_128_256:mode>3<mask_name>"):
15395         Add masking, use VF_128_256 mode iterator and update assembler emit
15396         code.
15397         (define_insn "*<any_logic:code><VF_512:mode>3<mask_name>"): New.
15398         (define_mode_attr avx512flogicsuff): Delete.
15399         (define_insn "avx512f_<logic><mode>"): Ditto.
15400         (define_insn "*andnot<mode>3<mask_name>"): Update MODE_XI, MODE_OI,
15401         MODE_TI.
15402         (define_insn "<mask_codefor><code><mode>3<mask_name>"): Ditto.
15404 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15405             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15406             Anna Tikhonova  <anna.tikhonova@intel.com>
15407             Ilya Tocar  <ilya.tocar@intel.com>
15408             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15409             Ilya Verbin  <ilya.verbin@intel.com>
15410             Kirill Yukhin  <kirill.yukhin@intel.com>
15411             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15413         * config/i386/sse.md
15414         (define_mode_iterator VI128_128 [V16QI V8HI V2DI]): Delete.
15415         (define_expand "vashr<mode>3<mask_name>"): Add masking,
15416         use VI12_128 mode iterator.
15417         (define_expand "ashrv2di3<mask_name>"): New.
15419 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15420             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15421             Anna Tikhonova  <anna.tikhonova@intel.com>
15422             Ilya Tocar  <ilya.tocar@intel.com>
15423             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15424             Ilya Verbin  <ilya.verbin@intel.com>
15425             Kirill Yukhin  <kirill.yukhin@intel.com>
15426             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15428         * config/i386/i386.c
15429         (ix86_expand_args_builtin): Handle CODE_FOR_avx512vl_cmpv4di3_mask,
15430         CODE_FOR_avx512vl_cmpv8si3_mask, CODE_FOR_avx512vl_ucmpv4di3_mask,
15431         CODE_FOR_avx512vl_ucmpv8si3_mask, CODE_FOR_avx512vl_cmpv2di3_mask,
15432         CODE_FOR_avx512vl_cmpv4si3_mask, CODE_FOR_avx512vl_ucmpv2di3_mask,
15433         CODE_FOR_avx512vl_ucmpv4si3_mask.
15434         * config/i386/sse.md
15435         (define_insn "avx512f_ucmp<mode>3<mask_scalar_merge_name>"): Delete.
15436         "<avx512>_ucmp<VI12_AVX512VL:mode>3<mask_scalar_merge_name>"):New.
15437         (define_insn
15438         "<avx512>_ucmp<VI48_AVX512VL:mode>3<mask_scalar_merge_name>"):Ditto.
15439         (define_expand "<avx512>_eq<mode>3<mask_scalar_merge_name>"): Ditto.
15440         (define_insn "<avx512>_eq<mode>3<mask_scalar_merge_name>_1"): Ditto.
15441         (define_insn "<avx512>_gt<mode>3<mask_scalar_merge_name>"): Ditto.
15442         (define_insn "<avx512>_testm<mode>3<mask_scalar_merge_name>"): Ditto.
15443         (define_insn "<avx512>_testnm<mode>3<mask_scalar_merge_name>"): Ditto.
15445 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15446             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15447             Anna Tikhonova  <anna.tikhonova@intel.com>
15448             Ilya Tocar  <ilya.tocar@intel.com>
15449             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15450             Ilya Verbin  <ilya.verbin@intel.com>
15451             Kirill Yukhin  <kirill.yukhin@intel.com>
15452             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15454         * config/i386/sse.md
15455         (define_expand "vec_widen_umult_even_v8si<mask_name>"): Add masking.
15456         (define_insn "*vec_widen_umult_even_v8si<mask_name>"): Ditto.
15457         (define_expand "vec_widen_umult_even_v4si<mask_name>"): Ditto.
15458         (define_insn "*vec_widen_umult_even_v4si<mask_name>"): Ditto.
15459         (define_expand "vec_widen_smult_even_v8si<mask_name>"): Ditto.
15460         (define_insn "*vec_widen_smult_even_v8si<mask_name>"): Ditto.
15461         (define_expand "sse4_1_mulv2siv2di3<mask_name>"): Ditto.
15462         (define_insn "*sse4_1_mulv2siv2di3<mask_name>"): Ditto.
15463         (define_insn "avx512dq_mul<mode>3<mask_name>"): New.
15465 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15466             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15467             Anna Tikhonova  <anna.tikhonova@intel.com>
15468             Ilya Tocar  <ilya.tocar@intel.com>
15469             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15470             Ilya Verbin  <ilya.verbin@intel.com>
15471             Kirill Yukhin  <kirill.yukhin@intel.com>
15472             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15474         * config/i386/sse.md
15475         (define_insn "avx512f_blendm<mode>"): Delete.
15476         (define_insn "<avx512>_blendm<VI48_AVX512VL:mode>"): New.
15477         (define_insn "<avx512>_blendm<VI12_AVX512VL:mode>"): Ditto..
15478         (define_mode_attr cmp_imm_predicate): Add V8SF, V4DF, V8SI, V4DI, V4SF,
15479         V2DF, V4SI, V2DI, V32HI, V64QI, V16HI, V32QI, V8HI, V16QI modes.
15480         (define_insn
15481         "avx512f_cmp<mode>3<mask_scalar_merge_name><round_saeonly_name>"):
15482         Remove.
15483         (define_insn
15484         "<avx512>_cmp<VI48_AVX512VL:mode>3<mask_scalar_merge_name><round_saeonly_name>"):
15485         New.
15486         (define_insn
15487         "<avx512>_cmp<VI12_AVX512VL:mode>3<mask_scalar_merge_name><round_saeonly_name>"):
15488         Ditto.
15489         (define_insn "<mask_codefor>avx512f_vec_dup<mode><mask_name>"): Delete.
15490         (define_insn "<avx512>_vec_dup<V48_AVX512VL:mode><mask_name>"): New.
15491         (define_insn "<avx512>_vec_dup<V12_AVX512VL:mode><mask_name>"): Ditto.
15492         (define_insn "<mask_codefor>avx512f_vec_dup_gpr<mode><mask_name>"):
15493         Delete.
15494         (define_insn
15495         "<mask_codefor><avx512>_vec_dup_gpr<VI48_AVX512VL:mode><mask_name>"):
15496         New.
15497         (define_insn
15498         "<mask_codefor><avx512>_vec_dup_gpr<VI12_AVX512VL:mode><mask_name>"):
15499         Ditto.
15500         (define_insn·"<mask_codefor>avx512f_vec_dup_mem<mode><mask_name>"):
15501         Delete.
15502         (define_insn
15503         "<mask_codefor><avx512>_vec_dup_mem<VI48_AVX512VL:mode><mask_name>"):
15504         New.
15505         (define_insn
15506         "<mask_codefor><avx512>_vec_dup_mem<VI12_AVX512VL:mode><mask_name>"):
15507         Ditto.
15509 2014-10-14  Richard Biener  <rguenther@suse.de>
15511         PR tree-optimization/63512
15512         * tree-ssa-pre.c (create_expression_by_pieces): Mark stmts
15513         modified.
15515 2014-10-14  Oleg Endo  <olegendo@gcc.gnu.org>
15517         PR target/63260
15518         * config/sh/sh.md (negsf2, negsf2_i, negdf2, negdf2_i, abssf2,
15519         abssf2_i, absdf2, absdf2_i): Remove fp_mode attribute.  Remove use
15520         of FPSCR.
15521         (negsf2_i): Rename to *negsf2_i.
15522         (abssf2_i): Rename to *abssf2_i.
15523         (negdf2_i): Rename to *negdf2_i.
15524         (absdf2_i): Rename to *absdf2_i.
15526 2014-10-14  Felix Yang  <felix.yang@huawei.com>
15527             Jeff Law  <law@redhat.com>
15529         * ira.c (struct equivalence): Change member "is_arg_equivalence" and
15530         "replace" into boolean bitfields; turn member "loop_depth" into a short
15531         integer; add new member "no_equiv" and "reserved".
15532         (no_equiv): Set no_equiv of struct equivalence if register is marked
15533         as having no known equivalence.
15534         (update_equiv_regs): Check all definitions for a multiple-set
15535         register to make sure that the RHS have the same value.
15537 2014-10-13  Richard Henderson  <rth@redhat.com>
15539         * combine-stack-adj.c (no_unhandled_cfa): New.
15540         (maybe_merge_cfa_adjust): New.
15541         (combine_stack_adjustments_for_block): Use them.
15543 2014-10-13  Aldy Hernandez  <aldyh@redhat.com>
15545         * Makefile.in (TAGS): Tag ../include files.
15547 2014-10-13  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
15549         * config/rs6000/rs6000.h (DBX_REGISTER_NUMBER): Pass format argument
15550         to rs6000_dbx_register_number.
15551         (DWARF_FRAME_REGNUM): Redefine as identity map.
15552         (DWARF2_FRAME_REG_OUT): Call rs6000_dbx_register_number.
15553         * config/rs6000/rs6000-protos.h (rs6000_dbx_register_number): Update.
15554         * config/rs6000/rs6000.c (rs6000_dbx_register_number): Add format
15555         argument to handle .debug_frame and .eh_frame directly.  Always
15556         translate SPE high register numbers.  Add special treatment for CR,
15557         but only in .debug_frame.  Respect RS6000_USE_DWARF_NUMBERING.
15559         * config/rs6000/sysv.h (DBX_REGISTER_NUMBER): Do not undefine.
15560         * config/rs6000/freebsd.h (DBX_REGISTER_NUMBER): Remove.
15561         (RS6000_USE_DWARF_NUMBERING): Define.
15562         * config/rs6000/freebsd64.h (DBX_REGISTER_NUMBER): Remove.
15563         (RS6000_USE_DWARF_NUMBERING): Define.
15564         * config/rs6000/netbsd.h (DBX_REGISTER_NUMBER): Remove.
15565         (RS6000_USE_DWARF_NUMBERING): Define.
15566         * config/rs6000/lynx.h (DBX_REGISTER_NUMBER): Remove.
15567         (RS6000_USE_DWARF_NUMBERING): Define.
15568         * config/rs6000/aix.h (RS6000_USE_DWARF_NUMBERING): Define.
15569         * config/rs6000/darwin.h (RS6000_USE_DWARF_NUMBERING): Define.
15571 2014-10-13  Evgeny Stupachenko  <evstupac@gmail.com>
15573         * config/i386/i386.c (ix86_address_cost): Lower cost for
15574         when address contains GOT register.
15576 2014-10-13  Ilya Enkovich  <ilya.enkovich@intel.com>
15577             Vladimir Makarov  <vmakarov@redhat.com>
15579         PR target/8340
15580         PR middle-end/47602
15581         PR rtl-optimization/55458
15582         * config/i386/i386.c (ix86_use_pseudo_pic_reg): New.
15583         (ix86_init_pic_reg): New.
15584         (ix86_select_alt_pic_regnum): Add check on pseudo register.
15585         (ix86_save_reg): Likewise.
15586         (ix86_expand_prologue): Remove PIC register initialization
15587         now performed in ix86_init_pic_reg.
15588         (ix86_output_function_epilogue): Add check on pseudo register.
15589         (set_pic_reg_ever_alive): New.
15590         (legitimize_pic_address): Replace df_set_regs_ever_live with new
15591         set_pic_reg_ever_alive.
15592         (legitimize_tls_address): Likewise.
15593         (ix86_pic_register_p): New check.
15594         (ix86_delegitimize_address): Add check on pseudo register.
15595         (ix86_expand_call): Insert move from pseudo PIC register to ABI
15596         defined REAL_PIC_OFFSET_TABLE_REGNUM.
15597         (TARGET_INIT_PIC_REG): New.
15598         (TARGET_USE_PSEUDO_PIC_REG): New.
15599         * config/i386/i386.h (PIC_OFFSET_TABLE_REGNUM): Return INVALID_REGNUM
15600         if pic_offset_table_rtx exists.
15601         * doc/tm.texi.in (TARGET_USE_PSEUDO_PIC_REG, TARGET_INIT_PIC_REG):
15602         Document.
15603         * doc/tm.texi: Regenerate.
15604         * function.c (assign_parms): Generate pseudo register for PIC.
15605         * init-regs.c (initialize_uninitialized_regs): Ignor pseudo PIC
15606         register.
15607         * ira-color.c (color_pass): Add check on pseudo register.
15608         * ira-emit.c (change_loop): Don't create copies for PIC pseudo
15609         register.
15610         * ira.c (split_live_ranges_for_shrink_wrap): Add check on pseudo
15611         register.
15612         (ira): Add target specific PIC register initialization.
15613         (do_reload): Keep PIC pseudo register.
15614         * lra-assigns.c (spill_for): Add checks on pseudo register.
15615         * lra-constraints.c (contains_symbol_ref_p): New.
15616         (lra_constraints): Enable lra risky transformations when PIC is pseudo
15617         register.
15618         * shrink-wrap.c (try_shrink_wrapping): Add check on pseudo register.
15619         * target.def (use_pseudo_pic_reg): New.
15620         (init_pic_reg): New.
15622 2014-10-13  Evgeny Stupachenko  <evstupac@gmail.com>
15624         * config/i386/x86-tune.def (X86_TUNE_SSE_PARTIAL_REG_DEPENDENCY):
15625         Remove m_SILVERMONT and m_INTEL from the tune.
15627 2014-10-13  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
15629         PR libfortran/63471
15630         * config/pa/pa-hpux11.h (TARGET_OS_CPP_BUILTINS): Define _REENTRANT
15631         when _HPUX_SOURCE is defined.
15633 2014-10-13  Jan Hubicka  <hubicka@ucw.cz>
15635         PR tree-optimization/62127
15636         * tree.c (remap_type_1): When remapping array, remap
15637         also its type.
15639 2014-10-13  Christophe Lyon  <christophe.lyon@linaro.org>
15641         * Makefile.in: (check-%): Update comment, as RUNTESTFLAGS no
15642         longer impact parallelization.
15644 2014-10-13  Jan Hubicka  <hubicka@ucw.cz>
15646         PR bootstrap/63496
15647         * ipa-polymorphic-call.c (extr_type_from_vtbl_ptr_store): Fix pasto.
15649 2014-10-13  Marat Zakirov  <m.zakirov@samsung.com>
15651         * asan.c (instrument_derefs): BIT_FIELD_REF added.
15653 2014-10-13  Richard Biener  <rguenther@suse.de>
15655         PR tree-optimization/63419
15656         * gimple-fold.h (gimple_convert): New function.
15657         * gimple-fold.c (gimple_convert): Likewise.
15658         * tree-ssa-pre.c (create_expression_by_pieces): Use gimple_convert
15659         to split out required conversions early.
15661 2014-10-13  Richard Sandiford  <richard.sandiford@arm.com>
15663         * rtlanal.c (generic_subrtx_iterator <T>::add_subrtxes_to_queue):
15664         Add the parts of an insn in reverse order, with the pattern at
15665         the top of the queue.  Detect when we're iterating over a SEQUENCE
15666         pattern and in that case just consider patterns of subinstructions.
15668 2014-10-12  Oleg Endo  <olegendo@gcc.gnu.org>
15670         PR target/59401
15671         * config/sh/sh-protos (sh_find_equiv_gbr_addr): Use rtx_insn* instead
15672         of rtx.
15673         * config/sh/sh.c (sh_find_equiv_gbr_addr): Use def chains instead of
15674         insn walking.
15675         (sh_find_equiv_gbr_addr): Do nothing if input mem is already a GBR
15676         address.  Use def chains to handle GBR clobbering call insns.
15678 2014-10-12  Trevor Saunders  <tsaunders@mozilla.com>
15680         * asan.c, cfgloop.c, cfgloop.h, cgraph.c, cgraph.h,
15681         config/darwin.c, config/m32c/m32c.c, config/mep/mep.c,
15682         config/mips/mips.c, config/rs6000/rs6000.c, dwarf2out.c,
15683         function.c, function.h, gimple-ssa.h, libfuncs.h, optabs.c,
15684         output.h, rtl.h, sese.c, symtab.c, tree-cfg.c, tree-dfa.c,
15685         tree-ssa.c, varasm.c: Use hash-table instead of hashtab.
15686         * doc/gty.texi (for_user): Document new option.
15687         * gengtype.c (create_user_defined_type): Don't try to get a struct for
15688         char.
15689         (walk_type): Don't error out on for_user option.
15690         (write_func_for_structure): Emit user marking routines if requested by
15691         for_user option.
15692         (write_local_func_for_structure): Likewise.
15693         (main): Mark types with for_user option as used.
15694         * ggc.h (gt_pch_nx): Add overload for unsigned int.
15695         * hash-map.h (hash_map::hash_entry::pch_nx_helper): AddOverloads.
15696         * hash-table.h (ggc_hasher): New struct.
15697         (hash_table::create_ggc): New function.
15698         (gt_pch_nx): New overload for hash_table.
15700 2014-10-11  Oleg Endo  <olegendo@gcc.gnu.org>
15702         * config/sh/sh.h (TARGET_SH4A_ARCH): Remove macro.
15703         * config/sh/sh.h: Replace uses of TARGET_SH4A_ARCH with TARGET_SH4A.
15704         * config/sh/sh.c: Likewise.
15705         * config/sh/sh-mem.cc: Likewise.
15706         * config/sh/sh.md: Likewise.
15707         * config/sh/predicates.md: Likewise.
15708         * config/sh/sync.md: Likewise.
15710 2014-10-11  Martin Liska  <mliska@suse.cz>
15712         PR middle-end/63376
15713         * cgraphunit.c (symbol_table::process_new_functions): Missing call
15714         for call_cgraph_insertion_hooks added.
15716 2014-10-10  Jakub Jelinek  <jakub@redhat.com>
15718         PR c/63495
15719         * stor-layout.c (min_align_of_type): Don't decrease alignment
15720         through BIGGEST_FIELD_ALIGNMENT or ADJUST_FIELD_ALIGN if
15721         TYPE_USER_ALIGN is set.
15723 2014-10-10  Uros Bizjak  <ubizjak@gmail.com>
15725         PR rtl-optimization/63483
15726         * alias.c (true_dependence_1): Do not exit early for MEM_READONLY_P
15727         references when alignment ANDs are involved.
15728         (write_dependence_p): Ditto.
15729         (may_alias_p): Ditto.
15731 2014-10-10  Marek Polacek  <polacek@redhat.com>
15733         * asan.c (pass_sanopt::execute): Handle IFN_UBSAN_OBJECT_SIZE.
15734         * doc/invoke.texi: Document -fsanitize=object-size.
15735         * flag-types.h (enum sanitize_code): Add SANITIZE_OBJECT_SIZE and
15736         or it into SANITIZE_UNDEFINED.
15737         * gimple-fold.c (gimple_fold_call): Optimize IFN_UBSAN_OBJECT_SIZE.
15738         * internal-fn.c (expand_UBSAN_OBJECT_SIZE): New function.
15739         * internal-fn.def (UBSAN_OBJECT_SIZE): Define.
15740         * opts.c (common_handle_option): Handle -fsanitize=object-size.
15741         * ubsan.c: Include tree-object-size.h.
15742         (ubsan_type_descriptor): Call tree_to_uhwi instead of tree_to_shwi.
15743         (ubsan_expand_bounds_ifn): Use false instead of 0.
15744         (ubsan_expand_objsize_ifn): New function.
15745         (instrument_object_size): New function.
15746         (pass_ubsan::execute): Add object size instrumentation.
15747         * ubsan.h (ubsan_expand_objsize_ifn): Declare.
15749 2014-10-10  Richard Henderson  <rth@redhat.com>
15751         PR target/63404
15752         * shrink-wrap.c (move_insn_for_shrink_wrap): Don't use single_set.
15753         Restrict the set of expressions we're willing to move.
15755 2014-10-10  Jeff Law  <law@redhat.com>
15757         * ira.c (struct equivalence): Promote INIT_INSNs field to
15758         an rtx_insn_list.  Add comments.
15759         (no_equiv): Promote LIST to an rtx_insn_list.  Update
15760         testing for and creating the special marker.  Use methods
15761         to extract the insn and next pointers.  Promote INSN to an
15762         rtx_insn.
15763         (update_equiv_regs): Update test for special marker in the
15764         INIT_INSNs list.
15766 2014-10-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
15768         * configure.ac: Add --enable-fix-cortex-a53-835769 option.
15769         * configure: Regenerate.
15770         * config/aarch64/aarch64.c (aarch64_override_options): Handle
15771         TARGET_FIX_ERR_A53_835769_DEFAULT.
15772         * config/aarch64/aarch64.opt (mfix-cortex-a53-835769): Set Init
15773         value to 2.
15774         * doc/install.texi (aarch64*-*-*): Document
15775         new --enable-fix-cortex-a53-835769 option.
15777 2014-10-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
15778             Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
15780         * config/aarch64/aarch64.h (FINAL_PRESCAN_INSN): Define.
15781         (ADJUST_INSN_LENGTH): Define.
15782         * config/aarch64/aarch64.opt (mfix-cortex-a53-835769): New option.
15783         * config/aarch64/aarch64.c (is_mem_p): New function.
15784         (is_memory_op): Likewise.
15785         (aarch64_prev_real_insn): Likewise.
15786         (is_madd_op): Likewise.
15787         (dep_between_memop_and_curr): Likewise.
15788         (aarch64_madd_needs_nop): Likewise.
15789         (aarch64_final_prescan_insn): Likewise.
15790         * doc/invoke.texi (AArch64 Options): Document -mfix-cortex-a53-835769
15791         and -mno-fix-cortex-a53-835769 options.
15793 2014-10-10  Jakub Jelinek  <jakub@redhat.com>
15795         PR tree-optimization/63464
15796         * tree-switch-conversion.c (struct case_bit_test): Remove
15797         hi and lo fields, add wide_int mask field.
15798         (emit_case_bit_tests): Add MAXVAL argument, rewrite uses of
15799         hi/lo fields into wide_int mask operations, optimize by pretending
15800         minval to be 0 if maxval is small enough.
15801         (process_switch): Adjust caller.
15803 2014-10-10  Richard Biener  <rguenther@suse.de>
15805         PR tree-optimization/63379
15806         * tree-vect-slp.c (vect_get_constant_vectors): Do not compute
15807         a neutral operand for min/max when it is not a reduction chain.
15809 2014-10-10  Richard Biener  <rguenther@suse.de>
15811         PR tree-optimization/63476
15812         * tree-ssa-pre.c (struct bb_bitmap_sets): Add vop_on_exit member.
15813         (BB_LIVE_VOP_ON_EXIT): New define.
15814         (create_expression_by_pieces): Assign VUSEs to stmts.
15815         (compute_avail): Track BB_LIVE_VOP_ON_EXIT.
15816         (pass_pre::execute): Assert virtual SSA form is up-to-date
15817         after insertion.
15819 2014-10-10  Eric Botcazou  <ebotcazou@adacore.com>
15821         * lra-assigns.c (assign_by_spills): Error out on spill failure.
15823 2014-10-09  Markus Trippelsdorf  <markus@trippelsdorf.de>
15825         * pa-polymorphic-call.c (check_stmt_for_type_change): Move
15826         assertion.
15828 2014-10-09  Richard Biener  <rguenther@suse.de>
15830         PR tree-optimization/63380
15831         * tree-ssa-tail-merge.c (stmt_local_def): Exclude stmts that
15832         may trap.
15834 2014-10-09  Joern Rennecke  <joern.rennecke@embecosm.com>
15836         * config/avr/avr.opt (mmcu=): Change to have a string value.
15837         (mn-flash=, mskip-bug, march=, mrmw): New options.
15838         (HeaderInclude): New.
15839         (mmcu=): Remove Var / Init clauses.
15840         * config/avr/avr.h (DRIVER_SELF_SPECS): Translate -mmcu into a
15841         -specs option.
15842         (SYMBOL_FLAG_IO, SYMBOL_FLAG_ADDRESS): Define.
15843         (ASM_OUTPUT_ALIGNED_BSS): Use avr_asm_asm_output_aligned_bss.
15844         (SYMBOL_FLAG_IO_LOW): Define.
15845         (avr_device_to_as, avr_device_to_ld): Don't declare.
15846         (avr_device_to_data_start, avr_device_to_startfiles): Likewise.
15847         (avr_device_to_devicelib, avr_device_to_sp8): Likewise.
15848         (EXTRA_SPEC_FUNCTIONS): Don't define.
15849         (ASM_SPEC): Translate -arch= option to -mmcu= option.
15850         (LINK_SPEC): Translate -arch= option to -m= option.
15851         Don't use device_to_ld / device_to_data_start.
15852         (STARTFILE_SPEC): Now empty.
15853         (ASM_SPEC): Add -%{mrelax: --mlink-relax}.
15854         * config/avr/gen-avr-mmcu-specs.c: New file.
15855         * config/avr/t-avr (gen-avr-mmcu-specs$(build_exeext)): New rule.
15856         (s-device-specs): Likewise.
15857         (GCC_PASSES): Add s-device-specs.
15858         (install-driver): Depend on install-device-specs.
15859         (install-device-specs): New rule.
15860         * config/avr/avr.c (avr_option_override): Look up mcu arch by
15861         avr_arch_index and provide fallback initialization for avr_n_flash.
15862         (varasm.h): #include.
15863         (avr_print_operand) <i>: Allow SYMBOL_REF with SYMBOL_FLAG_IO;
15864         (avr_handle_addr_attribute, avr_eval_addr_attrib): New functions.
15865         (avr_attribute_table): Add "io", "address" and "io_low".
15866         (avr_asm_output_aligned_decl_common): Change type of decl to tree.
15867         Add special handling for symbols with "io" and/or "address" attributes.
15868         (avr_asm_asm_output_aligned_bss): New function.
15869         (avr_encode_section_info): Set SYMBOL_FLAG_IO and SYMBOL_FLAG_ADDRESS
15870         as appropriate.  Handle io_low attribute.
15871         (avr_out_sbxx_branch): Handle symbolic io addresses.
15872         (avr_xload_libgcc_p, avr_nonconst_pointer_addrspace): Use
15873         avr_n_flash instead of avr_current_device->n_flash.
15874         (avr_pgm_check_var_decl, avr_insert_attributes): Likewise.
15875         (avr_emit_movmemhi): Likewise.
15876         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Likewise.
15877         Use TARGET_RMW instead of avr_current_device->dev_attributes.
15878         Don't define avr_current_device->macro (that's the specfile's job).
15879         Use TARGET_SKIP_BUG instead of avr_current_device->errata_skip.
15880         * config/avr/avr.c (avr_2word_insn_p): Likewise.
15881         * config/avr/avr.md (*cpse.ne): Likewise.
15882         (mov<mode>): Use avr_eval_addr_attrib.
15883         (cbi): Change constraint for low_io_address_operand operand to "i".
15884         (sbi, sbix_branch, sbix_branch_bit7, insv.io, insv.not.io): Likewise.
15885         * config/avr/predicates.md (io_address_operand):
15886         Allow SYMBOL_REF with SYMBOL_FLAG_IO.
15887         (low_io_address_operand): Allow SYMBOL_REF with SYMBOL_FLAG_IO_LOW.
15888         * config/avr/avr-protos.h (avr_asm_output_aligned_decl_common):
15889         Update prototype.
15890         (avr_eval_addr_attrib, avr_asm_asm_output_aligned_bss): Prototype.
15891         * config/avr/genmultilib.awk: Use -march=.
15892         Remove Multilib matches processing.
15893         * config/avr/t-multilib, config/avr/avr-tables.opt: Regenerate.
15894         * config/avr/avr-arch.h: Add double include guard.
15895         (avr_mcu_t) <library_name>: Update comment.
15896         * config/avr/driver-avr.c (avr_device_to_as): Delete.
15897         (avr_device_to_ld, avr_device_to_data_start): Likewise.
15898         (avr_device_to_startfiles, avr_device_to_devicelib): Likewise.
15899         (avr_device_to_sp8): Likewise.
15900         * config/avr/genopt.sh:  Instead avr_mcu, emit an Enum for avr_arch.
15902         * doc/extend.texi (io, address): Document new AVR variable attributes.
15903         (io_low): Likewise.
15905 2014-10-09  Marek Polacek  <polacek@redhat.com>
15907         * doc/invoke.texi: Document -fsanitize=bool and -fsanitize=enum.
15909 2014-10-08  Richard Biener  <rguenther@suse.de>
15911         PR tree-optimization/61969
15912         * tree-nrv.c (pass_nrv::execute): Properly test for automatic
15913         variables.
15915 2014-10-09  Richard Biener  <rguenther@suse.de>
15917         PR tree-optimization/63445
15918         * tree-vrp.c (simplify_cond_using_ranges): Only warn about
15919         overflow for non-equality compares.
15921 2014-10-09  Uros Bizjak  <ubizjak@gmail.com>
15923         PR rtl-optimization/57003
15924         * regcprop.c (copyprop_hardreg_forward_1): If ksvd.ignore_set_reg,
15925         also check CALL_INSN_FUNCTION_USAGE for clobbers again after
15926         killing regs_invalidated_by_call.
15928 2014-10-08  Teresa Johnson  <tejohnson@google.com>
15930         PR bootstrap/63432.
15931         * tree-ssa-threadupdate.c (estimated_freqs_path): New function.
15932         (ssa_fix_duplicate_block_edges): Invoke it.
15933         (mark_threaded_blocks): Make two passes to avoid ordering dependences.
15935 2014-10-08  Oleg Endo  <olegendo@gcc.gnu.org>
15937         PR target/52941
15938         * config/sh/sync.md (atomic_exchangesi_hard, atomic_exchange<mode>_hard,
15939         atomic_fetch_<fetchop_name>si_hard,
15940         atomic_fetch_<fetchop_name><mode>_hard, atomic_fetch_nandsi_hard,
15941         atomic_fetch_nand<mode>_hard, atomic_<fetchop_name>_fetchsi_hard,
15942         atomic_<fetchop_name>_fetch<mode>_hard, atomic_nand_fetchsi_hard,
15943         atomic_nand_fetch<mode>_hard): Add missing set of T_REG.
15945 2014-10-08  Rong Xu  <xur@google.com>
15947         * gcov-tool.c (profile_overlap): New driver function
15948         to compute profile overlap.
15949         (print_overlap_usage_message): New.
15950         (overlap_usage): New.
15951         (do_overlap): New.
15952         (print_usage): Add calls to overlap function.
15953         (main): Ditto.
15954         * doc/gcov-tool.texi: Add documentation.
15956 2014-10-08  Steve Ellcey  <sellcey@mips.com>
15958         * config/mips/mti-linux.h (DRIVER_SELF_SPECS): Change
15959         LINUX64_DRIVER_SELF_SPECS to LINUX_DRIVER_SELF_SPECS
15961 2014-10-08  Jan Hubicka  <hubicka@ucw.cz>
15963         * ipa-polymorphic-call.c (extr_type_from_vtbl_store): Do better
15964         pattern matching of MEM_REF.
15965         (check_stmt_for_type_change): Update.
15967 2014-10-08  Steve Ellcey  <sellcey@mips.com>
15969         * config/mips/linux64.h: Remove.
15970         * config/mips/gnu-user64.h: Remove.
15971         * gcc.config (mips*-*-*): Remove references to linux64.h and
15972         gnu-user64.h
15973         * config/mips/gnu-user.h (GNU_USER_TARGET_LINK_SPEC): Replace
15974         with modified version from gnu-user64.h.
15975         (LINUX_DRIVER_SELF_SPECS): Update parts from gnu-user64.h.
15976         (LOCAL_LABEL_PREFIX): Copy from gnu-user64.h.
15977         * config/mips/linux.h (GNU_USER_LINK_EMULATION32): Copy from
15978         linux64.h.
15979         (GNU_USER_LINK_EMULATION64): Ditto.
15980         (GNU_USER_LINK_EMULATIONN32): Ditto.
15981         (GLIBC_DYNAMIC_LINKER32): Ditto.
15982         (GLIBC_DYNAMIC_LINKER64): Ditto.
15983         (GLIBC_DYNAMIC_LINKERN32): Ditto.
15984         (UCLIBC_DYNAMIC_LINKER32): Ditto.
15985         (UCLIBC_DYNAMIC_LINKER64): Ditto.
15986         (UCLIBC_DYNAMIC_LINKERN32): Ditto.
15987         (BIONIC_DYNAMIC_LINKERN32): Ditto.
15988         (GNU_USER_DYNAMIC_LINKERN32): Ditto.
15989         (GLIBC_DYNAMIC_LINKER): Delete.
15990         (UCLIBC_DYNAMIC_LINKER): Delete.
15992 2014-10-08  Joern Rennecke  <joern.rennecke@embecosm.com>
15993             Richard Biener  <rguenther@suse.de>
15995         * cfgexpand.c (expand_debug_expr) <TARGET_MEM_REF>:
15996         Get address space from operand 0 (BASE).
15998 2014-10-07  Iain Sandoe  <iain@codesourcery.com>
16000         PR target/61387
16001         * config/i386/i386.c (x86_output_mi_thunk): Fix darwin fallout.
16003 2014-10-07  Aldy Hernandez  <aldyh@redhat.com>
16005         * dwarf2out.c: Remove current_function_has_inlines.
16006         (gen_subprogram_die): Same.
16007         (gen_inlined_subroutine_die): Same.
16009 2014-10-07  Ilya Tocar  <ilya.tocar@intel.com>
16011         * config/i386/adxintrin.h (_subborrow_u64): Use long long for param
16012         type.
16013         (_addcarry_u64): Ditto.
16014         (_addcarryx_u64): Ditto.
16016 2014-10-07  Eric Botcazou  <ebotcazou@adacore.com>
16018         * cgraph.h (cgraph_node::get_fun): Declare.
16019         * cgraph.c (cgraph_node::get_fun): New method.
16020         * ipa-inline.c (can_inline_edge_p): Use it.
16022 2014-10-07  Eric Botcazou  <ebotcazou@adacore.com>
16024         * lto-opts.c (lto_write_options): Handle -fmath-errno, -fsigned-zeros
16025         and -ftrapping-math.
16026         * lto-wrapper.c (merge_and_complain): Likewise.
16027         (run_gcc): Likewise.
16029 2014-10-06  Rong Xu  <xur@google.com>
16031         * params.def (PARAM_INDIR_CALL_TOPN_PROFILE): New param.
16032         * tree-profile.c: (params.h): New include.
16033         (init_ic_make_global_vars): Make __gcov_indirect_call_topn_callee
16034         and __gcov_indirect_call_topn_counters for
16035         indirect_call_topn_profile.
16036         (gimple_init_edge_profiler): New decls for
16037         __gcov_indirect_call_topn_profiler.
16038         (gimple_gen_ic_profiler): Generate the correct profiler call.
16039         (gimple_gen_ic_func_profiler): Fix format.
16040         * value-prof.c (params.h): New include.
16041         (dump_histogram_value): Hanlde indirect_call_topn counters.
16042         (stream_in_histogram_value): Ditto.
16043         (gimple_indirect_call_to_profile): Use indirect_call_topn
16044         profile when PARAM_INDIR_CALL_TOPN_PROFILE is set.
16045         (gimple_find_values_to_profile): Hanlde indirect_call_topn
16046         counters.
16047         * value-prof.h (enum hist_type): Histrogram type for
16048         indirect_call_topn counters.
16049         * profile.c (instrument_values): Instrument
16050         indirect_call_topn counters.
16052 2014-10-06  Rong Xu  <xur@google.com>
16054         * Makefile.in: Fix dependence.
16055         * gcov-counter.def (GCOV_COUNTER_ICALL_TOPNV): Add
16056         indirect call topn profiler.
16057         * gcov-io.h: Ditto.
16059 2014-10-06  Eric Botcazou  <ebotcazou@adacore.com>
16061         * calls.c (expand_call): Do not use the target as the return slot if
16062         it is not sufficiently aligned.
16064 2014-10-06  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16066         * config/rs6000/rs6000.c (analyze_swaps commentary): Add
16067         discussion of permutes and why we don't handle them.
16069 2014-10-06  Eric Botcazou  <ebotcazou@adacore.com>
16071         * config/sparc/predicates.md (int_register_operand): Delete.
16073 2014-10-06  Eric Botcazou  <ebotcazou@adacore.com>
16075         * dwarf2cfi.c (create_pseudo_cfg): Fix trace numbering.
16077 2014-10-06  Jakub Jelinek  <jakub@redhat.com>
16079         * ubsan.h (ubsan_get_source_location): New prototype.
16080         * ubsan.c (ubsan_source_location_type): New variable.
16081         Function renamed to ...
16082         (ubsan_get_source_location_type): ... this.  Cache
16083         return value in ubsan_source_location_type variable.
16084         (ubsan_source_location, ubsan_create_data): Use
16085         ubsan_get_source_location_type instead of
16086         ubsan_source_location_type.
16087         * asan.c (asan_protect_global): Don't protect globals
16088         with ubsan_get_source_location_type () type.
16089         (asan_add_global): Provide global decl location info
16090         if possible.
16092 2014-10-04  Jan Hubicka  <hubicka@ucw.cz>
16094         * ipa-prop.c (try_make_edge_direct_virtual_call): Remove overactive
16095         sanity check.
16097 2014-10-04  Jan Hubicka  <hubicka@ucw.cz>
16099         * ipa-polymorphic-call.c (possible_placement_new): Fix condition
16100         on size.
16101         (ipa_polymorphic_call_context::restrict_to_inner_type): Do not walk
16102         into vptr pointer.
16103         (ipa_polymorphic_call_context::dump): Fix formating.
16104         (walk_ssa_copies): Add logic avoiding loops; update uses.
16105         * ipa-prop.c (ipa_analyze_call_uses): Compute vptr_changed.
16107 2014-10-02  Mark Wielaard  <mjw@redhat.com>
16109         PR debug/63239
16110         * dwarf2out.c (gen_subprogram_die): When a member function is
16111         explicitly deleted then add a DW_AT_GNU_deleted attribute.
16112         * langhooks.h (struct lang_hooks_for_decls): Add
16113         function_decl_deleted_p langhook.
16114         * langhooks-def.h (LANG_HOOKS_FUNCTION_DECL_DELETED_P): Define.
16115         (LANG_HOOKS_DECLS): Add LANG_HOOKS_FUNCTION_DECL_DELETED_P.
16117 2014-10-04  Jan Hubicka  <hubicka@ucw.cz>
16119         * ipa-polymorphic-call.c (walk_ssa_copies): Recognize
16120         NULL pointer checks.
16121         (ipa_polymorphic_call_context::get_dynamic_type): Return true
16122         if type doesn't change.
16123         * cgraph.h (cgraph_indirect_call_info): New flag.
16124         * cgraph.c (cgraph_node::create_indirect_edge): Initialize it.
16125         (cgraph_node::dump): Dump it.
16126         * ipa-prop.c (ipa_analyze_call_uses):  Ignore return valud
16127         of context.get_dynamic_type.
16128         (ipa_make_edge_direct_to_target): Do not speculate
16129         edge that is already speuclative.
16130         (try_make_edge_direct_virtual_call): Use VPTR_CHANGED; Do not
16131         speculate to __builtin_unreachable
16132         (ipa_write_indirect_edge_info, ipa_read_indirect_edge_info): Stream
16133         vptr_changed.
16134         * ipa-cp.c (ipa_get_indirect_edge_target_1): Use vptr_changed.
16136 2014-10-04  Jan Hubicka  <hubicka@ucw.cz>
16138         * ipa-prop.c (ipa_compute_jump_functions_for_edge): Call
16139         get_dynamic_type; drop TODO.
16140         * ipa-polymorphic-call.c
16141         (ipa_polymorphic_call_context::get_dynamic_type): Be ready
16142         for otr_type to be unknown.
16144 2014-10-04  Trevor Saunders  <tsaunders@mozilla.com>
16146         * common/config/score/score-common.c: Remove.
16147         * config.gcc: Remove support for score-*.
16148         * config/score/constraints.md: Remove.
16149         * config/score/elf.h: Remove.
16150         * config/score/predicates.md: Remove.
16151         * config/score/score-conv.h: Remove.
16152         * config/score/score-generic.md: Remove.
16153         * config/score/score-modes.def: Remove.
16154         * config/score/score-protos.h: Remove.
16155         * config/score/score.c: Remove.
16156         * config/score/score.h: Remove.
16157         * config/score/score.md: Remove.
16158         * config/score/score.opt: Remove.
16159         * doc/md.texi: Don't document score-*.
16161 2014-10-04  Trevor Saunders  <tsaunders@mozilla.com>
16163         PR pch/63429
16164         * genconditions.c: Directly include ggc.h before rtl.h.
16166 2014-10-03  Jan Hubicka  <hubicka@ucw.cz>
16168         * ipa-polymorphic-call.c
16169         (ipa_polymorphic_call_context::ipa_polymorphic_call_context): Fix
16170         code determining speculative type.
16171         (ipa_polymorphic_call_context::combine_with): Fix speculation merge.
16173 2014-10-03  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16175         * altivec.md (altivec_lvsl): New define_expand.
16176         (altivec_lvsl_direct): Rename define_insn from altivec_lvsl.
16177         (altivec_lvsr): New define_expand.
16178         (altivec_lvsr_direct): Rename define_insn from altivec_lvsr.
16179         * rs6000.c (rs6000_expand_builtin): Change to use
16180         altivec_lvs[lr]_direct; remove commented-out code.
16182 2014-10-03  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16184         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
16185         Issue a warning message when vec_lvsl or vec_lvsr is used with a
16186         little endian target.
16188 2014-10-03  Manuel López-Ibáñez  <manu@gcc.gnu.org>
16190         * tree-pretty-print.c (dump_location): Make it extern. Dump also
16191         the column.
16192         * tree-pretty-print.h (dump_location): Declare.
16193         * gimple-pretty-print.c (dump_gimple_phi): Use dump_location.
16194         (pp_gimple_stmt_1): Likewise.
16195         (dump_implicit_edges): Likewise.
16196         * gimplify.c (gimplify_call_expr): Use LOCATION_FILE and
16197         LOCATION_LINE.
16200 2014-10-03  David Malcolm  <dmalcolm@redhat.com>
16202         * gcc.c (driver::global_initializations): Remove "const" so
16203         that GCC_DRIVER_HOST_INITIALIZATION can modify decoded_options
16204         and decoded_options_count.
16206 2014-10-03  Maciej W. Rozycki  <macro@codesourcery.com>
16208         * config/rs6000/e500.h (HARD_REGNO_CALLER_SAVE_MODE): Remove
16209         macro.
16210         * config/rs6000/rs6000.h (HARD_REGNO_CALLER_SAVE_MODE): Handle
16211         TARGET_E500_DOUBLE case here.
16213 2014-10-03  Marc Glisse  <marc.glisse@inria.fr>
16215         PR c++/54427
16216         PR c++/57198
16217         PR c++/58845
16218         * doc/extend.texi (Vector Extensions): Document &&, ||, ! in C++.
16220 2014-10-03  Jan Hubicka  <hubicka@ucw.cz>
16222         * cgraph.h (struct indirect_call_info): Add IN_POLYMORPHIC_CDTOR
16223         * lto-cgraph.c (lto_output_edge, input_edge): Stream
16224         in_polymorphic_cdtor
16225         * cgraph.c (symbol_table::create_edge): Compute in_polymorphic_cdtor.
16226         (cgraph_edge::make_speculative): Copy in_polymorphic_cdtor.
16227         * cgraphclones.c (cgraph_edge::clone): Likewise.
16228         * ipa-prop.c (update_jump_functions_after_inlining,
16229         try_make_edge_direct_virtual_call): Pass in_polymorphic_cdtor
16230         to possible_dynamic_type_change.
16231         (decl_maybe_in_construction_p): Allow empty OUTER_TYPE and BASE.
16232         (ipa_polymorphic_call_context::possible_dynamic_type_change): Add
16233         IN_POLY_CDOTR argument.
16235         * ipa-polymorphic-call.c (decl_maybe_in_construction_p): Be ready
16236         for BASE and OUTER_TYPE being NULL.
16237         (ipa_polymorphic_call_context::possible_dynamic_type_change): Add
16238         in_poly_cdtor parameter.
16240 2014-10-03  Jakub Jelinek  <jakub@redhat.com>
16242         * config/i386/i386.c (ix86_expand_vec_perm_vpermi2): Fix up formatting.
16243         (ix86_expand_vec_perm): Only call ix86_expand_vec_perm_vpermi2 if
16244         TARGET_AVX512F.
16245         (expand_vec_perm_1): Likewise.
16247 2014-10-03  Jakub Jelinek  <jakub@redhat.com>
16248             Uros Bizjak  <ubizjak@gmail.com>
16250         PR tree-optimization/61403
16251         * config/i386/i386.c (expand_vec_perm_palignr): Fix a spelling
16252         error in comment.  Also optimize 256-bit vectors for AVX2
16253         or AVX (floating vectors only), provided the first permutation
16254         can be performed in one insn.
16256 2014-10-03  David Malcolm  <dmalcolm@redhat.com>
16258         * gcc.c (class driver): New class.
16259         (main): Reimplement in terms of driver::main, moving most of the
16260         locals to be locals within individual methods of class driver.
16261         The remaining locals "explicit_link_files", "decoded_options" and
16262         "decoded_options_count" are used by multiple driver:: methods, and
16263         so become member data.  Doing so isolates the argc/argv reads and
16264         writes.  Replace "goto out" with a special exit code from
16265         new method driver::prepare_infiles.  Split out the old
16266         implementation of main into the following...
16267         (driver::main): New function, corresponding to the old "main"
16268         implementation.
16269         (driver::set_progname): New function, taken from the old
16270         "main" implementation.
16271         (driver::expand_at_files): Likewise.
16272         (driver::decode_argv): Likewise.
16273         (driver::global_initializations): Likewise.
16274         (driver::build_multilib_strings): Likewise.
16275         (driver::set_up_specs): Likewise.
16276         (driver::putenv_COLLECT_GCC): Likewise.
16277         (driver::maybe_putenv_COLLECT_LTO_WRAPPER): Likewise.
16278         (driver::handle_unrecognized_options): Likewise.
16279         (driver::maybe_print_and_exit): Likewise.
16280         (driver::prepare_infiles): Likewise.
16281         (driver::do_spec_on_infiles): Likewise.
16282         (driver::maybe_run_linker): Likewise.
16283         (driver::final_actions): Likewise.
16284         (driver::get_exit_code): Likewise.
16286 2014-10-03  Yury Gribov  <y.gribov@samsung.com>
16288         * asan.c (asan_finish_file): Disable __asan_init calls for KASan;
16289         don't emit empty ctors.
16291 2014-10-03  Eric Botcazou  <ebotcazou@adacore.com>
16293         * convert.c (convert_to_integer): Do not introduce useless conversions
16294         between integral types.
16296 2014-10-03  David Sherwood  <david.sherwood@arm.com>
16298         * ira-int.h (ira_allocno): Mark hard_regno as signed.
16300 2014-10-03  Ilya Enkovich  <ilya.enkovich@intel.com>
16302         * lra-constraints.c (inherit_in_ebb): Handle calls with
16303         multiple return values.
16304         * caller-save.c (save_call_clobbered_regs): Likewise.
16306 2014-10-03  Jakub Jelinek  <jakub@redhat.com>
16308         * tree-vect-data-refs.c (vect_permute_load_chain,
16309         vect_shift_permute_load_chain): Fix a typo in temporary var names,
16310         suffle3 to shuffle3.
16312         PR libgomp/61200
16313         * omp-low.c (taskreg_contexts): New variable.
16314         (scan_omp_parallel): Push newly created context into taskreg_contexts
16315         vector and move record layout code to finish_taskreg_scan.
16316         (scan_omp_task): Likewise.
16317         (finish_taskreg_scan): New function.
16318         (execute_lower_omp): Call finish_taskreg_scan on all taskreg_contexts
16319         vector elements and release it.
16321         PR target/62128
16322         * config/i386/i386.c (expand_vec_perm_palignr): If op1, op0 order
16323         of palignr arguments can't be used due to min 0 or max - min
16324         too high, try also op0, op1 order of palignr arguments.
16326 2014-10-02  Jan Hubicka  <hubicka@ucw.cz>
16328         * cgraph.h (ipa_polymorphic_call_context):
16329         Turn bools into bitfields; add DYNAMIC; make MAKE_SPECULATIVE
16330         private, add POSSIBLE_DYNAMIC_TYPE_CHANGE.
16331         * ipa-polymorphic-call.c
16332         (ipa_polymorphic_call_context::restrict_to_inner_class): Allow accesses
16333         past end of dynamic types.
16334         (ipa_polymorphic_call_context::stream_out,
16335         speculative_outer_type): Stream dynamic flag.
16336         (ipa_polymorphic_call_context::set_by_decl): Clear DYNAMIC.
16337         (ipa_polymorphic_call_context::ipa_polymorphic_call_context):
16338         Clear DYNAMIC.
16339         (ipa_polymorphic_call_context::get_dynamic_type): Use DYNAMIC;
16340         set it.
16341         (ipa_polymorphic_call_context::combine_with): Propagate dynamic.
16342         * ipa-prop.c (update_jump_functions_after_inlining,
16343         try_make_edge_direct_virtual_call): Use possible_dynamic_type_change.
16345 2014-10-02  Teresa Johnson  <tejohnson@google.com>
16347         * tree-ssa-threadupdate.c (freqs_to_counts_path): Scale frequencies
16348         up when synthesizing counts to avoid rounding errors.
16350 2014-10-02  Teresa Johnson  <tejohnson@google.com>
16352         PR middle-end/63422
16353         * tree-ssa-threadupdate.c (freqs_to_counts_path): Remove
16354         asserts to handle incoming insanities.
16356 2014-10-02  Martin Jambor  <mjambor@suse.cz>
16358         PR tree-optimization/63375
16359         * tree-sra.c (build_access_from_expr_1): Disqualify volatile
16360         references.
16362 2014-10-02  Olivier Hainque  <hainque@adacore.com>
16364         * Makefile.in (CROSS): Define, to @CROSS.
16366 2014-10-02  Jakub Jelinek  <jakub@redhat.com>
16368         PR target/62128
16369         * config/i386/i386.c (expand_vec_perm_1): Try expand_vec_perm_palignr
16370         if it expands to a single insn only.
16371         (expand_vec_perm_palignr): Add SINGLE_INSN_ONLY_P argument.  If true,
16372         fail unless in_order is true.  Add forward declaration.
16373         (expand_vec_perm_vperm2f128): Fix up comment about which permutation
16374         is useful for one_operand_p.
16375         (ix86_expand_vec_perm_const_1): Adjust expand_vec_perm_palignr caller.
16377 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16379         * cgraphclones.c (build_function_type_skip_args): Do not make new
16380         type variant of old.
16382 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16384         * ipa-prop.h (ipa_get_controlled_uses): Add hack to avoid ICE
16385         when speculation is added.
16386         (ipa_edge_args): Add polymorphic_call_contexts.
16387         (ipa_get_ith_polymorhic_call_context): New accesor.
16388         (ipa_make_edge_direct_to_target): Add SPECULATIVE parameter.
16389         * ipa-prop.c (ipa_print_node_jump_functions_for_edge): Print contexts.
16390         (ipa_compute_jump_functions_for_edge): Compute contexts.
16391         (update_jump_functions_after_inlining): Update contexts.
16392         (ipa_make_edge_direct_to_target): Add SPECULATIVE argument;
16393         update dumping; add speculative edge creation.
16394         (try_make_edge_direct_virtual_call): Add CTX_PTR parameter; handle
16395         context updating.
16396         (update_indirect_edges_after_inlining): Pass down context.
16397         (ipa_edge_duplication_hook): Duplicate contexts.
16398         (ipa_write_node_info): Stream out contexts.
16399         (ipa_read_node_info): Stream in contexts.
16400         * ipa-devirt.c (type_all_derivations_known_p): Avoid ICE on non-ODR
16401         types.
16402         (try_speculative_devirtualization): New function.
16403         * ipa-utils.h (try_speculative_devirtualization): Declare.
16405 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16407         * ipa.c (walk_polymorphic_call_targets): Avoid ICE when
16408         dumping during WPA.
16410 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16412         * ipa-prop.c (ipa_modify_formal_parameters): Do not merge
16413         type variants.
16415 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16417         * ipa-polymorphic-call.c
16418         (ipa_polymorphic_call_context::restrict_to_inner_class):
16419         Rename EXPECTED_TYPE to OTR_TYPE; Validate speculation late;
16420         use speculation_consistent_p to do so; Add CONSDER_BASES
16421         and CONSIDER_PLACEMENT_NEW parameters.
16422         (contains_type_p): Add CONSDER_PLACEMENT_NEW and CONSIDER_BASES;
16423         short circuit obvious cases.
16424         (ipa_polymorphic_call_context::dump): Improve formatting.
16425         (ipa_polymorphic_call_context::ipa_polymorphic_call_context): Use
16426         combine_speculation_with to record speculations; Do not ICE when
16427         object is located in pointer type decl; do not ICE for methods
16428         of UNION_TYPE; do not record nonpolymorphic types.
16429         (ipa_polymorphic_call_context::speculation_consistent_p): New method.
16430         (ipa_polymorphic_call_context::combine_speculation_with): New method.
16431         (ipa_polymorphic_call_context::combine_with): New method.
16432         (ipa_polymorphic_call_context::make_speculative): Move here; use
16433         combine speculation.
16434         * cgraph.h (ipa_polymorphic_call_context): Update
16435         restrict_to_inner_class prototype; add offset_by, make_speculative,
16436         combine_with, useless_p, combine_speculation_with and
16437         speculation_consistent_p methods.
16438         (ipa_polymorphic_call_context::offset_by): New method.
16439         (ipa_polymorphic_call_context::useless_p): New method.
16441 2014-10-01  Segher Boessenkool  <segher@kernel.crashing.org>
16443         PR rtl-optimization/62151
16444         * combine.c (can_combine_p): Allow the destination register of INSN
16445         to be clobbered in I3.
16446         (subst): Do not substitute into clobbers of registers.
16448 2014-10-01  Jakub Jelinek  <jakub@redhat.com>
16450         PR debug/63342
16451         * dwarf2out.c (loc_list_from_tree): Handle MEM_REF with non-zero
16452         offset, TARGET_MEM_REF and SSA_NAME.
16454         * config/i386/i386.c (expand_vec_perm_palignr): Handle
16455         256-bit vectors for TARGET_AVX2.
16457         * config/i386/i386.c (expand_vec_perm_vperm2f128): Canonicalize
16458         dfirst permutation.
16460         PR target/63428
16461         * config/i386/i386.c (expand_vec_perm_pshufb): Fix up rperm[0]
16462         argument to avx2_permv2ti.
16464 2014-10-01  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
16466         * config/arm/arm.md (*store_minmaxsi): Disable for arm_restrict_it.
16468 2014-09-30  Uros Bizjak  <ubizjak@gmail.com>
16470         * config/i386/i386.md (fmodxf3): Enable for flag_finite_math_only only.
16471         (fmod<mode>3): Ditto.
16472         (fpremxf4_i387): Ditto.
16473         (reminderxf3): Ditto.
16474         (reminder<mode>3): Ditto.
16475         (fprem1xf4_i387): Ditto.
16477 2014-09-30  Teresa Johnson  <tejohnson@google.com>
16479         * tree-ssa-threadupdate.c (struct ssa_local_info_t): New
16480         duplicate_blocks bitmap.
16481         (remove_ctrl_stmt_and_useless_edges): Ditto.
16482         (create_block_for_threading): Ditto.
16483         (compute_path_counts): New function.
16484         (update_profile): Ditto.
16485         (recompute_probabilities): Ditto.
16486         (update_joiner_offpath_counts): Ditto.
16487         (freqs_to_counts_path): Ditto.
16488         (clear_counts_path): Ditto.
16489         (ssa_fix_duplicate_block_edges): Update profile info.
16490         (ssa_create_duplicates): Pass new parameter.
16491         (ssa_redirect_edges): Remove old profile update.
16492         (thread_block_1): New duplicate_blocks bitmap,
16493         remove old profile update.
16494         (thread_single_edge): Pass new parameter.
16496 2014-09-30  Ilya Tocar  <ilya.tocar@intel.com>
16498         PR middle-end/62120
16499         * varasm.c (decode_reg_name_and_count): Check availability for
16500         registers from ADDITIONAL_REGISTER_NAMES.
16502 2014-09-30  David Malcolm  <dmalcolm@redhat.com>
16504         PR plugins/63410
16505         * Makefile.in (PRETTY_PRINT_H): Add wide-int-print.h.
16506         (PLUGIN_HEADERS): Add pass-instances.def.
16508 2014-09-30  James Greenhalgh  <james.greenhalgh@arm.com>
16510         * config/aarch64/aarch64-simd-builtins.def (sqdmull_laneq): Expand
16511         iterator.
16512         * config/aarch64/aarch64-simd.md
16513         (aarch64_sqdmull_laneq<mode>): Expand iterator.
16514         * config/aarch64/arm_neon.h (vqdmullh_laneq_s16): New.
16515         (vqdmulls_lane_s32): Fix return type.
16516         (vqdmulls_laneq_s32): New.
16518 2014-09-30  Jakub Jelinek  <jakub@redhat.com>
16520         PR inline-asm/63282
16521         * ifcvt.c (dead_or_predicable): Don't call redirect_jump_1
16522         or invert_jump_1 if jump isn't any_condjump_p.
16524 2014-09-30  Terry Guo  <terry.guo@arm.com>
16526         * config/arm/arm-cores.def (cortex-m7): New core name.
16527         * config/arm/arm-fpus.def (fpv5-sp-d16): New fpu name.
16528         (fpv5-d16): Ditto.
16529         * config/arm/arm-tables.opt: Regenerated.
16530         * config/arm/arm-tune.md: Regenerated.
16531         * config/arm/arm.h (TARGET_VFP5): New macro.
16532         * config/arm/bpabi.h (BE8_LINK_SPEC): Include cortex-m7.
16533         * config/arm/vfp.md (<vrint_pattern><SDF:mode>2,
16534         smax<mode>3, smin<mode>3): Enabled for FPU FPv5.
16535         * doc/invoke.texi: Document new cpu and fpu names.
16537 2014-09-30  Jiong Wang  <jiong.wang@arm.com>
16539         * shrink-wrap.c (move_insn_for_shrink_wrap): Check "can_throw_internal"
16540         before sinking insn.
16542 2014-09-30  David Sherwood  <david.sherwood@arm.com>
16544         * ira-int.h (ira_allocno): Add "wmode" field.
16545         * ira-build.c (create_insn_allocnos): Add new "parent" function
16546         parameter.
16547         * ira-conflicts.c (ira_build_conflicts): Add conflicts for registers
16548         that cannot be accessed in wmode.
16550 2014-09-30  Markus Trippelsdorf  <markus@trippelsdorf.de>
16552         * data-streamer.c (bp_unpack_var_len_int): Avoid signed
16553         integer overflow.
16555 2014-09-29  Andi Kleen  <ak@linux.intel.com>
16557         * opts.c (print_filtered_help): Print --param min/max/default
16558         with -Q.
16560 2014-09-29  Kaz Kojima  <kkojima@gcc.gnu.org>
16562         * config/sh/sh.md: Use define_c_enum for "unspec" and "unspecv".
16564 2014-09-29  Eric Botcazou  <ebotcazou@adacore.com>
16566         * tree-vrp.c (get_single_symbol): New function.
16567         (build_symbolic_expr): Likewise.
16568         (symbolic_range_based_on_p): New predicate.
16569         (extract_range_from_binary_expr_1): Deal with single-symbolic ranges
16570         for PLUS and MINUS.  Do not drop symbolic ranges at the end.
16571         (extract_range_from_binary_expr): Try harder for PLUS and MINUS if
16572         operand is symbolic and based on the other operand.
16574 2014-09-29  Chen Gang  <gang.chen.5i5j@gmail.com>
16576         * config/microblaze/microblaze.md (call_internal1): Use VOID
16577         instead of SI to fix "((void (*)(void)) 0)()" issue
16579 2014-09-29  Nick Clifton  <nickc@redhat.com>
16581         * config/msp430/msp430.c (msp430_expand_prologue): Return a
16582         CLOBBER rtx for naked functions.
16583         (msp430_expand_epilogue): Likewise.
16584         (msp430_use_f5_series_hwmult): Cache result.
16585         (use_32bit_hwmult): Cache result.
16586         (msp430_no_hwmult): New function.
16587         (msp430_output_labelref): Use it.
16589 2014-09-29  Jakub Jelinek  <jakub@redhat.com>
16591         PR middle-end/63247
16592         * omp-low.c (lower_omp_target): For OMP_CLAUSE_MAP_POINTER
16593         of ARRAY_TYPE, if not OMP_CLAUSE_MAP_ZERO_BIAS_ARRAY_SECTION
16594         use the alignment of avar rather than ovar.
16596 2014-09-28  John David Anglin  <danglin@gcc.gnu.org>
16598         * config/pa/pa.c (pa_output_function_epilogue): Only update
16599         last_address when a nonnote insn is found.
16601 2014-09-26  Jan Hubicka  <hubicka@ucw.cz>
16603         PR ipa/60665
16604         * ipa-devirt.c (possible_polymorphic_call_targets): Silence
16605         clang warning.
16607 2014-09-26  Jan Hubicka  <hubicka@ucw.cz>
16609         PR ipa/62121
16610         * ipa-polymorphic-call.c
16611         (ipa_polymorphic_call_context::restrict_to_inner_class): Fix pasto
16612         in checking array size.
16614 2014-09-26  Jan Hubicka  <hubicka@ucw.cz>
16616         PR middle-end/35545
16617         * passes.def (pass_tracer): Move before last dominator pass.
16619 2014-09-26  Thomas Schwinge  <thomas@codesourcery.com>
16621         * gcc.c (try_generate_repro): Remove argument "prog".  Change all
16622         users.
16623         (run_attempt): Handle errors of "pex_run" invocation.
16625 2014-09-26  Christophe Lyon  <christophe.lyon@linaro.org>
16627         * config/aarch64/aarch64-linux.h (ASAN_CC1_SPEC): Define.
16628         (CC1_SPEC): Define.
16629         * config/aarch64/aarch64.c (aarch64_asan_shadow_offset): New function.
16630         (TARGET_ASAN_SHADOW_OFFSET): Define.
16632 2014-09-26  Martin Liska  <mliska@suse.cz>
16634         * cgraph.c (cgraph_node::release_body): New argument keep_arguments
16635         introduced.
16636         * cgraph.h: Likewise.
16637         * cgraphunit.c (cgraph_node::create_wrapper): Usage of new
16638         argument introduced.
16639         * ipa-utils.h (polymorphic_type_binfo_p): Safe check for binfos
16640         created by Java.
16641         * tree-ssa-alias.c (ao_ref_base_alias_set): Static function
16642         transformed to global.
16643         * tree-ssa-alias.h: Likewise.
16645 2014-09-26  Jakub Jelinek  <jakub@redhat.com>
16646             Max Ostapenko  <m.ostapenko@partner.samsung.com>
16648         * common.opt: New option.
16649         * doc/invoke.texi: Describe new option.
16650         * gcc.c (execute): Don't free first string early, but at the end
16651         of the function.  Call retry_ice if compiler exited with
16652         ICE_EXIT_CODE.
16653         (main): Factor out common code.
16654         (print_configuration): New function.
16655         (files_equal_p): Likewise.
16656         (check_repro): Likewise.
16657         (run_attempt): Likewise.
16658         (do_report_bug): Likewise.
16659         (append_text): Likewise.
16660         (try_generate_repro): Likewise
16662 2014-09-25  Andi Kleen  <ak@linux.intel.com>
16664         * config/i386/i386.c (x86_print_call_or_nop): New function.
16665         (x86_function_profiler): Support -mnop-mcount and
16666         -mrecord-mcount.
16667         * config/i386/i386.opt (-mnop-mcount, -mrecord-mcount): Add
16668         * doc/invoke.texi: Document -mnop-mcount, -mrecord-mcount.
16670 2014-09-25  Jan Hubicka  <hubicka@ucw.cz>
16672         * ipa-prop.c (ipa_intraprocedural_devirtualization): Remove.
16673         * ipa-prop.h (ipa_intraprocedural_devirtualization): Remove.
16674         * tree-ssa-prop.c (eliminate_dom_walker::before_dom_children):
16675         Remove.
16677 2014-09-25  Jan Hubicka  <hubicka@ucw.cz>
16679         * ipa-utils.h (subbinfo_with_vtable_at_offset,
16680         type_all_derivations_known_p, type_known_to_have_no_deriavations_p,
16681         types_must_be_same_for_odr, types_odr_comparable): Declare.
16682         (polymorphic_type_binfo_p): Move here from ipa-devirt.c
16683         * ipa-polymorphic-call.c: New file.
16684         (contains_polymorphic_type_p, possible_placement_new,
16685         ipa_polymorphic_call_context::restrict_to_inner_class,
16686         contains_type_p, decl_maybe_in_construction_p,
16687         ipa_polymorphic_call_context::stream_out,
16688         ipa_polymorphic_call_context::debug,
16689         ipa_polymorphic_call_context::stream_in,
16690         ipa_polymorphic_call_context::set_by_decl,
16691         ipa_polymorphic_call_context::set_by_invariant,
16692         walk_ssa_copies,
16693         ipa_polymorphic_call_context::ipa_polymorphic_call_context,
16694         type_change_info, noncall_stmt_may_be_vtbl_ptr_store,
16695         extr_type_from_vtbl_ptr_store, record_known_type
16696         check_stmt_for_type_change,
16697         ipa_polymorphic_call_context::get_dynamic_type): Move here from
16698         ipa-devirt.c
16699         * ipa-devirt.c: No longer include data-streamer.h, lto-streamer.h
16700         and streamer-hooks.h
16701         (contains_polymorphic_type_p, possible_placement_new,
16702         ipa_polymorphic_call_context::restrict_to_inner_class,
16703         contains_type_p, decl_maybe_in_construction_p,
16704         ipa_polymorphic_call_context::stream_out,
16705         ipa_polymorphic_call_context::debug,
16706         ipa_polymorphic_call_context::stream_in,
16707         ipa_polymorphic_call_context::set_by_decl,
16708         ipa_polymorphic_call_context::set_by_invariant,
16709         walk_ssa_copies,
16710         ipa_polymorphic_call_context::ipa_polymorphic_call_context,
16711         type_change_info, noncall_stmt_may_be_vtbl_ptr_store,
16712         extr_type_from_vtbl_ptr_store, record_known_type
16713         check_stmt_for_type_change,
16714         ipa_polymorphic_call_context::get_dynamic_type): Move to
16715         ipa-polymorphic-call.c
16716         (type_all_derivations_known_p, types_odr_comparable,
16717         types_must_be_same_for_odr): Export.
16718         (type_known_to_have_no_deriavations_p): New function.
16719         * Makefile.in: Add ipa-polymorphic-call.c
16721 2014-09-25  Jan Hubicka  <hubicka@ucw.cz>
16723         * ipa-devirt.c (polymorphic_call_target_d): Add SPECULATIVE; reorder
16724         for better storage.
16725         (polymorphic_call_target_hasher::hash): Hash SPECULATIVE.
16726         (possible_polymorphic_call_targets): Instead of computing both
16727         speculative and non-speculative answers, do just one at a time.
16728         Replace NONSPECULATIVE_TARGETSP parameter with SPECULATIVE flag.
16729         (dump_targets): Break out from ...
16730         (dump_possible_polymorphic_call_targets): ... here; dump both
16731         speculative and non-speculative lists.
16732         (ipa_devirt): Update for new possible_polymorphic_call_targets API.
16733         * ipa-utils.h (possible_polymorphic_call_targets): Update.
16735 2014-09-25  Uros Bizjak  <ubizjak@gmail.com>
16737         PR rtl-optimization/63348
16738         * emit-rtl.c (try_split): Do not emit extra barrier.
16740 2014-09-25  James Greenhalgh  <james.greenhalgh@arm.com>
16742         * config/aarch64/aarch64-protos.h (aarch64_simd_const_bounds): Delete.
16743         * config/aarch64/aarch64-simd.md (aarch64_<sur>q<r>shl<mode>): Use
16744         new predicates.
16745         (aarch64_<sur>shll2_n<mode>): Likewise.
16746         (aarch64_<sur>shr_n<mode>): Likewise.
16747         (aarch64_<sur>sra_n<mode>: Likewise.
16748         (aarch64_<sur>s<lr>i_n<mode>): Likewise.
16749         (aarch64_<sur>qshl<u>_n<mode>): Likewise.
16750         * config/aarch64/aarch64.c (aarch64_simd_const_bounds): Delete.
16751         * config/aarch64/iterators.md (ve_mode): New.
16752         (offsetlr): Remap to infix text for use in new predicates.
16753         * config/aarch64/predicates.md (aarch64_simd_shift_imm_qi): New.
16754         (aarch64_simd_shift_imm_hi): Likewise.
16755         (aarch64_simd_shift_imm_si): Likewise.
16756         (aarch64_simd_shift_imm_di): Likewise.
16757         (aarch64_simd_shift_imm_offset_qi): Likewise.
16758         (aarch64_simd_shift_imm_offset_hi): Likewise.
16759         (aarch64_simd_shift_imm_offset_si): Likewise.
16760         (aarch64_simd_shift_imm_offset_di): Likewise.
16761         (aarch64_simd_shift_imm_bitsize_qi): Likewise.
16762         (aarch64_simd_shift_imm_bitsize_hi): Likewise.
16763         (aarch64_simd_shift_imm_bitsize_si): Likewise.
16764         (aarch64_simd_shift_imm_bitsize_di): Likewise.
16766 2014-09-25  Jiong Wang  <jiong.wang@arm.com>
16768         * shrink-wrap.c (move_insn_for_shrink_wrap): Initialize the live-in of
16769         new created BB as the intersection of live-in from "old_dest" and
16770         live-out from "bb".
16772 2014-09-25  Felix Yang  <felix.yang@huawei.com>
16774         * lra.c (lra_set_insn_recog_data): Fix typo in comment.
16775         * genautomata.c (merge_states): Ditto.
16777 2014-09-25  Oleg Endo  <olegendo@gcc.gnu.org>
16779         PR target/62218
16780         * config/sh/sync.md (atomic_test_and_set_soft_imask): Fix typo
16781         in instruction sequence.
16783 2014-09-25  Nick Clifton  <nickc@redhat.com>
16785         PR target/62218
16786         * config/sh/sync.md (atomic_fetch_nand<mode>_soft_imask): Fix typo
16787         in instruction sequence.
16789 2014-09-25  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16791         PR target/63335
16792         * config/rs6000/rs6000-c.c (altivec_build_resolved_builtin):
16793         Exclude VSX_BUILTIN_XVCMPGEDP_P from special handling.
16795 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16796             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16797             Anna Tikhonova  <anna.tikhonova@intel.com>
16798             Ilya Tocar  <ilya.tocar@intel.com>
16799             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16800             Ilya Verbin  <ilya.verbin@intel.com>
16801             Kirill Yukhin  <kirill.yukhin@intel.com>
16802             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16804         * config/i386/sse.md
16805         (define_expand "<avx2_avx512f>_perm<mode>"): Rename to ...
16806         (define_expand "<avx2_avx512>_perm<mode>"): ... this.
16807         (define_expand "avx512f_perm<mode>_mask"): Rename to ...
16808         (define_expand "<avx512>_perm<mode>_mask"): ... this.
16809         Use VI8F_256_512 mode iterator.
16810         (define_insn "<avx2_avx512f>_perm<mode>_1<mask_name>"): Rename to ...
16811         (define_insn "<avx2_avx512bw>_perm<mode>_1<mask_name>"): ... this.
16813 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16814             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16815             Anna Tikhonova  <anna.tikhonova@intel.com>
16816             Ilya Tocar  <ilya.tocar@intel.com>
16817             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16818             Ilya Verbin  <ilya.verbin@intel.com>
16819             Kirill Yukhin  <kirill.yukhin@intel.com>
16820             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16822         * config/i386/sse.md
16823         (define_insn "avx_movshdup256<mask_name>"): Add masking.
16824         (define_insn "sse3_movshdup<mask_name>"): Ditto.
16825         (define_insn "avx_movsldup256<mask_name>"): Ditto.
16826         (define_insn "sse3_movsldup<mask_name>"): Ditto.
16827         (define_insn "vec_dupv2df<mask_name>"): Ditto.
16828         (define_insn "*vec_concatv2df"): Add EVEX version.
16830 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16831             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16832             Anna Tikhonova  <anna.tikhonova@intel.com>
16833             Ilya Tocar  <ilya.tocar@intel.com>
16834             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16835             Ilya Verbin  <ilya.verbin@intel.com>
16836             Kirill Yukhin  <kirill.yukhin@intel.com>
16837             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16839         * config/i386/sse.md
16840         (define_insn "vec_set<mode>_0"): Add EVEX version.
16842 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16843             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16844             Anna Tikhonova  <anna.tikhonova@intel.com>
16845             Ilya Tocar  <ilya.tocar@intel.com>
16846             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16847             Ilya Verbin  <ilya.verbin@intel.com>
16848             Kirill Yukhin  <kirill.yukhin@intel.com>
16849             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16851         * config/i386/sse.md
16852         (define_insn
16853         "<fixsuffix>fix_trunc<mode><sselongvecmodelower>2<mask_name><round_saeonly_name>"):
16854         New.
16855         (define_insn "<fixsuffix>fix_truncv2sfv2di2<mask_name>"): Ditto.
16856         (define_insn "ufix_trunc<mode><sseintvecmodelower>2<mask_name>"): Ditto.
16857         (define_insn "sse2_cvtss2sd<round_saeonly_name>"): Change
16858         "nonimmediate_operand" to "<round_saeonly_nimm_predicate>".
16859         (define_insn "avx_cvtpd2ps256<mask_name>"): Add masking.
16860         (define_expand "sse2_cvtpd2ps_mask): New.
16861         (define_insn "*sse2_cvtpd2ps<mask_name>"): Add masking.
16862         (define_insn "sse2_cvtps2pd<mask_name>"): Add masking.
16864 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16865             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16866             Anna Tikhonova  <anna.tikhonova@intel.com>
16867             Ilya Tocar  <ilya.tocar@intel.com>
16868             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16869             Ilya Verbin  <ilya.verbin@intel.com>
16870             Kirill Yukhin  <kirill.yukhin@intel.com>
16871             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16873         * config/i386/i386.c
16874         (avx512f_ufix_notruncv8dfv8si_mask_round): Rename to ...
16875         (ufix_notruncv8dfv8si2_mask_round): ... this.
16876         * config/i386/sse.md
16877         (define_insn "avx512f_cvtdq2pd512_2): Update TARGET check.
16878         (define_insn "avx_cvtdq2pd256_2"): Add EVEX version.
16879         (define_insn "sse2_cvtdq2pd<mask_name>"): Add masking.
16880         (define_insn "avx_cvtpd2dq256<mask_name>"): Ditto.
16881         (define_expand "sse2_cvtpd2dq"): Delete.
16882         (define_insn "sse2_cvtpd2dq<mask_name>"): Add masking and
16883         make 2nd operand const0 vector.
16884         (define_insn "avx512f_ufix_notruncv8dfv8si<mask_name><round_name>"):
16885         Delete.
16886         (define_mode_attr pd2udqsuff): New.
16887         (define_insn
16888         "ufix_notrunc<mode><si2dfmodelower>2<mask_name><round_name>"): Ditto.
16889         (define_insn "ufix_notruncv2dfv2si2<mask_name>"): Ditto.
16890         (define_insn "*avx_cvttpd2dq256_2"): Delete.
16891         (define_expand "sse2_cvttpd2dq"): Ditto.
16892         (define_insn "sse2_cvttpd2dq<mask_name>"): Add masking and
16893         make 2nd operand const0 vector.
16895 2014-09-25  Jakub Jelinek  <jakub@redhat.com>
16897         PR tree-optimization/63341
16898         * tree-vectorizer.h (vect_create_data_ref_ptr,
16899         vect_create_addr_base_for_vector_ref): Add another tree argument
16900         defaulting to NULL_TREE.
16901         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Add byte_offset
16902         argument, pass it down to vect_create_addr_base_for_vector_ref.
16903         (vect_create_addr_base_for_vector_ref): Add byte_offset argument,
16904         add that to base_offset too if non-NULL.
16905         * tree-vect-stmts.c (vectorizable_load): Add byte_offset variable,
16906         for dr_explicit_realign_optimized set it to vector byte size
16907         - 1 instead of setting offset, pass byte_offset down to
16908         vect_create_data_ref_ptr.
16910 2014-09-24  Jan Hubicka  <hubicka@ucw.cz>
16912         * ipa-devirt.c (possible_polymorphic_call_targets): Remove
16913         forgotten debug output; canonicalize querries more wtih LTO.
16915 2014-09-24  Jan Hubicka  <hubicka@ucw.cz>
16917         * cgraph.h (class ipa_polymorphic_call_context): Move here from
16918         ipa-utils.h; add stream_int and stream_out methods.
16919         (cgraph_indirect_call_info): Remove SPECILATIVE_OFFSET,
16920         OUTER_TYPE, SPECULATIVE_OUTER_TYPE, MAYBE_IN_CONSTRUCTION
16921         MAYBE_DERIVED_TYPE and SPECULATIEVE_MAYBE_DERIVED_TYPE;
16922         add CONTEXT.
16923         (ipa_polymorphic_call_context::ipa_polymorphic_call_context,
16924         ipa_polymorphic_call_context::ipa_polymorphic_call_context,
16925         ipa_polymorphic_call_context::clear_speculation,
16926         ipa_polymorphic_call_context::clear_outer_type): Move here from
16927         ipa-utils.h
16928         * ipa-utils.h (class ipa_polymorphic_call_context): Move to cgraph.h
16929         (ipa_polymorphic_call_context::ipa_polymorphic_call_context,
16930         ipa_polymorphic_call_context::ipa_polymorphic_call_context,
16931         ipa_polymorphic_call_context::clear_speculation,
16932         ipa_polymorphic_call_context::clear_outer_type): Likewise.
16933         * ipa-devirt.c: Include data-streamer.h, lto-streamer.h and
16934         streamer-hooks.h
16935         (ipa_polymorphic_call_context::stream_out): New method.
16936         (ipa_polymorphic_call_context::stream_in): New method.
16937         (noncall_stmt_may_be_vtbl_ptr_store): Add forgotten static.
16938         * ipa-prop.c (ipa_analyze_indirect_call_uses): Do not care about
16939         OUTER_TYPE.
16940         (ipa_analyze_call_uses): Simplify.
16941         (update_indirect_edges_after_inlining): Do not care about outer_type.
16942         (ipa_write_indirect_edge_info): Update.
16943         (ipa_write_indirect_edge_info): Likewise.
16944         * cgraph.c (cgraph_node::create_indirect_edge): Simplify.
16945         (dump_edge_flags): Break out from ...
16946         (cgraph_node::dump): ... here; dump indirect edges.
16948 2014-09-24  Jan Hubicka  <hubicka@ucw.cz>
16950         * ipa-utils.h (polymorphic_call_context): Add
16951         metdhos dump, debug and clear_outer_type.
16952         (ipa_polymorphic_call_context::ipa_polymorphic_call_context): Simplify.
16953         (ipa_polymorphic_call_context::clear_outer_type): New method.
16954         * ipa-prop.c (ipa_analyze_call_uses): Do not overwrite offset.
16955         * ipa-devirt.c (types_odr_comparable): New function.
16956         (types_must_be_same_for_odr): New function.
16957         (odr_subtypes_equivalent_p): Simplify.
16958         (possible_placement_new): Break out from ...
16959         (ipa_polymorphic_call_context::restrict_to_inner_type): ... here;
16960         be more cuatious about returning false in cases the context may be
16961         valid in derived type or via placement new.
16962         (contains_type_p): Clear maybe_derived_type
16963         (ipa_polymorphic_call_context::dump): New method.
16964         (ipa_polymorphic_call_context::debug): New method.
16965         (ipa_polymorphic_call_context::set_by_decl): Cleanup comment.
16966         (ipa_polymorphic_call_context::set_by_invariant): Simplify.
16967         (ipa_polymorphic_call_context::ipa_polymorphic_call_context): Simplify.
16968         (possible_polymorphic_call_targets): Trust
16969         context.restrict_to_inner_class to suceed on all valid cases;
16970         remove confused sanity check.
16971         (dump_possible_polymorphic_call_targets): Simplify.
16973 2014-09-24  Aldy Hernandez  <aldyh@redhat.com>
16975         * cgraph.h, dbxout.c, dwarfout2.c, gimple-fold.c,
16976         lto-streamer-out.c, print-tree.c, symtab.c, tree-inline.c,
16977         tree-streamer-in.c, tree-streamer-out.c, tree.c, tree.h,
16978         varpool.c: Rename all instances of DECL_ABSTRACT to
16979         DECL_ABSTRACT_P.
16981 2014-09-24  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16983         * config/rs6000/rs6000.c (insn_is_swappable_p): Don't provide
16984         special handling for stores whose SET_SRC is an UNSPEC (such as
16985         UNSPEC_STVE).
16987 2014-09-24  Jiong Wang  <jiong.wang@arm.com>
16989         * shrink-wrap.c (move_insn_for_shrink_wrap): Add further check when
16990         !REG_P (src) to release more instruction sink opportunities.
16992 2014-09-24  Wilco Dijkstra  <wilco.dijkstra@arm.com>
16994         * config/aarch64/aarch64.c (aarch64_register_move_cost): Add register
16995         move costs for 128-bit types.
16997 2014-09-24  Martin Jambor  <mjambor@suse.cz>
16999         * ipa-prop.c (ipa_edge_duplication_hook): Update controlled_use_count
17000         when duplicating a PASS_THROUGH jump function when creating a
17001         speculative edge.
17003 2014-09-24  Marek Polacek  <polacek@redhat.com>
17005         PR c/61405
17006         PR c/53874
17007         * asan.c (maybe_instrument_call): Add default case.
17008         * ipa-pure-const.c (special_builtin_state): Likewise.
17009         * predict.c (expr_expected_value_1): Likewise.
17010         * lto-streamer-out.c (write_symbol): Initialize variable.
17012 2014-09-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
17014         * config/aarch64/arm_neon.h (vmuld_lane_f64): Use macro for getting
17015         the lane.
17016         (vmuld_laneq_f64): Likewise.
17017         (vmuls_lane_f32): Likewise.
17018         (vmuls_laneq_f32): Likewise.
17020 2014-09-24  Kirill Yukhin  <kirill.yukhin@intel.com>
17022         PR bootstrap/63235
17023         * varpool.c (varpool_node::add): Pass decl attributes
17024         to lookup_attribute.
17026 2014-09-24  Jakub Jelinek  <jakub@redhat.com>
17028         PR sanitizer/63316
17029         * asan.c (asan_expand_check_ifn): Fix up align >= 8 optimization.
17031 2014-09-24  Thomas Preud'homme  <thomas.preudhomme@arm.com>
17033         PR tree-optimization/63266
17034         * tree-ssa-math-opts.c (struct symbolic_number): Add comment about
17035         marker for unknown byte value.
17036         (MARKER_MASK): New macro.
17037         (MARKER_BYTE_UNKNOWN): New macro.
17038         (HEAD_MARKER): New macro.
17039         (do_shift_rotate): Mark bytes with unknown values due to sign
17040         extension when doing an arithmetic right shift. Replace hardcoded
17041         mask for marker by new MARKER_MASK macro.
17042         (find_bswap_or_nop_1): Likewise and adjust ORing of two symbolic
17043         numbers accordingly.
17045 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17046             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17047             Anna Tikhonova  <anna.tikhonova@intel.com>
17048             Ilya Tocar  <ilya.tocar@intel.com>
17049             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17050             Ilya Verbin  <ilya.verbin@intel.com>
17051             Kirill Yukhin  <kirill.yukhin@intel.com>
17052             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17054         * config/i386/sse.md
17055         (define_insn
17056         "<sse2_avx_avx512f>_fix_notrunc<sf2simodelower><mode><mask_name>"):
17057         Add masking.
17058         (define_insn "fix_truncv8sfv8si2<mask_name>"): Ditto.
17059         (define_insn "fix_truncv4sfv4si2<mask_name>"): Ditto.
17061 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17062             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17063             Anna Tikhonova  <anna.tikhonova@intel.com>
17064             Ilya Tocar  <ilya.tocar@intel.com>
17065             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17066             Ilya Verbin  <ilya.verbin@intel.com>
17067             Kirill Yukhin  <kirill.yukhin@intel.com>
17068             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17070         * config/i386/sse.md
17071         (define_c_enum "unspec"): Add UNSPEC_PSHUFHW, UNSPEC_PSHUFLW.
17072         (define_insn "<mask_codefor>avx512bw_pshuflwv32hi<mask_name>"): New.
17073         (define_expand "avx512vl_pshuflwv3_mask"): Ditto.
17074         (define_insn "avx2_pshuflw_1<mask_name>"): Add masking.
17075         (define_expand "avx512vl_pshuflw_mask"): New.
17076         (define_insn "sse2_pshuflw_1<mask_name>"): Add masking.
17077         (define_insn "<mask_codefor>avx512bw_pshufhwv32hi<mask_name>"): New.
17078         (define_expand "avx512vl_pshufhwv3_mask"): Ditto.
17079         (define_insn "avx2_pshufhw_1<mask_name>"): Add masking.
17080         (define_expand "avx512vl_pshufhw_mask"): New.
17081         (define_insn "sse2_pshufhw_1<mask_name>"): Add masking.
17083 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17084             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17085             Anna Tikhonova  <anna.tikhonova@intel.com>
17086             Ilya Tocar  <ilya.tocar@intel.com>
17087             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17088             Ilya Verbin  <ilya.verbin@intel.com>
17089             Kirill Yukhin  <kirill.yukhin@intel.com>
17090             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17092         * config/i386/i386.c
17093         (ix86_expand_args_builtin): Handle CODE_FOR_sse2_shufpd,
17094         CODE_FOR_sse2_sse2_shufpd_mask, CODE_FOR_sse2_avx512dq_shuf_f64x2_mask,
17095         CODE_FOR_sse2_avx512dq_shuf_i64x2_mask,
17096         CODE_FOR_sse2_avx512vl_shuf_i32x4_mask and
17097         CODE_FOR_sse2_avx512vl_shuf_f32x4_mask.
17098         * config/i386/sse.md
17099         (define_expand "avx512dq_shuf_<shuffletype>64x2_mask"): New.
17100         (define_insn
17101         "<mask_codefor>avx512dq_shuf_<shuffletype>64x2_1<mask_name>"): Ditto.
17102         (define_expand "avx512vl_shuf_<shuffletype>32x4_mask"): Ditto.
17103         (define_insn
17104         "<mask_codefor>avx512vl_shuf_<shuffletype>32x4_1<mask_name>"): Ditto.
17105         (define_expand "avx512vl_pshufdv3_mask"): Ditto.
17106         (define_insn "avx2_pshufd_1<mask_name>"): Add masking.
17107         (define_expand "avx512vl_pshufd_mask"): New.
17108         (define_insn "sse2_pshufd_1<mask_name>"): Add masking.
17110 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17111             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17112             Anna Tikhonova  <anna.tikhonova@intel.com>
17113             Ilya Tocar  <ilya.tocar@intel.com>
17114             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17115             Ilya Verbin  <ilya.verbin@intel.com>
17116             Kirill Yukhin  <kirill.yukhin@intel.com>
17117             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17119         * config/i386/i386.c
17120         (CODE_FOR_avx2_extracti128): Rename to ...
17121         (CODE_FOR_avx_vextractf128v4di): this.
17122         (CODE_FOR_avx2_inserti128): Rename to ...
17123         (CODE_FOR_avx_vinsertf128v4di): this.
17124         (ix86_expand_args_builtin): Handle CODE_FOR_avx_vinsertf128v4di,
17125         CODE_FOR_avx_vextractf128v4di.
17126         (ix86_expand_args_builtin): Handle CODE_FOR_avx512dq_vinsertf32x8_mask,
17127         CODE_FOR_avx512dq_vinserti32x8_mask, CODE_FOR_avx512vl_vinsertv4df,
17128         CODE_FOR_avx512vl_vinsertv4di, CODE_FOR_avx512vl_vinsertv8sf,
17129         CODE_FOR_avx512vl_vinsertv8si.
17130         * config/i386/sse.md
17131         (define_expand
17132         "<extract_type>_vinsert<shuffletype><extract_suf>_mask"): Use
17133         AVX512_VEC mode iterator.
17134         (define_insn
17135         "<mask_codefor><extract_type>_vinsert<shuffletype><extract_suf>_1<mask_name>"):
17136         Ditto.
17137         (define_expand
17138         "<extract_type_2>_vinsert<shuffletype><extract_suf_2>_mask"): Use
17139         AVX512_VEC_2 mode iterator.
17140         (define_insn "vec_set_lo_<mode><mask_name>"): New.
17141         (define_insn "vec_set_hi_<mode><mask_name>"): Ditto.
17142         (define_expand "avx512vl_vinsert<mode>"): Ditto.
17143         (define_insn "avx2_vec_set_lo_v4di"): Delete.
17144         (define_insn "avx2_vec_set_hi_v4di"): Ditto.
17145         (define_insn "vec_set_lo_<mode><mask_name>"): Add masking.
17146         (define_insn "vec_set_hi_<mode><mask_name>"): Ditto.
17147         (define_insn "vec_set_lo_<mode><mask_name>"): Ditto.
17148         (define_insn "vec_set_hi_<mode><mask_name>"): Ditto.
17149         (define_expand "avx2_extracti128"): Delete.
17150         (define_expand "avx2_inserti128"): Ditto.
17152 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17153             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17154             Anna Tikhonova  <anna.tikhonova@intel.com>
17155             Ilya Tocar  <ilya.tocar@intel.com>
17156             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17157             Ilya Verbin  <ilya.verbin@intel.com>
17158             Kirill Yukhin  <kirill.yukhin@intel.com>
17159             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17161         * config/i386/sse.md
17162         (define_insn "avx2_<code>v16qiv16hi2<mask_name>"): Add masking.
17163         (define_insn "avx512bw_<code>v32qiv32hi2<mask_name>"): New.
17164         (define_insn "sse4_1_<code>v8qiv8hi2<mask_name>"): Add masking.
17165         (define_insn "avx2_<code>v8qiv8si2<mask_name>"): Ditto.
17166         (define_insn "sse4_1_<code>v4qiv4si2<mask_name>"): Ditto.
17167         (define_insn "avx2_<code>v8hiv8si2<mask_name>"): Ditto.
17168         (define_insn "sse4_1_<code>v4hiv4si2<mask_name>"): Ditto.
17169         (define_insn "avx2_<code>v4qiv4di2<mask_name>"): Ditto.
17170         (define_insn "sse4_1_<code>v2qiv2di2<mask_name>"): Ditto.
17171         (define_insn "avx2_<code>v4hiv4di2<mask_name>"): Ditto.
17172         (define_insn "sse4_1_<code>v2hiv2di2<mask_name>"): Ditto.
17173         (define_insn "avx2_<code>v4siv4di2<mask_name>"): Ditto.
17174         (define_insn "sse4_1_<code>v2siv2di2<mask_name>"): Ditto.
17176 2014-09-24  Zhenqiang Chen  <zhenqiang.chen@arm.com>
17178         PR rtl-optimization/63210
17179         * ira-color.c (assign_hard_reg): Ignore conflict cost if the
17180         HARD_REGNO is not available for CONFLICT_A.
17182 2014-09-23  Andi Kleen  <ak@linux.intel.com>
17184         * cgraph.h (symtab_node): Add no_reorder attribute.
17185         (symbol_table::output_asm_statements): Remove.
17186         * cgraphclones.c (cgraph_node::create_clone): Copy no_reorder.
17187         (cgraph_node::create_version_clone): Dito.
17188         (symbol_table::output_asm_statements): Remove.
17189         * trans-mem.c (ipa_tm_create_version_alias): Dito.
17190         * cgraphunit.c (varpool_node::finalize_decl): Check no_reorder.
17191         (output_in_order): Add no_reorder flag. Only handle no_reorder
17192         nodes when set.
17193         (symbol_table::compile): Add separate pass for no_reorder nodes.
17194         (process_common_attributes): Set no_reorder flag in symtab node.
17195         Add node argument.
17196         (process_function_and_variable_attributes): Pass symtab nodes to
17197         process_common_attributes.
17198         * doc/extend.texi (no_reorder): Document no_reorder attribute.
17199         * lto-cgraph.c (lto_output_node): Serialize no_reorder.
17200         (lto_output_varpool_node): Dito.
17201         (input_overwrite_node): Dito.
17202         (input_varpool_node): Dito.
17203         * varpool.c (varpool_node::add): Set no_reorder attribute.
17204         (symbol_table::remove_unreferenced_decls): Handle no_reorder.
17205         (symbol_table::output_variables): Dito.
17206         * symtab.c (symtab_node::dump_base): Print no_reorder.
17208 2014-09-23  Jiong Wang  <jiong.wang@arm.com>
17210         * shrink-wrap.c (try_shrink_wrapping): Check PIC_OFFSET_TABLE_REGNUM
17211         not be INVALID_REGNUM.
17213 2014-09-23  Thomas Schwinge  <thomas@codesourcery.com>
17215         * configure: Regenerate.
17217 2014-09-23  Alan Lawrence  <alan.lawrence@arm.com>
17219         * combine.c (simplify_shift_const_1): Allow commuting (ashiftrt (xor))
17220         when result_mode == shift_mode.
17222 2014-09-23  Kostya Serebryany  <kcc@google.com>
17224         Update to match the changed asan API.
17225         * asan.c (asan_global_struct): Update the __asan_global definition
17226         to match the new API.
17227         (asan_add_global): Ditto.
17228         * sanitizer.def (BUILT_IN_ASAN_INIT): Rename __asan_init_v3
17229         to __asan_init_v4.
17231 2014-09-23  Michael Meissner  <meissner@linux.vnet.ibm.com>
17233         * config/rs6000/rs6000.md (f32_vsx): New mode attributes to
17234         refine the constraints used on 32/64-bit floating point moves.
17235         (f32_av): Likewise.
17236         (f64_vsx): Likewise.
17237         (f64_dm): Likewise.
17238         (f64_av): Likewise.
17239         (BOOL_REGS_OUTPUT): Use wt constraint for TImode instead of wa.
17240         (BOOL_REGS_OP1): Likewise.
17241         (BOOL_REGS_OP2): Likewise.
17242         (BOOL_REGS_UNARY): Likewise.
17243         (mov<mode>_hardfloat, SFmode/SDmode): Tighten down constraints for
17244         32/64-bit floating point moves.  Do not use wa, instead use ww/ws
17245         for moves involving VSX registers.  Do not use constraints that
17246         target VSX registers for decimal types.
17247         (mov<mode>_hardfloat32, DFmode/DDmode): Likewise.
17248         (mov<mode>_hardfloat64, DFmode/DDmode): Likewise.
17250 2014-09-23  Jan Hubicka  <hubicka@ucw.cz>
17252         * tree.h (int_bit_position): Turn into inline function;
17253         implement using wide int.
17254         * tree.c (int_bit_position): Remove.
17256 2014-09-23  Richard Sandiford  <richard.sandiford@arm.com>
17258         PR bootstrap/63280
17259         * target-globals.c (target_globals::~target_globals): Fix location
17260         of ira_int destruction.
17262 2014-09-23  Renlin Li  <renlin.li@arm.com>
17264         * config/aarch64/aarch64.md (return): New.
17265         (simple_return): Likewise.
17266         * config/aarch64/aarch64.c (aarch64_use_return_insn_p): New.
17267         * config/aarch64/aarch64-protos.h (aarch64_use_return_insn_p): New.
17269 2014-09-23  Wilco Dijkstra  <wdijkstr@arm.com>
17271         * common/config/aarch64/aarch64-common.c:
17272         (default_options aarch_option_optimization_table):
17273         Default to -fsched-pressure.
17275 2014-09-23  Ilya Enkovich  <ilya.enkovich@intel.com>
17277         * cfgcleanup.c (try_optimize_cfg): Do not remove label
17278         with LABEL_PRESERVE_P flag set.
17280 2014-09-23  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17281             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17282             Anna Tikhonova  <anna.tikhonova@intel.com>
17283             Ilya Tocar  <ilya.tocar@intel.com>
17284             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17285             Ilya Verbin  <ilya.verbin@intel.com>
17286             Kirill Yukhin  <kirill.yukhin@intel.com>
17287             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17289         * config/i386/sse.md
17290         (define_expand "avx_shufpd256<mask_expand4_name>"): Add masking.
17291         (define_insn "avx_shufpd256_1<mask_name>"): Ditto.
17292         (define_expand "sse2_shufpd<mask_expand4_name>"): Ditto.
17293         (define_insn "sse2_shufpd_v2df_mask"): New.
17295 2014-09-23  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17296             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17297             Anna Tikhonova  <anna.tikhonova@intel.com>
17298             Ilya Tocar  <ilya.tocar@intel.com>
17299             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17300             Ilya Verbin  <ilya.verbin@intel.com>
17301             Kirill Yukhin  <kirill.yukhin@intel.com>
17302             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17304         * config/i386/sse.md
17305         (define_expand "avx_shufps256<mask_expand4_name>"): Add masking.
17306         (define_insn "avx_shufps256_1<mask_name>"): Ditto.
17307         (define_expand "sse_shufps<mask_expand4_name>"): Ditto.
17308         (define_insn "sse_shufps_v4sf_mask"): New.
17310 2014-09-23  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17311             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17312             Anna Tikhonova  <anna.tikhonova@intel.com>
17313             Ilya Tocar  <ilya.tocar@intel.com>
17314             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17315             Ilya Verbin  <ilya.verbin@intel.com>
17316             Kirill Yukhin  <kirill.yukhin@intel.com>
17317             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17319         * config/i386/sse.md
17320         (define_insn "avx_unpckhps256<mask_name>"): Add masking.
17321         (define_insn "vec_interleave_highv4sf<mask_name>"): Ditto.
17322         (define_insn "avx_unpcklps256<mask_name>"): Ditto.
17323         (define_insn "unpcklps128_mask"): New.
17325 2014-09-23  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17326             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17327             Anna Tikhonova  <anna.tikhonova@intel.com>
17328             Ilya Tocar  <ilya.tocar@intel.com>
17329             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17330             Ilya Verbin  <ilya.verbin@intel.com>
17331             Kirill Yukhin  <kirill.yukhin@intel.com>
17332             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17334         * config/i386/sse.md
17335         (define_insn "avx_unpckhpd256<mask_name>"): Add masking.
17336         (define_insn "avx512vl_unpckhpd128_mask"): New.
17337         (define_expand "avx_movddup256<mask_name>"): Add masking.
17338         (define_expand "avx_unpcklpd256<mask_name>"): Ditto.
17339         (define_insn "*avx_unpcklpd256<mask_name>"): Ditto.
17340         (define_insn "avx512vl_unpcklpd128_mask"): New.
17342 2014-09-22  Joseph Myers  <joseph@codesourcery.com>
17344         * doc/tm.texi.in (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17345         * doc/tm.texi: Regenerate.
17346         * system.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Poison.
17347         * config/alpha/alpha.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17348         * config/i386/i386-interix.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE):
17349         Remove.
17350         * config/i386/i386.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17351         * config/i386/rtemself.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17352         * config/ia64/ia64.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17353         * config/m68k/m68k.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17354         * config/m68k/netbsd-elf.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE):
17355         Remove.
17356         * config/mips/mips.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17357         * config/mips/n32-elf.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17358         * config/msp430/msp430.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17359         * config/rl78/rl78.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17360         * config/rs6000/rs6000.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17361         * config/rx/rx.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17362         * config/s390/s390.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17363         * config/sparc/freebsd.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17364         * config/sparc/linux.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17365         * config/sparc/linux64.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17366         * config/sparc/netbsd-elf.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE):
17367         Remove.
17369 2014-09-22  Jan Hubicka  <hubicka@ucw.cz>
17371         * tree-ssa-ccp.c (prop_value_d): Rename to ...
17372         (ccp_prop_value_t): ... this one to avoid ODR violation; update uses.
17373         * ipa-prop.c (struct type_change_info): Rename to ...
17374         (prop_type_change_info): ... this; update uses.
17375         * ggc-page.c (globals): Rename to ...
17376         (static struct ggc_globals): ... this; update uses.
17377         * tree-ssa-loop-im.c (mem_ref): Rename to ...
17378         (im_mem_ref): ... this; update uses.
17379         * ggc-common.c (loc_descriptor): Rename to ...
17380         (ggc_loc_descriptor): ... this; update uses.
17381         * lra-eliminations.c (elim_table): Rename to ...
17382         (lra_elim_table): ... this; update uses.
17383         * bitmap.c (output_info): Rename to ...
17384         (bitmap_output_info): ... this; update uses.
17385         * gcse.c (expr): Rename to ...
17386         (gcse_expr) ... this; update uses.
17387         (occr): Rename to ...
17388         (gcse_occr): .. this; update uses.
17389         * tree-ssa-copy.c (prop_value_d): Rename to ...
17390         (prop_value_t): ... this.
17391         * predict.c (block_info_def): Rename to ...
17392         (block_info): ... this; update uses.
17393         (edge_info_def): Rename to ...
17394         (edge_info): ... this; update uses.
17395         * profile.c (bb_info): Rename to ...
17396         (bb_profile_info): ... this; update uses.
17397         * alloc-pool.c (output_info): Rename to ...
17398         (pool_output_info): ... this; update uses.
17399         * ipa-cp.c (topo_info): Rename to ..
17400         (ipa_topo_info): ... this; update uses.
17401         * tree-nrv.c (nrv_data): Rename to ...
17402         (nrv_data_t): ... this; update uses.
17403         * ipa-split.c (bb_info): Rename to ...
17404         (split_bb_info): ... this one.
17405         * profile.h (edge_info): Rename to ...
17406         (edge_profile_info): ... this one; update uses.
17407         * dse.c (bb_info): Rename to ...
17408         (dse_bb_info): ... this one; update uses.
17409         * cprop.c (occr): Rename to ...
17410         (cprop_occr): ... this one; update uses.
17411         (expr): Rename to ...
17412         (cprop_expr): ... this one; update uses.
17414 2014-09-22  Jason Merrill  <jason@redhat.com>
17416         * Makefile.in (check-parallel-%): Add @.
17418 2014-09-22  James Greenhalgh  <james.greenhalgh@arm.com>
17420         * config/aarch64/geniterators.sh: New.
17421         * config/aarch64/iterators.md (VDQF_DF): New.
17422         * config/aarch64/t-aarch64: Generate aarch64-builtin-iterators.h.
17423         * config/aarch64/aarch64-builtins.c (BUILTIN_*) Remove.
17425 2014-09-22  Peter A. Bigot  <pab@pabigot.com>
17427         * config/msp430/msp430.h (LIB_SPEC): Remove automatic addition of
17428         -lnosys when -msim absent.
17430 2014-09-22  Alan Lawrence  <alan.lawrence@arm.com>
17432         * fold-const.c (tree_swap_operands_p): Strip only sign-preserving NOPs.
17434 2014-09-22  Richard Biener  <rguenther@suse.de>
17436         * gimplify.c (gimplify_init_constructor): Do not leave
17437         non-GIMPLE vector constructors around.
17438         * tree-cfg.c (verify_gimple_assign_single): Verify that
17439         CONSTRUCTORs have gimple elements.
17441 2014-09-22  Jakub Jelinek  <jakub@redhat.com>
17443         PR debug/63328
17444         * omp-low.c (ipa_simd_modify_stmt_ops): For debug stmts
17445         insert a debug source bind stmt setting DEBUG_EXPR_DECL
17446         instead of a normal gimple assignment stmt.
17448 2014-09-22  James Greenhalgh  <james.greenhalgh@arm.com>
17450         * config/bfin/bfin.md: Fix use of constraints in define_split.
17452 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17454         * config/i386/i386.c (ix86_cannot_change_mode_class): Remove
17455         GET_MODE_SIZE (to) < GET_MODE_SIZE (from) test.
17457 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17459         * hard-reg-set.h: Include hash-table.h.
17460         (target_hard_regs): Add a finalize method and a x_simplifiable_subregs
17461         field.
17462         * target-globals.c (target_globals::~target_globals): Call
17463         hard_regs->finalize.
17464         * rtl.h (subreg_shape): New structure.
17465         (shape_of_subreg): New function.
17466         (simplifiable_subregs): Declare.
17467         * reginfo.c (simplifiable_subreg): New structure.
17468         (simplifiable_subregs_hasher): Likewise.
17469         (simplifiable_subregs): New function.
17470         (invalid_mode_changes): Delete.
17471         (alid_mode_changes, valid_mode_changes_obstack): New variables.
17472         (record_subregs_of_mode): Remove subregs_of_mode parameter.
17473         Record valid mode changes in valid_mode_changes.
17474         (find_subregs_of_mode): Remove subregs_of_mode parameter.
17475         Update calls to record_subregs_of_mode.
17476         (init_subregs_of_mode): Remove invalid_mode_changes and bitmap
17477         handling.  Initialize new variables.  Update call to
17478         find_subregs_of_mode.
17479         (invalid_mode_change_p): Check new variables instead of
17480         invalid_mode_changes.
17481         (finish_subregs_of_mode): Finalize new variables instead of
17482         invalid_mode_changes.
17483         (target_hard_regs::finalize): New function.
17484         * ira-costs.c (print_allocno_costs): Call invalid_mode_change_p
17485         even when CLASS_CANNOT_CHANGE_MODE is undefined.
17487 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17489         * combine.c (subst): Use simplify_subreg_regno rather than
17490         REG_CANNOT_CHANGE_MODE_P to detect invalid mode changes.
17492 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17494         * rtl.h (subreg_info): Expand commentary
17495         * rtlanal.c (subreg_get_info): Likewise.
17497 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17499         * hard-reg-set.h (COPY_HARD_REG_SET, COMPL_HARD_REG_SET)
17500         (AND_HARD_REG_SET, AND_COMPL_HARD_REG_SET, IOR_HARD_REG_SET)
17501         (IOR_COMPL_HARD_REG_SET): Allow the "from" set to be constant.
17503 2014-09-22  Zhenqiang Chen  <zhenqiang.chen@arm.com>
17505         * config/arm/arm.c: #include "tm-constrs.h"
17506         (thumb1_size_rtx_costs): Adjust rtx costs.
17508 2014-09-22  Hans-Peter Nilsson  <hp@axis.com>
17510         * configure.ac (target_header_dir): Move block defining
17511         this to before the block setting inhibit_libc.
17512         (inhibit_libc): When considering $with_headers, just
17513         check it it's explicitly "no".  If not, also check if
17514         $target_header_dir/stdio.h is present.  If not, set
17515         inhibit_libc=true.
17516         * configure: Regenerate.
17518 2014-09-21  Patrick Oppenlander  <pattyo.lists@gmail.com>
17520         * config/rs6000/t-spe (MULTILIB_EXCEPTIONS): Allow isel without SPE.
17522 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17524         * config/rs6000/rs6000.md (div<mode>3): Fix comment.  Use a different
17525         insn for divides by integer powers of two.
17526         (div<mode>3_sra, *div<mode>3_sra_dot, *div<mode>3_sra_dot2): New.
17527         (mod<mode>3): Fix formatting.
17528         (three anonymous define_insn and two define_split): Delete.
17530 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17532         * config/rs6000/rs6000.md (ashr<mode>3, *ashr<mode>3, *ashrsi3_64,
17533         *ashr<mode>3_dot, *ashr<mode>3_dot2): Clobber CA_REGNO.
17534         (floatdisf2_internal2): Ditto.
17535         (ashrdi3_no_power): Ditto.  Fix formatting.
17537 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17539         * config/rs6000/rs6000.md (ctz<mode>2, ffs<mode>2, popcount<mode>2,
17540         popcntb<mode>2, popcntd<mode>2, parity<mode>2, parity<mode>2_cmpb):
17541         Tidy.
17543 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17545         * config/rs6000/rs6000.md (strlensi): Don't use subsi3 with a
17546         constant, use addsi3 directly.
17547         (three anonymous define_insn, two define_split): Delete.
17548         (sub<mode>3): Move.  Do not allow constant second operand.
17549         Generate different insn for constant first operand.
17550         (*subf<mode>3, *subf<mode>3_dot, *subf<mode>3_dot2): New.
17551         (subf<mode>3_imm): New.
17552         (ctz<mode>2, ffs<mode>2): Clobber CA_REGNO where required.
17553         (*plus_ltu<mode>): Only handle registers.
17554         (*plus_ltu<mode>_1): New.  Handle integer third operand.
17555         (*plus_gtu<mode>): Only handle registers.
17556         (*plus_gtu<mode>_1): New.  Handle integer third operand.
17558 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17560         * config/rs6000/rs6000.md (iorxor): New code_iterator.
17561         (iorxor): New code_attr.
17562         (IORXOR): New code_attr.
17563         (*and<mode>3, *and<mode>3_dot, *and<mode>3_dot2): Delete.
17564         (ior<mode>3, xor<mode>3): Delete.
17565         (<iorxor><mode>3): New.
17566         (splitter for "big" integer ior, xor): New.
17567         (*bool<mode>3): Move.  Also handle AND.
17568         (*bool<mode>3_dot, *bool<mode>3_dot2): Also handle AND.
17569         (splitter for "big" integer ior, xor): Delete.
17571 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17573         * config/rs6000/rs6000.md (*neg<mode>2_internal): Delete.
17574         (two anonymous define_insn and two define_split): Delete.
17575         (*neg<mode>2, *neg<mode>2_dot, *neg<mode>2_dot2): New.
17577 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17579         * config/rs6000/rs6000.md (*one_cmpl<mode>2): Generate "not" insn.
17580         (two anonymous define_insn and two define_split): Delete.
17581         (*one_cmpl<mode>2_dot, *one_cmpl<mode>2_dot2): New.
17583 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17585         * config/rs6000/rs6000.c (rs6000_rtx_costs) <NE>: New.
17587 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17589         * config/rs6000/predicates.md (ca_operand): Allow subregs.
17590         (input_operand): Do not allow ca_operand.
17591         * config/rs6000/rs6000.c (rs6000_hard_regno_mode_ok): For the
17592         carry bit, allow SImode and Pmode.
17593         (rs6000_init_hard_regno_mode_ok): Make the carry bit class NO_REGS.
17595 2014-09-21  Uros Bizjak  <ubizjak@gmail.com>
17597         * config/i386/i386.c (ix86_expand_call): Generate MS->SYSV extra
17598         clobbered registers using clobber_reg.  Remove UNSPEC decoration.
17599         * config/i386/i386.md (unspec) <UNSPEC_MS_TO_SYSV_CALL>: Remove.
17600         (*call_rex64_ms_sysv): Remove.
17601         (*call_value_rex64_ms_sysv): Ditto.
17602         * config/i386/predicates.md (call_rex64_ms_sysv_operation): Remove.
17604 2014-09-20  Joern Rennecke  <joern.rennecke@embecosm.com>
17606         * config/epiphany/epiphany.md (sub_f_add_imm): Change constraint of
17607         operand 3 to "CnL".
17609 2014-09-20  Andreas Schwab  <schwab@suse.de>
17611         * config/ia64/ia64.md: Remove constraints from define_split
17612         patterns.
17614 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17616         * ipa-utils.h (ipa_polymorphic_call_context): Turn into class;
17617         add ctors.
17618         (possible_polymorphic_call_targets,
17619         dump_possible_polymorphic_call_targets,
17620         possible_polymorphic_call_target_p,
17621         possible_polymorphic_call_target_p): Simplify.
17622         (get_dynamic_type): Remove.
17623         * ipa-devirt.c (ipa_dummy_polymorphic_call_context): Remove.
17624         (clear_speculation): Bring to ipa-deivrt.h
17625         (get_class_context): Rename to ...
17626         (ipa_polymorphic_call_context::restrict_to_inner_class): ... this one.
17627         (contains_type_p): Update.
17628         (get_dynamic_type): Rename to ...
17629         ipa_polymorphic_call_context::get_dynamic_type(): ... this one.
17630         (possible_polymorphic_call_targets): UPdate.
17631         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children): Update.
17632         * ipa-prop.c (ipa_analyze_call_uses): Update.
17634 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17636         * ipa-visibility.c (varpool_node::externally_visible_p): Do not
17637         privatize dynamic TLS variables.
17639 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17641         * diagnostic.c (warning_n): New function.
17642         * diagnostic-core.h (warning_n): Declare.
17643         * ipa-devirt.c (ipa_devirt): Handle singulars correctly;
17644         output dynamic counts when available.
17646 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17648         PR tree-optimization/63255
17649         * ipa.c (symbol_table::remove_unreachable_nodes): Fix ordering
17650         issue in setting body_removed flag.
17652 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17654         PR c++/61825
17655         * c-family/c-common.c (handle_alias_ifunc_attribute): Check
17656         that visibility change is possible
17657         (handle_weakref_attribute): Likewise.
17658         * cgraph.h (symtab_node): Add method get_create and
17659         field refuse_visibility_changes.
17660         (symtab_node::get_create): New method.
17661         * fold-const.c (tree_single_nonzero_warnv_p): Use get_create.
17662         * varasm.c (mark_weak): Verify that visibility change is possible.
17664 2014-09-19  Michael Meissner  <meissner@linux.vnet.ibm.com>
17666         * config/rs6000/predicates.md (fusion_gpr_mem_load): Move testing
17667         for base_reg_operand to be common between LO_SUM and PLUS.
17668         (fusion_gpr_mem_combo): New predicate to match a fused address
17669         that combines the addis and memory offset address.
17671         * config/rs6000/rs6000-protos.h (fusion_gpr_load_p): Change
17672         calling signature.
17673         (emit_fusion_gpr_load): Likewise.
17675         * config/rs6000/rs6000.c (fusion_gpr_load_p): Change calling
17676         signature to pass each argument separately, rather than
17677         using an operands array.  Rewrite the insns found by peephole2 to
17678         be a single insn, rather than hoping the insns will still be
17679         together when the peephole pass is done.  Drop being called via a
17680         normal peephole.
17681         (emit_fusion_gpr_load): Change calling signature to be called from
17682         the fusion_gpr_load_<mode> insns with a combined memory address
17683         instead of the peephole pass passing the addis and offset
17684         separately.
17686         * config/rs6000/rs6000.md (UNSPEC_FUSION_GPR): New unspec for GPR
17687         fusion.
17688         (power8 fusion peephole): Drop support for doing power8 via a
17689         normal peephole that was created by the peephole2 pass.
17690         (power8 fusion peephole2): Create a new insn with the fused
17691         address, so that the fused operation is kept together after
17692         register allocation is done.
17693         (fusion_gpr_load_<mode>): Likewise.
17695 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17697         PR lto/63286
17698         * tree.c (need_assembler_name_p): Do not mangle variadic types.
17700 2014-09-19  Segher Boessenkool  <segher@kernel.crashing.org>
17702         * recog.c (scratch_operand): Do not simply allow all hard registers:
17703         only allow those that are allocatable.
17705 2014-09-19  Felix Yang  <felix.yang@huawei.com>
17707         * cfgrtl.c ira.c ira-color.c ira-conflicts ira-lives.c: Update
17708         comments and fix spacing to conform to coding style.
17710 2014-09-19  James Greenhalgh  <james.greenhalgh@arm.com>
17712         * genrecog.c (validate_pattern): Allow empty constraints in
17713         a match_scratch.
17715 2014-09-19  Aldy Hernandez  <aldyh@redhat.com>
17717         * dwarf2out.c (decl_ultimate_origin): Update comment.
17718         * tree.c (block_ultimate_origin): Same.
17720 2014-09-19  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
17722         * config/rs6000/rs6000.c (rs6000_special_adjust_field_align_p):
17723         Update GCC version name to GCC 5.
17724         (rs6000_function_arg_boundary): Likewise.
17725         (rs6000_function_arg): Likewise.
17727 2014-09-19  James Greenhalgh  <james.greenhalgh@arm.com>
17729         * config/sh/sh.md: Fix use of constraints in define_split.
17731 2014-09-19  Markus Trippelsdorf  <markus@trippelsdorf.de>
17733         PR ipa/61998
17734         * ipa-devirt.c (ipa_devirt): Bail out if odr_types_ptr is NULL.
17736 2014-09-19  James Greenhalgh  <james.greenhalgh@arm.com>
17738         * doc/md.texi (Modifiers): Consistently use "read/write"
17739         nomenclature rather than "input/output".
17740         * genrecog.c (constraints_supported_in_insn_p): New.
17741         (validate_pattern): If needed, also check constraints on
17742         MATCH_SCRATCH operands.
17743         * genoutput.c (validate_insn_alternatives): Catch earlyclobber
17744         operands with no '=' or '+' modifier.
17746 2014-09-19  James Greenhalgh  <james.greenhalgh@arm.com>
17748         * config/aarch64/aarch64.md (stack_protect_test_<mode>): Mark
17749         scratch register as written.
17751 2014-09-19  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
17753         * config/s390/s390.c (s390_emit_epilogue): Remove bogus
17754         assignment.
17756 2014-09-19  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
17758         * config/s390/s390.md ("trunctdsd2", "extendsdtd2"): New
17759         expanders.
17761 2014-09-19  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
17763         PR target/62662
17764         * config/s390/s390.c (s390_emit_epilogue): When doing the return
17765         address load optimization force s390_optimize_prologue to leave it
17766         that way.  Only do the optimization if we already decided to push
17767         r14 into a stack slot.
17769 2014-09-19  Marat Zakirov  <m.zakirov@samsung.com>
17771         * asan.c (build_check_stmt): Alignment arg was added.
17772         (asan_expand_check_ifn): Optimization for alignment >= 8.
17774 2014-09-19  Olivier Hainque  <hainque@adacore.com>
17776         * config/i386/vxworksae.h: Remove obsolete definitions.
17777         (STACK_CHECK_PROTECT): Define.
17778         * config/i386/vx-common.h: Remove.  Merge contents within
17779         config/i386/vxworks.h.
17780         * config.gcc (i?86-vxworks*): Use i386/vxworks.h instead of
17781         i386/vx-common.h.
17783 2014-09-19  Olivier Hainque  <hainque@adacore.com>
17785         * config.gcc (powerpc-wrs-vxworksmils): New configuration.
17786         * config/rs6000/t-vxworksmils: New file.
17787         * config/rs6000/vxworksmils.h: New file.
17789 2014-09-19  Olivier Hainque  <hainque@adacore.com>
17791         * varasm.c (default_section_type_flags): Flag .persistent.bss
17792         sections as SECTION_BSS.
17794 2014-09-19  Nick Clifton  <nickc@redhat.com>
17796         * config/rl78/rl78.c (rl78_expand_epilogue): Generate a USE of the
17797         pop'ed registers so that DCE does not eliminate them.
17799 2014-09-18  Jan Hubicka  <hubicka@ucw.cz>
17801         PR lto/63298
17802         * ipa-devirt.c (odr_subtypes_equivalent_p): Fix thinko in a condition.
17804 2014-09-18  Joseph Myers  <joseph@codesourcery.com>
17806         * system.h (LIBGCC2_TF_CEXT): Poison.
17807         * config/i386/cygming.h (LIBGCC2_TF_CEXT): Remove.
17808         * config/i386/darwin.h (LIBGCC2_TF_CEXT): Likewise.
17809         * config/i386/dragonfly.h (LIBGCC2_TF_CEXT): Likewise.
17810         * config/i386/freebsd.h (LIBGCC2_TF_CEXT): Likewise.
17811         * config/i386/gnu-user-common.h (LIBGCC2_TF_CEXT): Likewise.
17812         * config/i386/openbsdelf.h (LIBGCC2_TF_CEXT): Likewise.
17813         * config/i386/sol2.h (LIBGCC2_TF_CEXT): Likewise.
17814         * config/ia64/ia64.h (LIBGCC2_TF_CEXT): Likewise.
17815         * config/ia64/linux.h (LIBGCC2_TF_CEXT): Likewise.
17817 2014-09-19  Kito Cheng  <kito@0xlab.org>
17819         * except.h: Fix header guard.
17820         * addresses.h: Add missing header guard.
17821         * cfghooks.h: Likewise.
17822         * collect-utils.h: Likewise.
17823         * collect2-aix.h: Likewise.
17824         * conditions.h: Likewise.
17825         * cselib.h: Likewise.
17826         * dwarf2asm.h: Likewise.
17827         * graphds.h: Likewise.
17828         * graphite-scop-detection.h: Likewise.
17829         * gsyms.h: Likewise.
17830         * hw-doloop.h: Likewise.
17831         * incpath.h: Likewise.
17832         * ipa-inline.h: Likewise.
17833         * ipa-ref.h: Likewise.
17834         * ira-int.h: Likewise.
17835         * ira.h: Likewise.
17836         * lra-int.h: Likewise.
17837         * lra.h: Likewise.
17838         * lto-section-names.h: Likewise.
17839         * read-md.h: Likewise.
17840         * reload.h: Likewise.
17841         * rtl-error.h: Likewise.
17842         * sdbout.h: Likewise.
17843         * targhooks.h: Likewise.
17844         * tree-affine.h: Likewise.
17845         * xcoff.h: Likewise.
17846         * xcoffout.h: Likewise.
17848 2014-09-18  Vladimir Makarov  <vmakarov@redhat.com>
17850         PR debug/63285
17851         * haifa-sched.c (schedule_block): Advance cycle at the end of BB
17852         if advance != 0.
17854 2014-09-18  Vladimir Makarov  <vmakarov@redhat.com>
17856         PR target/61360
17857         * lra.c (lra): Call recog_init.
17859 2014-09-18  Jakub Jelinek  <jakub@redhat.com>
17861         PR c++/62017
17862         * asan.c (transform_statements): Don't instrument clobber statements.
17864 2014-09-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
17866         * config/arm/neon.md (*movmisalign<mode>_neon_load): Change type
17867         to neon_load1_1reg<q>.
17869 2014-09-17  Jakub Jelinek  <jakub@redhat.com>
17871         PR debug/63284
17872         * tree-cfgcleanup.c (fixup_noreturn_call): Don't split block
17873         if there are only debug stmts after the noreturn call, instead
17874         remove the debug stmts.
17876 2014-09-17  Jan Hubicka  <hubicka@ucw.cz>
17878         * ipa-devirt.c (type_pair, default_hashset_traits): New types.
17879         (odr_types_equivalent_p): Use pair hash.
17880         (odr_subtypes_equivalent_p): Likewise, do structural compare
17881         on ODR types that may be mismatched.
17882         (warn_odr): Support warning when only one field is given.
17883         (odr_types_equivalent_p): Strenghten comparsions made;
17884         support VOIDtype.
17885         (add_type_duplicate): Update VISITED hash set.
17887 2014-09-17  Sebastian Huber  <sebastian.huber@embedded-brains.de>
17889         * config.gcc (*-*-rtems*): Default to 'rtems' thread model.
17890         Enable selection of 'posix' or no thread model.
17892 2014-09-17  Andrew Stubbs  <ams@codesourcery.com>
17894         * config/arm/arm.c (arm_option_override): Reject -mfpu=neon
17895         when architecture is older than ARMv7.
17897 2014-09-16  John David Anglin  <danglin@gcc.gnu.org>
17899         PR target/61853
17900         * config/pa/pa.c (pa_function_value): Directly handle aggregates
17901         that fit exactly in a word or double word.
17903 2014-09-16  Ilya Tocar  <ilya.tocar@intel.com>
17905         * config/i386/driver-i386.c (host_detect_local_cpu): Detect lack of
17906         zmm/k regs support.
17908 2014-09-16  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17909             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17910             Anna Tikhonova  <anna.tikhonova@intel.com>
17911             Ilya Tocar  <ilya.tocar@intel.com>
17912             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17913             Ilya Verbin  <ilya.verbin@intel.com>
17914             Kirill Yukhin  <kirill.yukhin@intel.com>
17915             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17917         * config/i386/i386.c
17918         (ix86_expand_vector_extract): Handle V32HI and V64QI modes.
17919         * config/i386/sse.md
17920         (define_mode_iterator VI48F_256): New.
17921         (define_mode_attr extract_type): Ditto.
17922         (define_mode_attr extract_suf): Ditto.
17923         (define_mode_iterator AVX512_VEC): Ditto.
17924         (define_expand
17925         "<extract_type>_vextract<shuffletype><extract_suf>_mask"): Use
17926         AVX512_VEC.
17927         (define_insn "avx512dq_vextract<shuffletype>64x2_1_maskm"): New.
17928         (define_insn
17929         "<mask_codefor>avx512dq_vextract<shuffletype>64x2_1<mask_name>"):
17930         Ditto.
17931         (define_mode_attr extract_type_2): Ditto.
17932         (define_mode_attr extract_suf_2): Ditto.
17933         (define_mode_iterator AVX512_VEC_2): Ditto.
17934         (define_expand
17935         "<extract_type_2>_vextract<shuffletype><extract_suf_2>_mask"): Use
17936         AVX512_VEC_2 mode iterator.
17937         (define_insn "vec_extract_hi_<mode>_maskm"): Ditto.
17938         (define_expand "avx512vl_vextractf128<mode>"): Ditto.
17939         (define_insn_and_split "vec_extract_lo_<mode>"): Delete.
17940         (define_insn "vec_extract_lo_<mode><mask_name>"): New.
17941         (define_split for V16FI mode): Ditto.
17942         (define_insn_and_split "vec_extract_lo_<mode>"): Delete.
17943         (define_insn "vec_extract_lo_<mode><mask_name>"): New.
17944         (define_split for VI8F_256 mode): Ditto.
17945         (define_insn "vec_extract_hi_<mode><mask_name>"): Add masking.
17946         (define_insn_and_split "vec_extract_lo_<mode>"): Delete.
17947         (define_insn "vec_extract_lo_<mode><mask_name>"): New.
17948         (define_split for VI4F_256 mode): Ditto.
17949         (define_insn "vec_extract_lo_<mode>_maskm"): Ditto.
17950         (define_insn "vec_extract_hi_<mode>_maskm"): Ditto.
17951         (define_insn "vec_extract_hi_<mode><mask_name>"): Add masking.
17952         (define_mode_iterator VEC_EXTRACT_MODE): Add V64QI and V32HI modes.
17953         (define_insn "vcvtph2ps<mask_name>"): Fix pattern condition.
17954         (define_insn "avx512f_vextract<shuffletype>32x4_1_maskm"): Ditto.
17955         (define_insn "<mask_codefor>avx512f_vextract<shuffletype>32x4_1<mask_name>"):
17956         Update `type' attribute, remove explicit `memory' attribute calculation.
17958 2014-09-16  Kito Cheng  <kito@0xlab.org>
17960         * ira.c (ira): Don't initialize ira_spilled_reg_stack_slots and
17961         ira_spilled_reg_stack_slots_num if using lra.
17962         (do_reload): Remove release ira_spilled_reg_stack_slots part.
17963         * ira-color.c (ira_sort_regnos_for_alter_reg): Add assertion to
17964         make sure not using lra.
17965         (ira_reuse_stack_slot): Likewise.
17966         (ira_mark_new_stack_slot): Likewise.
17968 2014-09-15  Andi Kleen  <ak@linux.intel.com>
17970         * function.c (allocate_struct_function): Force
17971         DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT to one when
17972         profiling is disabled.
17974 2014-09-15  Trevor Saunders  <tsaunders@mozilla.com>
17976         * cfgrtl.c, combine.c, config/arc/arc.c, config/mcore/mcore.c,
17977         config/rs6000/rs6000.c, config/sh/sh.c, cprop.c, dwarf2out.c,
17978         emit-rtl.c, final.c, function.c, gcse.c, jump.c, reg-stack.c,
17979         reload1.c, reorg.c, resource.c, sel-sched-ir.c: Replace INSN_DELETED_P
17980         macro with statically checked member functions.
17981         * rtl.h (rtx_insn::deleted): New method.
17982         (rtx_insn::set_deleted): Likewise.
17983         (rtx_insn::set_undeleted): Likewise.
17984         (INSN_DELETED_P): Remove.
17986 2014-09-15  Trevor Saunders  <tsaunders@mozilla.com>
17988         * config/mn10300/mn10300.c (mn10300_insert_setlb_lcc): Assign the
17989         result of emit_jump_insn_before to a new variable.
17990         * jump.c (mark_jump_label): Change the type of insn to rtx_insn *.
17991         (mark_jump_label_1): Likewise.
17992         (mark_jump_label_asm): Likewise.
17993         * reload1.c (gen_reload): Change type of tem to rtx_insn *.
17994         * rtl.h (mark_jump_label): Adjust.
17996 2014-09-15  Jakub Jelinek  <jakub@redhat.com>
17998         * Makefile.in (dg_target_exps): Remove.
17999         (check_gcc_parallelize): Change to just an upper bound number.
18000         (check-%-subtargets): Always print the non-parallelized goals.
18001         (check_p_vars, check_p_comma, check_p_subwork): Remove.
18002         (check_p_count, check_p_numbers0, check_p_numbers1, check_p_numbers2,
18003         check_p_numbers3, check_p_numbers4, check_p_numbers5,
18004         check_p_numbers6): New variables.
18005         (check_p_numbers): Set to sequence from 1 to 9999.
18006         (check_p_subdirs): Set to sequence from 1 to minimum of
18007         $(check_p_count) and either GCC_TEST_PARALLEL_SLOTS env var if set,
18008         or 128.
18009         (check-%, check-parallel-%): Rewritten so that for parallelized
18010         testing each job runs all the *.exp files, with
18011         GCC_RUNTEST_PARALLELIZE_DIR set in environment.
18013 2014-09-15  David Malcolm  <dmalcolm@redhat.com>
18015         * config/arc/arc-protos.h (arc_attr_type): Strengthen param from
18016         rtx to rtx_insn *.
18017         (arc_sets_cc_p): Likewise.
18018         * config/arc/arc.c (arc_print_operand): Use methods of
18019         "final_sequence" for clarity, and to enable strengthening of
18020         locals "jump" and "delay" from rtx to rtx_insn *.
18021         (arc_adjust_insn_length): Strengthen local "prev" from rtx to
18022         rtx_insn *; use method of rtx_sequence for typesafety.
18023         (arc_get_insn_variants): Use insn method of rtx_sequence for
18024         typesafety.
18025         (arc_pad_return): Likewise.
18026         (arc_attr_type): Strengthen param from rtx to rtx_insn *.
18027         (arc_sets_cc_p): Likewise.  Also, convert a GET_CODE check to a
18028         dyn_cast to rtx_sequence *, using insn method for typesafety.
18029         * config/arc/arc.h (ADJUST_INSN_LENGTH): Add checked casts to
18030         rtx_sequence * and use insn method when invoking get_attr_length.
18031         * config/bfin/bfin.c (type_for_anomaly): Strengthen param from rtx
18032         to rtx_insn *.  Replace a GET_CODE check with a dyn_cast to
18033         rtx_sequence *, introducing a local "seq", using its insn method
18034         from typesafety and clarity.
18035         (add_sched_insns_for_speculation): Strengthen local "next" from
18036         rtx to rtx_insn *.
18037         * config/c6x/c6x.c (get_insn_side): Likewise for param "insn".
18038         (predicate_insn): Likewise.
18039         * config/cris/cris-protos.h (cris_notice_update_cc): Likewise for
18040         second param.
18041         * config/cris/cris.c (cris_notice_update_cc): Likewise.
18042         * config/epiphany/epiphany-protos.h
18043         (extern void epiphany_insert_mode_switch_use): Likewise for param
18044         "insn".
18045         (get_attr_sched_use_fpu): Likewise for param.
18046         * config/epiphany/epiphany.c (epiphany_insert_mode_switch_use):
18047         Likewise for param "insn".
18048         * config/epiphany/mode-switch-use.c (insert_uses): Likewise for
18049         param "insn" of "target_insert_mode_switch_use" callback.
18050         * config/frv/frv.c (frv_insn_unit): Likewise for param "insn".
18051         (frv_issues_to_branch_unit_p): Likewise.
18052         (frv_pack_insn_p): Likewise.
18053         (frv_compare_insns): Strengthen locals "insn1" and "insn2" from
18054         const rtx * (i.e. mutable rtx_def * const *) to
18055         rtx_insn * const *.
18056         * config/i386/i386-protos.h (standard_sse_constant_opcode):
18057         Strengthen first param from rtx to rtx_insn *.
18058         (output_fix_trunc): Likewise.
18059         * config/i386/i386.c (standard_sse_constant_opcode): Likewise.
18060         (output_fix_trunc): Likewise.
18061         (core2i7_first_cycle_multipass_filter_ready_try): Likewise for
18062         local "insn".
18063         (min_insn_size): Likewise for param "insn".
18064         (get_mem_group): Likewise.
18065         (is_cmp): Likewise.
18066         (get_insn_path): Likewise.
18067         (get_insn_group): Likewise.
18068         (count_num_restricted): Likewise.
18069         (fits_dispatch_window): Likewise.
18070         (add_insn_window): Likewise.
18071         (add_to_dispatch_window): Likewise.
18072         (debug_insn_dispatch_info_file): Likewise.
18073         * config/m32c/m32c-protos.h (m32c_output_compare): Likewise for
18074         first param.
18075         * config/m32c/m32c.c (m32c_compare_redundant): Likewise for param
18076         "cmp" and local "prev".
18077         (m32c_output_compare): Likewise for param "insn".
18078         * config/m32r/predicates.md (define_predicate "small_insn_p"): Add
18079         a checked cast to rtx_insn * on "op" after we know it's an INSN_P.
18080         (define_predicate "large_insn_p"): Likewise.
18081         * config/m68k/m68k-protos.h (m68k_sched_attr_size): Strengthen
18082         param from rtx to rtx_insn *.
18083         (attr_op_mem m68k_sched_attr_op_mem): Likewise.
18084         * config/m68k/m68k.c (sched_get_attr_size_int): Likewise.
18085         (m68k_sched_attr_size): Likewise.
18086         (sched_get_opxy_mem_type): Likewise for param "insn".
18087         (m68k_sched_attr_op_mem): Likewise.
18088         (sched_mem_operand_p): Likewise.
18089         * config/mep/mep-protos.h (mep_multi_slot): Likewise for param.
18090         * config/mep/mep.c (mep_multi_slot): Likewise.
18091         * config/mips/mips-protos.h (mips_output_sync_loop): Likewise for
18092         first param.
18093         (mips_sync_loop_insns): Likewise.
18094         * config/mips/mips.c (mips_print_operand_punctuation): Use insn
18095         method of "final_sequence" for typesafety.
18096         (mips_process_sync_loop): Strengthen param "insn" from rtx to
18097         rtx_insn *.
18098         (mips_output_sync_loop): Likewise.
18099         (mips_sync_loop_insns): Likewise.
18100         (mips_74k_agen_init): Likewise.
18101         (mips_sched_init): Use NULL rather than NULL_RTX when working with
18102         insns.
18103         * config/nds32/nds32-fp-as-gp.c (nds32_symbol_load_store_p):
18104         Strengthen param "insn" from rtx to rtx_insn *.
18105         * config/nds32/nds32.c (nds32_target_alignment): Likewise for
18106         local "insn".
18107         * config/pa/pa-protos.h (pa_insn_refs_are_delayed): Likewise for param.
18108         * config/pa/pa.c (pa_output_function_epilogue): Likewise for local
18109         "insn".  Use method of rtx_sequence for typesafety.
18110         (branch_to_delay_slot_p): Strengthen param "insn" from rtx to
18111         rtx_insn *.
18112         (branch_needs_nop_p): Likewise.
18113         (use_skip_p): Likewise.
18114         (pa_insn_refs_are_delayed): Likewise.
18115         * config/rl78/rl78.c (rl78_propogate_register_origins): Likewise
18116         for locals "insn", "ninsn".
18117         * config/rs6000/rs6000.c (is_microcoded_insn): Likewise for param
18118         "insn".
18119         (is_cracked_insn): Likewise.
18120         (is_branch_slot_insn): Likewise.
18121         (is_nonpipeline_insn): Likewise.
18122         (insn_terminates_group_p): Likewise.
18123         (insn_must_be_first_in_group): Likewise.
18124         (insn_must_be_last_in_group): Likewise.
18125         (force_new_group): Likewise for param "next_insn".
18126         * config/s390/s390.c (s390_get_sched_attrmask): Likewise for param
18127         "insn".
18128         (s390_sched_score): Likewise.
18129         * config/sh/sh-protos.h (output_branch): Likewise for param 2.
18130         (rtx sfunc_uses_reg): Likewise for sole param.
18131         * config/sh/sh.c (sh_print_operand): Use insn method of
18132         final_sequence for typesafety.
18133         (output_branch): Strengthen param "insn" from rtx to rtx_insn *.
18134         Use insn method of final_sequence for typesafety.
18135         (sfunc_uses_reg): Strengthen param "insn" from rtx to rtx_insn *.
18136         * config/sparc/sparc-protos.h (eligible_for_call_delay): Likewise
18137         for param.
18138         (eligible_for_return_delay): Likewise.
18139         (eligible_for_sibcall_delay): Likewise.
18140         * config/sparc/sparc.c (eligible_for_call_delay): Likewise.
18141         (eligible_for_return_delay): Likewise.
18142         (eligible_for_sibcall_delay): Likewise.
18143         * config/stormy16/stormy16-protos.h
18144         (xstormy16_output_cbranch_hi): Likewise for final param.
18145         (xstormy16_output_cbranch_si): Likewise.
18146         * config/stormy16/stormy16.c (xstormy16_output_cbranch_hi): LIkewise.
18147         (xstormy16_output_cbranch_si): Likewise.
18148         * config/v850/v850-protos.h (notice_update_cc): Likewise.
18149         * config/v850/v850.c (notice_update_cc): Likewise.
18151         * final.c (get_attr_length_1): Strengthen param "insn" and param
18152         of "fallback_fn" from rtx to rtx_insn *, eliminating a checked cast.
18153         (get_attr_length): Strengthen param "insn" from rtx to rtx_insn *.
18154         (get_attr_min_length): Likewise.
18155         (shorten_branches): Likewise for signature of locals "length_fun"
18156         and "inner_length_fun".  Introduce local rtx_sequence * "seqn"
18157         from a checked cast and use its methods for clarity and to enable
18158         strengthening local "inner_insn" from rtx to rtx_insn *.
18159         * genattr.c (gen_attr): When writing out the prototypes of the
18160         various generated "get_attr_" functions, strengthen the params of
18161         the non-const functions from rtx to rtx_insn *.
18162         Similarly, strengthen the params of insn_default_length,
18163         insn_min_length, insn_variable_length_p, insn_current_length.
18164         (main): Similarly, strengthen the param of num_delay_slots,
18165         internal_dfa_insn_code, insn_default_latency, bypass_p,
18166         insn_latency, min_issue_delay, print_reservation,
18167         insn_has_dfa_reservation_p and of the "internal_dfa_insn_code" and
18168         "insn_default_latency" callbacks.  Rename hook_int_rtx_unreachable
18169         to hook_int_rtx_insn_unreachable.
18170         * genattrtab.c (write_attr_get): When writing out the generated
18171         "get_attr_" functions, strengthen the param "insn" from rtx to
18172         rtx_insn *, eliminating a checked cast.
18173         (make_automaton_attrs): When writing out prototypes of
18174         "internal_dfa_insn_code_", "insn_default_latency_" functions
18175         and the "internal_dfa_insn_code" and "insn_default_latency"
18176         callbacks, strengthen their params from rtx to rtx_insn *
18177         * genautomata.c (output_internal_insn_code_evaluation): When
18178         writing out code, add a checked cast from rtx to rtx_insn * when
18179         invoking DFA_INSN_CODE_FUNC_NAME aka dfa_insn_code.
18180         (output_dfa_insn_code_func): Strengthen param of generated
18181         function "dfa_insn_code_enlarge" from rtx to rtx_insn *.
18182         (output_trans_func): Likewise for generated function
18183         "state_transition".
18184         (output_internal_insn_latency_func): When writing out generated
18185         function "internal_insn_latency", rename params from "insn" and
18186         "insn2" to "insn_or_const0" and "insn2_or_const0".  Reintroduce
18187         locals "insn" and "insn2" as rtx_insn * with checked casts once
18188         we've proven that we're not dealing with const0_rtx.
18189         (output_insn_latency_func):  Strengthen param of generated
18190         function "insn_latency" from rtx to rtx_insn *.
18191         (output_print_reservation_func): Likewise for generated function
18192         "print_reservation".
18193         (output_insn_has_dfa_reservation_p): Likewise for generated
18194         function "insn_has_dfa_reservation_p".
18195         * hooks.c (hook_int_rtx_unreachable): Rename to...
18196         (hook_int_rtx_insn_unreachable): ...this, and strengthen param
18197         from rtx to rtx_insn *.
18198         * hooks.h (hook_int_rtx_unreachable): Likewise.
18199         (extern int hook_int_rtx_insn_unreachable): Likewise.
18200         * output.h (get_attr_length): Strengthen param from rtx to rtx_insn *.
18201         (get_attr_min_length): Likewise.
18202         * recog.c (get_enabled_alternatives): Likewise.
18203         * recog.h (alternative_mask get_enabled_alternatives): Likewise.
18204         * reorg.c (find_end_label): Introduce local rtx "pat" and
18205         strengthen local "insn" from rtx to rtx_insn *.
18206         (redundant_insn): Use insn method of "seq" rather than element for
18207         typesafety; strengthen local "control" from rtx to rtx_insn *.
18208         * resource.c (mark_referenced_resources): Add checked cast to
18209         rtx_insn * within INSN/JUMP_INSN case.
18210         (mark_set_resources): Likewise.
18211         * sel-sched.c (estimate_insn_cost): Strengthen param "insn" from
18212         rtx to rtx_insn *.
18214 2014-09-15  David Malcolm  <dmalcolm@redhat.com>
18216         * config/rs6000/rs6000.c (rs6000_loop_align_max_skip): Strengthen
18217         param "label" from rtx to rtx_insn *.
18218         * config/rx/rx.c (rx_max_skip_for_label): Likewise for param "lab"
18219         and local "op".
18220         * doc/tm.texi (TARGET_ASM_JUMP_ALIGN_MAX_SKIP): Autogenerated changes.
18221         (TARGET_ASM_LABEL_ALIGN_AFTER_BARRIER_MAX_SKIP): Likewise.
18222         (TARGET_ASM_LOOP_ALIGN_MAX_SKIP): Likewise.
18223         (TARGET_ASM_LABEL_ALIGN_MAX_SKIP): Likewise.
18224         * final.c (default_label_align_after_barrier_max_skip): Strengthen
18225         param from rtx to rtx_insn *.
18226         (default_loop_align_max_skip): Likewise.
18227         (default_label_align_max_skip): Likewise.
18228         (default_jump_align_max_skip): Likewise.
18229         * target.def (label_align_after_barrier_max_skip): Likewise.
18230         (loop_align_max_skip): Likewise.
18231         (label_align_max_skip): Likewise.
18232         (jump_align_max_skip): Likewise.
18233         * targhooks.h (default_label_align_after_barrier_max_skip): Likewise.
18234         (default_loop_align_max_skip): Likewise.
18235         (default_label_align_max_skip): Likewise.
18236         (default_jump_align_max_skip): Likewise.
18238 2014-09-15  David Malcolm  <dmalcolm@redhat.com>
18240         * config/arc/arc.c (arc_can_follow_jump): Strengthen both params
18241         from const_rtx to const rtx_insn *.  Update union members from rtx
18242         to rtx_insn *.
18243         * doc/tm.texi (TARGET_CAN_FOLLOW_JUMP): Autogenerated change.
18244         * hooks.c (hook_bool_const_rtx_const_rtx_true): Rename to...
18245         (hook_bool_const_rtx_insn_const_rtx_insn_true): ...this, and
18246         strengthen both params from const_rtx to const rtx_insn *.
18247         * hooks.h (hook_bool_const_rtx_const_rtx_true): Likewise.
18248         (hook_bool_const_rtx_insn_const_rtx_insn_true): Likewise.
18249         * reorg.c (follow_jumps): Strengthen param "jump" from rtx to
18250         rtx_insn *.
18251         * target.def (can_follow_jump): Strengthen both params from
18252         const_rtx to const rtx_insn *, and update default implementation
18253         from hook_bool_const_rtx_const_rtx_true to
18254         hook_bool_const_rtx_insn_const_rtx_insn_true.
18256 2014-09-15  David Malcolm  <dmalcolm@redhat.com>
18258         * sched-deps.c (deps_start_bb): Strengthen param "head" and local
18259         "insn" from rtx to rtx_insn *.
18260         * sched-int.h (deps_start_bb): Likewise for 2nd param.
18262 2014-09-15  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18263             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18264             Anna Tikhonova  <anna.tikhonova@intel.com>
18265             Ilya Tocar  <ilya.tocar@intel.com>
18266             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18267             Ilya Verbin  <ilya.verbin@intel.com>
18268             Kirill Yukhin  <kirill.yukhin@intel.com>
18269             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18271         * config/i386/sse.md
18272         (define_insn "vcvtph2ps<mask_name>"): Add masking.
18273         (define_insn "*vcvtph2ps_load<mask_name>"): Ditto.
18274         (define_insn "vcvtph2ps256<mask_name>"): Ditto.
18275         (define_expand "vcvtps2ph_mask"): New.
18276         (define_insn "*vcvtps2ph<mask_name>"): Add masking.
18277         (define_insn "*vcvtps2ph_store<mask_name>"): Ditto.
18278         (define_insn "vcvtps2ph256<mask_name>"): Ditto.
18280 2014-09-15  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18281             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18282             Anna Tikhonova  <anna.tikhonova@intel.com>
18283             Ilya Tocar  <ilya.tocar@intel.com>
18284             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18285             Ilya Verbin  <ilya.verbin@intel.com>
18286             Kirill Yukhin  <kirill.yukhin@intel.com>
18287             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18289         * config/i386/sse.md (define_mode_iterator VI248_AVX512BW_AVX512VL):
18290         New.
18291         (define_mode_iterator VI24_AVX512BW_1): Ditto.
18292         (define_insn "<mask_codefor>ashr<mode>3<mask_name>"): Ditto.
18293         (define_insn "<mask_codefor>ashrv2di3<mask_name>"): Ditto.
18294         (define_insn "ashr<VI248_AVX512BW_AVX512VL:mode>3<mask_name>"): Enable
18295         also for TARGET_AVX512VL.
18296         (define_expand "ashrv2di3"): Update to enable TARGET_AVX512VL.
18298 2014-09-15  Markus Trippelsdorf  <markus@trippelsdorf.de>
18300         * doc/install.texi (Options specification): add
18301         --disable-libsanitizer item.
18303 2014-09-14  James Clarke  <jrtc27@jrtc27.com>
18304             Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
18306         PR target/61407
18307         * config/darwin-c.c (version_as_macro): Added extra 0 for OS X 10.10
18308         and above.
18309         * config/darwin-driver.c (darwin_find_version_from_kernel): Removed
18310         kernel version check to avoid incrementing it after every major OS X
18311         release.
18312         (darwin_default_min_version): Avoid static memory buffer.
18314 2014-09-13  Jan Hubicka  <hubicka@ucw.cz>
18316         * tree.c (need_assembler_name_p): Store C++ type mangling only
18317         for aggregates.
18319 2014-09-13  Marek Polacek  <polacek@redhat.com>
18321         * tree.c (protected_set_expr_location): Don't check whether T is
18322         non-null here.
18324 2014-09-12  DJ Delorie  <dj@redhat.com>
18326         * config/msp430/msp430.md (extendhipsi2): Use 20-bit form of RLAM/RRAM.
18327         (extend_and_shift1_hipsi2): Likewise.
18328         (extend_and_shift2_hipsi2): Likewise.
18330 2014-09-12  David Malcolm  <dmalcolm@redhat.com>
18332         * config/alpha/alpha.c (alpha_ra_ever_killed): Replace NULL_RTX
18333         with NULL when dealing with an insn.
18334         * config/sh/sh.c (sh_reorg): Strengthen local "last_float_move"
18335         from rtx to rtx_insn *.
18336         * rtl.h (reg_set_between_p): Strengthen params 2 and 3 from
18337         const_rtx to const rtx_insn *.
18338         * rtlanal.c (reg_set_between_p): Likewise, removing a checked cast.
18340 2014-09-12  Trevor Saunders  <tsaunders@mozilla.com>
18342         * hash-table.h (gt_pch_nx): Don't call gt_pch_note_object within an
18343         assert.
18345 2014-09-12  Joseph Myers  <joseph@codesourcery.com>
18347         * target.def (libgcc_floating_mode_supported_p): New hook.
18348         * targhooks.c (default_libgcc_floating_mode_supported_p): New
18349         function.
18350         * targhooks.h (default_libgcc_floating_mode_supported_p): Declare.
18351         * doc/tm.texi.in (LIBGCC2_HAS_DF_MODE, LIBGCC2_HAS_XF_MODE)
18352         (LIBGCC2_HAS_TF_MODE): Remove.
18353         (TARGET_LIBGCC_FLOATING_MODE_SUPPORTED_P): New @hook.
18354         * doc/tm.texi: Regenerate.
18355         * genmodes.c (emit_insn_modes_h): Define HAVE_%smode for each
18356         machine mode.
18357         * system.h (LIBGCC2_HAS_SF_MODE, LIBGCC2_HAS_DF_MODE)
18358         (LIBGCC2_HAS_XF_MODE, LIBGCC2_HAS_TF_MODE): Poison.
18359         * config/i386/cygming.h (LIBGCC2_HAS_TF_MODE): Remove.
18360         * config/i386/darwin.h (LIBGCC2_HAS_TF_MODE): Remove.
18361         * config/i386/djgpp.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18362         * config/i386/dragonfly.h (LIBGCC2_HAS_TF_MODE): Remove.
18363         * config/i386/freebsd.h (LIBGCC2_HAS_TF_MODE): Remove.
18364         * config/i386/gnu-user-common.h (LIBGCC2_HAS_TF_MODE): Remove.
18365         * config/i386/i386-interix.h (IX86_NO_LIBGCC_TFMODE): Define.
18366         * config/i386/i386.c (ix86_libgcc_floating_mode_supported_p): New
18367         function.
18368         (TARGET_LIBGCC_FLOATING_MODE_SUPPORTED_P): Define.
18369         * config/i386/i386elf.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18370         * config/i386/lynx.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18371         * config/i386/netbsd-elf.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18372         * config/i386/netbsd64.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18373         * config/i386/nto.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18374         * config/i386/openbsd.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18375         * config/i386/openbsdelf.h (LIBGCC2_HAS_TF_MODE): Remove.
18376         * config/i386/rtemself.h (IX86_NO_LIBGCC_TFMODE): Define.
18377         * config/i386/sol2.h (LIBGCC2_HAS_TF_MODE): Remove.
18378         * config/i386/vx-common.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18379         * config/ia64/elf.h (IA64_NO_LIBGCC_TFMODE): Define.
18380         * config/ia64/freebsd.h (IA64_NO_LIBGCC_TFMODE): Define.
18381         * config/ia64/hpux.h (LIBGCC2_HAS_XF_MODE, LIBGCC2_HAS_TF_MODE):
18382         Remove.
18383         * config/ia64/ia64.c (TARGET_LIBGCC_FLOATING_MODE_SUPPORTED_P):
18384         New macro.
18385         (ia64_libgcc_floating_mode_supported_p): New function.
18386         * config/ia64/linux.h (LIBGCC2_HAS_TF_MODE): Remove.
18387         * config/ia64/vms.h (IA64_NO_LIBGCC_XFMODE)
18388         (IA64_NO_LIBGCC_TFMODE): Define.
18389         * config/msp430/msp430.h (LIBGCC2_HAS_DF_MODE): Remove.
18390         * config/pdp11/pdp11.c (TARGET_SCALAR_MODE_SUPPORTED_P): New macro.
18391         (pdp11_scalar_mode_supported_p): New function.
18392         * config/rl78/rl78.h (LIBGCC2_HAS_DF_MODE): Remove.
18393         * config/rx/rx.h (LIBGCC2_HAS_DF_MODE): Remove.
18395 2014-09-12  Richard Biener  <rguenther@suse.de>
18397         PR middle-end/63237
18398         * gimple-fold.c (get_maxval_strlen): Gimplify string length.
18400 2014-09-12  Marc Glisse  <marc.glisse@inria.fr>
18402         * tree.c (integer_each_onep): New function.
18403         * tree.h (integer_each_onep): Declare it.
18404         * fold-const.c (fold_binary_loc): Use it for ~A + 1 to -A and
18405         -A - 1 to ~A.  Disable (X & 1) ^ 1, (X ^ 1) & 1 and ~X & 1 to
18406         (X & 1) == 0 for vector and complex.
18408 2014-09-12  Wilco Dijkstra  <wilco.dijkstra@arm.com>
18410         * gcc/config/aarch64/aarch64.c (cortexa57_regmove_cost): New cost table
18411         for A57.
18412         (cortexa53_regmove_cost): New cost table for A53.  Increase GP2FP/FP2GP
18413         cost to spilling from integer to FP registers.
18415 2014-09-12  Wilco Dijkstra  <wilco.dijkstra@arm.com>
18417         * config/aarch64/aarch64.c (aarch64_register_move_cost): Fix Q register
18418         move handling.
18419         (generic_regmove_cost): Undo raised FP2FP move cost as Q register moves
18420         are now handled correctly.
18422 2014-09-12  Wilco Dijkstra  <wilco.dijkstra@arm.com>
18424         * config/aarch64/aarch64.c (aarch64_register_move_cost): Add cost
18425         handling of CALLER_SAVE_REGS and POINTER_REGS.
18427 2014-09-12  Wilco Dijkstra  <wilco.dijkstra@arm.com>
18429         * gcc/ree.c (combine_reaching_defs): Ensure inserted copy don't change
18430         the number of hard registers.
18432 2014-09-12  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18433             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18434             Anna Tikhonova  <anna.tikhonova@intel.com>
18435             Ilya Tocar  <ilya.tocar@intel.com>
18436             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18437             Ilya Verbin  <ilya.verbin@intel.com>
18438             Kirill Yukhin  <kirill.yukhin@intel.com>
18439             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18441         * config/i386/sse.md
18442         (define_mode_iterator VI48_AVX512VL): New.
18443         (define_expand "<avx512>_vternlog<mode>_maskz"): Rename from
18444         "avx512f_vternlog<mode>_maskz" and update mode iterator.
18445         (define_insn "<avx512>_vternlog<mode><sd_maskz_name>"): Rename
18446         from "avx512f_vternlog<mode><sd_maskz_name>" and update mode iterator.
18447         (define_insn "<avx512>_vternlog<mode>_mask"): Rename from
18448         "avx512f_vternlog<mode>_mask" and update mode iterator.
18449         (define_insn "<mask_codefor><avx512>_align<mode><mask_name>"): Rename
18450         from "<mask_codefor>avx512f_align<mode><mask_name>" and update mode
18451         iterator.
18452         (define_insn "<avx512>_<rotate>v<mode><mask_name>"): Rename from
18453         "avx512f_<rotate>v<mode><mask_name>" and update mode iterator.
18454         (define_insn "<avx512>_<rotate><mode><mask_name>"): Rename from
18455         "avx512f_<rotate><mode><mask_name>" and update mode iterator.
18456         (define_insn "clz<mode>2<mask_name>"): Use VI48_AVX512VL mode iterator.
18457         (define_insn "<mask_codefor>conflict<mode><mask_name>"): Ditto.
18459 2014-09-12  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18460             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18461             Anna Tikhonova  <anna.tikhonova@intel.com>
18462             Ilya Tocar  <ilya.tocar@intel.com>
18463             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18464             Ilya Verbin  <ilya.verbin@intel.com>
18465             Kirill Yukhin  <kirill.yukhin@intel.com>
18466             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18468         * config/i386/sse.md (VI128_256): Delete.
18469         (define_mode_iterator VI124_256): New.
18470         (define_mode_iterator VI124_256_AVX512F_AVX512BW): Ditto.
18471         (define_expand "<code><mode>3<mask_name><round_name>"): Delete.
18472         (define_expand "<code><VI124_256_AVX512F_AVX512BW:mode>3"): New.
18473         (define_insn "*avx2_<code><VI124_256:mode>3"): Rename from
18474         "*avx2_<code><mode>3<mask_name><round_name>" and update mode iterator.
18475         (define_expand "<code><VI48_AVX512VL:mode>3_mask"): New.
18476         (define_insn "*avx512bw_<code><VI48_AVX512VL:mode>3<mask_name>"): Ditto.
18477         (define_insn "<mask_codefor><code><mode>3<mask_name>"): Update mode
18478         iterator.
18479         (define_expand "<code><VI8_AVX2:mode>3"): Update pettern generation
18480         in presence of AVX-512.
18482 2014-09-12  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18483             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18484             Anna Tikhonova  <anna.tikhonova@intel.com>
18485             Ilya Tocar  <ilya.tocar@intel.com>
18486             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18487             Ilya Verbin  <ilya.verbin@intel.com>
18488             Kirill Yukhin  <kirill.yukhin@intel.com>
18489             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18491         * config/i386/sse.md
18492         (define_expand "<avx512>_gathersi<mode>"): Rename from
18493         "avx512f_gathersi<mode>".
18494         (define_insn "*avx512f_gathersi<mode>"): Use VI48F.
18495         (define_insn "*avx512f_gathersi<mode>_2"): Ditto.
18496         (define_expand "<avx512>_gatherdi<mode>"): Rename from
18497         "avx512f_gatherdi<mode>".
18498         (define_insn "*avx512f_gatherdi<mode>"): Use VI48F.
18499         (define_insn "*avx512f_gatherdi<mode>_2"): Use VI48F, add 128/256-bit
18500         wide versions.
18501         (define_expand "<avx512>_scattersi<mode>"): Rename from
18502         "avx512f_scattersi<mode>".
18503         (define_insn "*avx512f_scattersi<mode>"): Use VI48F.
18504         (define_expand "<avx512>_scatterdi<mode>"): Rename from
18505         "avx512f_scatterdi<mode>".
18506         (define_insn "*avx512f_scatterdi<mode>"): Use VI48F.
18508 2014-09-12  Richard Sandiford  <richard.sandiford@arm.com>
18510         * ira.h (ira_finish_once): Delete.
18511         * ira-int.h (target_ira_int::~target_ira_int): Declare.
18512         (target_ira_int::free_ira_costs): Likewise.
18513         (target_ira_int::free_register_move_costs): Likewise.
18514         (ira_finish_costs_once): Delete.
18515         * ira.c (free_register_move_costs): Replace with...
18516         (target_ira_int::free_register_move_costs): ...this new function.
18517         (target_ira_int::~target_ira_int): Define.
18518         (ira_init): Call free_register_move_costs as a member function rather
18519         than a global function.
18520         (ira_finish_once): Delete.
18521         * ira-costs.c (free_ira_costs): Replace with...
18522         (target_ira_int::free_ira_costs): ...this new function.
18523         (ira_init_costs): Call free_ira_costs as a member function rather
18524         than a global function.
18525         (ira_finish_costs_once): Delete.
18526         * target-globals.c (target_globals::~target_globals): Call the
18527         target_ira_int destructor.
18528         * toplev.c: Include lra.h.
18529         (finalize): Call lra_finish_once rather than ira_finish_once.
18531 2014-09-11  Jan Hubicka  <hubicka@ucw.cz>
18533         * common.opt (flto-odr-type-merging): New flag.
18534         * ipa-deivrt.c (hash_type_name): Use ODR names for hasing if availale.
18535         (types_same_for_odr): Likewise.
18536         (odr_subtypes_equivalent_p): Likewise.
18537         (add_type_duplicate): Do not walk type variants.
18538         (register_odr_type): New function.
18539         * ipa-utils.h (register_odr_type): Declare.
18540         (odr_type_p): New function.
18541         * langhooks.c (lhd_set_decl_assembler_name): Do not compute
18542         TYPE_DECLs
18543         * doc/invoke.texi (-flto-odr-type-merging): Document.
18544         * tree.c (need_assembler_name_p): Compute ODR names when asked
18545         for it.
18546         * tree.h (DECL_ASSEMBLER_NAME): Update comment.
18548 2014-09-11  H.J. Lu  <hongjiu.lu@intel.com>
18550         PR target/63228
18551         * config/i386/i386.c (ix86_option_override_internal): Also turn
18552         off OPTION_MASK_ABI_X32 for -m16.
18554 2014-09-11  Segher Boessenkool  <segher@kernel.crashing.org>
18556         * config/rs6000/rs6000.md (rs6000_mftb_<mode>): Use mode iterator
18557         GPR instead of P.
18559 2014-09-11  Marc Glisse  <marc.glisse@inria.fr>
18561         PR target/58757
18562         * ginclude/float.h (FLT_TRUE_MIN, DBL_TRUE_MIN, LDBL_TRUE_MIN):
18563         Directly forward to __*_DENORM_MIN__.
18565 2014-09-11  David Malcolm  <dmalcolm@redhat.com>
18567         * rtl.h (LABEL_REF_LABEL): New macro.
18569         * alias.c (rtx_equal_for_memref_p): Use LABEL_REF_LABEL in place
18570         of XEXP (, 0), where we know that we have a LABEL_REF.
18571         * cfgbuild.c (make_edges): Likewise.
18572         (purge_dead_tablejump_edges): Likewise.
18573         * cfgexpand.c (convert_debug_memory_address): Likewise.
18574         * cfgrtl.c (patch_jump_insn): Likewise.
18575         * combine.c (distribute_notes): Likewise.
18576         * cse.c (hash_rtx_cb): Likewise.
18577         (exp_equiv_p): Likewise.
18578         (fold_rtx): Likewise.
18579         (check_for_label_ref): Likewise.
18580         * cselib.c (rtx_equal_for_cselib_1): Likewise.
18581         (cselib_hash_rtx): Likewise.
18582         * emit-rtl.c (mark_label_nuses): Likewise.
18583         * explow.c (convert_memory_address_addr_space): Likewise.
18584         * final.c (output_asm_label): Likewise.
18585         (output_addr_const): Likewise.
18586         * gcse.c (add_label_notes): Likewise.
18587         * genconfig.c (walk_insn_part): Likewise.
18588         * genrecog.c (validate_pattern): Likewise.
18589         * ifcvt.c (cond_exec_get_condition): Likewise.
18590         (noce_emit_store_flag): Likewise.
18591         (noce_get_alt_condition): Likewise.
18592         (noce_get_condition): Likewise.
18593         * jump.c (maybe_propagate_label_ref): Likewise.
18594         (mark_jump_label_1): Likewise.
18595         (redirect_exp_1): Likewise.
18596         (rtx_renumbered_equal_p): Likewise.
18597         * lra-constraints.c (operands_match_p): Likewise.
18598         * reload.c (operands_match_p): Likewise.
18599         (find_reloads): Likewise.
18600         * reload1.c (set_label_offsets): Likewise.
18601         * reorg.c (get_branch_condition): Likewise.
18602         * rtl.c (rtx_equal_p_cb): Likewise.
18603         (rtx_equal_p): Likewise.
18604         * rtlanal.c (reg_mentioned_p): Likewise.
18605         (rtx_referenced_p): Likewise.
18606         (get_condition): Likewise.
18607         * sched-vis.c (print_value): Likewise.
18608         * varasm.c (const_hash_1): Likewise.
18609         (compare_constant): Likewise.
18610         (const_rtx_hash_1): Likewise.
18611         (output_constant_pool_1): Likewise.
18613 2014-09-11  Segher Boessenkool  <segher@kernel.crashing.org>
18615         * config/rs6000/htm.md (tabort, tabortdc, tabortdci, tabortwc,
18616         tabortwci, tbegin, tcheck, tend, trechkpt, treclaim, tsr): Use xor
18617         instead of minus.
18618         * config/rs6000/vector.md (cr6_test_for_zero_reverse,
18619         cr6_test_for_lt_reverse): Ditto.
18621 2014-09-11  Paolo Carlini  <paolo.carlini@oracle.com>
18623         PR c++/61489
18624         * doc/invoke.texi ([-Wmissing-field-initializers]): Update.
18626 2014-09-11  Alan Lawrence  <alan.lawrence@arm.com>
18628         * config/aarch64/aarch64-builtins.c (aarch64_types_unop_su_qualifiers,
18629         TYPES_REINTERP_SU, aarch64_types_unop_sp_qualifiers, TYPE_REINTERP_SP,
18630         aarch64_types_unop_us_qualifiers, TYPES_REINTERP_US,
18631         aarch64_types_unop_ps_qualifiers, TYPES_REINTERP_PS, BUILTIN_VD):
18632         Delete.
18634         (aarch64_fold_builtin): Remove all reinterpret cases.
18636         * config/aarch64/aarch64-protos.h (aarch64_simd_reinterpret): Delete.
18638         * config/aarch64/aarch64-simd-builtins.def (reinterpret*) : Delete.
18640         * config/aarch64/aarch64-simd.md (aarch64_reinterpretv8qi<mode>,
18641         aarch64_reinterpretv4hi<mode>, aarch64_reinterpretv2si<mode>,
18642         aarch64_reinterpretv2sf<mode>, aarch64_reinterpretdi<mode>,
18643         aarch64_reinterpretv1df<mode>, aarch64_reinterpretv16qi<mode>,
18644         aarch64_reinterpretv8hi<mode>, aarch64_reinterpretv4si<mode>,
18645         aarch64_reinterpretv4sf<mode>, aarch64_reinterpretv2di<mode>,
18646         aarch64_reinterpretv2df<mode>): Delete.
18648         * config/aarch64/aarch64.c (aarch64_simd_reinterpret): Delete.
18650         * config/aarch64/arm_neon.h (vreinterpret_p8_f64,
18651         vreinterpret_p16_f64, vreinterpret_f32_f64, vreinterpret_f64_f32,
18652         vreinterpret_f64_p8, vreinterpret_f64_p16, vreinterpret_f64_s8,
18653         vreinterpret_f64_s16, vreinterpret_f64_s32, vreinterpret_f64_u8,
18654         vreinterpret_f64_u16, vreinterpret_f64_u32, vreinterpret_s64_f64,
18655         vreinterpret_u64_f64, vreinterpret_s8_f64, vreinterpret_s16_f64,
18656         vreinterpret_s32_f64, vreinterpret_u8_f64, vreinterpret_u16_f64,
18657         vreinterpret_u32_f64): Use cast.
18659         * config/aarch64/iterators.md (VD_RE): Delete.
18661 2014-09-11  Alan Lawrence  <alan.lawrence@arm.com>
18663         * config/aarch64/arm_neon.h (aarch64_vset_lane_any): New (*2).
18664         (vset_lane_f32, vset_lane_f64, vset_lane_p8, vset_lane_p16,
18665         vset_lane_s8, vset_lane_s16, vset_lane_s32, vset_lane_s64,
18666         vset_lane_u8, vset_lane_u16, vset_lane_u32, vset_lane_u64,
18667         vsetq_lane_f32, vsetq_lane_f64, vsetq_lane_p8, vsetq_lane_p16,
18668         vsetq_lane_s8, vsetq_lane_s16, vsetq_lane_s32, vsetq_lane_s64,
18669         vsetq_lane_u8, vsetq_lane_u16, vsetq_lane_u32, vsetq_lane_u64):
18670         Replace inline assembler with __aarch64_vset_lane_any.
18672 2014-09-11  James Greenhalgh  <james.greenhalgh@arm.com>
18674         * config/aarch64/arm_neon.h (vmull_high_lane_s16): Fix argument
18675         types.
18676         (vmull_high_lane_s32): Likewise.
18677         (vmull_high_lane_u16): Likewise.
18678         (vmull_high_lane_u32): Likewise.
18680 2014-09-11  Jason Merrill  <jason@redhat.com>
18682         PR c++/58678
18683         * ipa-devirt.c (ipa_devirt): Don't check DECL_COMDAT.
18685 2014-09-11  Georg-Johann Lay  <avr@gjlay.de>
18687         PR target/63223
18688         * config/avr/avr.md (*tablejump.3byte-pc): New insn.
18689         (*tablejump): Restrict to !AVR_HAVE_EIJMP_EICALL.  Add void clobber.
18690         (casesi): Expand to *tablejump.3byte-pc if AVR_HAVE_EIJMP_EICALL.
18692 2014-09-11  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18693             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18694             Anna Tikhonova  <anna.tikhonova@intel.com>
18695             Ilya Tocar  <ilya.tocar@intel.com>
18696             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18697             Ilya Verbin  <ilya.verbin@intel.com>
18698             Kirill Yukhin  <kirill.yukhin@intel.com>
18699             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18701         * config/i386/sse.md
18702         (define_expand "<avx512>_vpermi2var<VI48F:mode>3_maskz"): Rename from
18703         "avx512f_vpermi2var<mode>3_maskz" and update mode iterator.
18704         (define_expand "<avx512>_vpermi2var<VI2_AVX512VL:mode>3_maskz"):
18705         New.
18706         (define_insn "<avx512>_vpermi2var<VI48F:mode>3<sd_maskz_name>"): Rename
18707         from "avx512f_vpermi2var<mode>3<sd_maskz_name>" and update mode
18708         iterator.
18709         (define_insn "<avx512>_vpermi2var<VI2_AVX512VL:mode>3<sd_maskz_name>"):
18710         New.
18711         (define_insn "<avx512>_vpermi2var<VI48F:mode>3_mask"): Rename from
18712         "avx512f_vpermi2var<mode>3_mask" and update mode iterator.
18713         (define_insn "<avx512>_vpermi2var<VI2_AVX512VL:mode>3_mask"): New.
18714         (define_expand "<avx512>_vpermt2var<VI48F:mode>3_maskz"): Rename from
18715         "avx512f_vpermt2var<mode>3_maskz" and update mode iterator.
18716         (define_expand "<avx512>_vpermt2var<VI2_AVX512VL:mode>3_maskz"): New.
18717         (define_insn "<avx512>_vpermt2var<VI48F:mode>3<sd_maskz_name>"): Rename
18718         from "avx512f_vpermt2var<mode>3<sd_maskz_name>" and update mode
18719         iterator.
18720         (define_insn "<avx512>_vpermt2var<VI2_AVX512VL:mode>3<sd_maskz_name>"):
18721         New.
18722         (define_insn "<avx512>_vpermt2var<VI48F:mode>3_mask"): Rename from
18723         "avx512f_vpermt2var<mode>3_mask" and update mode iterator.
18724         (define_insn "<avx512>_vpermt2var<VI2_AVX512VL:mode>3_mask"): New.
18726 2014-09-10  Jan Hubicka  <hubicka@ucw.cz>
18728         * varpool.c (varpool_node::ctor_useable_for_folding_p): Do not try
18729         to access removed nodes.
18731 2014-09-10  Jan Hubicka  <hubicka@ucw.cz>
18733         PR tree-optimization/63186
18734         * ipa-split.c (test_nonssa_use): Skip nonforced labels.
18735         (mark_nonssa_use): Likewise.
18736         (verify_non_ssa_vars): Verify all header blocks for label
18737         definitions.
18739 2014-09-11  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18740             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18741             Anna Tikhonova  <anna.tikhonova@intel.com>
18742             Ilya Tocar  <ilya.tocar@intel.com>
18743             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18744             Ilya Verbin  <ilya.verbin@intel.com>
18745             Kirill Yukhin  <kirill.yukhin@intel.com>
18746             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18748         * config/i386/sse.md
18749         (define_mode_attr avx2_avx512): Rename from avx2_avx512bw.
18750         (define_mode_iterator VI48F_256_512): Extend to AVX-512VL.
18751         (define_insn "<avx2_avx512>_permvar<mode><mask_name>"): Rename from
18752         "<avx2_avx512f>_permvar<mode><mask_name>".
18753         (define_insn "<avx512>_permvar<mode><mask_name>"): New.
18754         (define_insn "<avx2_avx512>_ashrv<VI48_AVX512F_AVX512VL:mode><mask_name>"):
18755         Rename from "<avx2_avx512f>_ashrv<mode><mask_name>".
18756         (define_insn "<avx2_avx512>_ashrv<VI2_AVX512VL:mode><mask_name>"):
18757         Ditto.
18758         (define_insn "<avx2_avx512>_<shift_insn>v<VI48_AVX512F:mode><mask_name>"):
18759         Rename from "<avx2_avx512bw>_<shift_insn>v<mode><mask_name>".
18760         (define_insn "<avx2_avx512>_<shift_insn>v<VI2_AVX512VL:mode><mask_name>"):
18761         Rename from "<avx2_avx512bw>_<shift_insn>v<mode><mask_name>".
18763 2014-09-10  Michael Meissner  <meissner@linux.vnet.ibm.com>
18765         * config/rs6000/vsx.md (vsx_fmav4sf4): Use correct constraints for
18766         V2DF, V4SF, DF, and DI modes.
18767         (vsx_fmav2df2): Likewise.
18768         (vsx_float_fix_<mode>2): Likewise.
18769         (vsx_reduc_<VEC_reduc_name>_v2df_scalar): Likewise.
18771 2014-09-10  Xinliang David Li  <davidxl@google.com>
18773         PR target/63209
18774         * config/arm/arm.md (movcond_addsi): Handle case where source
18775         and target operands are the same.
18777 2014-09-10  David Malcolm  <dmalcolm@redhat.com>
18779         * final.c (this_is_asm_operands): Strengthen this variable from
18780         rtx to const rtx_insn *.
18781         * output.h (this_is_asm_operands): Likewise.
18782         * rtl-error.c (location_for_asm): Strengthen param "insn" from
18783         const_rtx to const rtx_insn *.
18784         (diagnostic_for_asm): Likewise.
18785         * rtl-error.h (error_for_asm): Likewise.
18786         (warning_for_asm): Likewise.
18788 2014-09-10  David Malcolm  <dmalcolm@redhat.com>
18790         * genextract.c (print_header): When writing out insn_extract to
18791         insn-extract.c, strengthen the param "insn" from rtx to rtx_insn *.
18792         * recog.h (insn_extract): Strengthen the param from rtx to
18793         rtx_insn *.
18795 2014-09-10  Mike Stump  <mikestump@comcast.net>
18797         * doc/install.texi (Prerequisites): Note Tcl 8.6 bug fixed in
18798         8.6.1.
18800 2014-09-10  Martin Jambor  <mjambor@suse.cz>
18802         * cgraphunit.c (expand_thunk): If not expanding, set analyzed flag.
18803         (analyze): Do not set analyze flag if expand_thunk returns false;.
18804         (create_wrapper): Likewise.
18805         * cgraphclones.c (duplicate_thunk_for_node): Likewise.
18807 2014-09-10  Martin Jambor  <mjambor@suse.cz>
18809         PR ipa/61654
18810         * cgraphclones.c (duplicate_thunk_for_node): Copy arguments of the
18811         new decl properly.  Analyze the new thunk if it is expanded.
18813 2014-09-10  Andreas Schwab  <schwab@suse.de>
18815         * coretypes.h (struct _dont_use_rtx_insn_here_, rtx_insn)
18816         [USED_FOR_TARGET]: Define.
18818 2014-09-10  Matthew Fortune  <matthew.fortune@imgtec.com>
18820         * config/mips/mips.c (mips_secondary_reload_class): Handle
18821         regno < 0 case.
18823 2014-09-10  Robert Suchanek   <robert.suchanek@imgtec.com>
18825         * lra-lives.c (process_bb_lives): Replace assignment with bitwise OR
18826         assignment.
18828 2014-09-10  Jakub Jelinek  <jakub@redhat.com>
18830         * flag-types.h (enum sanitize_code): Add SANITIZE_NONNULL_ATTRIBUTE
18831         and SANITIZE_RETURNS_NONNULL_ATTRIBUTE, or them into SANITIZE_UNDEFINED.
18832         * opts.c (common_handle_option): Handle SANITIZE_NONNULL_ATTRIBUTE and
18833         SANITIZE_RETURNS_NONNULL_ATTRIBUTE and disable
18834         flag_delete_null_pointer_checks for them.
18835         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_NONNULL_ARG,
18836         BUILT_IN_UBSAN_HANDLE_NONNULL_ARG_ABORT,
18837         BUILT_IN_UBSAN_HANDLE_NONNULL_RETURN,
18838         BUILT_IN_UBSAN_HANDLE_NONNULL_RETURN_ABORT): New.
18839         * ubsan.c (instrument_bool_enum_load): Set *gsi back to
18840         stmt's iterator.
18841         (instrument_nonnull_arg, instrument_nonnull_return): New functions.
18842         (pass_ubsan::gate): Return true even for SANITIZE_NONNULL_ATTRIBUTE
18843         or SANITIZE_RETURNS_NONNULL_ATTRIBUTE.
18844         (pass_ubsan::execute): Call instrument_nonnull_{arg,return}.
18845         * doc/invoke.texi (-fsanitize=nonnull-attribute,
18846         -fsanitize=returns-nonnull-attribute): Document.
18848         * ubsan.h (struct ubsan_mismatch_data): Removed.
18849         (ubsan_create_data): Remove MISMATCH argument, add LOCCNT argument.
18850         * ubsan.c (ubsan_source_location): For unknown locations,
18851         pass { NULL, 0, 0 } instead of { "<unknown>", x, y }.
18852         (ubsan_create_data): Remove MISMATCH argument, add LOCCNT argument.
18853         Allow more than one location and arbitrary extra arguments passed
18854         in ... instead of through MISMATCH pointer.
18855         (ubsan_instrument_unreachable, ubsan_expand_bounds_ifn,
18856         ubsan_expand_null_ifn, ubsan_build_overflow_builtin,
18857         instrument_bool_enum_load, ubsan_instrument_float_cast): Adjust
18858         callers.
18860 2014-09-10  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18861             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18862             Anna Tikhonova  <anna.tikhonova@intel.com>
18863             Ilya Tocar  <ilya.tocar@intel.com>
18864             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18865             Ilya Verbin  <ilya.verbin@intel.com>
18866             Kirill Yukhin  <kirill.yukhin@intel.com>
18867             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18869         * config/i386/sse.md
18870         (define_mode_iterator VI48F): New.
18871         (define_insn "<avx512>_compress<mode>_mask"): Rename from
18872         "avx512f_compress<mode>_mask" and update mode iterator.
18873         (define_insn "<avx512>_compressstore<mode>_mask"): Rename from
18874         "avx512f_compressstore<mode>_mask" and update mode iterator.
18875         (define_expand "<avx512>_expand<mode>_maskz"): Rename from
18876         "avx512f_expand<mode>_maskz" and update mode iterator.
18877         (define_insn "<avx512>_expand<mode>_mask"): Rename from
18878         "avx512f_expand<mode>_mask" and update mode iterator.
18880 2014-09-10  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18881             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18882             Anna Tikhonova  <anna.tikhonova@intel.com>
18883             Ilya Tocar  <ilya.tocar@intel.com>
18884             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18885             Ilya Verbin  <ilya.verbin@intel.com>
18886             Kirill Yukhin  <kirill.yukhin@intel.com>
18887             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18889         * config/i386/i386.c
18890         (ix86_expand_args_builtin): Handle avx512dq_rangepv8df_mask_round,
18891         avx512dq_rangepv16sf_mask_round, avx512dq_rangepv4df_mask,
18892         avx512dq_rangepv8sf_mask, avx512dq_rangepv2df_mask,
18893         avx512dq_rangepv4sf_mask.
18894         * config/i386/sse.md
18895         (define_c_enum "unspec"): Add UNSPEC_REDUCE, UNSPEC_FPCLASS,
18896         UNSPEC_RANGE.
18897         (define_insn "<mask_codefor>reducep<mode><mask_name>"): New.
18898         (define_insn "reduces<mode>"): Ditto.
18899         (define_insn "avx512dq_rangep<mode><mask_name><round_saeonly_name>"):
18900         Ditto.
18901         (define_insn "avx512dq_ranges<mode><round_saeonly_name>"): Ditto.
18902         (define_insn "avx512dq_fpclass<mode><mask_scalar_merge_name>"): Ditto.
18903         (define_insn "avx512dq_vmfpclass<mode>"): Ditto..
18905 2014-09-10  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18906             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18907             Anna Tikhonova  <anna.tikhonova@intel.com>
18908             Ilya Tocar  <ilya.tocar@intel.com>
18909             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18910             Ilya Verbin  <ilya.verbin@intel.com>
18911             Kirill Yukhin  <kirill.yukhin@intel.com>
18912             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18914         * config/i386/i386.c
18915         (avx512f_vgetmantv2df_round): Rename from "avx512f_getmantv2df_round".
18916         (avx512f_vgetmantv4sf_round): Rename from "avx512f_vgetmantv4sf_round".
18917         (ix86_expand_args_builtin): Handle avx512vl_getmantv8sf_mask,
18918         avx512vl_getmantv4df_mask, avx512vl_getmantv4sf_mask,
18919         avx512vl_getmantv2df_mask.
18920         (ix86_expand_round_builtin): Handle avx512f_vgetmantv2df_round,
18921         avx512f_vgetmantv4sf_round.
18922         * config/i386/sse.md
18923         (define_insn "<avx512>_storeu<ssemodesuffix><avxsizesuffix>_mask"):
18924         Rename from "avx512f_storeu<ssemodesuffix>512_mask" and update
18925         mode iterator.
18926         (define_insn "<mask_codefor>rcp14<mode><mask_name>"): Use VF_AVX512VL.
18927         (define_insn "<mask_codefor>rsqrt14<mode><mask_name>"): Ditto.
18928         (define_insn "<avx512>_scalef<mode><mask_name><round_name>"): Rename
18929         from "avx512f_scalef<mode><mask_name><round_name>" and update mode
18930         iterator..
18931         (define_insn "<avx512>_getexp<mode><mask_name><round_saeonly_name>"):
18932         Rename from "avx512f_getexp<mode><mask_name><round_saeonly_name>" and
18933         update mode iterator.
18934         (define_expand
18935         "<avx512>_fixupimm<mode>_maskz<round_saeonly_expand_name>"): Rename from
18936         "avx512f_fixupimm<mode>_maskz<round_saeonly_expand_name>" and update
18937         mode iterator.
18938         (define_insn
18939         "<avx512>_fixupimm<mode><sd_maskz_name><round_saeonly_name>"): Rename
18940         from "avx512f_fixupimm<mode><sd_maskz_name><round_saeonly_name>" and
18941         update mode iterator.
18942         (define_insn "<avx512>_fixupimm<mode>_mask<round_saeonly_name>"): Rename
18943         from "avx512f_fixupimm<mode>_mask<round_saeonly_name>" and update mode
18944         iterator..
18945         (define_insn
18946         "<avx512>_rndscale<mode><mask_name><round_saeonly_name>"): rename from
18947         "avx512f_rndscale<mode><mask_name><round_saeonly_name>" and update
18948         mode iterator..
18949         (define_insn "<avx512>_getmant<mode><mask_name><round_saeonly_name>"):
18950         Rename from "avx512f_getmant<mode><mask_name><round_saeonly_name>" and
18951         update mode iterator.
18952         (define_insn "avx512f_vgetmant<mode><round_saeonly_name>"): Rename from
18953         "avx512f_getmant<mode><round_saeonly_name>".
18955 2014-09-10  Jan Hubicka  <hubicka@ucw.cz>
18957         PR ipa/63166
18958         * ipa-prop.c (compute_known_type_jump_func): Fix conditional.
18960 2014-09-10  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18961             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18962             Anna Tikhonova  <anna.tikhonova@intel.com>
18963             Ilya Tocar  <ilya.tocar@intel.com>
18964             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18965             Ilya Verbin  <ilya.verbin@intel.com>
18966             Kirill Yukhin  <kirill.yukhin@intel.com>
18967             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18969         * config/i386/sse.md (define_mode_iterator VF_AVX512VL): New.
18970         (define_mode_iterator FMAMODEM): Allow 128/256bit EVEX version.
18971         (define_mode_iterator FMAMODE_AVX512): New.
18972         (define_mode_iterator FMAMODE): Remove conditions.
18973         (define_expand "fma4i_fmadd_<mode>"): Use FMAMODE_AVX512 mode iterator.
18974         (define_expand "<avx512>_fmadd_<mode>_maskz<round_expand_name>"): Rename
18975         from "<avx512>_fmadd_<mode>_maskz<round_expand_name>" and use VF_AVX512VL
18976         mode iterator.
18977         (define_mode_iterator FMAMODE_NOVF512): Remove.
18978         (define_insn "*fma_fmadd_<mode>"): Rename from
18979         "<sd_mask_codefor>fma_fmadd_<mode><sd_maskz_name><round_name>" and use
18980         FMAMODE mode iterator.
18981         (define_mode_iterator VF_SF_AVX512VL): New.
18982         (define_insn "<sd_mask_codefor>fma_fmadd_<mode><sd_maskz_name><round_name>"):
18983         Use VF_SF_AVX512VL mode iterator.
18984         (define_insn "<avx512>_fmadd_<mode>_mask<round_name>"): Rename from
18985         "avx512f_fmadd_<mode>_mask<round_name>" and use VF_AVX512VL mode
18986         iterator.
18987         (define_insn "<avx512>_fmadd_<mode>_mask3<round_name>"): Rename from
18988         "avx512f_fmadd_<mode>_mask3<round_name>" and use VF_AVX512VL mode
18989         iterator.
18990         (define_insn "*fma_fmsub_<mode>"): Rename from
18991         "<sd_mask_codefor>fma_fmsub_<mode><sd_maskz_name><round_name>" and use
18992         FMAMODE mode iterator.
18993         (define_insn "<sd_mask_codefor>fma_fmsub_<mode><sd_maskz_name><round_name>"):
18994         Use VF_SF_AVX512VL mode iterator.
18995         (define_insn "<avx512>_fmsub_<mode>_mask<round_name>"): Rename from
18996         "avx512f_fmsub_<mode>_mask<round_name>" and use VF_AVX512VL mode
18997         iterator.
18998         (define_insn "<avx512>_fmsub_<mode>_mask3<round_name>"): Rename from
18999         "avx512f_fmsub_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19000         iterator.
19001         (define_insn "*fma_fnmadd_<mode>"): Rename from
19002         "<sd_mask_codefor>fma_fnmadd_<mode><sd_maskz_name><round_name>" and
19003         use FMAMODE mode iterator.
19004         (define_insn "<sd_mask_codefor>fma_fnmadd_<mode><sd_maskz_name><round_name>"):
19005         Use VF_SF_AVX512VL mode iterator.
19006         (define_insn "<avx512>_fnmadd_<mode>_mask<round_name>"): Rename from
19007         "avx512f_fnmadd_<mode>_mask<round_name>" and use VF_AVX512VL mode
19008         iterator.
19009         (define_insn "<avx512>_fnmadd_<mode>_mask3<round_name>"): Rename from
19010         "avx512f_fnmadd_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19011         iterator.
19012         (define_insn "*fma_fnmsub_<mode>"): Rename from
19013         "<sd_mask_codefor>fma_fnmsub_<mode><sd_maskz_name><round_name>" and use
19014         FMAMODE mode iterator.
19015         (define_insn "<sd_mask_codefor>fma_fnmsub_<mode><sd_maskz_name><round_name>"):
19016         Use VF_SF_AVX512VL mode iterator.
19017         (define_insn "<avx512>_fnmsub_<mode>_mask<round_name>"): Rename from
19018         "avx512f_fnmsub_<mode>_mask<round_name>" and use VF_AVX512VL mode
19019         iterator.
19020         (define_insn "<avx512>_fnmsub_<mode>_mask3<round_name>"): Rename from
19021         "avx512f_fnmsub_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19022         iterator.
19023         (define_expand "<avx512>_fmaddsub_<mode>_maskz<round_expand_name>"):
19024         Rename from "avx512f_fmaddsub_<mode>_maskz<round_expand_name>" and
19025         use VF_AVX512VL mode iterator.
19026         (define_insn "*fma_fmaddsub_<mode>"): Rename from
19027         "<sd_mask_codefor>fma_fmaddsub_<mode><sd_maskz_name><round_name>" and
19028         remove subst usage.
19029         (define_insn "<sd_mask_codefor>fma_fmaddsub_<mode><sd_maskz_name><round_name>"):
19030         Use VF_SF_AVX512VL mode iterator.
19031         (define_insn "<avx512>_fmaddsub_<mode>_mask<round_name>"): Rename from
19032         "avx512f_fmaddsub_<mode>_mask<round_name>" and use VF_AVX512VL mode
19033         iterator.
19034         (define_insn "<avx512>_fmaddsub_<mode>_mask3<round_name>"): Rename from
19035         "avx512f_fmaddsub_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19036         iterator.
19037         (define_insn "*fma_fmsubadd_<mode>"): Rename from
19038         "<sd_mask_codefor>fma_fmsubadd_<mode><sd_maskz_name><round_name>" and
19039         remove usage of subst.
19040         (define_insn "<sd_mask_codefor>fma_fmsubadd_<mode><sd_maskz_name><round_name>"):
19041         Use VF_SF_AVX512VL mode iterator.
19042         (define_insn "<avx512>_fmsubadd_<mode>_mask<round_name>"): Rename from
19043         "avx512f_fmsubadd_<mode>_mask<round_name>" and use VF_AVX512VL mode
19044         iterator.
19045         (define_insn "<avx512>_fmsubadd_<mode>_mask3<round_name>"): Rename from
19046         "avx512f_fmsubadd_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19047         iterator.
19049 2014-09-10  Kugan Vivekanandarajah  <kuganv@linaro.org>
19051         Revert r213751:
19052         * calls.c (precompute_arguments): Check
19053          promoted_for_signed_and_unsigned_p and set the promoted mode.
19054         (promoted_for_signed_and_unsigned_p): New function.
19055         (expand_expr_real_1): Check promoted_for_signed_and_unsigned_p
19056         and set the promoted mode.
19057         * expr.h (promoted_for_signed_and_unsigned_p): New function definition.
19058         * cfgexpand.c (expand_gimple_stmt_1): Call emit_move_insn if
19059         SUBREG is promoted with SRP_SIGNED_AND_UNSIGNED.
19061 2014-09-09  Manuel López-Ibáñez  <manu@gcc.gnu.org>
19063         * opth-gen.awk: Generate mapping from cpp message reasons to the
19064         options that enable them.
19065         * doc/options.texi (CppReason): Document.
19067 2014-09-09  Manuel López-Ibáñez  <manu@gcc.gnu.org>
19069         * doc/invoke.texi (Wnormalized=): Update.
19071 2014-09-09  Segher Boessenkool  <segher@kernel.crashing.org>
19073         PR target/63195
19074         * config/rs6000/rs6000.md (*bool<mode>3): Allow only register
19075         operands.  Split off the constant operand alternative to ...
19076         (*bool<mode>3_imm): New.
19078 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19080         * rtl.h (single_set_2): Strengthen first param from const_rtx to
19081         const rtx_insn *, and move prototype to above...
19082         (single_set): ...this.  Convert this from a macro to an inline
19083         function, enforcing the requirement that the param is a const
19084         rtx_insn *.
19085         (find_args_size_adjust): Strengthen param from rtx to rtx_insn *.
19087         * config/arm/aarch-common-protos.h (aarch_crypto_can_dual_issue):
19088         Strengthen both params from rtx to rtx_insn *.
19089         * config/arm/aarch-common.c (aarch_crypto_can_dual_issue):
19090         Likewise; introduce locals "producer_set", "consumer_set", using
19091         them in place of "producer" and "consumer" when dealing with SET
19092         rather than insn.
19093         * config/avr/avr.c (avr_out_plus): Add checked cast to rtx_insn *
19094         when invoking single_set in region guarded by INSN_P.
19095         (avr_out_bitop): Likewise.
19096         (_reg_unused_after): Introduce local rtx_sequence * "seq" in
19097         region guarded by GET_CODE check, using methods to strengthen
19098         local "this_insn" from rtx to rtx_insn *, and for clarity.
19099         * config/avr/avr.md (define_insn_and_split "xload8<mode>_A"):
19100         Strengthen local "insn" from rtx to rtx_insn *.
19101         (define_insn_and_split "xload<mode>_A"): Likewise.
19102         * config/bfin/bfin.c (trapping_loads_p): Likewise for param
19103         "insn".
19104         (find_load): Likewise for return type.
19105         (workaround_speculation): Likewise for both locals named
19106         "load_insn".
19107         * config/cris/cris.c (cris_cc0_user_requires_cmp): Likewise for
19108         local "cc0_user".
19109         * config/cris/cris.md (define_peephole2 ; moversideqi): Likewise
19110         for local "prev".
19111         * config/h8300/h8300-protos.h (notice_update_cc): Likewise for
19112         param 2.
19113         * config/h8300/h8300.c (notice_update_cc): Likewise.
19114         * config/i386/i386.c (ix86_flags_dependent): Likewise for params
19115         "insn" and "dep_insn".
19116         (exact_store_load_dependency): Likewise for both params.
19117         (ix86_macro_fusion_pair_p): Eliminate local named "single_set"
19118         since this now clashes with inline function.  Instead, delay
19119         calling single_set until the point where its needed, and then
19120         assign the result to "compare_set" and rework the conditional that
19121         follows.
19122         * config/ia64/ia64.md (define_expand "tablejump"): Strengthen
19123         local "last" from rtx to rtx_insn *.
19124         * config/mips/mips-protos.h (mips_load_store_insns): Likewise for
19125         second param.
19126         (mips_store_data_bypass_p): Likewise for both params.
19127         * config/mips/mips.c (mips_load_store_insns): Likewise for second
19128         param.
19129         (mips_store_data_bypass_p): Likewise for both params.
19130         (mips_orphaned_high_part_p): Likewise for param "insn".
19131         * config/mn10300/mn10300.c (extract_bundle): Likewise.
19132         (mn10300_bundle_liw): Likewise for locals "r", "insn1", "insn2".
19133         Introduce local rtx "insn2_pat".
19134         * config/rl78/rl78.c (move_elim_pass): Likewise for locals "insn",
19135         "ninsn".
19136         (rl78_remove_unused_sets): Likewise for locals "insn", "ninsn".
19137         Introduce local rtx "set", using it in place of "insn" for the
19138         result of single_set.  This appears to fix a bug, since the call
19139         to find_regno_note on a SET does nothing.
19140         * config/rs6000/rs6000.c (set_to_load_agen): Strengthen both
19141         params from rtx to rtx_insn *.
19142         (set_to_load_agen): Likewise.
19143         * config/s390/s390.c (s390_label_align): Likewise for local
19144         "prev_insn".  Introduce new rtx locals "set" and "src", using
19145         them in place of "prev_insn" for the results of single_set
19146         and SET_SRC respectively.
19147         (s390_swap_cmp): Strengthen local "jump" from rtx to rtx_insn *.
19148         Introduce new rtx local "set" using in place of "jump" for the
19149         result of single_set.  Use SET_SRC (set) rather than plain
19150         XEXP (set, 1).
19151         * config/sh/sh.c (noncall_uses_reg): Strengthen param 2from
19152         rtx to rtx_insn *.
19153         (noncall_uses_reg): Likewise.
19154         (reg_unused_after): Introduce local rtx_sequence * "seq" in region
19155         guarded by GET_CODE check, using its methods for clarity, and to
19156         enable strengthening local "this_insn" from rtx to rtx_insn *.
19157         * config/sh/sh.md (define_expand "mulhisi3"): Strengthen local
19158         "insn" from rtx to rtx_insn *.
19159         (define_expand "umulhisi3"): Likewise.
19160         (define_expand "smulsi3_highpart"): Likewise.
19161         (define_expand "umulsi3_highpart"): Likewise.
19162         * config/sparc/sparc.c (sparc_do_work_around_errata): Likewise for
19163         local "after".  Replace GET_CODE check with a dyn_cast,
19164         introducing new local rtx_sequence * "seq", using insn method for
19165         typesafety.
19167         * dwarf2cfi.c (dwarf2out_frame_debug): Strengthen param "insn"
19168         from rtx to rtx_insn *.  Introduce local rtx "pat", using it in
19169         place of "insn" once we're dealing with patterns rather than the
19170         input insn.
19171         (scan_insn_after): Strengthen param "insn" from rtx to rtx_insn *.
19172         (scan_trace): Likewise for local "elt", updating lookups within
19173         sequence to use insn method rather than element method.
19174         * expr.c (find_args_size_adjust): Strengthen param "insn" from rtx
19175         to rtx_insn *.
19176         * gcse.c (gcse_emit_move_after): Likewise for local "new_rtx".
19177         * ifcvt.c (noce_try_abs): Likewise for local "insn".
19178         * ira.c (fix_reg_equiv_init): Add checked cast to rtx_insn * when
19179         invoking single_set.
19180         * lra-constraints.c (insn_rhs_dead_pseudo_p): Strengthen param
19181         "insn" from rtx to rtx_insn *.
19182         (skip_usage_debug_insns): Likewise for return type, adding a
19183         checked cast.
19184         (check_secondary_memory_needed_p): Likewise for local "insn".
19185         (inherit_reload_reg): Likewise.
19186         * modulo-sched.c (sms_schedule): Likewise for local "count_init".
19187         * recog.c (peep2_attempt): Likewise for local "old_insn", adding
19188         checked casts.
19189         (store_data_bypass_p): Likewise for both params.
19190         (if_test_bypass_p): Likewise.
19191         * recog.h (store_data_bypass_p): Likewise for both params.
19192         (if_test_bypass_p): Likewise.
19193         * reload.c (find_equiv_reg): Likewise for local "where".
19194         * reorg.c (delete_jump): Likewise for param "insn".
19195         * rtlanal.c (single_set_2): Strenghen param "insn" from const_rtx
19196         to const rtx_insn *.
19197         * store-motion.c (replace_store_insn): Likewise for param "del".
19198         (delete_store): Strengthen local "i" from rtx to rtx_insn_list *,
19199         and use its methods for clarity, and to strengthen local "del"
19200         from rtx to rtx_insn *.
19201         (build_store_vectors): Use insn method of "st" when calling
19202         replace_store_insn for typesafety and clarity.
19204 2014-09-09  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
19206         * config/rs6000/rs6000.c (rtx_is_swappable_p): Add
19207         UNSPEC_VSX_CVDPSPN as an unswappable operand, and add commentary
19208         on how to make it legal in future.
19210 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19212         * caller-save.c (rtx saveinsn): Strengthen this variable from rtx
19213         to rtx_insn *.
19214         (restinsn): Likewise.
19215         * config/aarch64/aarch64-protos.h (aarch64_simd_attr_length_move):
19216         Likewise for param.
19217         * config/aarch64/aarch64.c (aarch64_simd_attr_length_move):
19218         Likewise.
19219         * config/arc/arc-protos.h (arc_adjust_insn_length): Likewise for
19220         first param.
19221         (arc_hazard): Likewise for both params.
19222         * config/arc/arc.c (arc600_corereg_hazard): Likewise, adding
19223         checked casts to rtx_sequence * and uses of the insn method for
19224         type-safety.
19225         (arc_hazard): Strengthen both params from rtx to rtx_insn *.
19226         (arc_adjust_insn_length): Likewise for param "insn".
19227         (struct insn_length_parameters_s): Likewise for first param of
19228         "get_variants" callback field.
19229         (arc_get_insn_variants): Likewise for first param and local
19230         "inner".  Replace a check of GET_CODE with a dyn_cast to
19231         rtx_sequence *, using methods for type-safety and clarity.
19232         * config/arc/arc.h (ADJUST_INSN_LENGTH): Use casts to
19233         rtx_sequence * and uses of the insn method for type-safety when
19234         invoking arc_adjust_insn_length.
19235         * config/arm/arm-protos.h (arm_attr_length_move_neon): Likewise
19236         for param.
19237         (arm_address_offset_is_imm): Likewise.
19238         (struct tune_params): Likewise for params 1 and 3 of the
19239         "sched_adjust_cost" callback field.
19240         * config/arm/arm.c (cortex_a9_sched_adjust_cost): Likewise for
19241         params 1 and 3 ("insn" and "dep").
19242         (xscale_sched_adjust_cost): Likewise.
19243         (fa726te_sched_adjust_cost): Likewise.
19244         (cortexa7_older_only): Likewise for param "insn".
19245         (cortexa7_younger): Likewise.
19246         (arm_attr_length_move_neon): Likewise.
19247         (arm_address_offset_is_imm): Likewise.
19248         * config/avr/avr-protos.h (avr_notice_update_cc): Likewise.
19249         * config/avr/avr.c (avr_notice_update_cc): Likewise.
19250         * config/bfin/bfin.c (hwloop_pattern_reg): Likewise.
19251         (workaround_speculation): Likewise for local "last_condjump".
19252         * config/c6x/c6x.c (shadow_p): Likewise for param "insn".
19253         (shadow_or_blockage_p): Likewise.
19254         (get_unit_reqs): Likewise.
19255         (get_unit_operand_masks): Likewise.
19256         (c6x_registers_update): Likewise.
19257         (returning_call_p): Likewise.
19258         (can_use_callp): Likewise.
19259         (convert_to_callp): Likewise.
19260         (find_last_same_clock): Likwise for local "t".
19261         (reorg_split_calls): Likewise for local "shadow".
19262         (hwloop_pattern_reg): Likewise for param "insn".
19263         * config/frv/frv-protos.h (frv_final_prescan_insn): Likewise.
19264         * config/frv/frv.c (frv_final_prescan_insn): Likewise.
19265         (frv_extract_membar): Likewise.
19266         (frv_optimize_membar_local): Strengthen param "last_membar" from
19267         rtx * to rtx_insn **.
19268         (frv_optimize_membar_global): Strengthen param "membar" from rtx
19269         to rtx_insn *.
19270         (frv_optimize_membar): Strengthen local "last_membar" from rtx *
19271         to rtx_insn **.
19272         * config/ia64/ia64-protos.h (ia64_st_address_bypass_p): Strengthen
19273         both params from rtx to rtx_insn *.
19274         (ia64_ld_address_bypass_p): Likewise.
19275         * config/ia64/ia64.c (ia64_safe_itanium_class): Likewise for param
19276         "insn".
19277         (ia64_safe_type): Likewise.
19278         (group_barrier_needed): Likewise.
19279         (safe_group_barrier_needed): Likewise.
19280         (ia64_single_set): Likewise.
19281         (is_load_p): Likewise.
19282         (record_memory_reference): Likewise.
19283         (get_mode_no_for_insn): Likewise.
19284         (important_for_bundling_p): Likewise.
19285         (unknown_for_bundling_p): Likewise.
19286         (ia64_st_address_bypass_p): Likewise for both params.
19287         (ia64_ld_address_bypass_p): Likewise.
19288         (expand_vselect): Introduce new local rtx_insn * "insn", using it
19289         in place of rtx "x" after the emit_insn call.
19290         * config/i386/i386-protos.h (x86_extended_QIreg_mentioned_p):
19291         Strengthen param from rtx to rtx_insn *.
19292         (ix86_agi_dependent): Likewise for both params.
19293         (ix86_attr_length_immediate_default): Likewise for param 1.
19294         (ix86_attr_length_address_default): Likewise for param.
19295         (ix86_attr_length_vex_default): Likewise for param 1.
19296         * config/i386/i386.c (ix86_attr_length_immediate_default):
19297         Likewise for param "insn".
19298         (ix86_attr_length_address_default): Likewise.
19299         (ix86_attr_length_vex_default): Likewise.
19300         (ix86_agi_dependent): Likewise for both params.
19301         (x86_extended_QIreg_mentioned_p): Likewise for param "insn".
19302         (vselect_insn): Likewise for this variable.
19303         * config/m68k/m68k-protos.h (m68k_sched_attr_opx_type): Likewise
19304         for param 1.
19305         (m68k_sched_attr_opy_type): Likewise.
19306         * config/m68k/m68k.c (sched_get_operand): Likewise.
19307         (sched_attr_op_type): Likewise.
19308         (m68k_sched_attr_opx_type): Likewise.
19309         (m68k_sched_attr_opy_type): Likewise.
19310         (sched_get_reg_operand): Likewise.
19311         (sched_get_mem_operand): Likewise.
19312         (m68k_sched_address_bypass_p): Likewise for both params.
19313         (sched_get_indexed_address_scale): Likewise.
19314         (m68k_sched_indexed_address_bypass_p): Likewise.
19315         * config/m68k/m68k.h (m68k_sched_address_bypass_p): Likewise.
19316         (m68k_sched_indexed_address_bypass_p): Likewise.
19317         * config/mep/mep.c (mep_jmp_return_reorg): Strengthen locals
19318         "label", "ret" from rtx to rtx_insn *, adding a checked cast and
19319         removing another.
19320         * config/mips/mips-protos.h (mips_linked_madd_p): Strengthen both
19321         params from rtx to rtx_insn *.
19322         (mips_fmadd_bypass): Likewise.
19323         * config/mips/mips.c (mips_fmadd_bypass): Likewise.
19324         (mips_linked_madd_p): Likewise.
19325         (mips_macc_chains_last_hilo): Likewise for this variable.
19326         (mips_macc_chains_record): Likewise for param.
19327         (vr4130_last_insn): Likewise for this variable.
19328         (vr4130_swap_insns_p): Likewise for both params.
19329         (mips_ls2_variable_issue): Likewise for param.
19330         (mips_need_noat_wrapper_p): Likewise for param "insn".
19331         (mips_expand_vselect): Add a new local rtx_insn * "insn", using it
19332         in place of "x" after the emit_insn.
19333         * config/pa/pa-protos.h (pa_fpstore_bypass_p): Strengthen both
19334         params from rtx to rtx_insn *.
19335         * config/pa/pa.c (pa_fpstore_bypass_p): Likewise.
19336         (pa_combine_instructions): Introduce local "par" for result of
19337         gen_rtx_PARALLEL, moving decl and usage of new_rtx for after call
19338         to make_insn_raw.
19339         (pa_can_combine_p): Strengthen param "new_rtx" from rtx to rtx_insn *.
19340         * config/rl78/rl78.c (insn_ok_now): Likewise for param "insn".
19341         (rl78_alloc_physical_registers_op1): Likewise.
19342         (rl78_alloc_physical_registers_op2): Likewise.
19343         (rl78_alloc_physical_registers_ro1): Likewise.
19344         (rl78_alloc_physical_registers_cmp): Likewise.
19345         (rl78_alloc_physical_registers_umul): Likewise.
19346         (rl78_alloc_address_registers_macax): Likewise.
19347         (rl78_alloc_physical_registers): Likewise for locals "insn", "curr".
19348         * config/s390/predicates.md (execute_operation): Likewise for
19349         local "insn".
19350         * config/s390/s390-protos.h (s390_agen_dep_p): Likewise for both
19351         params.
19352         * config/s390/s390.c (s390_safe_attr_type): Likewise for param.
19353         (addr_generation_dependency_p): Likewise for param "insn".
19354         (s390_agen_dep_p): Likewise for both params.
19355         (s390_fpload_toreg): Likewise for param "insn".
19356         * config/sh/sh-protos.h (sh_loop_align): Likewise for param.
19357         * config/sh/sh.c (sh_loop_align): Likewise for param and local
19358         "next".
19359         * config/sh/sh.md (define_peephole2): Likewise for local "insn2".
19360         * config/sh/sh_treg_combine.cc
19361         (sh_treg_combine::make_inv_ccreg_insn): Likewise for return type
19362         and local "i".
19363         (sh_treg_combine::try_eliminate_cstores): Likewise for local "i".
19364         * config/stormy16/stormy16.c (combine_bnp): Likewise for locals
19365         "and_insn", "load", "shift".
19366         * config/tilegx/tilegx.c (match_pcrel_step2): Likewise for param
19367         "insn".
19368         * final.c (final_scan_insn): Introduce local rtx_insn * "other"
19369         for XEXP (note, 0) of the REG_CC_SETTER note.
19370         (cleanup_subreg_operands): Strengthen param "insn" from rtx to
19371         rtx_insn *, eliminating a checked cast made redundant by this.
19372         * gcse.c (process_insert_insn): Strengthen local "insn" from rtx
19373         to rtx_insn *.
19374         * genattr.c (main): When writing out the prototype to
19375         const_num_delay_slots, strengthen the param from rtx to
19376         rtx_insn *.
19377         * genattrtab.c (write_const_num_delay_slots): Likewise when
19378         writing out the implementation of const_num_delay_slots.
19379         * hw-doloop.h (struct hw_doloop_hooks): Strengthen the param
19380         "insn" of callback field "end_pattern_reg" from rtx to rtx_insn *.
19381         * ifcvt.c (noce_emit_store_flag): Eliminate local rtx "tmp" in
19382         favor of new rtx locals "src" and "set" and new local rtx_insn *
19383         "insn" and "seq".
19384         (noce_emit_move_insn): Strengthen locals "seq" and "insn" from rtx
19385         to rtx_insn *.
19386         (noce_emit_cmove): Eliminate local rtx "tmp" in favor of new rtx
19387         locals "cond", "if_then_else", "set" and new rtx_insn * locals
19388         "insn" and "seq".
19389         (noce_try_cmove_arith): Strengthen locals "insn_a" and "insn_b",
19390         "last" from rtx to rtx_insn *.  Likewise for a local "tmp",
19391         renaming to "tmp_insn".  Eliminate the other local rtx "tmp" from
19392         the top-level scope, replacing with new more tightly-scoped rtx
19393         locals "reg", "pat", "mem" and rtx_insn * "insn", "copy_of_a",
19394         "new_insn", "copy_of_insn_b", and make local rtx "set" more
19395         tightly-scoped.
19396         * ira-int.h (ira_setup_alts): Strengthen param "insn" from rtx to
19397         rtx_insn *.
19398         * ira.c (setup_prohibited_mode_move_regs): Likewise for local
19399         "move_insn".
19400         (ira_setup_alts): Likewise for param "insn".
19401         * lra-constraints.c (emit_inc): Likewise for local "add_insn".
19402         * lra.c (emit_add3_insn): Split local rtx "insn" in two, an rtx
19403         and an rtx_insn *.
19404         (lra_emit_add): Eliminate top-level local rtx "insn" in favor of
19405         new more-tightly scoped rtx locals "add3_insn", "insn",
19406         "add2_insn" and rtx_insn * "move_insn".
19407         * postreload-gcse.c (eliminate_partially_redundant_load): Add
19408         checked cast on result of gen_move_insn when invoking
19409         extract_insn.
19410         * recog.c (insn_invalid_p): Strengthen param "insn" from rtx to
19411         rtx_insn *.
19412         (verify_changes): Add a checked cast on "object" when invoking
19413         insn_invalid_p.
19414         (extract_insn_cached): Strengthen param "insn" from rtx to
19415         rtx_insn *.
19416         (extract_constrain_insn_cached): Likewise.
19417         (extract_insn): Likewise.
19418         * recog.h (insn_invalid_p): Likewise for param 1.
19419         (recog_memoized): Likewise for param.
19420         (extract_insn): Likewise.
19421         (extract_constrain_insn_cached): Likewise.
19422         (extract_insn_cached): Likewise.
19423         * reload.c (can_reload_into): Likewise for local "test_insn".
19424         * reload.h (cleanup_subreg_operands): Likewise for param.
19425         * reload1.c (emit_insn_if_valid_for_reload): Rename param from
19426         "insn" to "pat", reintroducing "insn" as an rtx_insn * on the
19427         result of emit_insn.  Remove a checked cast made redundant by this
19428         change.
19429         * sel-sched-ir.c (sel_insn_rtx_cost): Strengthen param "insn" from
19430         rtx to rtx_insn *.
19431         * sel-sched.c (get_reg_class): Likewise.
19433 2014-09-09  Marcus Shawcroft  <marcus.shawcroft@arm.com>
19434             Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
19436         * config/aarch64/aarch64-elf-raw.h (ENDFILE_SPEC): Add crtfastmath.o.
19437         * config/aarch64/aarch64-linux.h (GNU_USER_TARGET_MATH_ENDFILE_SPEC):
19438         Define.
19439         (ENDFILE_SPEC): Define and use GNU_USER_TARGET_MATH_ENDFILE_SPEC.
19441 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19443         * rtl.h (INSN_LOCATION): Strengthen param from const_rtx to
19444         const rtx_insn *, and from rtx to rtx_insn * for the other
19445         overloaded variant.
19446         (RTL_LOCATION): Add a checked cast to rtx_insn * when invoking
19447         INSN_LOCATION, since we know INSN_P holds.
19448         (insn_line): Strengthen param from const_rtx to const rtx_insn *.
19449         (insn_file): Likewise.
19450         (insn_scope): Likewise.
19451         (insn_location): Likewise.
19453         * config/mips/mips.c (mips16_gp_pseudo_reg): Strengthen local
19454         "insn" from rtx to rtx_insn *, introducing a new local rtx "set"
19455         for the result of gen_load_const_gp.
19456         * config/rs6000/rs6000-protos.h (output_call): Strengthen first
19457         param from rtx to rtx_insn *.
19458         * config/rs6000/rs6000.c (output_call): Likewise.
19459         * dwarf2out.c (dwarf2out_var_location): Likewise for local "prev",
19460         introducing a checked cast to rtx_sequence * and use of the insn
19461         method.
19462         * emit-rtl.c (emit_copy_of_insn_after): Strengthen both params
19463         from rtx to rtx_insn *.
19464         (insn_scope): Strengthen param from const_rtx to const rtx_insn *.
19465         (insn_line): Likewise.
19466         (insn_file): Likewise.
19467         (insn_location): Likewise.
19468         * emit-rtl.h (emit_copy_of_insn_after): Strengthen both params
19469         from rtx to rtx_insn *.
19470         * print-rtl.c (print_rtx): Introduce local "in_insn" via a checked
19471         cast, using it for calls to INSN_HAS_LOCATION and insn_location.
19472         * recog.c (peep2_attempt): Introduce local rtx_insn * "peepinsn"
19473         via a checked cast.
19474         * reorg.c (relax_delay_slots): Strengthen locals named "after"
19475         from rtx to rtx_insn *; use methods of "pat" for type-safety.
19477 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19479         * combine.c (try_combine): Eliminate checked cast on result of
19480         gen_rtx_INSN.
19481         * emit-rtl.c (gen_rtx_INSN): New function, improving over the prior
19482         autogenerated one by strengthening the return type and params 2 and 3
19483         from rtx to rtx_insn *, and by naming the params.
19484         * gengenrtl.c (special_rtx): Add INSN to those that are
19485         special-cased.
19486         * rtl.h (gen_rtx_INSN): New prototype.
19488 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19490         * ira.c (ira_update_equiv_info_by_shuffle_insn): Use NULL rather
19491         than NULL_RTX.
19492         (no_equiv): Likewise.
19493         (update_equiv_regs): Likewise.
19494         (setup_reg_equiv): Likewise.  Strengthen locals "elem",
19495         "prev_elem", "next_elem" from rtx to rtx_insn_list *, and "insn"
19496         from rtx to rtx_insn *.  Use methods of "elem" for typesafety and
19497         clarity.
19498         * ira.h (struct ira_reg_equiv_s): Strengthen field "init_insns"
19499         from rtx to rtx_insn_list *.
19500         * lra-assigns.c (spill_for): Strengthen local "x" from rtx to
19501         rtx_insn_list * and use methods for clarity and typesafety.
19502         * lra-constraints.c (contains_deleted_insn_p): Likewise for param
19503         "list".
19504         (init_insn_rhs_dead_pseudo_p): Likewise for local "insns".  Remove
19505         redundant check on INSN_P (insns): this cannot hold, as "insns" is
19506         an INSN_LIST, not an insn.
19507         (reverse_equiv_p): Strengthen local "insns" from rtx to
19508         rtx_insn_list * and use methods for clarity and typesafety.
19509         (contains_reloaded_insn_p): Likewise for local "list".
19511 2014-09-09  Jiong Wang  <jiong.wang@arm.com>
19513         * config/arm/arm.c (NEON_COPYSIGNF): New enum.
19514         (arm_init_neon_builtins): Support NEON_COPYSIGNF.
19515         (arm_builtin_vectorized_function): Likewise.
19516         * config/arm/arm_neon_builtins.def: New macro for copysignf.
19517         * config/arm/neon.md (neon_copysignf<mode>): New pattern for
19518         vector copysignf.
19520 2014-09-09  Richard Sandiford  <richard.sandiford@arm.com>
19522         * bb-reorder.h (default_target_bb_reorder): Remove redundant GTY.
19523         * builtins.h (default_target_builtins): Likewise.
19524         * gcse.h (default_target_gcse): Likewise.
19525         * target-globals.h (target_globals): Add a destructor.  Convert
19526         void-pointer fields back to their real type and change from
19527         GTY((atomic)) to GTY((skip)).
19528         (restore_target_globals): Remove casts accordingly.
19529         * target-globals.c (save_target_globals): Use XCNEW rather than
19530         ggc_internal_cleared_alloc to allocate non-GC structures.
19531         Use ggc_cleared_alloc to allocate the target_globals structure
19532         itself.
19533         (target_globals::~target_globals): Define.
19535 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19537         * config/arm/arm.md (vfp_pop_multiple_with_writeback): Use vldm
19538         mnemonic instead of fldmfdd.
19539         * config/arm/arm.c (vfp_output_fstmd): Rename to...
19540         (vfp_output_vstmd): ... This.  Convert output to UAL syntax.
19541         Output vpush when address register is SP.
19542         * config/arm/arm-protos.h (vfp_output_fstmd): Rename to...
19543         (vfp_output_vstmd): ... This.
19544         * config/arm/vfp.md (push_multi_vfp): Update call to
19545         vfp_output_vstmd.
19547 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19549         * config/arm/vfp.md (*movcc_vfp): Use UAL syntax.
19551 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19553         * config/arm/vfp.md (*sqrtsf2_vfp): Use UAL assembly syntax.
19554         (*sqrtdf2_vfp): Likewise.
19555         (*cmpsf_vfp): Likewise.
19556         (*cmpsf_trap_vfp): Likewise.
19557         (*cmpdf_vfp): Likewise.
19558         (*cmpdf_trap_vfp): Likewise.
19560 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19562         * config/arm/vfp.md (*extendsfdf2_vfp): Use UAL assembly syntax.
19563         (*truncdfsf2_vfp): Likewise.
19564         (*truncsisf2_vfp): Likewise.
19565         (*truncsidf2_vfp): Likewise.
19566         (fixuns_truncsfsi2): Likewise.
19567         (fixuns_truncdfsi2): Likewise.
19568         (*floatsisf2_vfp): Likewise.
19569         (*floatsidf2_vfp): Likewise.
19570         (floatunssisf2): Likewise.
19571         (floatunssidf2): Likewise.
19573 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19575         * config/arm/vfp.md (*mulsf3_vfp): Use UAL assembly syntax.
19576         (*muldf3_vfp): Likewise.
19577         (*mulsf3negsf_vfp): Likewise.
19578         (*muldf3negdf_vfp): Likewise.
19579         (*mulsf3addsf_vfp): Likewise.
19580         (*muldf3adddf_vfp): Likewise.
19581         (*mulsf3subsf_vfp): Likewise.
19582         (*muldf3subdf_vfp): Likewise.
19583         (*mulsf3negsfaddsf_vfp): Likewise.
19584         (*fmuldf3negdfadddf_vfp): Likewise.
19585         (*mulsf3negsfsubsf_vfp): Likewise.
19586         (*muldf3negdfsubdf_vfp): Likewise.
19588 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19590         * config/arm/vfp.md (*abssf2_vfp): Use UAL assembly syntax.
19591         (*absdf2_vfp): Likewise.
19592         (*negsf2_vfp): Likewise.
19593         (*negdf2_vfp): Likewise.
19594         (*addsf3_vfp): Likewise.
19595         (*adddf3_vfp): Likewise.
19596         (*subsf3_vfp): Likewise.
19597         (*subdf3_vfp): Likewise.
19598         (*divsf3_vfp): Likewise.
19599         (*divdf3_vfp): Likewise.
19601 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19603         * config/arm/arm.c (output_move_vfp): Use UAL syntax for load/store
19604         multiple.
19605         (arm_print_operand): Don't convert real values to decimal
19606         representation in default case.
19607         (fp_immediate_constant): Delete.
19608         * config/arm/arm-protos.h (fp_immediate_constant): Likewise.
19609         * config/arm/vfp.md (*arm_movsi_vfp): Convert to VFP moves to UAL
19610         syntax.
19611         (*thumb2_movsi_vfp): Likewise.
19612         (*movdi_vfp): Likewise.
19613         (*movdi_vfp_cortexa8): Likewise.
19614         (*movhf_vfp_neon): Likewise.
19615         (*movhf_vfp): Likewise.
19616         (*movsf_vfp): Likewise.
19617         (*thumb2_movsf_vfp): Likewise.
19618         (*movdf_vfp): Likewise.
19619         (*thumb2_movdf_vfp): Likewise.
19620         (*movsfcc_vfp): Likewise.
19621         (*thumb2_movsfcc_vfp): Likewise.
19622         (*movdfcc_vfp): Likewise.
19623         (*thumb2_movdfcc_vfp): Likewise.
19625 2014-09-09  James Greenhalgh  <james.greenhalgh@arm.com>
19627         * doc/invoke.texi (-march): Use GNU/Linux rather than Linux.
19628         (-mtune): Likewise.
19629         (-mcpu): Likewise.
19631 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19633         PR target/61749
19634         * config/aarch64/aarch64-builtins.c (aarch64_types_quadop_qualifiers):
19635         Use qualifier_immediate for last operand.  Rename to...
19636         (aarch64_types_ternop_lane_qualifiers): ... This.
19637         (TYPES_QUADOP): Rename to...
19638         (TYPES_TERNOP_LANE): ... This.
19639         (aarch64_simd_expand_args): Return const0_rtx when encountering user
19640         error.  Change return of 0 to return of NULL_RTX.
19641         (aarch64_crc32_expand_builtin): Likewise.
19642         (aarch64_expand_builtin): Return NULL_RTX instead of 0.
19643         ICE when expanding unknown builtin.
19644         * config/aarch64/aarch64-simd-builtins.def (sqdmlal_lane): Use
19645         TERNOP_LANE qualifiers.
19646         (sqdmlsl_lane): Likewise.
19647         (sqdmlal_laneq): Likewise.
19648         (sqdmlsl_laneq): Likewise.
19649         (sqdmlal2_lane): Likewise.
19650         (sqdmlsl2_lane): Likewise.
19651         (sqdmlal2_laneq): Likewise.
19652         (sqdmlsl2_laneq): Likewise.
19654 2014-09-09  Nick Clifton  <nickc@redhat.com>
19656         * doc/invoke.texi (Optimization Options): Add missing @gol to the
19657         end of a line.
19658         (S/390 and zSeries Options): Remove superfluous word from the
19659         description of the -mhotpatch option.
19661 2014-09-09  Zhenqiang Chen  <zhenqiang.chen@arm.com>
19663         * shrink-wrap.h: #define SHRINK_WRAPPING_ENABLED.
19664         * ira.c: #include "shrink-wrap.h"
19665         (split_live_ranges_for_shrink_wrap): Use SHRINK_WRAPPING_ENABLED.
19666         * ifcvt.c: #include "shrink-wrap.h"
19667         (dead_or_predicable): Use SHRINK_WRAPPING_ENABLED.
19669 2014-09-08  Trevor Saunders  <tsaunders@mozilla.com>
19671         * common/config/picochip/picochip-common.c: Remove.
19672         * config.gcc: Remove support for picochip.
19673         * config/picochip/constraints.md: Remove.
19674         * config/picochip/dfa_space.md: Remove.
19675         * config/picochip/dfa_speed.md: Remove.
19676         * config/picochip/picochip-protos.h: Remove.
19677         * config/picochip/picochip.c: Remove.
19678         * config/picochip/picochip.h: Remove.
19679         * config/picochip/picochip.md: Remove.
19680         * config/picochip/picochip.opt: Remove.
19681         * config/picochip/predicates.md: Remove.
19682         * config/picochip/t-picochip: Remove.
19683         * doc/md.texi: Don't document picochi.
19685 2014-09-08  David Malcolm  <dmalcolm@redhat.com>
19687         * basic-block.h (control_flow_insn_p): Strengthen param from
19688         const_rtx to const rtx_insn *.
19689         * cfgbuild.c (control_flow_insn_p): Likewise.
19691 2014-09-08  David Malcolm  <dmalcolm@redhat.com>
19693         * gcse.c (modify_mem_list): Strengthen this variable from
19694         vec<rtx> * to vec<rtx_insn *> *.
19695         (vec_rtx_heap): Strengthen this typedef from vec<rtx> to
19696         vec<rtx_insn *>.
19697         (load_killed_in_block_p): Strengthen local "list" from vec<rtx> to
19698         vec<rtx_insn *>, and local "setter" from rtx to rtx_insn *.
19699         (record_last_mem_set_info): Strengthen param "insn" from rtx to
19700         rtx_insn *.
19701         (record_last_set_info): Likewise for local "last_set_insn".
19703 2014-09-08  DJ Delorie  <dj@redhat.com>
19705         * doc/invoke.texi (MSP430 Options): Add -minrt.
19707 2014-09-08  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
19709         * config/rs6000/rs6000.c (special_handling_values):  Add SH_SPLAT.
19710         (rtx_is_swappable_p): Convert UNSPEC cascading ||s to a switch
19711         statement; allow optimization of UNSPEC_VSPLT_DIRECT with special
19712         handling SH_SPLAT.
19713         (adjust_extract): Fix test for VEC_DUPLICATE case; fix adjustment
19714         of extracted lane.
19715         (adjust_splat): New function.
19716         (handle_special_swappables): Call adjust_splat for SH_SPLAT.
19717         (dump_swap_insn_table): Add case for SH_SPLAT.
19719 2014-09-08  Richard Biener  <rguenther@suse.de>
19721         PR ipa/63196
19722         * tree-inline.c (copy_loops): The source loop header should
19723         always be non-NULL.
19724         (tree_function_versioning): If loops need fixup after removing
19725         unreachable blocks fix them.
19726         * omp-low.c (simd_clone_adjust): Do not add incr block to
19727         loop under construction.
19729 2014-09-08  Alan Lawrence  <alan.lawrence@arm.com>
19731         * config/aarch64/aarch64-builtins.c
19732         (aarch64_types_cmtst_qualifiers, TYPES_TST): Remove as unused.
19734 2014-09-08  Joseph Myers  <joseph@codesourcery.com>
19736         * config/i386/cygming.h (TF_SIZE): Remove.
19737         * config/i386/darwin.h (TF_SIZE): Remove.
19738         * config/i386/dragonfly.h (TF_SIZE): Remove.
19739         * config/i386/freebsd.h (TF_SIZE): Remove.
19740         * config/i386/gnu-user-common.h (TF_SIZE): Remove.
19741         * config/i386/openbsdelf.h (TF_SIZE): Remove.
19742         * config/i386/sol2.h (TF_SIZE): Remove.
19743         * config/ia64/hpux.h (XF_SIZE, TF_SIZE): Remove.
19744         * config/ia64/linux.h (TF_SIZE): Remove.
19745         * doc/tm.texi.in (SF_SIZE, DF_SIZE, XF_SIZE, TF_SIZE): Remove.
19746         * doc/tm.texi: Regenerate.
19747         * system.h (SF_SIZE, DF_SIZE, XF_SIZE, TF_SIZE): Poison.
19749 2014-09-08  Joseph Myers  <joseph@codesourcery.com>
19751         * defaults.h (LARGEST_EXPONENT_IS_NORMAL, ROUND_TOWARDS_ZERO):
19752         Remove.
19753         * doc/tm.texi.in (ROUND_TOWARDS_ZERO, LARGEST_EXPONENT_IS_NORMAL):
19754         Remove.
19755         * doc/tm.texi: Regenerate.
19756         * system.h (LARGEST_EXPONENT_IS_NORMAL, ROUND_TOWARDS_ZERO):
19757         Poison.
19758         * config/arm/arm.h (LARGEST_EXPONENT_IS_NORMAL): Remove.
19759         * config/cris/cris.h (__make_dp): Remove.
19761 2014-09-08  Richard Biener  <rguenther@suse.de>
19763         PR bootstrap/63204
19764         * cfgloop.c (mark_loop_for_removal): Track former header
19765         unconditionally.
19766         * cfgloop.h (struct loop): Add former_header member unconditionally.
19767         * loop-init.c (fix_loop_structure): Enable bogus loop removal
19768         diagnostic unconditionally.
19770 2014-09-07 Venkataramanan Kumar <venkataramanan.kumar@linaro.org>
19772         PR target/63190
19773         * config/aarch64/aarch64.md (stack_protect_test_<mode>) Add register
19774         constraint for operand0 and remove write only modifier from operand3.
19776 2014-09-07  Richard Sandiford  <richard.sandiford@arm.com>
19778         PR rtl-optimization/62208
19779         * simplify-rtx.c (simplify_relational_operation_1): Use CONST0_RTX
19780         rather than const0_rtx in eq/ne-xor simplifications.
19782 2014-09-06  Joern Rennecke  <joern.rennecke@embecosm.com>
19784         * config/arc/arc.c (arc_print_operand): Fix format for HOST_WIDE_INT.
19785         (arc_output_mi_thunk): Likewise.
19787         * config/arc/arc.c (arc_predicate_delay_insns): Swap comparison
19788         arguments to silence bogus warning.
19790 2014-09-06  Richard Sandiford  <richard.sandiford@arm.com>
19792         PR middle-end/63171
19793         * rtlanal.c (tls_referenced_p): Don't skip constant subrtxes.
19795 2014-09-06  Tom de Vries  <tom@codesourcery.com>
19797         * ira-costs.c (ira_tune_allocno_costs): Don't conditionalize
19798         IRA_HARD_REGNO_ADD_COST_MULTIPLIER code on
19799         ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS.
19801 2014-09-05  Dominique Dhumieres  <dominiq@lps.ens.fr>
19803         PR target/63188
19804         * config/darwin.h (INIT_SECTION_ASM_OP): Define to "".
19805         * config/pa/pa64-hpux.h (INIT_SECTION_ASM_OP): Likewise.
19807 2014-09-05  Easwaran Raman  <eraman@google.com>
19809         PR rtl-optimization/62146
19810         * ifcvt.c (dead_or_predicable): Make removal of REG_EQUAL note of
19811         hoisted instruction unconditional.
19813 2014-09-05  Segher Boessenkool  <segher@kernel.crashing.org>
19815         PR target/63187
19816         * config/rs6000/rs6000.md (*and<mode>3_imm_dot, *and<mode>3_imm_dot2):
19817         Do not allow any_mask_operand for operands[2].
19818         (*and<mode>3_imm_mask_dot, *and<mode>3_imm_mask_dot2): New.
19820 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19822         * config/arc/arc.c (arc_print_operand): Use insn method of
19823         final_sequence for type-safety.
19824         * config/bfin/bfin.c (bfin_hardware_loop): Strengthen param
19825         "insn" from rtx to rtx_insn *.
19826         * config/frv/frv.c (frv_print_operand_jump_hint): Likewise.
19827         * config/mn10300/mn10300.c (mn10300_scan_for_setlb_lcc):
19828         Likewise for locals "branch", "label".
19829         * config/h8300/h8300.c (same_cmp_preceding_p): Likewise for
19830         locals "i1", "i2".  Use NULL rather than NULL_RTX in comparisons.
19831         (same_cmp_following_p): Likewise for locals "i2", "i3".
19832         * config/sh/sh_optimize_sett_clrt.cc
19833         (sh_optimize_sett_clrt::sh_cbranch_ccreg_value): Likewise for
19834         param "cbranch_insn".
19835         * function.c (convert_jumps_to_returns): Likewis for local "jump".
19836         * ifcvt.c (cond_exec_get_condition): Likewise for param "jump".
19837         * jump.c (simplejump_p): Strengthen param "insn" from const_rtx to
19838         const rtx_insn *.
19839         (condjump_p): Likewise.
19840         (condjump_in_parallel_p): Likewise.
19841         (pc_set): Likewise.
19842         (any_uncondjump_p): Likewise.
19843         (any_condjump_p): Likewise.
19844         (condjump_label): Likewise.
19845         (returnjump_p): Strengthen param "insn" from rtx to
19846         const rtx_insn *.
19847         (onlyjump_p): Strengthen param "insn" from const_rtx to
19848         const rtx_insn *.
19849         (jump_to_label_p): Likewise.
19850         (invert_jump_1): Strengthen param "jump" from rtx to rtx_insn *.
19851         (invert_jump): Likewise.
19852         * reorg.c (simplejump_or_return_p): Add checked cast when calling
19853         simplejump_p.
19854         (get_jump_flags): Strengthen param "insn" from rtx to
19855         const rtx_insn *.
19856         (get_branch_condition): Likewise.
19857         (condition_dominates_p): Likewise.
19858         (make_return_insns): Move declaration of local "pat" earlier, to
19859         after we've handled NONJUMP_INSN_P and non-sequences, using its
19860         methods to simplify the code and for type-safety.
19861         * rtl.h (find_constant_src): Strengthen param from const_rtx to
19862         const rtx_insn *.
19863         (jump_to_label_p): Strengthen param from rtx to const rtx_insn *.
19864         (condjump_p): Strengthen param from const_rtx to
19865         const rtx_insn *.
19866         (any_condjump_p): Likewise.
19867         (any_uncondjump_p): Likewise.
19868         (pc_set): Likewise.
19869         (condjump_label): Likewise.
19870         (simplejump_p): Likewise.
19871         (returnjump_p): Likewise.
19872         (onlyjump_p): Likewise.
19873         (invert_jump_1): Strengthen param 1 from rtx to rtx_insn *.
19874         (invert_jump): Likewise.
19875         (condjump_in_parallel_p): Strengthen param from const_rtx to
19876         const rtx_insn *.
19877         * rtlanal.c (find_constant_src): Strengthen param from const_rtx
19878         to const rtx_insn *.
19879         * sel-sched-ir.c (fallthru_bb_of_jump): Strengthen param from rtx
19880         to const rtx_insn *.
19881         * sel-sched-ir.h (fallthru_bb_of_jump): Likewise.
19883 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19885         * reorg.c (relax_delay_slots): Move declaration of "trial_seq"
19886         above the conditional, and convert the check on GET_CODE to a
19887         dyn_cast, so that "trial_seq" is available as an rtx_sequence * in
19888         the conditional.  Simplify the conditional by using methods of
19889         "trial_seq".
19891 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19893         * haifa-sched.c (check_clobbered_conditions): Strengthen local
19894         "link" from rtx to rtx_insn_list *, and use its methods for
19895         clarity and type-safety.
19896         (toggle_cancelled_flags): Likewise.
19897         (restore_last_backtrack_point): Likewise.
19898         (queue_to_ready): Use insn method of "link" in one place.
19899         (schedule_block): Strengthen local "link" from rtx to
19900         rtx_insn_list *, and use its methods for clarity and type-safety.
19902 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19904         * sched-deps.c (sched_get_condition_with_rev_uncached): Strengthen
19905         param "insn" from const_rtx to const rtx_insn *.
19906         (sched_get_reverse_condition_uncached): Likewise.
19907         (sched_get_condition_with_rev): Likewise.
19908         (sched_has_condition_p): Likewise.
19909         (sched_insns_conditions_mutex_p): Likewise for both params.
19910         (sched_insn_is_legitimate_for_speculation_p): Likewise for param
19911         "insn"; conver use of CONST_CAST_RTX to CONST_CAST_RTX_INSN.
19912         (setup_insn_reg_uses): Move local "list" to be more tightly
19913         scoped, strengthening it from an rtx to an rtx_insn_list *.  Use
19914         its methods for clarity and type-safety.
19915         (sched_analyze_1): Strengthen local "pending" from rtx to
19916         rtx_insn_list *, and local "pending_mem" from rtx to
19917         rtx_expr_list *.  Use methods of each for clarity and type-safety.
19918         (sched_analyze_2): Likewise.
19919         (sched_analyze_insn): Likewise.
19921         * sched-int.h (sched_get_reverse_condition_uncached): Strengthen
19922         param from const_rtx to const rtx_insn *.
19923         (sched_insns_conditions_mutex_p): Likewise for both params.
19924         (sched_insn_is_legitimate_for_speculation_p): Likewise for first
19925         param.
19927         * system.h (CONST_CAST_RTX_INSN): New macro.
19929 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19931         * recog.c (peep2_attempt): Strengthen return type from rtx to
19932         rtx_insn *.
19933         (peep2_update_life): Likewise for params "last", "prev", removing
19934         a checked cast made redundant by this.
19935         (peephole2_optimize): Likewise for local "last".
19937 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19939         * basic-block.h (set_block_for_insn): Eliminate this macro in
19940         favor of...
19941         * rtl.h (set_block_for_insn): New inline function, imposing the
19942         requirement that the "insn" param is an rtx_insn *.
19944 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19946         * caller-save.c (setup_save_areas): Strengthen local "insn" from
19947         rtx to rtx_insn *.
19948         * final.c (get_call_reg_set_usage): Likewise for first param,
19949         eliminating a checked cast.
19950         * regs.h (get_call_reg_set_usage): Likewise for first param.
19951         * resource.c (mark_set_resources): Introduce local rtx_call_insn *
19952         "call_insn" for the case of a MARK_SRC_DEST_CALL via a checked
19953         cast, replacing references to "x" with "call_insn" where
19954         appropriate.
19955         (mark_target_live_regs): Strengthen local "real_insn" from rtx to
19956         rtx_insn *, adding a checked cast.
19958 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19960         * output.h (final_scan_insn): Strengthen first param from rtx to
19961         rtx_insn *.
19963         * final.c (final_scan_insn): Likewise, renaming it back from
19964         "uncast_insn" to "insn", eliminating the checked cast.
19966         * config/h8300/h8300.md (define_insn "jump"): Replace local rtx
19967         "vec" with an rtx_sequence * "seq", taking a copy of
19968         "final_sequence", and using methods of "seq" for clarity, and for
19969         type-safety in the calls to final_scan_insn.
19970         * config/mips/mips.c (mips_output_conditional_branch): Use methods
19971         of "final_sequence" for clarity, and for type-safety in the call to
19972         final_scan_insn.
19973         * config/sh/sh.c (print_slot): Strengthen param from rtx to
19974         rtx_sequence * and rename from "insn" to "seq".
19976 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19978         * jump.c (delete_related_insns): Introduce a new local "table" by
19979         replacing JUMP_TABLE_DATA_P with a dyn_cast, then use the
19980         get_labels method of "table" to simplify access to the labels in
19981         the jump table.
19983 2014-09-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19985         * config/arm/cortex-a53.md (cortex_a53_fpalu): Add f_rints, f_rintd,
19986         f_minmaxs, f_minmaxd types.
19988 2014-09-05  Richard Biener  <rguenther@suse.de>
19990         * cfgloop.c (mark_loop_for_removal): Record former header
19991         when ENABLE_CHECKING.
19992         * cfgloop.h (strut loop): Add former_header member when
19993         ENABLE_CHECKING.
19994         * loop-init.c (fix_loop_structure): Sanity check loops
19995         marked for removal if they re-appeared.
19997 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
19999         * config/aarch64/arm_neon.h (int32x1_t, int16x1_t, int8x1_t,
20000         uint32x1_t, uint16x1_t, uint8x1_t): Remove typedefs.
20002         (vqabsb_s8, vqabsh_s16, vqabss_s32, vqaddb_s8, vqaddh_s16, vqadds_s32,
20003         vqaddb_u8, vqaddh_u16, vqadds_u32, vqdmlalh_s16, vqdmlalh_lane_s16,
20004         vqdmlals_s32, vqdmlslh_s16, vqdmlslh_lane_s16, vqdmlsls_s32,
20005         vqdmulhh_s16, vqdmulhh_lane_s16, vqdmulhs_s32, vqdmulhs_lane_s32,
20006         vqdmullh_s16, vqdmullh_lane_s16, vqdmulls_s32, vqdmulls_lane_s32,
20007         vqmovnh_s16, vqmovns_s32, vqmovnd_s64, vqmovnh_u16, vqmovns_u32,
20008         vqmovnd_u64, vqmovunh_s16, vqmovuns_s32, vqmovund_s64, vqnegb_s8,
20009         vqnegh_s16, vqnegs_s32, vqrdmulhh_s16, vqrdmulhh_lane_s16,
20010         vqrdmulhs_s32, vqrdmulhs_lane_s32, vqrshlb_s8, vqrshlh_s16,
20011         vqrshls_s32, vqrshlb_u8, vqrshlh_u16, vqrshls_u32, vqrshrnh_n_s16,
20012         vqrshrns_n_s32, vqrshrnd_n_s64, vqrshrnh_n_u16, vqrshrns_n_u32,
20013         vqrshrnd_n_u64, vqrshrunh_n_s16, vqrshruns_n_s32, vqrshrund_n_s64,
20014         vqshlb_s8, vqshlh_s16, vqshls_s32, vqshlb_u8, vqshlh_u16, vqshls_u32,
20015         vqshlb_n_s8, vqshlh_n_s16, vqshls_n_s32, vqshlb_n_u8, vqshlh_n_u16,
20016         vqshls_n_u32, vqshlub_n_s8, vqshluh_n_s16, vqshlus_n_s32,
20017         vqshrnh_n_s16, vqshrns_n_s32, vqshrnd_n_s64, vqshrnh_n_u16,
20018         vqshrns_n_u32, vqshrnd_n_u64, vqshrunh_n_s16, vqshruns_n_s32,
20019         vqshrund_n_s64, vqsubb_s8, vqsubh_s16, vqsubs_s32, vqsubb_u8,
20020         vqsubh_u16, vqsubs_u32, vsqaddb_u8, vsqaddh_u16, vsqadds_u32,
20021         vuqaddb_s8, vuqaddh_s16, vuqadds_s32): Replace all int{32,16,8}x1_t
20022         with int{32,16,8}_t.
20024 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20026         * config/aarch64/arm_neon.h (__GET_HIGH): New macro.
20027         (vget_high_f32, vget_high_f64, vget_high_p8, vget_high_p16,
20028         vget_high_s8, vget_high_s16, vget_high_s32, vget_high_s64,
20029         vget_high_u8, vget_high_u16, vget_high_u32, vget_high_u64):
20030         Remove temporary __asm__ and reimplement.
20032 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20034         * config/aarch64/aarch64-builtins.c (aarch64_fold_builtin): Remove code
20035         handling cmge, cmgt, cmeq, cmtst.
20037         * config/aarch64/aarch64-simd-builtins.def (cmeq, cmge, cmgt, cmle,
20038         cmlt, cmgeu, cmgtu, cmtst): Remove.
20040         * config/aarch64/arm_neon.h (vceq_*, vceqq_*, vceqz_*, vceqzq_*,
20041         vcge_*, vcgeq_*, vcgez_*, vcgezq_*, vcgt_*, vcgtq_*, vcgtz_*,
20042         vcgtzq_*, vcle_*, vcleq_*, vclez_*, vclezq_*, vclt_*, vcltq_*,
20043         vcltz_*, vcltzq_*, vtst_*, vtstq_*): Use gcc vector extensions.
20045 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20047         * config/aarch64/aarch64-builtins.c (aarch64_types_cmtst_qualifiers,
20048         TYPES_TST): Define.
20049         (aarch64_fold_builtin): Update pattern for cmtst.
20051         * config/aarch64/aarch64-protos.h (aarch64_const_vec_all_same_int_p):
20052         Declare.
20054         * config/aarch64/aarch64-simd-builtins.def (cmtst): Update qualifiers.
20056         * config/aarch64/aarch64-simd.md (aarch64_vcond_internal<mode><mode>):
20057         Switch operands, separate out more cases, refactor.
20059         (aarch64_cmtst<mode>): Rewrite pattern to match (plus ... -1).
20061         * config/aarch64.c (aarch64_const_vec_all_same_int_p): Take single
20062         argument; rename old version to...
20063         (aarch64_const_vec_all_same_in_range_p): ...this.
20064         (aarch64_print_operand, aarch64_simd_shift_imm_p): Follow renaming.
20066         * config/aarch64/predicates.md (aarch64_simd_imm_minus_one): Define.
20068 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20070         * config/aarch64/aarch64-builtins.c (enum aarch64_type_qualifiers):
20071         Remove qualifier_const_pointer, update comment.
20073 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20075         * config/aarch64/aarch64.md (adddi3_aarch64): set type to neon_add.
20077 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20079         * config/aarch64/aarch64-builtins.c (aarch64_simd_expand_args): Replace
20080         varargs with pointer parameter.
20081         (aarch64_simd_expand_builtin): pass pointer into previous.
20083 2014-09-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20085         * config/arm/cortex-a53.md (cortex_a53_alu_shift): Add alu_ext,
20086         alus_ext.
20088 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20090         * config/aarch64/aarch64-simd.md (aarch64_rbit<mode>): New pattern.
20091         * config/aarch64/aarch64-simd-builtins.def (rbit): New builtin.
20092         * config/aarch64/arm_neon.h (vrbit_s8, vrbit_u8, vrbitq_s8, vrbitq_u8):
20093         Replace temporary asm with call to builtin.
20094         (vrbit_p8, vrbitq_p8): New functions.
20096 2014-09-05  Richard Biener  <rguenther@suse.de>
20098         * cfgloop.c (mark_loop_for_removal): New function.
20099         * cfgloop.h (mark_loop_for_removal): Declare.
20100         * cfghooks.c (delete_basic_block): Use mark_loop_for_removal.
20101         (merge_blocks): Likewise.
20102         (duplicate_block): Likewise.
20103         * except.c (sjlj_emit_dispatch_table): Likewise.
20104         * tree-eh.c (cleanup_empty_eh_merge_phis): Likewise.
20105         * tree-ssa-threadupdate.c (ssa_redirect_edges): Likewise.
20106         (thread_through_loop_header): Likewise.
20108 2014-09-05  Richard Biener  <rguenther@suse.de>
20110         PR middle-end/63148
20111         * fold-const.c (try_move_mult_to_index): Remove.
20112         (fold_binary_loc): Do not call it.
20113         * tree-data-ref.c (dr_analyze_indices): Strip conversions
20114         from the base object again.
20116 2014-09-05  James Greenhalgh  <james.greenhalgh@arm.com>
20118         * config/aarch64/aarch64.md (sibcall_value_insn): Give operand 1
20119         DImode.
20121 2014-09-05  Bin Cheng  <bin.cheng@arm.com>
20123         PR target/55701
20124         * config/arm/arm.md (setmem): New pattern.
20125         * config/arm/arm-protos.h (struct tune_params): New fields.
20126         (arm_gen_setmem): New prototype.
20127         * config/arm/arm.c (arm_slowmul_tune): Initialize new fields.
20128         (arm_fastmul_tune, arm_strongarm_tune, arm_xscale_tune): Ditto.
20129         (arm_9e_tune, arm_v6t2_tune, arm_cortex_tune): Ditto.
20130         (arm_cortex_a8_tune, arm_cortex_a7_tune): Ditto.
20131         (arm_cortex_a15_tune, arm_cortex_a53_tune): Ditto.
20132         (arm_cortex_a57_tune, arm_cortex_a5_tune): Ditto.
20133         (arm_cortex_a9_tune, arm_cortex_a12_tune): Ditto.
20134         (arm_v7m_tune, arm_v6m_tune, arm_fa726te_tune): Ditto.
20135         (arm_const_inline_cost): New function.
20136         (arm_block_set_max_insns): New function.
20137         (arm_block_set_non_vect_profit_p): New function.
20138         (arm_block_set_vect_profit_p): New function.
20139         (arm_block_set_unaligned_vect): New function.
20140         (arm_block_set_aligned_vect): New function.
20141         (arm_block_set_unaligned_non_vect): New function.
20142         (arm_block_set_aligned_non_vect): New function.
20143         (arm_block_set_vect, arm_gen_setmem): New functions.
20145 2014-09-05  Bin Cheng  <bin.cheng@arm.com>
20147         * config/arm/arm.md (arm_movqi_insn): Use Uh instead of m constraint.
20149 2014-09-05  Bin Cheng  <bin.cheng@arm.com>
20151         * config/arm/arm.c (output_move_neon): Handle REG explicitly.
20153 2014-09-04  Trevor Saunders  <tsaunders@mozilla.com>
20155         * valtrack.c (dead_debug_insert_temp): Take an rtx_insn * instead of
20156         an rtx.
20157         * valtrack.h: Adjust.
20159 2014-09-04  Trevor Saunders  <tsaunders@mozilla.com>
20161         * emit-rtl.c (emit_insn_before_noloc): Take an rtx_insn * instead of
20162         an rtx.
20163         (emit_jump_insn_before_noloc): Likewise.
20164         (emit_call_insn_before_noloc): Likewise.
20165         (emit_label_before): Likewise.
20166         (emit_label_after): Likewise.
20167         (emit_insn_before_setloc): Likewise.
20168         (emit_jump_insn_before_setloc): Likewise.
20169         (emit_call_insn_before_setloc): Likewise.
20170         (emit_call_insn_before): Likewise.
20171         * rtl.h: Adjust.
20173 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20175         * cse.c (cse_insn): Strengthen local "new_rtx" from rtx to
20176         rtx_insn *, eliminating a checked cast.
20178 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20180         * rtl.h (modified_between_p): Strengthen params 2 and 3 from
20181         const_rtx to const rtx_insn *.
20182         * rtlanal.c (modified_between_p): Likewise, eliminating a checked
20183         cast.
20185 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20187         * emit-rtl.c (try_split): Update NULL_RTX to NULL in call to
20188         fixup_args_size_notes.
20189         * expr.c (fixup_args_size_notes): Strengthen first two params from
20190         rtx to rtx_insn *, eliminating a checked cast.
20191         * rtl.h (fixup_args_size_notes): Strengthen first two params from
20192         rtx to rtx_insn *.
20194 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20196         * haifa-sched.c (get_ready_element): Strengthen return type from
20197         rtx to rtx_insn *.
20198         * sched-int.h (get_ready_element): Likewise.
20200 2014-09-04  Segher Boessenkool  <segher@kernel.crashing.org>
20202         PR target/63165
20203         * config/rs6000/rs6000.md (floatsi<mode>2_lfiwax_mem): Use
20204         indexed_or_indirect_operand instead of memory_operand.
20205         (floatsi<mode>2_lfiwzx_mem): Ditto.
20207 2014-09-04  Trevor Saunders  <tsaunders@mozilla.com>
20209         * config/bfin/bfin.c, config/c6x/c6x.c, config/m32c/m32c.c,
20210         config/mn10300/mn10300.c, config/s390/s390.c, config/sh/sh.c,
20211         ifcvt.c, reorg.c: Change types of variables from rtx to rtx_insn *.
20213 2014-09-04  Trevor Saunders  <tsaunders@mozilla.com>
20215         * emit-rtl.c (get_first_nonnote_insn): Return rtx_insn * instead of
20216         rtx.
20217         (get_last_nonnote_insn): Likewise.
20218         (next_nonnote_insn_bb): Take rtx_insn * instead of rtx.
20219         * resource.c (find_basic_block): Likewise.
20220         * rtl.h: Adjust.
20221         * rtlanal.c (keep_with_call_p): Take const rtx_insn * instead of
20222         const_rtx.
20224 2014-09-04  David Malcolm  <dmalcolm@redhat.com>
20226         * genattr.c (main): Within the prototype of insn_latency written
20227         out to insn-attr.h, strengthen both params from rtx to rtx_insn *.
20228         * genautomata.c (output_internal_maximal_insn_latency_func):
20229         Within the implementation of insn_latency written out to
20230         insn-automata.c, strengthen both params from rtx to rtx_insn *,
20231         eliminating a pair of checked casts.
20233 2014-09-04  David Malcolm  <dmalcolm@redhat.com>
20235         * jump.c (eh_returnjump_p): Strengthen param "insn" from rtx to
20236         rtx_insn *.
20238         * rtl.h (eh_returnjump_p): Likewise.
20240 2014-09-04  Aldy Hernandez  <aldyh@redhat.com>
20242         * Makefile.in (TAGS): Handle constructs in timevar.def.
20244 2014-09-04  Guozhi Wei  <carrot@google.com>
20246         PR target/62040
20247         * config/aarch64/iterators.md (VQ_NO2E, VQ_2E): New iterators.
20248         * config/aarch64/aarch64-simd.md (move_lo_quad_internal_<mode>): Split
20249         it into two patterns.
20250         (move_lo_quad_internal_be_<mode>): Likewise.
20252 2014-09-04  Manuel López-Ibáñez  <manu@gcc.gnu.org>
20254         * doc/options.texi: Document that Var and Init are required if CPP
20255         is given.
20256         * optc-gen.awk: Require Var and Init if CPP is given.
20257         * common.opt (Wpedantic): Use Init.
20259 2014-09-04  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
20261         * config/rs6000/rs6000.c (special_handling_values): Add
20262         SH_EXTRACT.
20263         (rtx_is_swappable_p): Look for patterns with a VEC_SELECT, perhaps
20264         wrapped in a VEC_DUPLICATE, representing an extract.  Mark these
20265         as swappable with special handling SH_EXTRACT.  Remove
20266         UNSPEC_VSX_XXSPLTW from the list of disallowed unspecs for the
20267         optimization.
20268         (adjust_extract): New function.
20269         (handle_special_swappables): Add default to case statement; add
20270         case for SH_EXTRACT that calls adjust_extract.
20271         (dump_swap_insn_table): Handle SH_EXTRACT.
20273 2014-09-04  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
20275         * config/rs6000/vsx.md (*vsx_extract_<mode>_load): Always match
20276         selection of 0th memory doubleword, regardless of endianness.
20278 2014-09-04  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
20280         * config/rx/rx.h (HARD_REGNO_MODE_OK): Add braces.
20282 2014-09-04  Alan Modra  <amodra@gmail.com>
20284         PR debug/60655
20285         * dwarf2out.c (mem_loc_descriptor <PLUS>): Return NULL if addend
20286         can't be output.
20288 2014-09-03  Matthew Fortune  <matthew.fortune@imgtec.com>
20290         * target.def (TARGET_DWARF_FRAME_REG_MODE): New target hook.
20291         * targhooks.c (default_dwarf_frame_reg_mode): New function.
20292         * targhooks.h (default_dwarf_frame_reg_mode): New prototype.
20293         * doc/tm.texi.in (TARGET_DWARF_FRAME_REG_MODE): Document.
20294         * doc/tm.texi: Regenerate.
20295         * dwarf2cfi.c (expand_builtin_init_dwarf_reg_sizes): Abstract mode
20296         selection logic to default_dwarf_frame_reg_mode.
20298 2014-09-03  Marek Polacek  <polacek@redhat.com>
20300         * doc/invoke.texi: Document that -Wlogical-not-parentheses is enabled
20301         by -Wall.
20303 2014-09-03  Richard Sandiford  <richard.sandiford@arm.com>
20305         * doc/rtl.texi (RTX_AUTOINC): Document that the first operand is
20306         the automodified register.
20308 2014-09-03  Richard Sandiford  <richard.sandiford@arm.com>
20310         * output.h (get_some_local_dynamic_name): Declare.
20311         * final.c (some_local_dynamic_name): New variable.
20312         (get_some_local_dynamic_name): New function.
20313         (final_end_function): Clear some_local_dynamic_name.
20314         * config/alpha/alpha.c (machine_function): Remove some_ld_name.
20315         (get_some_local_dynamic_name, get_some_local_dynamic_name_1): Delete.
20316         (print_operand): Report an error if '%&' is used inappropriately.
20317         * config/i386/i386.c (get_some_local_dynamic_name): Delete.
20318         (get_some_local_dynamic_name_1): Delete.
20319         * config/rs6000/rs6000.c (machine_function): Remove some_ld_name.
20320         (rs6000_get_some_local_dynamic_name): Delete.
20321         (rs6000_get_some_local_dynamic_name_1): Delete.
20322         (print_operand): Report an error if '%&' is used inappropriately.
20323         * config/s390/s390.c (machine_function): Remove some_ld_name.
20324         (get_some_local_dynamic_name, get_some_local_dynamic_name_1): Delete.
20325         (print_operand): Assert that get_some_local_dynamic_name is nonnull.
20326         * config/sparc/sparc.c: Include rtl-iter.h.
20327         (machine_function): Remove some_ld_name.
20328         (sparc_print_operand): Report an error if '%&' is used inappropriately.
20329         (get_some_local_dynamic_name, get_some_local_dynamic_name_1): Delete.
20331 2014-09-03  Richard Henderson  <rth@redhat.com>
20333         * config/aarch64/aarch64.c (aarch64_popwb_single_reg): Remove.
20334         (aarch64_popwb_pair_reg): Remove.
20335         (aarch64_set_frame_expr): Remove.
20336         (aarch64_restore_callee_saves): Add CFI_OPS argument; fill it with
20337         the restore ops performed by the insns generated.
20338         (aarch64_expand_epilogue): Attach CFI_OPS to the stack deallocation
20339         insn.  Perform the calls_eh_return addition later; do not attempt to
20340         preserve the CFA in that case.  Don't use aarch64_set_frame_expr.
20341         (aarch64_expand_prologue): Use REG_CFA_ADJUST_CFA directly, or no
20342         special markup at all.  Load cfun->machine->frame.hard_fp_offset
20343         into a local variable.
20344         (aarch64_frame_pointer_required): Don't check calls_alloca.
20346 2014-09-03  Richard Biener  <rguenther@suse.de>
20348         * opts.c (default_options_optimization): Adjust
20349         max-combine-insns to 2 for -Og.
20351 2014-09-03  Martin Jambor  <mjambor@suse.cz>
20353         PR ipa/62015
20354         * ipa-cp.c (intersect_aggregates_with_edge): Handle impermissible
20355         pass-trough jump functions correctly.
20357 2014-09-03  Martin Jambor  <mjambor@suse.cz>
20359         PR ipa/61986
20360         * ipa-cp.c (find_aggregate_values_for_callers_subset): Chain
20361         created replacements in ascending order of offsets.
20362         (known_aggs_to_agg_replacement_list): Likewise.
20364 2014-09-03  Martin Liska  <mliska@suse.cz>
20366         * tree-ssa-sccvn.c (vn_reference_lookup_call): default (NULL) value
20367         is set to set uninitialized value for vnresult.
20369 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20371         * config/nds32/nds32.c (nds32_must_pass_in_stack): New implementation
20372         for TARGET_MUST_PASS_IN_STACK.
20374 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20376         * config/nds32/nds32.c (nds32_arg_partial_bytes): New implementation
20377         for TARGET_ARG_PARTIAL_BYTES.
20379 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20381         * config/nds32/nds32.c (nds32_expand_prologue): Emit stack push
20382         instructions for varargs implementation.
20383         (nds32_expand_epilogue): Emit stack adjustment instructions for
20384         varargs implementation.
20386 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20388         * config/nds32/nds32.c (nds32_expand_prologue): Suppress fp-as-gp
20389         optimization detection.
20391 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20393         * config/nds32/nds32.c (nds32_function_arg): Deal with nameless
20394         arguments.
20395         (nds32_function_arg_advance): Deal with nameless arguments.
20396         * config/nds32/nds32.h (NDS32_ARG_PASS_IN_REG_P): Split it into ...
20397         (NDS32_ARG_ENTIRE_IN_GPR_REG_P): ... this one and ...
20398         (NDS32_ARG_PARTIAL_IN_GPR_REG_P): ... this one.
20400 2014-09-03  Richard Biener  <rguenther@suse.de>
20402         * tree-ssa-pre.c (alloc_expression_id): Use quick_grow_cleared.
20403         (struct bb_bitmap_sets): Remove deferred member.
20404         (BB_DEFERRED): Remove.
20405         (defer_or_phi_translate_block): Remove.
20406         (compute_antic_aux): Remove deferring of blocks, assert
20407         proper iteration order.
20408         (compute_antic): Do not set BB_DEFERRED.
20409         (eliminate): Allocate el_avail of proper size initially.
20411 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20413         * config/nds32/nds32.h (FIRST_PARM_OFFSET): Set proper location
20414         according to the value of crtl->args.pretend_args_size.
20416 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20418         * config/nds32/nds32.c (nds32_compute_stack_frame): Prepare necessary
20419         varargs information.
20421 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20423         * config/nds32/nds32.c (nds32_setup_incoming_varargs): New
20424         implementation for TARGET_SETUP_INCOMING_VARARGS.
20425         (nds32_strict_argument_naming): Refine comment.
20426         * config/nds32/nds32.h (TARGET_SOFT_FLOAT, TARGET_HARD_FLOAT):
20427         Define for future implementation.
20429 2014-09-03  Ilya Tocar  <ilya.tocar@intel.com>
20431         * config/i386/adxintrin.h (_subborrow_u32): New.
20432         (_addcarry_u32): Ditto.
20433         (_subborrow_u64): Ditto.
20434         (_addcarry_u64): Ditto.
20435         * config/i386/i386.c (ix86_builtins): Add IX86_BUILTIN_SBB32,
20436         IX86_BUILTIN_SBB64.
20437         (ix86_init_mmx_sse_builtins): Handle __builtin_ia32_sbb_u32,
20438         __builtin_ia32_sbb_u64
20440 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20442         * config/nds32/nds32.c (nds32_function_arg): Define and rename some
20443         GPR-specific stuff.
20444         (nds32_function_arg_advance): Likewise.
20445         (nds32_init_cumulative_args): Likewise.
20446         * config/nds32/nds32.h (NDS32_MAX_GPR_REGS_FOR_ARGS): Define.
20447         (NDS32_FIRST_GPR_REGNUM): Define.
20448         (NDS32_LAST_GPR_REGNUM): Define.
20449         (NDS32_AVAILABLE_REGNUM_FOR_GPR_ARG): Define.
20450         (NDS32_ARG_PASS_IN_REG_P): Use NDS32_MAX_GPR_REGS_FOR_ARGS.
20451         (FUNCTION_ARG_REGNO_P): Use NDS32_MAX_GPR_REGS_FOR_ARGS.
20452         (machine_function): Use GRP-specific stuff.
20454 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20456         * config/nds32/nds32.c (nds32_expand_prologue): Remove unused variables.
20457         (nds32_expand_epilogue): Likewise.
20458         (nds32_expand_prologue_v3push): Likewise.
20459         (nds32_expand_epilogue_v3pop): Likewise.
20461 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20463         * config/nds32/nds32.c (nds32_compute_stack_frame): Do not use
20464         v3push/v3pop for variadic function.
20465         * config/nds32/nds32.md (prologue, epilogue): Likewise.
20467 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20469         * config/nds32/nds32-md-auxiliary.c (nds32_output_stack_push):
20470         Check rtx for varargs implementation.
20471         (nds32_output_stack_pop): Likewise.
20472         * config/nds32/nds32-protos.h: Have a rtx argument for
20473         nds32_output_stack_push and nds32_output_stack_pop.
20474         * config/nds32/nds32.md: Likewise.
20476 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20478         * config/nds32/nds32-isr.c (nds32_isr_function_p): Define new function
20479         to check if FUNC is an interrupt service routine.
20480         * config/nds32/nds32-protos.h (nds32_isr_function_p): Declaration.
20482 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20484         * config/nds32/nds32.h (machine_function): Add some fields for variadic
20485         arguments implementation.
20487 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20489         * config/nds32/nds32-predicates.c
20490         (nds32_valid_stack_push_pop): Rename to ...
20491         (nds32_valid_stack_push_pop_p): ... this.
20492         * config/nds32/nds32-protos.h: Likewise.
20493         * config/nds32/predicates.md: Likewise.
20495 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20497         * config/nds32/nds32.c (nds32_gen_stack_v3push): Rename to ...
20498         (nds32_emit_stack_v3push): ... this.
20499         (nds32_gen_stack_v3pop): Rename to ...
20500         (nds32_emit_stack_v3pop): ... this and consider CFA restore
20501         information.
20503 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20505         * config/nds32/nds32.c (nds32_gen_stack_push_multiple): Rename to ...
20506         (nds32_emit_stack_push_multiple): ... this.
20507         (nds32_gen_stack_pop_multiple): Rename to ...
20508         (nds32_emit_stack_pop_multiple): ... this and consider CFA restore
20509         information.
20511 2014-09-03  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
20513         PR target/61078
20514         * config/s390/s390.md ("*negdi2_31"): Add s390_split_ok_p check
20515         and add a second splitter to handle the remaining cases.
20517 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20519         * config/nds32/nds32.h (PIC_OFFSET_TABLE_REGNUM): Define.
20521 2014-09-02  Trevor Saunders  <tsaunders@mozilla.com>
20523         * cfgexpand.c (label_rtx_for_bb): Change type to
20524         hash_map<basic_block, rtx_code_label *> *.
20525         (expand_gimple_basic_block): Adjust.
20526         (pass_expand::execute): Likewise.
20528 2014-09-02  Trevor Saunders  <tsaunders@mozilla.com>
20530         * asan.c, cfgexpand.c, config/alpha/alpha.md, config/arm/arm.c,
20531         config/epiphany/epiphany.md, config/h8300/h8300.c, config/i386/i386.md,
20532         config/m32r/m32r.c, config/mcore/mcore.md, config/mips/mips.c,
20533         config/mips/mips.md, config/nios2/nios2.c, config/pa/pa.c,
20534         config/s390/s390.c, config/s390/s390.md, config/sh/sh-mem.cc,
20535         config/sh/sh.c, config/sparc/sparc.c, dojump.c, function.c, optabs.c,
20536         stmt.c: Assign the result of gen_label_rtx to rtx_code_label * instead
20537         of rtx.
20539 2014-09-02  Trevor Saunders  <tsaunders@mozilla.com>
20541         * alloc-pool.c: Include coretypes.h.
20542         * cgraph.h, dbxout.c, dwarf2out.c, except.c, except.h, function.c,
20543         function.h, symtab.c, tree-cfg.c, tree-eh.c: Use hash_map and
20544         hash_set instead of htab.
20545         * ggc-page.c (in_gc): New variable.
20546         (ggc_free): Do nothing if a collection is taking place.
20547         (ggc_collect): Set in_gc appropriately.
20548         * ggc.h (gt_ggc_mx(const char *)): New function.
20549         (gt_pch_nx(const char *)): Likewise.
20550         (gt_ggc_mx(int)): Likewise.
20551         (gt_pch_nx(int)): Likewise.
20552         * hash-map.h (hash_map::hash_entry::ggc_mx): Likewise.
20553         (hash_map::hash_entry::pch_nx): Likewise.
20554         (hash_map::hash_entry::pch_nx_helper): Likewise.
20555         (hash_map::hash_map): Adjust.
20556         (hash_map::create_ggc): New function.
20557         (gt_ggc_mx): Likewise.
20558         (gt_pch_nx): Likewise.
20559         * hash-set.h (default_hashset_traits::ggc_mx): Likewise.
20560         (default_hashset_traits::pch_nx): Likewise.
20561         (hash_set::hash_entry::ggc_mx): Likewise.
20562         (hash_set::hash_entry::pch_nx): Likewise.
20563         (hash_set::hash_entry::pch_nx_helper): Likewise.
20564         (hash_set::hash_set): Adjust.
20565         (hash_set::create_ggc): New function.
20566         (hash_set::elements): Likewise.
20567         (gt_ggc_mx): Likewise.
20568         (gt_pch_nx): Likewise.
20569         * hash-table.h (hash_table::hash_table): Adjust.
20570         (hash_table::m_ggc): New member.
20571         (hash_table::~hash_table): Adjust.
20572         (hash_table::expand): Likewise.
20573         (hash_table::empty): Likewise.
20574         (gt_ggc_mx): New function.
20575         (hashtab_entry_note_pointers): Likewise.
20576         (gt_pch_nx): Likewise.
20578 2014-09-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
20580         * config/rs6000/rs6000-builtin.def (XVCVSXDDP_SCALE):  New
20581         built-in definition.
20582         (XVCVUXDDP_SCALE): Likewise.
20583         (XVCVDPSXDS_SCALE): Likewise.
20584         (XVCVDPUXDS_SCALE): Likewise.
20585         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins):  Add
20586         entries for VSX_BUILTIN_XVCVSXDDP_SCALE,
20587         VSX_BUILTIN_XVCVUXDDP_SCALE, VSX_BUILTIN_XVCVDPSXDS_SCALE, and
20588         VSX_BUILTIN_XVCVDPUXDS_SCALE.
20589         * config/rs6000/rs6000-protos.h (rs6000_scale_v2df): New
20590         prototype.
20591         * config/rs6000/rs6000.c (real.h): New include.
20592         (rs6000_scale_v2df): New function.
20593         * config/rs6000/vsx.md (UNSPEC_VSX_XVCVSXDDP): New unspec.
20594         (UNSPEC_VSX_XVCVUXDDP): Likewise.
20595         (UNSPEC_VSX_XVCVDPSXDS): Likewise.
20596         (UNSPEC_VSX_XVCVDPUXDS): Likewise.
20597         (vsx_xvcvsxddp_scale): New define_expand.
20598         (vsx_xvcvsxddp): New define_insn.
20599         (vsx_xvcvuxddp_scale): New define_expand.
20600         (vsx_xvcvuxddp): New define_insn.
20601         (vsx_xvcvdpsxds_scale): New define_expand.
20602         (vsx_xvcvdpsxds): New define_insn.
20603         (vsx_xvcvdpuxds_scale): New define_expand.
20604         (vsx_xvcvdpuxds): New define_insn.
20605         * doc/extend.texi (vec_ctf): Add new prototypes.
20606         (vec_cts): Likewise.
20607         (vec_ctu): Likewise.
20608         (vec_splat): Likewise.
20609         (vec_div): Likewise.
20610         (vec_mul): Likewise.
20612 2014-09-02  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20614         PR target/62275
20615         * config/arm/neon.md
20616         (neon_vcvt<NEON_VCVT:nvrint_variant><su_optab><VCVTF:mode>
20617         <v_cmp_result>): New pattern.
20618         * config/arm/iterators.md (NEON_VCVT): New int iterator.
20619         * config/arm/arm_neon_builtins.def (vcvtav2sf, vcvtav4sf, vcvtauv2sf,
20620         vcvtauv4sf, vcvtpv2sf, vcvtpv4sf, vcvtpuv2sf, vcvtpuv4sf, vcvtmv2sf,
20621         vcvtmv4sf, vcvtmuv2sf, vcvtmuv4sf): New builtin definitions.
20622         * config/arm/arm.c (arm_builtin_vectorized_function): Handle
20623         BUILT_IN_LROUNDF, BUILT_IN_LFLOORF, BUILT_IN_LCEILF.
20625 2014-09-02  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20627         PR target/62275
20628         * config/arm/iterators.md (FIXUORS): New code iterator.
20629         (VCVT): New int iterator.
20630         (su_optab): New code attribute.
20631         (su): Likewise.
20632         * config/arm/vfp.md (l<vrint_pattern><su_optab><mode>si2): New pattern.
20634 2014-09-02  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20636         * config/aarch64/predicates.md (aarch64_comparison_operation):
20637         New special predicate.
20638         * config/aarch64/aarch64.md (*csinc2<mode>_insn): Use
20639         aarch64_comparison_operation instead of matching an operator.
20640         Update operand numbers.
20641         (csinc3<mode>_insn): Likewise.
20642         (*csinv3<mode>_insn): Likewise.
20643         (*csneg3<mode>_insn): Likewise.
20644         (ffs<mode>2): Update gen_csinc3<mode>_insn callsite.
20645         * config/aarch64/aarch64.c (aarch64_get_condition_code):
20646         Return -1 instead of aborting on invalid condition codes.
20647         (aarch64_print_operand): Update aarch64_get_condition_code callsites
20648         to assert that the returned condition code is valid.
20649         * config/aarch64/aarch64-protos.h (aarch64_get_condition_code): Export.
20651 2014-09-02  Aldy Hernandez  <aldyh@redhat.com>
20653         * Makefile.in (TAGS): Handle constructs in common.opt, rtl.def,
20654         tree.def, and gimple.def
20656 2014-09-02  Jakub Jelinek  <jakub@redhat.com>
20657             Balaji V. Iyer  <balaji.v.iyer@intel.com>
20658             Igor Zamyatin  <igor.zamyatin@intel.com>
20660         * cilk-builtins.def (__cilkrts_cilk_for_32): New.
20661         (__cilkrts_cilk_for_64): Likewise.
20662         * cilk-common.c (declare_cilk_for_builtin): New function.
20663         (cilk_init_builtins): Declare __cilkrts_cilk_for_32 and
20664         __cilkrts_cilk_for_64 bultins.
20665         * cilk.h (enum cilk_tree_index): Added CILK_TI_F_LOOP_32 and
20666         CILK_TI_F_LOOP_64.
20667         (cilk_for_32_fndecl): New define.
20668         (cilk_for_64_fndecl): Likewise.
20669         * gimple-pretty-print.c (dump_gimple_omp_for): Correct hadling of
20670         GF_OMP_FOR_KIND_CILKFOR cases; Added NE_EXPR case.
20671         * gimple.h (enum gf_mask): Added GF_OMP_FOR_KIND_CILKFOR; adjusted
20672         GF_OMP_FOR_KIND_MASK, GF_OMP_FOR_SIMD, GF_OMP_FOR_COMBINED,
20673         GF_OMP_FOR_COMBINED_INTO.
20674         * gimplify.c (gimplify_scan_omp_clauses): Added
20675         OMP_CLAUSE__CILK_FOR_COUNT_ case.
20676         (gimplify_adjust_omp_clauses): Ditto.
20677         (gimplify_omp_for): Added CILK_FOR case.
20678         (gimplify_expr): Ditto.
20679         * omp-low.c: Include cilk.h.
20680         (extract_omp_for_data): Set appropriate kind for
20681         GF_OMP_FOR_KIND_CILKFOR; added check for GF_OMP_FOR_KIND_CILKFOR.
20682         (scan_sharing_clauses): Added OMP_CLAUSE__CILK_FOR_COUNT_ cases.
20683         (create_omp_child_function_name): Added second argument to handle
20684         cilk_for case.
20685         (cilk_for_check_loop_diff_type): New function.
20686         (expand_cilk_for_call): Likewise.
20687         (expand_cilk_for): Likewise.
20688         (create_omp_child_function): Set cilk_for_count; handle the cases when
20689         it is true; call create_omp_child_function_name with second argument.
20690         (expand_omp_taskreg): Set is_cilk_for and handle cases when it's true.
20691         (expand_omp_for): Handle case of GF_OMP_FOR_KIND_CILKFOR.
20692         * tree-core.h (omp_clause_code): Added OMP_CLAUSE__CILK_FOR_COUNT_.
20693         * tree-nested.c (convert_nonlocal_omp_clauses): Added
20694         OMP_CLAUSE__CILK_FOR_COUNT_ case.
20695         (convert_local_omp_clauses): Ditto.
20696         * tree-pretty-print.c (dump_omp_clause): Added
20697         OMP_CLAUSE__CILK_FOR_COUNT_ and OMP_CLAUSE_SCHEDULE_CILKFOR cases.
20698         (dump_generic_node): Added CILK_FOR case.
20699         * tree.c (omp_clause_num_ops): New element
20700         OMP_CLAUSE__CILK_FOR_COUNT_ (1).
20701         (omp_clause_code_name): New element _Cilk_for_count_.
20702         (walk_tree_1): Added OMP_CLAUSE__CILK_FOR_COUNT_ case.
20703         * tree.def: Add tree code for CILK_FOR.
20705 2014-09-02  Segher Boessenkool  <segher@kernel.crashing.org>
20707         * config/rs6000/40x.md (ppc403-integer): Move "exts" to "no dot".
20708         (ppc403-compare): Add "exts with dot" case.
20709         * config/rs6000/440.md (ppc440-integer, ppc440-compare): As above.
20710         * config/rs6000/476.md (ppc476-simple-integer, ppc476-compare): Ditto.
20711         * config/rs6000/601.md (ppc601-integer, ppc601-compare): Ditto.
20712         * config/rs6000/603.md (ppc603-integer, ppc603-compare): Ditto.
20713         * config/rs6000/6xx.md (ppc604-integer, ppc604-compare): Ditto.
20714         * config/rs6000/7450.md (ppc7450-integer, ppc7450-compare): Ditto.
20715         * config/rs6000/7xx.md (ppc750-integer, ppc750-compare): Ditto.
20716         * config/rs6000/cell.md (cell-integer, cell-fast-cmp,
20717         cell-cmp-microcoded): Similarly.
20718         * config/rs6000/e300c2c3.md (ppce300c3_iu, ppce300c3_cmp): As before.
20719         * config/rs6000/e500mc64.md (e500mc64_su, e500mc64_su2): Ditto.
20720         * config/rs6000/e5500.md (e5500_sfx, e5500_sfx2): Ditto.
20721         * config/rs6000/e6500.md (e6500_sfx, e6500_sfx2): Ditto.
20722         * config/rs6000/mpc.md (mpccore-integer, mpccore-compare): Ditto.
20723         * config/rs6000/power4.md (power4-integer, power4-compare): Ditto.
20724         * config/rs6000/power5.md (power5-integer, power5-compare): Ditto.
20725         * config/rs6000/power6.md (power6-exts): Add "no dot" condition.
20726         (power6-compare): Add "exts with dot" case.
20727         * config/rs6000/power7.md (power7-integer, power7-compare): As before.
20728         * config/rs6000/power8.md (power8-1cyc, power8-compare): Ditto.
20729         * config/rs6000/rs64.md (rs64a-integer, rs64a-compare): Ditto.
20731         * config/rs6000/predicates.md (lwa_operand): Don't allow memory
20732         if avoiding Cell microcode.
20733         * config/rs6000/rs6000.c (rs6000_adjust_cost): Handle exts+dot case.
20734         (is_cracked_insn): Ditto.
20735         (insn_must_be_first_in_group): Ditto.
20736         * config/rs6000/rs6000.md (dot): Adjust comment.
20737         (cell_micro): Handle exts+dot.
20738         (extendqidi2, extendhidi2, extendsidi2, *extendsidi2_lfiwax,
20739         *extendsidi2_nocell, *extendsidi2_nocell, extendqisi2, extendqihi2,
20740         extendhisi2, 16 anonymous instructions, and 12 splitters): Delete.
20741         (extendqi<mode>2, *extendqi<mode>2_dot, *extendqi<mode>2_dot2,
20742         extendhi<mode>2, *extendhi<mode>2, *extendhi<mode>2_noload,
20743         *extendhi<mode>2_dot, *extendhi<mode>2_dot2, extendsi<mode>2,
20744         *extendsi<mode>2_dot, *extendsi<mode>2_dot2): New.
20746 2014-09-02  Segher Boessenkool  <segher@kernel.crashing.org>
20748         * config/rs6000/rs6000.md (QHSI): Delete.
20749         (EXTQI, EXTHI, EXTSI): New mode iterators.
20750         (zero_extend<mode>di2, *zero_extend<mode>di2_internal1,
20751         *zero_extend<mode>di2_internal2, *zero_extend<mode>di2_internal3,
20752         *zero_extendsidi2_lfiwzx, zero_extendqisi2, zero_extendhisi2,
20753         9 anonymous instructions, and 8 splitters): Delete.
20754         (zero_extendqi<mode>2, *zero_extendqi<mode>2_dot,
20755         *zero_extendqi<mode>2_dot2, zero_extendhi<mode>2,
20756         *zero_extendhi<mode>2_dot, *zero_extendhi<mode>2_dot2,
20757         zero_extendsi<mode>2, *zero_extendsi<mode>2_dot,
20758         *zero_extendsi<mode>2_dot2): New.
20760 2014-09-02  Segher Boessenkool  <segher@kernel.crashing.org>
20762         * config/rs6000/rs6000.md (any_extend): New code iterator.
20763         (u, su): New code attributes.
20764         (dmode, DMODE): New mode attributes.
20765         (<su>mul<mode>3_highpart): New.
20766         (*<su>mul<mode>3_highpart): New.
20767         (<su>mulsi3_highpart_le): New.
20768         (<su>muldi3_highpart_le): New.
20769         (<su>mulsi3_highpart_64): New.
20770         (<u>mul<mode><dmode>3): New.
20771         (mulsidi3, umulsidi3, smulsi3_highpart, umulsi3_highpart, and two
20772         splitters): Delete.
20773         (mulditi3, umulditi3, smuldi3_highpart, umuldi3_highpart, and two
20774         splitters): Delete.
20776 2014-09-02  Segher Boessenkool  <segher@kernel.crashing.org>
20778         * config/rs6000/rs6000.md (mulsi3, *mulsi3_internal1,
20779         *mulsi3_internal2, and two splitters): Delete.
20780         (muldi3, *muldi3_internal1, *muldi3_internal2, and two splitters):
20781         Delete.
20782         (mul<mode>3, mul<mode>3_dot, mul<mode>3_dot2): New.
20784 2014-09-02  Richard Biener  <rguenther@suse.de>
20786         PR tree-optimization/62695
20787         * tree-ssa-structalias.c (find_func_clobbers): Add missing
20788         vector truncate.
20790 2014-09-01  Oleg Endo  <olegendo@gcc.gnu.org>
20792         PR target/62312
20793         * config/sh/sh.md (*cmp_div0s_0): Add missing constraints.
20795 2014-09-01  Andi Kleen  <ak@linux.intel.com>
20797         * file-find.c (add_prefix_begin): Add.
20798         (do_add_prefix): Rename from add_prefix with first argument.
20799         (add_prefix): Add new wrapper.
20800         * file-find.h (add_prefix_begin): Add.
20801         * gcc-ar.c (main): Support -B option.
20803 2014-09-01  Segher Boessenkool  <segher@kernel.crashing.org>
20805         * genemit.c: Include dumpfile.h.
20806         (gen_split): Print name of splitter function to dump file.
20808 2014-09-01  Richard Biener  <rguenther@suse.de>
20810         * tree-ssa-struct-aliases.c (find_func_aliases_for_builtin_call):
20811         Use stack auto_vecs for constraint expressions.
20812         (find_func_aliases_for_call): Likewise.
20813         (find_func_aliases): Likewise.
20814         (find_func_clobbers): Likewise.
20816 2014-09-01  Richard Biener  <rguenther@suse.de>
20818         * tree-ssa-pre.c (phi_translate_1): Avoid re-allocating the
20819         operands vector in most cases.  Remove redundant code.
20821 2014-09-01  Olivier Hainque  <hainque@adacore.com>
20823         * config/vxworksae.h (VXWORKSAE_TARGET_DIR): Rely on
20824         $WIND_BASE instead of designating a harcoded arbitrary home dir.
20825         (VXWORKS_ADDITIONAL_CPP_SPEC): Adjust callers.
20827 2014-09-01  Richard Biener  <rguenther@suse.de>
20829         * tree-ssa-sccvn.h (copy_reference_ops_from_ref,
20830         copy_reference_ops_from_call, vn_nary_op_compute_hash,
20831         vn_reference_compute_hash, vn_reference_insert): Remove.
20832         (vn_reference_lookup_call): New function.
20833         * tree-ssa-sccvn.c (vn_reference_compute_hash,
20834         copy_reference_ops_from_ref, copy_reference_ops_from_call,
20835         vn_reference_insert, vn_nary_op_compute_hash): Make static.
20836         (create_reference_ops_from_call): Remove.
20837         (vn_reference_lookup_3): Properly update shared_lookup_references.
20838         (vn_reference_lookup_pieces): Assert that we updated
20839         shared_lookup_references properly.
20840         (vn_reference_lookup): Likewise.
20841         (vn_reference_lookup_call): New function.
20842         (visit_reference_op_call): Use it.  Avoid re-building the
20843         reference ops.
20844         (visit_reference_op_load): Remove redundant lookup.
20845         (visit_reference_op_store): Perform special tail-merging work
20846         only when possibly doing tail-merging.
20847         (visit_use): Likewise.
20848         * tree-ssa-pre.c (compute_avail): Use vn_reference_lookup_call.
20850 2014-09-01  Jakub Jelinek  <jakub@redhat.com>
20852         PR target/62025
20853         * sched-deps.c (add_or_update_dep_1): If ask_dependency_caches
20854         returned DEP_PRESENT, make sure to set DEP_MULTIPLE on present_dep.
20855         (find_inc): Revert 2014-08-13 change.
20857 2014-09-01  Marek Polacek  <polacek@redhat.com>
20859         PR middle-end/61903
20860         * expmed.c (store_fixed_bit_field_1): Shift UHWI 1 instead of HWI 1.
20861         Change the type of V to unsigned HOST_WIDE_INT.
20863 2014-09-01  Thomas Preud'homme  <thomas.preudhomme@arm.com>
20865         * tree-ssa-math-opts.c (struct symbolic_number): Clarify comment about
20866         the size of byte markers.
20867         (do_shift_rotate): Fix confusion between host, target and marker byte
20868         size.
20869         (verify_symbolic_number_p): Likewise.
20870         (find_bswap_or_nop_1): Likewise.
20871         (find_bswap_or_nop): Likewise.
20873 2014-09-01  Olivier Hainque  <hainque@adacore.com>
20875         * Makefile.in (FLAGS_TO_PASS): Propagate INSTALL, INSTALL_DATA,
20876         INSTALL_SCRIPT and INSTALL_PROGRAM as well.
20878 2014-09-01  Jakub Jelinek  <jakub@redhat.com>
20880         * config/gnu-user.h (LIBLSAN_EARLY_SPEC): Define.
20881         * gcc.c (LIBLSAN_SPEC, LIBLSAN_EARLY_SPEC): Follow LIBTSAN*_SPEC.
20882         (SANITIZER_EARLY_SPEC): Include LIBLSAN_EARLY_SPEC for -fsanitize=leak.
20884 2014-09-01  Yury Gribov  <y.gribov@samsung.com>
20886         PR sanitizer/61897
20887         PR sanitizer/62140
20888         * asan.c (asan_mem_ref_get_end): Handle non-ptroff_t lengths.
20889         (build_check_stmt): Likewise.
20890         (instrument_strlen_call): Likewise.
20891         (asan_expand_check_ifn): Likewise and fix types.
20892         (maybe_cast_to_ptrmode): New function.
20894 2014-09-01  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
20896         * config/mcore/mcore.c (try_constant_tricks): Fix declaration.
20898 2014-08-31  Gerald Pfeifer  <gerald@pfeifer.com>
20900         * doc/generic.texi (Deficiencies): Add note on exemplary mistakes.
20902 2014-08-30  John David Anglin  <danglin@gcc.gnu.org>
20904         * config/pa/pa.c (pa_assemble_integer): Don't add PLABEL relocation
20905         prefix to function labels when generating fast indirect calls.
20907 2014-08-30  David Malcolm  <dmalcolm@redhat.com>
20909         PR bootstrap/62304
20911         * gcc/reorg.c (skip_consecutive_labels): Convert return type and
20912         param back from rtx_insn * to rtx.  Rename param from "label" to
20913         "label_or_return", reintroducing "label" as an rtx_insn * after
20914         we've ensured it's not a RETURN.
20915         (first_active_target_insn): Likewise for return type and param;
20916         add a checked cast to rtx_insn * once we've ensured "insn" is not
20917         a RETURN.
20918         (steal_delay_list_from_target): Convert param "pnew_thread" back
20919         from rtx_insn ** to rtx *.  Replace use of JUMP_LABEL_AS_INSN
20920         with JUMP_LABEL.
20921         (own_thread_p): Convert param "thread" back from an rtx_insn * to
20922         an rtx.  Introduce local rtx_insn * "thread_insn" with a checked
20923         cast once we've established we're not dealing with a RETURN,
20924         renaming subsequent uses of "thread" to "thread_insn".
20925         (fill_simple_delay_slots): Convert uses of JUMP_LABEL_AS_INSN back
20926         to JUMP_LABEL.
20927         (follow_jumps): Convert return type and param "label" from
20928         rtx_insn * back to rtx.  Move initialization of "value" to after
20929         the handling for ANY_RETURN_P, adding a checked cast there to
20930         rtx_insn *.  Convert local rtx_insn * "this_label" to an rtx and
20931         rename to "this_label_or_return", reintroducing "this_label" as
20932         an rtx_insn * once we've handled the case where it could be an
20933         ANY_RETURN_P.
20934         (fill_slots_from_thread): Rename param "thread" to
20935         "thread_or_return", converting from an rtx_insn * back to an rtx.
20936         Reintroduce name "thread" as an rtx_insn * local with a checked
20937         cast once we've handled the case of it being an ANY_RETURN_P.
20938         Convert local "new_thread" from an rtx_insn * back to an rtx.
20939         Add a checked cast when assigning to "trial" from "new_thread".
20940         Convert use of JUMP_LABEL_AS_INSN back to JUMP_LABEL.  Add a
20941         checked cast to rtx_insn * from "new_thread" when invoking
20942         get_label_before.
20943         (fill_eager_delay_slots): Convert locals "target_label",
20944         "insn_at_target" from rtx_insn * back to rtx.
20945         Convert uses of JUMP_LABEL_AS_INSN back to JUMP_LABEL.
20946         (relax_delay_slots): Convert locals "trial", "target_label" from
20947         rtx_insn * back to rtx.  Convert uses of JUMP_LABEL_AS_INSN back
20948         to JUMP_LABEL.  Add a checked cast to rtx_insn * on "trial" when
20949         invoking update_block.
20950         (dbr_schedule): Convert use of JUMP_LABEL_AS_INSN back to
20951         JUMP_LABEL; this removes all JUMP_LABEL_AS_INSN from reorg.c.
20953         * resource.h (mark_target_live_regs): Undo erroneous conversion
20954         of second param of r214693, converting it back from rtx_insn * to
20955         rtx, since it could be a RETURN.
20957         * resource.c (find_dead_or_set_registers): Similarly, convert
20958         param "jump_target" back from an rtx_insn ** to an rtx *, as we
20959         could be writing back a RETURN.  Rename local rtx_insn * "next" to
20960         "next_insn", and introduce "lab_or_return" as a local rtx,
20961         handling the case where JUMP_LABEL (this_jump_insn) is a RETURN.
20962         (mark_target_live_regs): Undo erroneous conversion
20963         of second param of r214693, converting it back from rtx_insn * to
20964         rtx, since it could be a RETURN.  Rename it from "target" to
20965         "target_maybe_return", reintroducing the name "target" as a local
20966         rtx_insn * with a checked cast, after we've handled the case of
20967         ANY_RETURN_P.
20969 2014-08-29  DJ Delorie  <dj@redhat.com>
20971         * cppbuiltin.c (define_builtin_macros_for_type_sizes): Round
20972         pointer size up to a power of two.
20973         * defaults.h (DWARF2_ADDR_SIZE): Round up.
20974         (POINTER_SIZE_UNITS): New, rounded up value.
20975         * dwarf2asm.c (size_of_encoded_value): Use it.
20976         (dw2_output_indirect_constant_1): Likewise.
20977         * expmed.c (init_expmed_one_conv): We now know the sizes of
20978         partial int modes.
20979         * loop-iv.c (iv_number_of_iterations): Use precision, not size.
20980         * optabs.c (expand_float): Use precision, not size.
20981         (expand_fix): Likewise.
20982         * simplify-rtx (simplify_unary_operation_1): Likewise.
20983         * tree-dfa.c (get_ref_base_and_extent): Likewise.
20984         * varasm.c (assemble_addr_to_section): Round up pointer sizes.
20985         (default_assemble_integer) Likewise.
20986         (dump_tm_clone_pairs): Likewise.
20987         * dwarf2out.c (mem_loc_descriptor): Allow partial-int modes also.
20988         * var-tracking.c (adjust_mems): Allow partial-int modes also.
20989         (prepare_call_arguments): Likewise.
20990         * stor-layout.c (finalize_type_size): Preserve precision.
20991         (layout_type): Use precision, not size.
20993         * expr.c (convert_move): If the target has an explicit converter,
20994         use it.
20996 2014-08-29  David Malcolm  <dmalcolm@redhat.com>
20998         * gdbinit.in: Skip various inline functions in rtl.h when
20999         stepping.
21001 2014-08-29  Richard Sandiford  <richard.sandiford@arm.com>
21003         PR bootstrap/62301
21004         * rtlanal.c (rtx_referenced_p): Fix typo in LABEL_P call.
21006 2014-08-29  Richard Biener  <rguenther@suse.de>
21008         PR tree-optimization/62291
21009         * tree-ssa-pre.c (sorted_array_from_bitmap_set): Reserve
21010         exactly the vector size needed and use quick_push.
21011         (phi_translate_1): Adjust comment.
21012         (valid_in_sets): Remove block argument and remove pointless
21013         checking of NAMEs.
21014         (dependent_clean): Adjust for removal of block argument.
21015         (clean): Likewise.
21016         (compute_antic_aux): Likewise.
21017         (compute_partial_antic_aux): Likewise.
21019 2014-08-29  Alexander Ivchenko  <alexander.ivchenko@intel.com>
21020             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
21021             Anna Tikhonova  <anna.tikhonova@intel.com>
21022             Ilya Tocar  <ilya.tocar@intel.com>
21023             Andrey Turetskiy  <andrey.turetskiy@intel.com>
21024             Ilya Verbin  <ilya.verbin@intel.com>
21025             Kirill Yukhin  <kirill.yukhin@intel.com>
21026             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
21028         * config/i386/sse.md
21029         (define_insn "avx2_interleave_highv4di<mask_name>"): Add masking.
21030         (define_insn "vec_interleave_highv2di<mask_name>"): Ditto.
21031         (define_insn "avx2_interleave_lowv4di<mask_name>"): Ditto.
21032         (define_insn "vec_interleave_lowv2di<mask_name>"): Ditto.
21034 2014-08-29  Alexander Ivchenko  <alexander.ivchenko@intel.com>
21035             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
21036             Anna Tikhonova  <anna.tikhonova@intel.com>
21037             Ilya Tocar  <ilya.tocar@intel.com>
21038             Andrey Turetskiy  <andrey.turetskiy@intel.com>
21039             Ilya Verbin  <ilya.verbin@intel.com>
21040             Kirill Yukhin  <kirill.yukhin@intel.com>
21041             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
21043         * config/i386/i386-modes.def: Add V12QI, V14QI, V6HI modes.
21044         * config/i386/sse.md
21045         (define_mode_iterator VI4_128_8_256): New.
21046         (define_mode_iterator VI2_128_4_256): Ditto.
21047         (define_mode_iterator PMOV_DST_MODE): Rename into
21048         (define_mode_iterator PMOV_DST_MODE_1): this.
21049         (define_insn "*avx512f_<code><pmov_src_lower><mode>2"):
21050         Use PMOV_DST_MODE_1 mode iterator.
21051         (define_insn "avx512f_<code><pmov_src_lower><mode>2_mask"):
21052         Ditto.
21053         (define_insn "avx512f_<code><pmov_src_lower><mode>2_mask"):
21054         Ditto.
21055         (define_insn "*avx512bw_<code>v32hiv32qi2"): New.
21056         (define_insn "avx512bw_<code>v32hiv32qi2_mask"): Ditto.
21057         (define_expand "avx512bw_<code>v32hiv32qi2_store_mask"): Ditto.
21058         (define_mode_iterator PMOV_DST_MODE_2): New.
21059         (define_insn "*avx512vl_<code><ssedoublemodelower><mode>2"): Ditto.
21060         (define_insn "<avx512>_<code><ssedoublemodelower><mode>2_mask"): Ditto.
21061         (define_expand "<avx512>_<code><ssedoublemodelower><mode>2_store_mask"):
21062         Ditto.
21063         (define_mode_iterator PMOV_SRC_MODE_3): Ditto.
21064         (define_mode_attr pmov_dst_3): Ditto.
21065         (define_mode_attr pmov_dst_zeroed_3): Ditto.
21066         (define_mode_attr pmov_suff_3): Ditto.
21067         (define_insn "*avx512vl_<code><mode>v<ssescalarnum>qi2"): Ditto.
21068         (define_insn "*avx512vl_<code>v2div2qi2_store"): Ditto.
21069         (define_insn "avx512vl_<code>v2div2qi2_mask"): Ditto.
21070         (define_insn "avx512vl_<code>v2div2qi2_store_mask"): Ditto.
21071         (define_insn "*avx512vl_<code><mode>v4qi2_store"): Ditto.
21072         (define_insn "avx512vl_<code><mode>v4qi2_mask"): Ditto.
21073         (define_insn "avx512vl_<code><mode>v4qi2_store_mask"): Ditto.
21074         (define_insn "*avx512vl_<code><mode>v8qi2_store"): Ditto.
21075         (define_insn "avx512vl_<code><mode>v8qi2_mask"): Ditto.
21076         (define_insn "avx512vl_<code><mode>v8qi2_store_mask"): Ditto.
21077         (define_mode_iterator PMOV_SRC_MODE_4): Ditto.
21078         (define_mode_attr pmov_dst_4): Ditto.
21079         (define_mode_attr pmov_dst_zeroed_4): Ditto.
21080         (define_mode_attr pmov_suff_4): Ditto.
21081         (define_insn "*avx512vl_<code><mode>v<ssescalarnum>hi2"): Ditto.
21082         (define_insn "*avx512vl_<code><mode>v4hi2_store"): Ditto.
21083         (define_insn "avx512vl_<code><mode>v4hi2_mask"): Ditto.
21084         (define_insn "avx512vl_<code><mode>v4hi2_store_mask"): Ditto.
21085         (define_insn "*avx512vl_<code>v2div2hi2_store"): Ditto.
21086         (define_insn "avx512vl_<code>v2div2hi2_mask"): Ditto.
21087         (define_insn "avx512vl_<code>v2div2hi2_store_mask"): Ditto.
21088         (define_insn "*avx512vl_<code>v2div2si2"): Ditto.
21089         (define_insn "*avx512vl_<code>v2div2si2_store"): Ditto.
21090         (define_insn "avx512vl_<code>v2div2si2_mask"): Ditto.
21091         (define_insn "avx512vl_<code>v2div2si2_store_mask"): Ditto.
21093 2014-08-29  Richard Biener  <rguenther@suse.de>
21095         * tree-cfg.c (verify_gimple_assign_unary): Do not allow
21096         NON_LVALUE_EXPR in gimple.
21098 2014-08-29  Richard Biener  <rguenther@suse.de>
21100         PR middle-end/62292
21101         * gimple-fold.c (gimple_fold_builtin_strcpy): Fix error
21102         from previous refactoring.
21103         (gimple_fold_builtin_strncpy): Likewise.
21105 2014-08-29  David Malcolm  <dmalcolm@redhat.com>
21107         PR bootstrap/62300
21108         * function.c (assign_parm_setup_reg): Remove erroneous checked
21109         cast to rtx_insn * on result of gen_extend_insn in favor of
21110         introducing a new local rtx "pat".
21112 2014-08-29  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
21114         * config/mep/mep-pragma.c (mep_pragma_coprocessor_subclass): Rework
21115         to silence warning.
21116         * config/mep/mep.c (VECTOR_TYPE_P): Remove duplicate definition.
21118 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21120         * rtl.h (previous_insn): Strengthen param from rtx to rtx_insn *.
21121         (next_insn): Likewise.
21122         * emit-rtl.c (next_insn): Likewise.
21123         (previous_insn): Likewise.
21124         * config/pa/pa.c (remove_useless_addtr_insns): Strenghten locals
21125         "insn" and "next" from rtx to rtx_insn *.
21126         * config/picochip/picochip.c (picochip_reorg): Likewise for locals
21127         "insn", "insn1", "vliw_start",  "prologue_end_note",
21128         "last_insn_in_packet".
21130 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21132         * shrink-wrap.h (active_insn_between): Strengthen both params from
21133         rtx to rtx_insn *.
21134         * function.c (active_insn_between): Likewise.
21136 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21138         * genattr.c (main): When writing out insn-attr.h, strengthen param
21139         of dfa_clear_single_insn_cache from rtx to rtx_insn *.
21140         * genautomata.c (output_dfa_clean_insn_cache_func): Likewise when
21141         writing out the definition of dfa_clear_single_insn_cache to the
21142         generated insn-automata.c
21144 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21146         * resource.h (clear_hashed_info_for_insn): Strengthen param from
21147         rtx to rtx_insn *.
21148         (incr_ticks_for_insn): Likewise.
21149         (init_resource_info): Likewise.
21151         * resource.c (init_resource_info): Likewise.
21152         (clear_hashed_info_for_insn): Likewise.
21153         (incr_ticks_for_insn): Likewise.
21155         * reorg.c (delete_scheduled_jump): Strengthen param "insn" from
21156         rtx to rtx_insn *.
21157         (steal_delay_list_from_target): Use methods of "seq".
21158         (try_merge_delay_insns): Use methods of "merged_insns".
21159         (update_block): Strengthen param "insn" from rtx to rtx_insn *.
21160         (reorg_redirect_jump): Likewise for param "jump".
21162 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21164         * insn-addr.h (insn_addresses_new): Strengthen param "insn" from
21165         rtx to rtx_insn *.
21166         * config/s390/s390.c (s390_split_branches): Eliminate top-level
21167         local rtx "tmp", in favor of new local rtx "mem" and rtx_insn *
21168         "set_insn".
21169         (s390_mainpool_finish): In three places, split out a local rtx
21170         "insn" into a local rtx - "set" or "pat" - and a rtx_insn *
21171         "insn".  Strengthen local "pool_end" from rtx to rtx_code_label *
21172         and split another local rtx "insn" out into rtx "pat" and
21173         rtx_insn * "insn".
21174         * config/sh/sh.c (output_branchy_insn): Rather than working
21175         directly on operands[9], introduce local rtx_code_label *
21176         variables named "lab" in two places, working on them, and then
21177         assigning them to operands[9], so that the intervening operations
21178         are known by the type system to be on insns.
21180 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21182         * rtl.h (INSN_HAS_LOCATION): Strengthen param from const_rtx to
21183         const rtx_insn *.
21185         * print-rtl.c (print_rtx): Add checked cast to const rtx_insn *
21186         in invocation of INSN_HAS_LOCATION.
21188 2014-08-28  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
21190         * config/rs6000/altivec.h (vec_xl): New #define.
21191         (vec_xst): Likewise.
21192         * config/rs6000/rs6000-builtin.def (XXSPLTD_V2DF): New built-in.
21193         (XXSPLTD_V2DI): Likewise.
21194         (DIV_V2DI): Likewise.
21195         (UDIV_V2DI): Likewise.
21196         (MUL_V2DI): Likewise.
21197         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
21198         entries for VSX_BUILTIN_XVRDPI, VSX_BUILTIN_DIV_V2DI,
21199         VSX_BUILTIN_UDIV_V2DI, VSX_BUILTIN_MUL_V2DI,
21200         VSX_BUILTIN_XXSPLTD_V2DF, and VSX_BUILTIN_XXSPLTD_V2DI).
21201         * config/rs6000/vsx.md (UNSPEC_VSX_XXSPLTD): New unspec.
21202         (UNSPEC_VSX_DIVSD): Likewise.
21203         (UNSPEC_VSX_DIVUD): Likewise.
21204         (UNSPEC_VSX_MULSD): Likewise.
21205         (vsx_mul_v2di): New insn-and-split.
21206         (vsx_div_v2di): Likewise.
21207         (vsx_udiv_v2di): Likewise.
21208         (vsx_xxspltd_<mode>): New insn.
21210 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21212         * rtl.h (RTX_PREV): Added checked casts to uses of PREV_INSN and
21213         NEXT_INSN.
21214         (PREV_INSN): Strengthen param from const_rtx to const rtx_insn *.
21215         (NEXT_INSN): Likewise.
21216         (JUMP_LABEL_AS_INSN): Add a "const" modifier to param.
21217         (reg_used_between_p): Strengthen params 2 and 3 from const_rtx to
21218         const rtx_insn *.
21219         (no_labels_between_p): Likewise for both params.
21221         * config/aarch64/aarch64.c (aarch64_output_casesi): Add a checked
21222         cast when using NEXT_INSN on operands[2].
21223         * config/alpha/alpha.c (alpha_set_memflags): Strengthen local
21224         "insn" from rtx to rtx_insn *, adding a checked cast.
21225         (alpha_handle_trap_shadows): Strengthen locals "i", "n" from rtx to
21226         rtx_insn *.
21227         * config/arc/arc-protos.h (arc_ccfsm_record_condition): Likewise
21228         for third param.
21229         (arc_text_label): Likewise for param "insn".
21230         * config/arc/arc.c (arc_expand_epilogue): Likewise for local
21231         "insn".
21232         (arc_ccfsm_record_condition): Likewise for param "jump".
21233         (arc_text_label): Likewise for local "label".
21234         * config/arc/arc.md (doloop_begin_i): Likewise for local "scan".
21235         Introduce a local "seq" via a dyn_cast to rtx_sequence *, and use
21236         a method for typesafety.  Add a checked cast.
21237         * config/arc/constraints.md (Clb): Add a checked cast when getting
21238         the CODE_LABEL from a LABEL_REF.
21239         * config/arm/arm.c (require_pic_register): Strengthen locals
21240         "seq", "insn" from rtx to rtx_insn *.
21241         (create_fix_barrier): Likewise for locals "selected", "next".
21242         (thumb1_reorg): Likewise for locals "prev", "insn".
21243         (arm_expand_prologue): Likewise for local "last".
21244         (thumb1_output_casesi): Add a checked cast when using NEXT_INSN on
21245         operands[0].
21246         (thumb2_output_casesi): Likewise for operands[2].
21247         * config/avr/avr-log.c (avr_log_vadump): Within 'L' case,
21248         strengthen local "insn" from rtx to rtx_insn *.
21249         * config/bfin/bfin.c (find_next_insn_start): Likewise for return
21250         type and param "insn".
21251         (find_prev_insn_start): Likewise.
21252         (hwloop_optimize): Likewise for locals "insn", "last_insn",
21253         "prev".
21254         (gen_one_bundle): Likewise for loal "t".
21255         (find_load): Likewise for param "insn".
21256         (workaround_speculation): Likewise for locals "insn", "next",
21257         "target", "next_tgt".
21258         * config/c6x/c6x.c (assign_reservations): Likewise for both params
21259         and for locals "insn", "within", "last".
21260         (count_unit_reqs): Likewise for params "head", "tail" and local
21261         "insn".
21262         (try_rename_operands): Likewise for params "head", "tail".
21263         (reshuffle_units): Likewise for locals "head", "tail", "insn".
21264         (struct c6x_sched_context): Likewise for fields
21265         "last_scheduled_insn", "last_scheduled_iter0".
21266         (init_sched_state): Replace NULL_RTX with NULL.
21267         (reorg_split_calls): Strengthen local "new_cycle_first" from rtx
21268         to rtx_insn *.
21269         (undo_split_delayed_nonbranch): Likewise for param and for local
21270         "prev".
21271         (conditionalize_after_sched): Likewise for local "insn".
21272         (bb_earliest_end_cycle): Likewise.
21273         (filter_insns_above): Likewise for locals "insn", "next".
21274         (hwloop_optimize): Remove redundant checked cast.
21275         (hwloop_fail): Strengthen local "t" from rtx to rtx_insn *.
21276         * config/cris/cris.c (cris_initial_frame_pointer_offset): Replace
21277         NULL_RTX with NULL.
21278         (cris_simple_epilogue): Likewise.
21279         (cris_expand_prologue): Likewise.
21280         (cris_expand_epilogue): Likewise.
21281         * config/frv/frv.c (frv_function_contains_far_jump): Strengthen
21282         local "insn" from rtx to rtx_insn *.
21283         (frv_ifcvt_modify_tests): Likewise for locals "last_insn", "insn".
21284         (struct frv_packet_group): Likewise for the elements within array
21285         fields "insns", "sorted", and for field "nop".
21286         (frv_packet): Likewise for the elements within array field
21287         "insns".
21288         (frv_add_insn_to_packet): Likewise for param "insn".
21289         (frv_insert_nop_in_packet): Likewise for param "insn" and local
21290         "last".
21291         (frv_for_each_packet): Likewise for locals "insn", "next_insn".
21292         (frv_sort_insn_group_1): Likewise for local "insn".
21293         (frv_optimize_membar_local): Likewise.
21294         (frv_align_label): Likewise for locals "x", "last", "barrier",
21295         "label".
21296         * config/ia64/ia64.c (last_scheduled_insn): Likewise for this
21297         local.
21298         (ia64_sched_init): Likewise for local "insn".
21299         (scheduled_good_insn): Likewise for param "last".
21300         (struct _ia64_sched_context): Likewise for field
21301         "last_scheduled_insn".
21302         (ia64_init_sched_context): Replace NULL_RTX with NULL.
21303         (struct bundle_state): Likewise for field "insn".
21304         (issue_nops_and_insn): Likewise for param "insn".
21305         (get_next_important_insn): Likewise for return type and both
21306         params.
21307         (ia64_add_bundle_selector_before): Likewise for param "insn".
21308         (bundling): Likewise for params "prev_head_insn", "tail" and
21309         locals "insn", "next_insn", "b".  Eliminate top-level local rtx
21310         "nop" in favor of new locals rtx "nop_pat" and rtx_insn *nop;
21311         * config/iq2000/iq2000-protos.h (iq2000_fill_delay_slot):
21312         Strengthen final param from rtx to rtx_insn *.
21313         (iq2000_move_1word): Likewise for second param.
21314         * config/iq2000/iq2000.c (iq2000_fill_delay_slot): Likewise for
21315         param "cur_insn" and local "next_insn".
21316         (iq2000_move_1word): Likewise for param "insn".
21317         * config/iq2000/iq2000.md (insn before ADDR_DIFF_VEC): Add checked
21318         casts when using NEXT_INSN on operands[1].
21319         * config/m32c/m32c.c (m32c_function_needs_enter): Strengthen local
21320         "insn" from rtx to rtx_insn *.
21321         * config/m68k/m68k.c (m68k_jump_table_ref_p): Split out uses of
21322         "x", introducing local rtx_insn * "insn" for when working with the
21323         CODE_LABEL of the LABEL_REF.
21324         (m68k_sched_md_init_global): Strengthen local "insn" from rtx to
21325         rtx_insn *.
21326         * config/mcore/mcore-protos.h (mcore_is_dead): Likewise for first
21327         param.
21328         * config/mcore/mcore.c (emit_new_cond_insn): Likewise for return
21329         type.
21330         (conditionalize_block): Likewise for return type and param.
21331         (mcore_is_dead): Likewise for param "first" and local "insn".
21332         (emit_new_cond_insn): Likewise for return type.
21333         (conditionalize_block): Likewise for return type, param, and
21334         locals "insn", "blk_1_br", "end_blk_2_insn", "start_blk_3_lab",
21335         "newinsn".
21336         (conditionalize_optimization): Likewise for local "insn".
21337         * config/mep/mep.c (mep_jmp_return_reorg): Add checked cast when
21338         using NEXT_INSN.
21339         * config/microblaze/microblaze.md: Add checked casts when using
21340         NEXT_INSN.
21341         * config/mips/mips.c (mips_expand_prologue): Eliminate top-level
21342         rtx "insn" in favor of various more tightly-scoped rtx "insn" and
21343         and rtx_insn * "insn".
21344         * config/mips/mips.md (casesi_internal_mips16_<mode>): Add a
21345         checked cast when using NEXT_INSN on operands[2].
21346         * config/mn10300/mn10300.c (mn10300_insert_setlb_lcc): Strengthen
21347         local "insn" from rtx to rtx_insn *.
21348         * config/nds32/nds32-fp-as-gp.c (nds32_fp_as_gp_check_available):
21349         Likewise.
21350         * config/nds32/nds32-md-auxiliary.c (nds32_output_casesi_pc_relative):
21351         Add a checked cast when using NEXT_INSN on operands[1].
21352         * config/pa/pa-protos.h (pa_following_call): Strengthen param from
21353         rtx to rtx_insn *.
21354         (pa_output_cbranch): Likewise for final param.
21355         (pa_output_lbranch): Likewise for second param.
21356         (pa_output_bb): Likewise for third param.
21357         (pa_output_bvb): Likewise.
21358         (pa_output_dbra): Likewise for second param.
21359         (pa_output_movb): Likewise.
21360         (pa_output_parallel_movb): Likewise.
21361         (pa_output_parallel_addb): Likewise.
21362         (pa_output_millicode_call): Likewise for first param.
21363         (pa_output_mul_insn): Likewise for second param.
21364         (pa_output_div_insn): Likewise for third param.
21365         (pa_output_mod_insn): Likewise for second param.
21366         (pa_jump_in_call_delay): Likewise for param.
21367         * config/pa/pa.c (pa_output_mul_insn): Likewise for param "insn".
21368         (pa_output_div_insn): Likewise.
21369         (pa_output_mod_insn): Likewise.
21370         (pa_output_cbranch): Likewise.
21371         (pa_output_lbranch): Likewise.
21372         (pa_output_bb): Likewise.
21373         (pa_output_bvb): Likewise.
21374         (pa_output_dbra): Likewise.
21375         (pa_output_movb): Likewise.
21376         (pa_output_millicode_call): Likewise; use method of rtx_sequence *
21377         to simplify and for typesafety.
21378         (pa_output_call): Use method of rtx_sequence *.
21379         (forward_branch_p): Strengthen param "insn" from rtx to rtx_insn *.
21380         (pa_jump_in_call_delay): Likewise.
21381         (pa_output_parallel_movb): Likewise.
21382         (pa_output_parallel_addb): Likewise.
21383         (pa_following_call): Likewise.
21384         (pa_combine_instructions): Likewise for locals "anchor",
21385         "floater".
21386         (pa_can_combine_p): Likewise for params "anchor", "floater" and
21387         locals "start", "end".
21388         * config/picochip/picochip.c (picochip_reset_vliw): Likewise for
21389         param "insn" and local "local_insn".
21390         (picochip_final_prescan_insn): Likewise for local "local_insn".
21391         * config/rs6000/rs6000.c (compute_save_world_info): Likewise for
21392         local "insn".
21393         (uses_TOC): Likewise.
21394         * config/s390/s390.c (get_some_local_dynamic_name): Likewise.
21395         (s390_mainpool_finish): Eliminate top-level local rtx "insn",
21396         splitting out to more tightly-scoped locals, 3 as rtx and one as
21397         rtx_insn *.
21398         (s390_optimize_nonescaping_tx): Strengthen local "tmp" from rtx
21399         to rtx_insn *.
21400         (s390_emit_prologue): Introduce a local "insn" to be an rtx_insn *
21401         where needed.
21402         * config/sh/sh-protos.h (barrier_align): Strenghten param from rtx
21403         to rtx_insn *.
21404         (fixup_addr_diff_vecs): Likewise.
21405         (reg_unused_after): Likewise for param 2.
21406         (sh_can_redirect_branch): Likewise for both params.
21407         (check_use_sfunc_addr): Likewise for param 1.
21408         * config/sh/sh.c (fixup_mova): Likewise for local "worker".
21409         (find_barrier): Likewise for local "last_got".
21410         (gen_block_redirect): Likewise for return type, param "jump" and
21411         locals "prev", "scan", "next", "insn".
21412         (struct far_branch): Likewise for fields "near_label",
21413         "insert_place", "far_label".
21414         (gen_far_branch): Likewise for local "jump".
21415         (fixup_addr_diff_vecs): Likewise for param "first" and locals
21416         "insn", "prev".
21417         (barrier_align): Likewise for param and for locals "prev", "x".
21418         Introduce local rtx_sequence * "prev_seq" and use insn method for
21419         typesafety and clarity.
21420         (sh_reorg): Strengthen local "scan" from rtx to rtx_insn *.
21421         (get_dest_uid): Likewise for local "dest".
21422         (split_branches): Likewise for locals "next", "beyond", "label",
21423         "block", "far_label".  Add checked casts when assigning to
21424         bp->far_label and "far_label".
21425         (reg_unused_after): Strengthen param "scan" from rtx to rtx_insn *.
21426         (sequence_insn_p): Likewise.
21427         (mark_constant_pool_use): Likewise for locals "insn", "lab".  Add a
21428         more loop-scoped rtx "insn" when walking LABEL_REFS.
21429         (sh_can_redirect_branch): Strengthen both params from rtx to
21430         rtx_insn *.
21431         (check_use_sfunc_addr): Likewise for param "insn".  Introduce a
21432         new local rtx_sequence * "seq" via a dyn_cast, and use a method
21433         for clarity and typesafety.
21434         * config/sh/sh.md (define_expand "epilogue"): Strengthen local
21435         "insn" from rtx to rtx_insn *.
21436         (define_insn "casesi_worker_1"): Add a checked cast to rtx_insn *
21437         when using NEXT_INSN on the CODE_LABEL in operands[2].
21438         (define_insn "casesi_worker_2"): Likewise.
21439         (define_insn "casesi_shift_media"): Likewise.
21440         (define_insn "casesi_load_media"): Likewise for the CODE_LABEL in
21441         operands[3].
21442         * config/sh/sh_optimize_sett_clrt.cc (struct ccreg_value):
21443         Strengthen field "insn" from rtx to rtx_insn *.
21444         (sh_optimize_sett_clrt::execute): Likewise for locals "next_i", "i".
21445         (sh_optimize_sett_clrt::find_last_ccreg_values): Likewise for
21446         param "start_insn" and local "start_insn".
21447         * config/sh/sh_treg_combine.cc (struct set_of_reg): Likewise for
21448         field "insn".
21449         (find_set_of_reg_bb): Likewise for param "insn".
21450         (trace_reg_uses_1): Likewise for param "start_insn" and local "i".
21451         (trace_reg_uses): Likewise for param "start_insn".
21452         (sh_treg_combine::cbranch_trace): Likewise for field
21453         "cbranch_insn".
21454         (sh_treg_combine::cbranch_trace::cbranch_trace): Likewise for
21455         param "insn".
21456         (sh_treg_combine::record_set_of_reg): Likewise for param
21457         "start_insn" and local "i".
21458         (sh_treg_combine::can_remove_cstore): Likewise for local
21459         "prev_insn".
21460         (sh_treg_combine::try_optimize_cbranch): Likewise for param
21461         "insn".
21462         (sh_treg_combine::execute): Likewise for local "i".
21463         * config/sparc/sparc-protos.h (empty_delay_slot): Likewise for
21464         param.
21465         (sparc_check_64): Likewise for second param.
21466         * config/sparc/sparc.c (sparc_do_work_around_errata): Likewise for
21467         locals "insn", "next".  Introduce local rtx_sequence * "seq" via a
21468         dyn_cast, using its insn method for typesafety and clarity.
21469         (empty_delay_slot): Strengthen param "insn" from rtx to
21470         rtx_insn *.
21471         (set_extends): Likewise.
21472         (sparc_check_64): Likewise.
21473         * config/stormy16/stormy16.c (xstormy16_split_cbranch): Likewise
21474         for locals "seq", "last_insn".
21475         (combine_bnp): Likewise for param "insn".
21476         (xstormy16_reorg): Likewise for local "insn".
21477         * config/v850/v850.c (substitute_ep_register): Likewise for params
21478         "first_insn", "last_insn" and local "insn".
21479         (v850_reorg): Likewise for fields "first_insn", "last_insn" within
21480         elements of "regs" array, and local "insn".
21481         * except.c (emit_note_eh_region_end): Likewise for param "insn".
21482         * final.c (final_sequence): Strengthen this global from rtx to
21483         rtx_sequence *.
21484         (shorten_branches): Strenthen locals "rel_lab", "prev" from rtx to
21485         rtx_insn *.
21486         (final_scan_insn): Update assignment to "final_sequence" to be
21487         from "seq", the cast version of "body", for type-safety.
21488         * function.c (assign_parm_setup_reg): Strengthen locals "insn",
21489         "insns" from rtx to rtx_insn *.
21490         (thread_prologue_and_epilogue_insns): Likewise for local "seq".
21491         * genattr.c (main): When writing out generated insn-attr.h,
21492         strengthen params 1 and 3 of eligible_for_delay,
21493         eligible_for_annul_true, eligible_for_annul_false from rtx to
21494         rtx_insn *.
21495         * genattrtab.c (write_eligible_delay): Likewise when writing out
21496         generated insn-attrtab.c; also local "insn" the generated
21497         functions.
21498         * hw-doloop.c (discover_loops): Strengthen local "insn" from rtx
21499         to rtx_insn *.
21500         * hw-doloop.h (struct GTY hwloop_info_d): Strengthen field
21501         "start_label" from rtx to rtx_insn *.
21502         * ira.c (decrease_live_ranges_number): Likewise for local "p".
21503         (ira_update_equiv_info_by_shuffle_insn): Likewise for param
21504         "insns" and local "insn".
21505         (validate_equiv_mem): Likewise for param "start" and local "insn".
21506         (memref_used_between_p): Likewise for params "start", "end" and
21507         local "insn".
21508         * ira.h (ira_update_equiv_info_by_shuffle_insn): Likewise for
21509         final param.
21510         * loop-doloop.c (doloop_optimize): Within region guarded by
21511         INSN_P (doloop_pat), introduce a new local rtx_insn *
21512         "doloop_insn" via a checked cast, and use it for typesafety,
21513         eventually writing the value back into doloop_pat.
21514         * output.h (final_sequence): Strengthen this global from rtx to
21515         rtx_sequence *.
21516         * recog.c (peep2_attempt): Rename param "insn" to "uncast_insn",
21517         reintroducing "insn" as an rtx_insn * via a checked cast.
21518         Strengthen param "attempt" and local "new_insn"from rtx to
21519         rtx_insn *.
21520         (peephole2_optimize): Strengthen locals "insn", "attempt" from rtx
21521         to rtx_insn *.
21522         * ree.c (emit_note_eh_region_end): Likewise for local "insn".
21523         * reload1.c (reload_as_needed): Eliminate top-level locals "x" and
21524         "p" in favor of more tightly-scoped replacements, sometimes rtx
21525         and sometimes rtx_insn *, as appropriate.
21526         (delete_output_reload): Eliminate top-level rtx "i1", splitting
21527         into two loop-scoped locals, one an rtx, the other an rtx_insn *.
21528         * reorg.c (delete_scheduled_jump): Add checked cast.  Strengthen
21529         local "trial" from rtx to rtx_insn *.
21530         (redirect_with_delay_slots_safe_p): Strengthen param "jump" from
21531         rtx to rtx_insn *.  Strenghten local "pat" from rtx to
21532         rtx_sequence * and use methods for clarity and typesafety.
21533         (redirect_with_delay_list_safe_p): Strengthen param "jump" from
21534         rtx to rtx_insn *.  Strenghten local "li" from rtx to
21535         rtx_insn_list * and use its methods for clarity and typesafety.
21536         (steal_delay_list_from_target): Strengthen param "insn" from rtx
21537         to rtx_insn *.
21538         (steal_delay_list_from_fallthrough): Likewise.
21539         (try_merge_delay_insns): Likewise for param "thread" and locals
21540         "trial", "next_trial", "delay_insn".
21541         (redundant_insn): Likewise for param "target" and local "trial".
21542         (own_thread_p): Likewise for param "thread" and locals
21543         "active_insn", "insn".
21544         (get_label_before): Likewise for param "insn".
21545         (fill_simple_delay_slots): Likewise for local "new_label"; use
21546         JUMP_LABEL_AS_INSN as necessary when calling own_thread_p.
21547         (label_before_next_insn): Strengthen return type and local "insn"
21548         from rtx to rtx_insn *.
21549         (relax_delay_slots): Likewise for locals "other", "tmp".
21550         (make_return_insns): Likewise for param "first" and locals "insn",
21551         "jump_insn", "prev".  Move declaration of "pat" to its assignment
21552         and strengthen from rtx to rtx_sequence *.  Use its methods for
21553         clarity and typesafety.
21554         * rtlanal.c (no_labels_between_p): Strengthen params from
21555         const_rtx to const rtx_insn *.  Strengthen local "p" from rtx to
21556         rtx_insn *.
21557         (reg_used_between_p): Strengthen params "from_insn", "to_insn"
21558         from const_rtx to const rtx_insn *.
21559         (reg_set_between_p): Rename param "from_insn" to
21560         "uncast_from_insn", and reintroduce "from_insn" as a
21561         const rtx_insn * via a checked cast.
21562         (modified_between_p): Likewise for param "start" as "uncast_start".
21563         (tablejump_p): Add a cast when invoking NEXT_INSN on "label".
21564         * sel-sched-ir.c (get_seqno_by_preds): Strengthen param and locals
21565         "tmp", head" from rtx to rtx_insn *.
21566         (recompute_rev_top_order): Likewise for local "insn".
21567         * sel-sched-ir.h (get_seqno_by_preds): Likewise for param.
21568         * store-motion.c (build_store_vectors): Likewise for local "insn".
21569         Strengthen local "st" from rtx to rtx_insn_list * and use methods
21570         for clarity and typesafety.
21571         * tree-ssa-loop-ivopts.c (seq_cost): Strengthen param "seq" from
21572         rtx to rtx_insn *.
21573         (computation_cost): Likewise for local "seq".
21574         (get_address_cost): Likewise.
21576 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21578         * rtl.h (tablejump_p): Strengthen first param from const_rtx to
21579         const rtx_insn *.
21580         (label_is_jump_target_p): Likewise for second param.
21582         * rtlanal.c (tablejump_p): Likewise for param "insn".
21583         (label_is_jump_target_p): Likewise for param "jump_insn".
21585 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21587         * rtl.h (find_first_parameter_load): Strengthen return type and
21588         both params from rtx to rtx_insn *.
21589         * rtlanal.c (find_first_parameter_load): Strengthen return type,
21590         both params and locals "before", "first_set" from rtx to
21591         rtx_insn *.  Remove now-redundant cast.
21592         * except.c (sjlj_mark_call_sites): Use NULL rather than NULL_RTX.
21594 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21596         * rtl.h (find_last_value): Delete.
21597         * rtlanal.c (find_last_value): Delete.
21599 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21601         * cfgexpand.c (pass_expand::execute): Strengthen local "after"
21602         from rtx to rtx_insn *.
21603         * cfgrtl.c (force_nonfallthru_and_redirect): Replace use of local
21604         rtx "note" with new local rtx_insn * "new_head" when calculating
21605         head insn of new basic block.
21606         * combine.c (combine_split_insns): Strengthen return type and local
21607         "ret" from rtx to rtx_insn *.
21608         (likely_spilled_retval_p): Likewise for locals "use" and "p".
21609         (try_combine): Eliminate local "m_split", splitting into new
21610         locals "m_split_insn" and "m_split_pat".
21611         (find_split_point): Strengthen local "seq" from rtx into
21612         rtx_insn *.
21613         * config/spu/spu.c (spu_machine_dependent_reorg): Likewise for
21614         locals "label", "branch".
21615         * config/spu/spu.md (define_expand "smulsi3_highpart"): Likewise
21616         for local "insn".
21617         (define_expand "umulsi3_highpart"): Likewise for local "insn".
21618         * dse.c (note_add_store_info): Likewise for fields "first",
21619         "current".
21620         (note_add_store): Likewise for local "insn".
21621         (emit_inc_dec_insn_before): Likewise for locals "insn",
21622         "new_insn", "cur".
21623         (find_shift_sequence): Likewise for locals "shift_seq", "insn".
21624         (replace_read): Likewise for locals "insns", "this_insn".
21625         * dwarf2cfi.c (dw_trace_info): Likewise for field "eh_head".
21626         (notice_eh_throw): Likewise for param "insn".
21627         (before_next_cfi_note): Likewise for return type, param, and local
21628         "prev".
21629         (connect_traces): Likewise for local "note".
21630         * emit-rtl.c (reset_all_used_flags): Likewise for local "p".
21631         (verify_rtl_sharing): Likewise.
21632         (unshare_all_rtl_in_chain): Likewise for param "insn".
21633         (get_first_nonnote_insn): Likewise for local "insn".
21634         (get_last_nonnote_insn): Likewise.  Introduce local rtx_sequence *
21635         "seq" and use its methods to clarify things.
21636         (next_insn): Strengthen return type from rtx to rtx_insn *.
21637         Rename param "insn" to "uncast_insn" and reintroduce "insn" as a
21638         local rtx_insn * using a checked cast, dropping a checked cast
21639         made redundant by this change.  Use a cast to and method of
21640         rtx_sequence to clarify the code.
21641         (previous_insn): Rename param "insn" to "uncast_insn" and
21642         reintroduce "insn" as a local rtx_insn * using a checked cast,
21643         dropping a checked cast made redundant by this change.  Use a cast
21644         to and method of rtx_sequence to clarify the code.
21645         (next_nonnote_insn): Rename param "insn" to "uncast_insn" and
21646         reintroduce "insn" as a local rtx_insn * using a checked cast,
21647         dropping a checked cast made redundant by this change.
21648         (next_nonnote_insn_bb): Likewise.
21649         (prev_nonnote_insn): Likewise.
21650         (prev_nonnote_insn_bb): Likewise.
21651         (next_nondebug_insn): Likewise.
21652         (prev_nondebug_insn): Likewise.
21653         (next_nonnote_nondebug_insn): Likewise.
21654         (prev_nonnote_nondebug_insn): Likewise.
21655         (next_real_insn): Likewise.
21656         (prev_real_insn): Likewise.
21657         (next_active_insn): Likewise.
21658         (prev_active_insn): Likewise.
21659         (next_cc0_user): Likewise.  Use rtx_sequence and a method for
21660         clarity.
21661         (prev_cc0_setter): Likewise.
21662         (try_split): Rename param "trial" to "uncast_trial" and
21663         reintroduce "insn" as a local rtx_insn * using a checked cast,
21664         dropping checked casts made redundant by this change.
21665         Strengthen locals "seq", "tem", "insn_last", "insn", "next" from
21666         rtx to rtx_insn *.
21667         (remove_insn): Rename param "insn" to "uncast_insn" and
21668         reintroduce "insn" as a local rtx_insn * using a checked cast.
21669         (emit_pattern_after_setloc): Likewise for param "after", as
21670         "uncast_after".
21671         (emit_pattern_after): Likewise.  Strengthen local "prev" from
21672         rtx to rtx_insn *.
21673         (emit_pattern_before_setloc): Rename param "before" to
21674         "uncast_before" and reintroduce "before" as a local rtx_insn *
21675         using a checked cast.  Strengthen locals "first", "last" from
21676         rtx to rtx_insn *.
21677         (emit_pattern_before): Likewise rename/cast param "before" to
21678         "uncast_before". Strengthen local "next" from rtx to rtx_insn *.
21679         * except.c (copy_reg_eh_region_note_forward): Strengthen param
21680         "first" and local "insn" from rtx to rtx_insn *.
21681         (copy_reg_eh_region_note_backward): Likewise for param "last"
21682         and local "insn".
21683         * expr.c (fixup_args_size_notes): Rename param "last" to
21684         "uncast_last" and reintroduce "last" as a local rtx_insn *
21685         using a checked cast.  Strengthen local "insn" from rtx to
21686         rtx_insn *.
21687         * function.c (set_insn_locations): Strengthen param "insn" from
21688         rtx to rtx_insn *.
21689         (record_insns): Likewise for param "insns" and local "tmp".
21690         (active_insn_between): Rename param "tail" to
21691         "uncast_tail" and reintroduce "tail" as a local rtx_insn *
21692         using a checked cast.
21693         (thread_prologue_and_epilogue_insns): Split out top-level local
21694         rtx "seq" into three different rtx_insn * locals.  Strengthen
21695         local "prologue_seq" from rtx to rtx_insn *.
21696         * gcse.c (insert_insn_end_basic_block): Strenghen local "insn"
21697         from rtx to rtx_insn *.
21698         * haifa-sched.c (initiate_bb_reg_pressure_info): Likewise.
21699         (priority): Likewise for locals "prev_first", "twin".
21700         (setup_insn_max_reg_pressure): Likewise for param "after".
21701         (sched_setup_bb_reg_pressure_info): Likewise.
21702         (no_real_insns_p): Strengthen params from const_rtx to
21703         const rtx_insn *.
21704         (schedule_block): Strengthen local "next_tail" from rtx to
21705         rtx_insn *.
21706         * ifcvt.c (find_active_insn_before): Strengthen return type and
21707         param "insn" from rtx to rtx_insn *.
21708         (find_active_insn_after): Likewise.
21709         (cond_exec_process_insns): Likewise for param "start" and local "insn".
21710         (cond_exec_process_if_block): Likewise for locals "then_start",
21711         "then_end", "else_start", "else_end", "insn", "start", "end", "from".
21712         (noce_process_if_block): Likewise for local "jump".
21713         (merge_if_block): Likewise for two locals named "end".
21714         (cond_exec_find_if_block): Likewise for local "last_insn".
21715         * jump.c (delete_related_insns): Rename param "insn" to
21716         "uncast_insn" and reintroduce "insn" as a local rtx_insn * using a
21717         checked cast.  Strengthen local "p" from rtx to rtx_insn *.
21718         * lra-constraints.c (inherit_reload_reg): Replace NULL_RTX with
21719         NULL.
21720         (split_reg): Likewise.
21721         * lra.c (lra_process_new_insns): Likewise.
21722         * modulo-sched.c (permute_partial_schedule): Strengthen param
21723         "last" from rtx to rtx_insn *.
21724         * optabs.c (add_equal_note): Likewise for param "insns" and local
21725         "last_insn".
21726         (expand_binop_directly): Add checked casts to rtx_insn * within
21727         NEXT_INSN (pat) uses.
21728         (expand_unop_direct): Likewise.
21729         (maybe_emit_unop_insn): Likewise.
21730         * recog.c (peep2_attempt): Strengthen locals "last",
21731         "before_try", "x" from rtx to rtx_insn *.
21732         * reorg.c (optimize_skip): Strengthen return type and local
21733         "delay_list" from rtx to rtx_insn_list *.  Strengthen param "insn"
21734         and locals "trial", "next_trial" from rtx to rtx_insn *.
21735         * resource.c (next_insn_no_annul): Strengthen return type and
21736         param "insn" from rtx to rtx_insn *.  Use a cast to and method of
21737         rtx_sequence to clarify the code.
21738         (mark_referenced_resources): Add a checked cast to rtx_insn *
21739         within PREV_INSN (x).
21740         (find_dead_or_set_registers): Strengthen return type, param
21741         "target", locals "insn", "next", "jump_insn", "this_jump_insn"
21742         from rtx to rtx_insn *.  Strengthen param "jump_target" from rtx *
21743         to rtx_insn **.
21744         (mark_target_live_regs): Strengthen params "insns" and "target",
21745         locals "insn", "jump_target", "start_insn", "stop_insn" from rtx
21746         to rtx_insn *.  Use cast to and method of rtx_sequence to clarify
21747         the code.
21748         * resource.h (mark_target_live_regs): Strengthen params 1 and 2
21749         from rtx to rtx_insn *.
21750         * rtl.h (copy_reg_eh_region_note_forward): Strengthen second param
21751         from rtx to rtx_insn *.
21752         (copy_reg_eh_region_note_backward): Likewise.
21753         (unshare_all_rtl_in_chain): Likewise for sole param.
21754         (dump_rtl_slim): Strengthen second and third params from const_rtx
21755         to const rtx_insn *.
21756         * sched-deps.c (sched_free_deps): Strengthen params "head" and
21757         "tail" and locals "insn", "next_tail" from rtx to rtx_insn *.
21758         * sched-ebb.c (init_ready_list): Strengthen locals "prev_head",
21759         "next_tail" from rtx to rtx_insn *.
21760         (begin_move_insn): Likewise for local "next".
21761         * sched-int.h (sched_free_deps): Likewise for first and second
21762         params.
21763         (no_real_insns_p): Strengthen both params from const_rtx to
21764         const rtx_insn *.
21765         (sched_setup_bb_reg_pressure_info): Strengthen second params from
21766         rtx to rtx_insn *.
21767         * sched-rgn.c (init_ready_list): Likewise for locals "prev_head",
21768         "next_tail".
21769         * sched-vis.c (dump_rtl_slim): Strengthen params "first", "last"
21770         and locals "insn", "tail" from const_rtx to const rtx_insn *.
21771         (rtl_dump_bb_for_graph): Strengthen local "insn" from rtx to
21772         rtx_insn *.
21773         (debug_rtl_slim): Strengthen params "first" and "last" from
21774         const_rtx to const rtx_insn *.
21775         * shrink-wrap.c (try_shrink_wrapping): Strengthen param
21776         "prologue_seq" and locals "seq", "p_insn" from rtx to rtx_insn *.
21777         (convert_to_simple_return): Likewise for param "returnjump".
21778         * shrink-wrap.h (try_shrink_wrapping): Likewise for param
21779         "prologue_seq".
21780         (convert_to_simple_return): Likewise for param "returnjump".
21781         * valtrack.c (propagate_for_debug): Likewise for params
21782         "insn", "last".
21783         * valtrack.h (propagate_for_debug): Likewise for second param.
21785 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21787         * output.h (insn_current_reference_address): Strengthen param
21788         from rtx to rtx_insn *.
21789         * final.c (insn_current_reference_address): Likewise.
21791 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21793         * basic-block.h (inside_basic_block_p): Strengthen param from
21794         const_rtx to const rtx_insn *.
21795         * cfgbuild.c (inside_basic_block_p): Likewise.
21797 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21799         * dwarf2cfi.c (dw_trace_info): Strengthen field "head" from rtx to
21800         rtx_insn *.
21801         (get_trace_info): Likewise for param "insn".
21802         (save_point_p): Likewise.
21803         (maybe_record_trace_start): Likewise for both params.
21804         (maybe_record_trace_start_abnormal): Likewise.
21805         (create_trace_edges): Likewise for sole param and for three of the
21806         locals named "lab".
21807         (scan_trace): Strengthen local "prev", "insn", "control" from rtx
21808         to rtx_insn *, and update a call to pat->element to pat->insn.
21810 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21812         * function.h (struct expr_status): Convert field "x_forced_labels"
21813         from rtx_expr_list * to rtx_insn_list *.
21815         * cfgbuild.c (make_edges): Convert local "x" from an
21816         rtx_expr_list * to an rtx_insn_list *, replacing use of
21817         "element" method with "insn" method.
21818         * dwarf2cfi.c (create_trace_edges): Likewise for local "lab".
21819         * except.c (sjlj_emit_dispatch_table): Replace use of
21820         gen_rtx_EXPR_LIST with gen_rtx_INSN_LIST when prepending to
21821         forced_labels.
21822         * jump.c (rebuild_jump_labels_1): Convert local "insn" from an
21823         rtx_expr_list * to an rtx_insn_list *, replacing use of
21824         "element" method with "insn" method.
21825         * reload1.c (set_initial_label_offsets): Likewise for local "x".
21826         * stmt.c (label_rtx): Strengthen local "ref" from rtx to
21827         rtx_insn *, adding a checked cast.  Replace use of
21828         gen_rtx_EXPR_LIST with gen_rtx_INSN_LIST when prepending it to
21829         forced_labels.
21830         (expand_label): Likewise for local "label_r".
21832 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21834         * function.h (struct rtl_data): Convert field
21835         "x_nonlocal_goto_handler_labels" from rtx_expr_list * to
21836         rtx_insn_list *.
21837         * rtl.h (remove_node_from_insn_list): New prototype.
21839         * builtins.c (expand_builtin): When prepending to
21840         nonlocal_goto_handler_labels, use gen_rtx_INSN_LIST rather than
21841         gen_rtx_EXPR_LIST.
21842         * cfgbuild.c (make_edges): Convert local "x" from rtx_expr_list *
21843         to rtx_insn_list *, and use its "insn" method rather than
21844         "element" method.
21845         * cfgrtl.c (delete_insn): Use new function
21846         remove_node_from_insn_list rather than
21847         remove_node_from_expr_list.
21848         (cfg_layout_initialize): Convert local "x" from rtx_expr_list *
21849         to rtx_insn_list *, and use its "insn" method rather than
21850         "element" method.
21851         * dwarf2cfi.c (create_trace_edges): Likewise for local "lab".
21852         * reload1.c (set_initial_label_offsets): Likewise for local "x".
21853         * rtlanal.c (remove_node_from_insn_list): New function, adapted
21854         from remove_node_from_expr_list.
21855         * stmt.c (expand_label): When prepending to
21856         nonlocal_goto_handler_labels, use gen_rtx_INSN_LIST rather than
21857         gen_rtx_EXPR_LIST.
21859 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21861         * function.h (struct rtl_data): Strengthen fields "x_return_label"
21862         and "x_naked_return_label" from rtx to rtx_code_label *.
21864 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21866         * rtl.h (SET_PREV_INSN): Strengthen param from rtx to rtx_insn *.
21867         (SET_NEXT_INSN): Likewise.
21868         (gen_rtvec_v): Add an overload for param types (int, rtx_insn **).
21870         * config/c6x/c6x.c (gen_one_bundle): Strengthen param "slot" from
21871         rtx * to rtx_insn **.  Introduce a new local rtx "seq", using it
21872         to split out the SEQUENCE from local "bundle", strengthening the
21873         latter from rtx to rtx_insn * to hold the insn holding the SEQUENCE.
21874         Strengthen locals "t" and "insn" from rtx to rtx_insn *.
21875         (c6x_gen_bundles): Strengthen locals "insn", "next", "last_call"
21876         and the type of the elements of the "slot" array from rtx to
21877         rtx_insn *.
21878         (reorg_split_calls): Likewise for locals "insn" and "next", and
21879         the type of the elements of the "slot" array.
21881         * config/frv/frv.c (frv_nops): Likewise for the elements of this
21882         array.
21883         (frv_function_prologue): Likewise for locals "insn", "next",
21884         "last_call".
21885         (frv_register_nop): Introduce a local "nop_insn" to be the
21886         rtx_insn * containing rtx "nop".
21888         * config/mep/mep.c (mep_make_bundle): Param "core" is sometimes
21889         used as an insn and sometimes as a pattern, so rename it to
21890         "core_insn_or_pat", and introduce local rtx_insn * "core_insn",
21891         using it where dealing with the core insn.
21893         * config/picochip/picochip.c (reorder_var_tracking_notes):
21894         Strengthen locals "insn", "next", "last_insn", "queue",
21895         "next_queue", "prev" from rtx to rtx_insn *.
21897         * emit-rtl.c (gen_rtvec_v): Add overloaded implementation for when
21898         the second param is an rtx_insn ** rather than an rtx **.
21899         (link_insn_into_chain): Strengthen locals "seq" and "sequence"
21900         from rtx to rtx_sequence *, and introduce local named "sequence",
21901         using methods of rtx_sequence to clarify the code.
21902         (remove_insn): Introduce local rtx_sequence * named "sequence" and
21903         use its methods.
21904         (emit_insn_after_1): Strengthen return type from rtx to rtx_insn *.
21905         Rename param "after" to "uncast_after", reintroducing "after" as a
21906         local rtx_insn * with a checked cast.
21907         (emit_pattern_after_noloc): Rename param "after" to "uncast_after",
21908         reintroducing "after" as a local rtx_insn * with a checked cast.
21909         Strengthen local "last" from rtx to rtx_insn * and remove the
21910         now-redundant checked casts.
21911         (copy_delay_slot_insn): Strengthen return type and param from rtx
21912         to rtx_insn *.
21914         * haifa-sched.c (reemit_notes): Strengthen params "insn" and
21915         "last" from rtx to rtx_insn *.
21917 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21919         * emit-rtl.h (copy_delay_slot_insn): Strengthen return type and
21920         param from rtx to rtx_insn *.
21922         * emit-rtl.c (copy_delay_slot_insn): Likewise.
21924         * reorg.c (skip_consecutive_labels): Strengthen return type, param
21925         and local "insn" from rtx to rtx_insn *.
21926         (unfilled_slots_base): Strengthen type from rtx * to rtx_insn **.
21927         (unfilled_slots_next): Likewise.
21928         (function_return_label): Strengthen from rtx to rtx_code_label *.
21929         (function_simple_return_label): Likewise.
21930         (first_active_target_insn): Strengthen return type and param from
21931         rtx to rtx_insn *.
21932         (find_end_label): Strengthen return type from rtx to
21933         rtx_code_label *; strengthen locals as appropriate.
21934         (emit_delay_sequence): Strengthen return type, param "insn" and
21935         local "seq_insn" from rtx to rtx_insn *.  Strengthen param "list"
21936         and local "li" from rtx to rtx_insn_list *, using methods of
21937         rtx_insn_list for clarity and typesafety.
21938         (add_to_delay_list): Strengthen return type and param "insn" from
21939         rtx to rtx_insn *.  Strengthen param "delay_list" from rtx to
21940         rtx_insn_list * and use methods of rtx_insn_list.
21941         (delete_from_delay_slot): Strengthen return type, param "insn",
21942         locals "trial", "seq_insn", "prev" from rtx to rtx_insn *.
21943         Strengthen local "seq" from rtx to rtx_sequence *, and local
21944         "delay_list" from rtx to rtx_insn_list *, using methods of
21945         rtx_sequence for clarity and type-safety.
21946         (delete_scheduled_jump): Add checked cast when invoking
21947         delete_from_delay_slot.  Strengthen local "trial" from rtx to
21948         rtx_insn *.
21949         (optimize_skip): Strengthen return type and local "delay_list"
21950         from rtx to rtx_insn_list *.  Strengthen local "trial" from rtx to
21951         rtx_insn *.
21952         (steal_delay_list_from_target): Strengthen return type, param
21953         "delay_list" and local "new_delay_list" from rtx to
21954         rtx_insn_list *.  Strengthen param "seq" from rtx to
21955         rtx_sequence *.  Strengthen param "pnew_thread" from rtx * to
21956         rtx_insn **.
21957         Split out local "temp" into multiple more-tightly scoped locals:
21958         sometimes an rtx_insn_list *, and once a rtx_insn *.  Use methods
21959         of rtx_insn_list and rtx_sequence for clarity and typesafety.
21960         Strengthen locals named "trial" from rtx to rtx_insn *.
21961         (steal_delay_list_from_fallthrough): Strengthen return type and
21962         param "delay_list" from rtx to rtx_insn_list *.  Strengthen param
21963         "seq" from rtx to rtx_sequence *.  Use methods of rtx_sequence.
21964         Strengthen local "trial" from rtx to rtx_insn *.
21965         (try_merge_delay_insns): Strength local "merged_insns" from rtx
21966         to rtx_insn_list * and use its methods.  Strengthen local "pat"
21967         from rtx to rtx_sequence * and use its methods.  Strengthen locals
21968         "dtrial" and "new_rtx" from rtx to rtx_insn *.
21969         (get_label_before): Strengthen return type and local "label" from
21970         rtx to rtx_insn *.
21971         (fill_simple_delay_slots): Likewise for locals "insn", "trial",
21972         "next_trial", "next", prev".  Strengthen local "delay_list" from
21973         rtx to rtx_insn_list *  Strengthen local "tmp" from rtx * to
21974         rtx_insn **.
21975         (follow_jumps): Strengthen return type, param "label" and locals
21976         "insn", "next", "value", "this_label" from rtx to rtx_insn *.
21977         (fill_slots_from_thread): Strengthen return type, param
21978         "delay_list" from rtx to rtx_insn_list *.  Strengthen params
21979         "insn", "thread", "opposite_thread" and locals "new_thread",
21980         "trial", "temp", "ninsn" from rtx to rtx_insn *.  Introduce local
21981         "sequence" from a checked cast to rtx_sequence so that we can call
21982         steal_delay_list_from_target and steal_delay_list_from_fallthrough
21983         with an rtx_sequence *.
21984         (fill_eager_delay_slots): Strengthen locals "insn", "target_label",
21985         "insn_at_target", "fallthrough_insn" from rtx to rtx_insn *.
21986         Strengthen local "delay_list" from rtx to rtx_insn_list *.
21987         (relax_delay_slots): Strengthen param "first" and locals "insn",
21988         "next", "trial", "delay_insn", "target_label" from rtx to
21989         rtx_insn *.  Strengthen local "pat" from rtx to rtx_sequence *.
21990         Introduce a local "trial_seq" for PATTERN (trial) of type
21991         rtx_sequence *, in both cases using methods of rtx_sequence.
21992         (dbr_schedule): Strengthen param "first" and locals "insn",
21993         "next", "epilogue_insn" from rtx to rtx_insn *.
21995 2014-08-28  Richard Biener  <rguenther@suse.de>
21997         PR tree-optimization/62283
21998         * tree-vect-data-refs.c (vect_enhance_data_refs_alignment):
21999         Do not peel loops for alignment where the vector loop likely
22000         doesn't run at least VF times.
22002 2014-08-28  Bin Cheng  <bin.cheng@arm.com>
22004         * tree-ssa-loop-ivopts.c (iv_ca_add_use): Delete parameter
22005         important_candidates.  Consider all important candidates if
22006         IVS doesn't give any result.  Remove check on ivs->upto.
22007         (try_add_cand_for): Call iv_ca_add_use only once.
22009 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22010             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22011             Anna Tikhonova  <anna.tikhonova@intel.com>
22012             Ilya Tocar  <ilya.tocar@intel.com>
22013             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22014             Ilya Verbin  <ilya.verbin@intel.com>
22015             Kirill Yukhin  <kirill.yukhin@intel.com>
22016             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22018         (define_mode_iterator VI12_AVX2): Add V64QI and V32HI modes.
22019         (define_expand "<sse2_avx2>_<plusminus_insn><mode>3<mask_name>"): Add
22020         masking.
22021         (define_insn "*<sse2_avx2>_<plusminus_insn><mode>3<mask_name>"): Ditto.
22022         (define_expand "<sse2_avx2>_uavg<mode>3<mask_name>"): Ditto.
22023         (define_insn "*<sse2_avx2>_uavg<mode>3<mask_name>"): Ditto.
22024         (define_insn "*mul<mode>3"): Add EVEX version.
22026 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22027             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22028             Anna Tikhonova  <anna.tikhonova@intel.com>
22029             Ilya Tocar  <ilya.tocar@intel.com>
22030             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22031             Ilya Verbin  <ilya.verbin@intel.com>
22032             Kirill Yukhin  <kirill.yukhin@intel.com>
22033             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22035         * config/i386/sse.md
22036         (define_insn "avx512bw_interleave_highv64qi<mask_name>"): New.
22037         (define_insn "avx2_interleave_highv32qi<mask_name>"): Add masking.
22038         (define_insn "vec_interleave_highv16qi<mask_name>"): Ditto.
22039         (define_insn "avx2_interleave_lowv32qi<mask_name>"): Ditto.
22040         (define_insn "vec_interleave_lowv16qi<mask_name>"): Ditto.
22041         (define_insn "avx2_interleave_highv16hi<mask_name>"): Ditto.
22042         (define_insn "vec_interleave_highv8hi<mask_name>"): Ditto.
22043         (define_insn "avx2_interleave_lowv16hi<mask_name>"): Ditto.
22044         (define_insn "vec_interleave_lowv8hi<mask_name>"): Ditto.
22045         (define_insn "avx2_interleave_highv8si<mask_name>"): Ditto.
22046         (define_insn "vec_interleave_highv4si<mask_name>"): Ditto.
22047         (define_insn "avx2_interleave_lowv8si<mask_name>"): Ditto.
22048         (define_insn "vec_interleave_lowv4si<mask_name>"): Ditto.
22049         (define_insn "vec_interleave_highv16qi<mask_name>"): New.
22050         (define_insn "avx512bw_interleave_highv32hi<mask_name>"): Ditto.
22051         (define_insn "<mask_codefor>avx512bw_interleave_lowv32hi<mask_name>"):
22052         Ditto.
22054 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22055             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22056             Anna Tikhonova  <anna.tikhonova@intel.com>
22057             Ilya Tocar  <ilya.tocar@intel.com>
22058             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22059             Ilya Verbin  <ilya.verbin@intel.com>
22060             Kirill Yukhin  <kirill.yukhin@intel.com>
22061             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22063         * config/i386/sse.md
22064         (define_mode_iterator VIMAX_AVX2): Add V4TI mode.
22065         (define_insn "<sse2_avx2>_ashl<mode>3"): Add EVEX version.
22066         (define_insn "<sse2_avx2>_lshr<mode>3"): Ditto.
22068 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22069             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22070             Anna Tikhonova  <anna.tikhonova@intel.com>
22071             Ilya Tocar  <ilya.tocar@intel.com>
22072             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22073             Ilya Verbin  <ilya.verbin@intel.com>
22074             Kirill Yukhin  <kirill.yukhin@intel.com>
22075             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22077         * config/i386/sse.md
22078         (define_mode_iterator VI128_256): New.
22079         (define_insn "<mask_codefor><code><mode>3<mask_name>"): Ditto.
22081 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22082             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22083             Anna Tikhonova  <anna.tikhonova@intel.com>
22084             Ilya Tocar  <ilya.tocar@intel.com>
22085             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22086             Ilya Verbin  <ilya.verbin@intel.com>
22087             Kirill Yukhin  <kirill.yukhin@intel.com>
22088             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22090         * config/i386/sse.md
22091         (define_mode_iterator VI8_256_512): New.
22092         (define_insn "<mask_codefor>avx512dq_cvtps2qq<mode><mask_name><round_name>"):
22093         Ditto.
22094         (define_insn "<mask_codefor>avx512dq_cvtps2qqv2di<mask_name>"): Ditto.
22095         (define_insn "<mask_codefor>avx512dq_cvtps2uqq<mode><mask_name><round_name>"):
22096         Ditto.
22097         (define_insn "<mask_codefor>avx512dq_cvtps2uqqv2di<mask_name>"): Ditto.
22099 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22101         * varasm.c (compute_reloc_for_rtx_1): Take a const_rtx.  Remove the
22102         pointer to the cumulative reloc value and return the value for
22103         this reloc instead.
22104         (compute_reloc_for_rtx): Take a const_rtx.  Call
22105         compute_reloc_for_rtx_1 directly for SYMBOL_REF and LABEL_REF,
22106         avoiding any recursion.  Use FOR_EACH_SUBRTX rather than
22107         for_each_rtx for the CONST case.
22109 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22111         * varasm.c (mark_constant): Replace this for_each_rtx callback with...
22112         (mark_constants_in_pattern): ...this new function to iterate over
22113         all the subrtxes.
22114         (mark_constants): Update accordingly.
22116 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22118         * varasm.c: Include rtl-iter.h.
22119         (const_rtx_hash_1): Take a const_rtx rather than an rtx *.
22120         Remove the pointer to the cumulative hashval_t and just return
22121         the hash for this rtx instead.  Remove recursive CONST_VECTOR case.
22122         (const_rtx_hash): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22123         Accumulate the hashval_ts here instead of const_rtx_hash_1.
22125 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22127         * var-tracking.c (add_uses): Take an rtx rather than an rtx *.
22128         Give real type of data parameter.  Remove return value.
22129         (add_uses_1): Use FOR_EACH_SUBRTX_VAR rather than for_each_rtx
22130         to iterate over subrtxes.
22132 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22134         * var-tracking.c (use_narrower_mode_test): Turn from being a
22135         for_each_rtx callback to being a function that examines each
22136         subrtx itself.
22137         (adjust_mems): Update accordingly.
22139 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22141         * var-tracking.c (non_suitable_const): Turn from being a for_each_rtx
22142         callback to being a function that examines each subrtx itself.
22143         Remove handling of null rtxes.
22144         (add_uses): Update accordingly.
22146 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22148         * var-tracking.c: Include rtl-iter.h.
22149         (rtx_debug_expr_p): Turn from being a for_each_rtx callback
22150         to being a function that examines each subrtx itself.
22151         (use_type): Update accordingly.
22153 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22155         * store-motion.c: Include rtl-iter.h.
22156         (extract_mentioned_regs_1): Delete.
22157         (extract_mentioned_regs): Use FOR_EACH_SUBRTX_VAR rather than
22158         for_each_rtx to iterate over subrtxes.
22160 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22162         * sel-sched.c: Include rtl-iter.h
22163         (count_occurrences_1): Delete.
22164         (count_occurrences_equiv): Turn rtxes into const_rtxes.
22165         Use FOR_EACH_SUBRTX rather than for_each_rtx.
22167 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22169         * rtl.h (tls_referenced_p): Take a const_rtx rather than an rtx.
22170         * rtlanal.c (tls_referenced_p_1): Delete.
22171         (tls_referenced_p): Take a const_rtx rather than an rtx.
22172         Use FOR_EACH_SUBRTX rather than for_each_rtx.
22174 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22176         * rtl.h (for_each_inc_dec_fn): Remove special case for -1.
22177         (for_each_inc_dec): Take an rtx rather than an rtx *.
22178         * cselib.c (cselib_record_autoinc_cb): Update accordingly.
22179         (cselib_record_sets): Likewise.
22180         * dse.c (emit_inc_dec_insn_before, check_for_inc_dec_1)
22181         (check_for_inc_dec): Likewise.
22182         * rtlanal.c (for_each_inc_dec_ops): Delete.
22183         (for_each_inc_dec_find_inc_dec): Take the MEM as argument,
22184         rather than a pointer to the memory address.  Replace
22185         for_each_inc_dec_ops argument with separate function and data
22186         arguments.  Abort on non-autoinc addresses.
22187         (for_each_inc_dec_find_mem): Delete.
22188         (for_each_inc_dec): Take an rtx rather than an rtx *.  Use
22189         FOR_EACH_SUBRTX_VAR to visit every autoinc MEM.
22191 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22193         * rtl.h (find_all_hard_regs): Declare.
22194         * rtlanal.c (find_all_hard_regs): New function.
22195         (record_hard_reg_uses_1): Delete.
22196         (record_hard_reg_uses): Use find_all_hard_regs.
22198 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22200         * rtl.h (replace_label_data): Delete.
22201         (replace_label): Take the old label, new label and update-nuses flag
22202         as direct arguments.  Return void.
22203         * cfgcleanup.c (outgoing_edges_match): Update accordingly.
22204         * rtlanal.c (replace_label): Update interface as above.  Handle
22205         JUMP_TABLE_DATA as a special case.  Handle JUMPs outside the
22206         iterator.  Use FOR_EACH_SUBRTX_PTR.
22208 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22210         * rtl.h (get_pool_constant, rtx_referenced_p): Replace rtx parameters
22211         with const_rtx parameters.
22212         * varasm.c (get_pool_constant): Likewise.
22213         * rtlanal.c (rtx_referenced_p_1): Delete.
22214         (rtx_referenced_p): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22215         Assert that the rtx we're looking for is nonnull.  Allow searches
22216         for constant pool SYMBOL_REFs.
22218 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22220         * reload1.c: Include rtl-iter.h.
22221         (note_reg_elim_costly): Turn from being a for_each_rtx callback
22222         to being a function that examines each subrtx itself.
22223         (eliminate_regs_1, elimination_costs_in_insn): Update accordingly.
22225 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22227         * regcprop.c (cprop_find_used_regs_1): Delete.
22228         (cprop_find_used_regs): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22230 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22232         * regcprop.c: Include rtl-iter.h.
22233         (kill_value): Take a const_rtx.
22234         (kill_autoinc_value): Turn from being a for_each_rtx callback
22235         to being a function that examines each subrtx itself.
22236         (copyprop_hardreg_forward_1): Update accordingly.
22238 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22240         * reg-stack.c: Include rtl-iter.h.
22241         (subst_stack_regs_in_debug_insn): Delete.
22242         (subst_all_stack_regs_in_debug_insn): Use FOR_EACH_SUBRTX_PTR
22243         instead of for_each_rtx.
22245 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22247         * lower-subreg.c (find_decomposable_subregs): Turn from being
22248         a for_each_rtx callback to being a function that examines each
22249         subrtx itself.  Remove handling of null rtxes.
22250         (decompose_multiword_subregs): Update accordingly.
22252 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22254         * lower-subreg.c (adjust_decomposed_uses): Delete.
22255         (resolve_debug): Use FOR_EACH_SUBRTX_PTR rather than for_each_rtx.
22256         Remove handling of null rtxes.
22258 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22260         * lower-subreg.c: Include rtl-iter.h.
22261         (resolve_subreg_use): Turn from being a for_each_rtx callback
22262         to being a function that examines each subrtx itself.  Remove
22263         handling of null rtxes.
22264         (resolve_reg_notes, resolve_simple_move): Update accordingly.
22265         (decompose_multiword_subregs): Likewise.
22267 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22269         * loop-iv.c (altered_reg_used): Turn from being a for_each_rtx callback
22270         to being a function that examines each subrtx itself.
22271         (simplify_using_condition, simplify_using_initial_values): Update
22272         accordingly.
22274 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22276         * loop-iv.c: Include rtl-iter.h.
22277         (find_single_def_src): New function.
22278         (replace_single_def_regs): Turn from being a for_each_rtx callback
22279         to being a function that examines each subrtx itself.
22280         (replace_in_expr, simplify_using_initial_values): Update accordingly.
22282 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22284         * jump.c (eh_returnjump_p_1): Delete.
22285         (eh_returnjump_p): Use FOR_EACH_SUBRTX rather than for_each_rtx.
22286         Remove handling of null rtxes.
22288 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22290         * jump.c: Include rtl-iter.h.
22291         (returnjump_p_1): Delete.
22292         (returnjump_p): Use FOR_EACH_SUBRTX rather than for_each_rtx.
22293         Remove handling of null rtxes.
22295 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22297         * ira.c: Include rtl-iter.h.
22298         (set_paradoxical_subreg): Turn from being a for_each_rtx callback
22299         to being a function that examines each subrtx itself.  Remove
22300         handling of null rtxes.
22301         (update_equiv_regs): Update call accordingly.
22303 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22305         * fwprop.c: Include rtl-iter.h.
22306         (varying_mem_p): Turn from being a for_each_rtx callback to being
22307         a function that examines each subrtx itself.
22308         (propagate_rtx): Update accordingly.
22310 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22312         * function.c: Include rtl-iter.h
22313         (instantiate_virtual_regs_in_rtx): Turn from being a for_each_rtx
22314         callback to being a function that examines each subrtx itself.
22315         Return the changed flag.
22316         (instantiate_virtual_regs_in_insn, instantiate_decl_rtl)
22317         (instantiate_virtual_regs): Update calls accordingly.
22319 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22321         * final.c: Include rtl-iter.h.
22322         (mark_symbol_ref_as_used): Delete.
22323         (mark_symbol_refs_as_used): Use FOR_EACH_SUBRTX instead of
22324         for_each_rtx.
22326 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22328         * emit-rtl.c: Include rtl-iter.h.
22329         (find_auto_inc): Turn from being a for_each_rtx callback to being
22330         a function that examines each subrtx itself.  Assume the first operand
22331         to an RTX_AUTOINC is the automodified register.
22332         (try_split): Update call accordingly.
22334 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22336         * dwarf2out.c (resolve_one_addr): Remove unused data parameter.
22337         Return a bool, inverting the result so that 0/false means "not ok".
22338         Use FOR_EACH_SUBRTX_PTR instead of for_each_rtx to iterate over
22339         subrtxes of a CONST.
22340         (mem_loc_descriptor, add_const_value_attribute)
22341         (resolve_addr_in_expr): Update calls accordingly.
22343 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22345         * dwarf2out.c: Include rtl-iter.h.
22346         (const_ok_for_output_1): Take the rtx instead of a pointer to it.
22347         Remove unused data parameter.  Return a bool, inverting the result
22348         so that 0/false means "not ok".
22349         (const_ok_for_output): Update accordingly.  Use FOR_EACH_SUBRTX_VAR
22350         instead of for_each_rtx.
22352 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22354         * dse.c: Include rtl-iter.h.
22355         (check_mem_read_rtx): Change void * parameter to real type.
22356         Remove return value.
22357         (check_mem_read_use): Fix comment.  Use FOR_EACH_SUBRTX_PTR instead of
22358         for_each_rtx.  Don't handle null rtxes.
22360 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22362         * df-problems.c: Include rtl-iter.h.
22363         (find_memory): Turn from being a for_each_rtx callback to being
22364         a function that examines each subrtx itself.  Continue to look for
22365         volatile references even after a nonvolatile one has been found.
22366         (can_move_insns_across): Update calls accordingly.
22368 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22370         * ddg.c (walk_mems_2, walk_mems_1): Delete.
22371         (insns_may_alias_p): Use FOR_EACH_SUBRTX rather than for_each_rtx
22372         to iterate over subrtxes.  Return a bool rather than an int.
22374 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22376         * ddg.c: Include rtl-iter.h.
22377         (mark_mem_use_1): Rename to...
22378         (mark_mem_use): ...deleting old mark_mem_use.  Use FOR_EACH_SUBRTX
22379         instead of for_each_rtx.
22380         (mem_read_insn_p): Update accordingly.
22382 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22384         * cse.c (change_cc_mode_args): Delete.
22385         (cse_change_cc_mode): Turn from being a for_each_rtx callback to being
22386         a function that examines each subrtx itself.  Take the fields of
22387         change_cc_mode_args as argument and return void.
22388         (cse_change_cc_mode_insn): Update calls accordingly.
22390 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22392         * cse.c (is_dead_reg): Change argument to const_rtx.
22393         (dead_debug_insn_data): Delete.
22394         (is_dead_debug_insn): Expand commentary.  Turn from being a
22395         for_each_rtx callback to being a function that examines
22396         each subrtx itself.  Take the fields of dead_debug_insn_data
22397         as argument.
22398         (delete_trivially_dead_insns): Update call accordingly.
22400 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22402         * cse.c (check_for_label_ref): Move earlier in file.  Turn from
22403         being a for_each_rtx callback to being a function that examines
22404         each subrtx itself.
22405         (cse_extended_basic_block): Update call accordingly.
22407 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22409         * cse.c (check_dependence_data): Delete.
22410         (check_dependence): Change from being a for_each_rtx callback to being
22411         a function that examines all subrtxes itself.  Don't handle null rtxes.
22412         (invalidate): Update call accordingly.
22414 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22416         * cse.c: Include rtl-iter.h.
22417         (approx_reg_cost_1): Delete.
22418         (approx_reg_cost): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22419         Don't handle null rtxes.
22421 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22423         * cfgcleanup.c: Include rtl-iter.h.
22424         (mentions_nonequal_regs): Turn from being a for_each_rtx callback
22425         to being a function that examines each subrtx itself.
22426         (thread_jump): Update accordingly.
22428 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22430         * combine-stack-adj.c: Include rtl-iter.h.
22431         (record_stack_refs_data): Delete.
22432         (record_stack_refs): Turn from being a for_each_rtx callback
22433         to being a function that examines each subrtx itself.
22434         Take a pointer to the reflist.  Invert sense of return value
22435         so that true means success and false means failure.  Don't
22436         handle null rtxes.
22437         (combine_stack_adjustments_for_block): Update accordingly.
22439 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22441         * combine.c (record_truncated_value): Turn from being a for_each_rtx
22442         callback to a function that takes an rtx and returns a bool
22443         (record_truncated_values): Use FOR_EACH_SUBRTX_VAR instead of
22444         for_each_rtx.
22446 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22448         * combine.c: Include rtl-iter.h.
22449         (unmentioned_reg_p_1): Delete.
22450         (unmentioned_reg_p): Use FOR_EACH_SUBRTX rather than for_each_rtx.
22451         Don't handle null rtxes.
22453 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22455         * calls.c: Include rtl-iter.h.
22456         (internal_arg_pointer_based_exp_1): Delete.
22457         (internal_arg_pointer_based_exp): Take a const_rtx.
22458         Use FOR_EACH_SUBRTX to iterate over subrtxes.
22460 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22462         * caller-save.c: Include rtl-iter.h.
22463         (add_used_regs_1): Delete.
22464         (add_used_regs): Use FOR_EACH_SUBRTX rather than for_each_rtx
22465         to iterate over subrtxes.  Assert that any remaining pseudos
22466         have been spilled.
22468 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22470         * bt-load.c: Include rtl-iter.h.
22471         (btr_reference_found, find_btr_reference, btr_referenced_p): Delete.
22472         (find_btr_use): Move further up file.  Use FOR_EACH_SUBRTX_PTR
22473         to iterate over subrtxes.
22474         (insn_sets_btr_p, new_btr_user, compute_defs_uses_and_gen): Use
22475         find_btr_use rather than btr_referenced_p.
22477 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22479         * alias.c: Include rtl-iter.h.
22480         (refs_newer_value_cb): Delete.
22481         (refs_newer_value_p): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22483 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22485         * rtl-iter.h: New file.
22486         * rtlanal.c: Include it.
22487         (rtx_all_subrtx_bounds, rtx_nonconst_subrtx_bounds): New variables.
22488         (generic_subrtx_iterator <T>::add_single_to_queue)
22489         (generic_subrtx_iterator <T>::add_subrtxes_to_queue)
22490         (generic_subrtx_iterator <T>::free_array): New functions.
22491         (generic_subrtx_iterator <T>::LOCAL_ELEMS): Define.
22492         (generic_subrtx_iterator <const_rtx_accessor>)
22493         (generic_subrtx_iterator <rtx_var_accessor>
22494         (generic_subrtx_iterator <rtx_ptr_accessor>): Instantiate.
22495         (setup_reg_subrtx_bounds): New function.
22496         (init_rtlanal): Call it.
22498 2014-08-27  Kaz Kojima  <kkojima@gcc.gnu.org>
22500         PR target/62261
22501         * config/sh/sh.md (ashlsi3): Handle negative shift count for
22502         TARGET_SHMEDIA.
22503         (ashldi3, ashrsi3, ashrdi3, lshrsi3, lshrdi3): Likewise.
22505 2014-08-27  Richard Sandiford  <rdsandiford@googlemail.com>
22507         * emit-rtl.c (set_unique_reg_note): Discard notes with side effects.
22509 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22511         * rtl.h (JUMP_LABEL_AS_INSN): New.
22513 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22515         * rtl.h (free_EXPR_LIST_list): Strengthen param from rtx * to
22516         rtx_expr_list **.
22517         (alloc_EXPR_LIST): Strengthen return type from rtx to
22518         rtx_expr_list *.
22519         (remove_free_EXPR_LIST_node): Likewise for param.
22520         * reload.h (struct reg_equivs_t): Strengthen field "alt_mem_list"
22521         from rtx to rtx_expr_list *.
22522         * sched-int.h (struct deps_desc): Strengthen fields
22523         "pending_read_mems" and "pending_write_mems" from rtx to
22524         rtx_expr_list *.
22526         * dwarf2out.c (decl_piece_varloc_ptr): Strengthen return type from
22527         rtx to rtx_expr_list *.
22528         * lists.c (alloc_INSN_LIST): Likewise, also for local "r".
22529         (free_EXPR_LIST_list): Strengthen param "listp" from rtx * to
22530         rtx_expr_list **.
22531         (remove_free_EXPR_LIST_node): Likewise.  Strengthen local "node"
22532         from rtx to rtx_expr_list *.
22533         * loop-iv.c (simplify_using_initial_values): Strengthen local
22534         "cond_list" from rtx to rtx_expr_list *, and locals "pnode",
22535         "pnote_next" from rtx * to rtx_expr_list **.
22536         * sched-deps.c (remove_from_both_dependence_lists):  Strengthen
22537         param "exprp" from rtx * to rtx_expr_list **.
22538         (add_insn_mem_dependence): Strengthen local "mem_list" from
22539         rtx * to rtx_expr_list **.  Strengthen local "mem_node" from rtx
22540         to rtx_expr_list *.
22541         * sched-rgn.c (concat_insn_mem_list): Strengthen param "copy_mems"
22542         and local "new_mems" from rtx to rtx_expr_list *.  Strengthen
22543         param "old_mems_p" from rtx * to rtx_expr_list **.
22544         * var-tracking.c (struct adjust_mem_data): Strengthen field
22545         "side_effects" from rtx to rtx_expr_list *.
22546         (adjust_insn): Replace NULL_RTX with NULL when assigning to
22547         rtx_expr_list *.
22548         (prepare_call_arguments): Likewise.
22550 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22552         * function.h (struct rtl_data): Strengthen field
22553         "x_stack_slot_list" from rtx to rtx_expr_list *.
22555         * emit-rtl.c (unshare_all_rtl_1): Add a checked cast
22556         when assigning to stack_slot_list.
22558 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22560         * function.h (struct rtl_data): Strengthen field
22561         x_nonlocal_goto_handler_labels from rtx to rtx_expr_list *.
22562         * rtl.h (remove_node_from_expr_list): Strengthen second param from
22563         rtx * to rtx_expr_list **.
22565         * cfgbuild.c (make_edges): In loop over
22566         nonlocal_goto_handler_labels, strengthen local "x" from rtx to
22567         rtx_expr_list *, and use methods of the latter class to clarify
22568         the code.
22569         * cfgrtl.c (cfg_layout_initialize): Strengthen local "x" from rtx to
22570         rtx_expr_list *, and use methods of the latter class to clarify
22571         the code.
22572         * dwarf2cfi.c (create_trace_edges): Likewise for local "lab".
22573         * reload1.c (set_initial_label_offsets): Likewise for local "x".
22574         * rtlanal.c (remove_node_from_expr_list): Strengthen param "listp"
22575         from rtx * to rtx_expr_list **.  Strengthen local "temp" from rtx
22576         to rtx_expr_list *.  Use methods of the latter class to clarify
22577         the code.
22579 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22581         * function.h (struct expr_status): Strengthen field
22582         "x_forced_labels" from rtx to rtx_expr_list *.
22584         * cfgbuild.c (make_edges): Split local "x" into two locals,
22585         strengthening one from rtx to rtx_expr_list *, and using methods
22586         of said class.
22587         * dwarf2cfi.c (create_trace_edges): Split local "lab" out; within
22588         loop over forced_labels, introduce strengthen it from rtx to
22589         rtx_expr_list *, using methods to clarify the code.
22590         * jump.c (rebuild_jump_labels_1): Strengthen local "insn" from rtx
22591         to rtx_expr_list *, using methods of said class to clarify the
22592         code.
22593         * reload1.c (set_initial_label_offsets): Split local "x" into two
22594         per-loop variables, strengthening the first from rtx to
22595         rtx_expr_list * and using methods.
22597 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22599         * coretypes.h (class rtx_expr_list): Add forward declaration.
22600         * emit-rtl.c (gen_rtx_EXPR_LIST): New.
22601         * gengenrtl.c (special_rtx): Add EXPR_LIST.
22602         * rtl.h (class rtx_expr_list): New subclass of rtx_def, adding
22603         invariant: GET_CODE (X) == EXPR_LIST.
22604         (is_a_helper <rtx_expr_list *>::test): New.
22605         (rtx_expr_list::next): New.
22606         (rtx_expr_list::element): New.
22607         (gen_rtx_EXPR_LIST): New.
22609 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22611         * varasm.c (mark_constants): Convert a GET_CODE check into a
22612         dyn_cast, strengthening local "seq" from rtx to rtx_sequence *.
22613         Use methods of rtx_sequence to clarify the code.
22615 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22617         * sched-vis.c (print_pattern): Within SEQUENCE case, introduce a
22618         local "seq" via a checked cast, and use methods of rtx_sequence
22619         to simplify the code.
22621 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22623         * resource.c (mark_referenced_resources): Strengthen local
22624         "sequence" from rtx to rtx_sequence *, adding a checked cast, and
22625         using methods of rtx_sequence to clarify the code.
22626         (find_dead_or_set_registers): Within the switch statement, convert
22627         a GET_CODE check to a dyn_cast, introducing local "seq".  Within
22628         the JUMP_P handling, introduce another local "seq", adding a
22629         checked cast to rtx_sequence *.  In both cases, use methods of
22630         rtx_sequence to clarify the code.
22631         (mark_set_resources): Within SEQUENCE case, introduce local "seq"
22632         via a checked cast, and use methods of rtx_sequence to simplify
22633         the code.
22635 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22637         * reorg.c (redundant_insn): In two places in the function, replace
22638         a check of GET_CODE with a dyn_cast, introducing local "seq", and
22639         usings methods of rtx_sequence to clarify the code.
22641 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22643         * jump.c (mark_jump_label_1): Within the SEQUENCE case, introduce
22644         local "seq" with a checked cast, and use methods of rtx_sequence
22645         to clarify the code.
22647 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22649         * function.c (contains): Introduce local "seq" for PATTERN (insn),
22650         with a checked cast, in the region for where we know it's a
22651         SEQUENCE.  Use methods of rtx_sequence.
22653 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22655         * final.c (get_attr_length_1): Replace GET_CODE check with a
22656         dyn_cast, introducing local "seq" and the use of methods of
22657         rtx_sequence.
22658         (shorten_branches): Likewise, introducing local "body_seq".
22659         Strengthen local "inner_insn" from rtx to rtx_insn *.
22660         (reemit_insn_block_notes): Replace GET_CODE check with a
22661         dyn_cast, strengthening local "body" from rtx to rtx_sequence *.
22662         Use methods of rtx_sequence.
22663         (final_scan_insn): Likewise, introducing local "seq" for when
22664         "body" is known to be a SEQUENCE, using its methods.
22666 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22668         * except.c (can_throw_external): Strengthen local "seq" from rtx
22669         to rtx_sequence *.  Use methods of rtx_sequence.
22670         (insn_nothrow_p): Likewise.
22672 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22674         * dwarf2cfi.c (create_trace_edges): Convert GET_CODE check into a
22675         dyn_cast, strengthening local "seq" from rtx to rtx_sequence *.
22676         Use methods of rtx_sequence.
22677         (scan_trace): Likewise for local "pat".
22679 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22681         * coretypes.h (class rtx_sequence): Add forward declaration.
22682         * rtl.h (class rtx_sequence): New subclass of rtx_def, adding
22683         invariant: GET_CODE (X) == SEQUENCE.
22684         (is_a_helper <rtx_sequence *>::test): New.
22685         (is_a_helper <const rtx_sequence *>::test): New.
22686         (rtx_sequence::len): New.
22687         (rtx_sequence::element): New.
22688         (rtx_sequence::insn): New.
22690 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22692         * rtl.h (free_INSN_LIST_list): Strengthen param from rtx * to
22693         rtx_insn_list **.
22694         (alloc_INSN_LIST): Strengthen return type from rtx to
22695         rtx_insn_list *.
22696         (copy_INSN_LIST): Likewise for return type and param.
22697         (concat_INSN_LIST): Likewise for both params and return type.
22698         (remove_free_INSN_LIST_elem): Strenghten first param from rtx to
22699         rtx_insn *.  Strengthen second param from rtx * to rtx_insn_list **.
22700         (remove_free_INSN_LIST_node): Strenghten return type from rtx to
22701         rtx_insn *.  Strengthen param from rtx * to rtx_insn_list **.
22703         * sched-int.h (struct deps_reg): Strengthen fields "uses", "sets",
22704         "implicit_sets", "control_uses", "clobbers" from rtx to
22705         rtx_insn_list *.
22706         (struct deps_desc): Likewise for fields "pending_read_insns",
22707         "pending_write_insns", "pending_jump_insns",
22708         "last_pending_memory_flush", "last_function_call",
22709         "last_function_call_may_noreturn", "sched_before_next_call",
22710         "sched_before_next_jump".
22711         (struct _haifa_deps_insn_data): Likewise for field "cond_deps".
22712         (remove_from_deps): Strengthen second param from rtx to rtx_insn *.
22714         * gcse.c (struct ls_expr): Strengthen fields "loads" and "stores"
22715         from rtx to rtx_insn_list *.
22716         (ldst_entry): Replace use of NULL_RTX with NULL when dealing with
22717         rtx_insn_list *.
22719         * haifa-sched.c (insn_queue): Strengthen this variable from rtx *
22720         to rtx_insn_list **.
22721         (dep_cost_1): Strengthen local "dep_cost_rtx_link" from rtx to
22722         rtx_insn_list *.
22723         (queue_insn): Likewise for local "link".
22724         (struct haifa_saved_data): Strengthen field "insn_queue" from
22725         rtx * to rtx_insn_list **.
22726         (save_backtrack_point): Update allocation of save->insn_queue to
22727         reflect the strengthening of elements from rtx to rtx_insn_list *.
22728         (queue_to_ready): Strengthen local "link" from rtx to
22729         rtx_insn_list *; use methods "next" and "insn" when traversing the
22730         list.
22731         (early_queue_to_ready): Likewise for locals "link", "next_link",
22732         "prev_link".
22733         (schedule_block): Update allocation of insn_queue to reflect the
22734         strengthening of elements from rtx to rtx_insn_list *.  Strengthen
22735         local "link" from rtx to rtx_insn_list *, and use methods when
22736         working it.
22737         (add_to_speculative_block): Strengthen locals "twins" and
22738         "next_node" from rtx to rtx_insn_list *, and use methods when
22739         working with them.  Strengthen local "twin" from rtx to
22740         rtx_insn *, eliminating a checked cast.
22741         (fix_recovery_deps): Strengthen locals "ready_list" and "link"
22742         from rtx to rtx_insn_list *, and use methods when working with
22743         them.
22745         * lists.c (alloc_INSN_LIST): Strengthen return type and local "r"
22746         from rtx to rtx_insn_list *, adding a checked cast.
22747         (free_INSN_LIST_list): Strengthen param "listp" from rtx * to
22748         rtx_insn_list **.
22749         (copy_INSN_LIST): Strengthen return type and locals "new_queue",
22750         "newlink" from rtx to rtx_insn_list *.  Strengthen local
22751         "pqueue" from rtx * to rtx_insn_list **.  Strengthen local "x"
22752         from rtx to rtx_insn *.
22753         (concat_INSN_LIST): Strengthen return type and local "new_rtx",
22754         from rtx to rtx_insn_list *.  Use methods of the latter class.
22755         (remove_free_INSN_LIST_elem): Strengthen param "elem" from rtx to
22756         rtx_insn *, and param "listp" from rtx * to rtx_insn_list **.
22757         (remove_free_INSN_LIST_node): Strengthen return type and local
22758         "elem" from rtx to rtx_insn *.  Strenghten param "listp" from
22759         rtx * to rtx_insn_list **.  Strengthen local "node" from rtx to
22760         rtx_insn_list *, using "insn" method.
22762         * sched-deps.c (add_dependence_list):  Strengthen param "list"
22763         from rtx to rtx_insn_list *, and use methods when working with it.
22764         (add_dependence_list_and_free):  Strengthen param "listp" from
22765         rtx * to rtx_insn_list **.
22766         (remove_from_dependence_list): Strenghten param "listp" from rtx *
22767         to rtx_insn_list **, and use methods when working with *listp.
22768         (remove_from_both_dependence_lists): Strengthen param "listp" from
22769         rtx * to rtx_insn_list **
22770         (add_insn_mem_dependence): Strengthen local "insn_list" from rtx *
22771         to rtx_insn_list **.  Eliminate local "link", in favor of two new
22772         locals "insn_node" and "mem_node", an rtx_insn_list * and an rtx
22773         respectively.
22774         (deps_analyze_insn): Split out uses 'f local "t" as an INSN_LIST
22775         by introducing local "cond_deps".
22776         (remove_from_deps): Strengthen param "insn" from rtx to
22777         rtx_insn *.
22779         * sched-rgn.c (concat_insn_mem_list): Strengthen param
22780         "copy_insns" and local "new_insns" from rtx to rtx_insn_list *.
22781         Strengthen param "old_insns_p" from rtx * to rtx_insn_list **.
22782         Use methods of rtx_insn_list.
22784         * store-motion.c (struct st_expr): Strengthen fields
22785         "antic_stores" and "avail_stores" from rtx to rtx_insn_list *.
22786         (st_expr_entry): Replace NULL_RTX with NULL when dealing with
22787         rtx_insn_list *.
22788         (find_moveable_store): Split out "tmp" into multiple more-tightly
22789         scoped locals.  Use methods of rtx_insn_list *.
22790         (compute_store_table): Strengthen local "tmp" from rtx to
22791         rtx_insn *.  Use methods of rtx_insn_list *.
22793 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22795         * coretypes.h (class rtx_insn_list): Add forward declaration.
22796         * rtl.h (class rtx_insn_list): New subclass of rtx_def
22797         (is_a_helper <rtx_insn_list *>::test): New.
22798         (rtx_insn_list::next): New.
22799         (rtx_insn_list::insn): New.
22800         (gen_rtx_INSN_LIST): Add prototype.
22801         * emit-rtl.c (gen_rtx_INSN_LIST): New.
22802         * gengenrtl.c (special_rtx): Add INSN_LIST.
22804 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22806         * ira-lives.c (find_call_crossed_cheap_reg): Strengthen local
22807         "prev" from rtx to rtx_insn *.
22809 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22811         * rtl.h (INSN_UID): Convert from a macro to a pair of inline
22812         functions.  Require merely an rtx for now, not an rtx_insn *.
22813         (BLOCK_FOR_INSN): Likewise.
22814         (INSN_LOCATION): Likewise.
22815         (INSN_HAS_LOCATION): Convert from a macro to an inline function.
22817 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22819         * rtl.h (PATTERN): Convert this macro into a pair of inline
22820         functions, for now, requiring const_rtx and rtx.
22822 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22824         * target.def (unwind_emit): Strengthen param "insn" from rtx to
22825         rtx_insn *.
22826         (final_postscan_insn): Likewise.
22827         (adjust_cost): Likewise.
22828         (adjust_priority): Likewise.
22829         (variable_issue): Likewise.
22830         (macro_fusion_pair_p): Likewise.
22831         (dfa_post_cycle_insn): Likewise.
22832         (first_cycle_multipass_dfa_lookahead_guard): Likewise.
22833         (first_cycle_multipass_issue): Likewise.
22834         (dfa_new_cycle): Likewise.
22835         (adjust_cost_2): Likewise for params "insn" and "dep_insn".
22836         (speculate_insn): Likewise for param "insn".
22837         (gen_spec_check): Likewise for params "insn" and "label".
22838         (get_insn_spec_ds): Likewise for param "insn".
22839         (get_insn_checked_ds): Likewise.
22840         (dispatch_do): Likewise.
22841         (dispatch): Likewise.
22842         (cannot_copy_insn_p): Likewise.
22843         (invalid_within_doloop): Likewise.
22844         (legitimate_combined_insn): Likewise.
22845         (needed): Likewise.
22846         (after): Likewise.
22848         * doc/tm.texi: Automatically updated to reflect changes to
22849         target.def.
22851         * haifa-sched.c (choose_ready): Convert NULL_RTX to NULL when
22852         working with insn.
22853         (schedule_block): Likewise.
22854         (sched_init): Likewise.
22855         (sched_speculate_insn): Strengthen param "insn" from rtx to
22856         rtx_insn *.
22857         (ready_remove_first_dispatch): Convert NULL_RTX to NULL when
22858         working with insn.
22859         * hooks.c (hook_bool_rtx_true): Rename to...
22860         hook_bool_rtx_insn_true): ...this, and strengthen first param from
22861         rtx to rtx_insn *.
22862         (hook_constcharptr_const_rtx_null): Rename to...
22863         (hook_constcharptr_const_rtx_insn_null): ...this, and strengthen
22864         first param from const_rtx to const rtx_insn *.
22865         (hook_bool_rtx_int_false): Rename to...
22866         (hook_bool_rtx_insn_int_false): ...this, and strengthen first
22867         param from rtx to rtx_insn *.
22868         (hook_void_rtx_int): Rename to...
22869         (hook_void_rtx_insn_int): ...this, and strengthen first param from
22870         rtx to rtx_insn *.
22872         * hooks.h (hook_bool_rtx_true): Rename to...
22873         (hook_bool_rtx_insn_true): ...this, and strengthen first param from
22874         rtx to rtx_insn *.
22875         (hook_bool_rtx_int_false): Rename to...
22876         (hook_bool_rtx_insn_int_false): ...this, and strengthen first
22877         param from rtx to rtx_insn *.
22878         (hook_void_rtx_int): Rename to...
22879         (hook_void_rtx_insn_int): ...this, and strengthen first param from
22880         rtx to rtx_insn *.
22881         (hook_constcharptr_const_rtx_null): Rename to...
22882         (hook_constcharptr_const_rtx_insn_null): ...this, and strengthen
22883         first param from const_rtx to const rtx_insn *.
22885         * sched-deps.c (sched_macro_fuse_insns): Strengthen param "insn"
22886         and local "prev" from rtx to rtx_insn *.
22888         * sched-int.h (sched_speculate_insn): Strengthen first param from
22889         rtx to rtx_insn *.
22891         * sel-sched.c (create_speculation_check): Likewise for local "label".
22892         * targhooks.c (default_invalid_within_doloop): Strengthen param
22893         "insn" from const_rtx to const rtx_insn *.
22894         * targhooks.h (default_invalid_within_doloop): Strengthen param
22895         from const_rtx to const rtx_insn *.
22897         * config/alpha/alpha.c (alpha_cannot_copy_insn_p): Likewise.
22898         (alpha_adjust_cost): Likewise for params "insn", "dep_insn".
22900         * config/arc/arc.c (arc_sched_adjust_priority): Likewise for param
22901         "insn".
22902         (arc_invalid_within_doloop): Likewise, with const.
22904         * config/arm/arm.c (arm_adjust_cost): Likewise for params "insn", "dep".
22905         (arm_cannot_copy_insn_p): Likewise for param "insn".
22906         (arm_unwind_emit): Likewise.
22908         * config/bfin/bfin.c (bfin_adjust_cost): Likewise for params "insn",
22909         "dep_insn".
22911         * config/c6x/c6x.c (c6x_dfa_new_cycle): Likewise for param "insn".
22912         (c6x_variable_issue): Likewise.  Removed now-redundant checked
22913         cast.
22914         (c6x_adjust_cost): Likewise for params "insn", "dep_insn".
22916         * config/epiphany/epiphany-protos.h (epiphany_mode_needed):
22917         Likewise for param "insn".
22918         (epiphany_mode_after): Likewise.
22919         * config/epiphany/epiphany.c (epiphany_adjust_cost): Likewise for
22920         params "insn", "dep_insn".
22921         (epiphany_mode_needed): Likewise for param "insn".
22922         (epiphany_mode_after): Likewise.
22924         * config/i386/i386-protos.h (i386_pe_seh_unwind_emit): Likewise.
22925         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
22926         (ix86_avx_u128_mode_needed): Likewise.
22927         (ix86_i387_mode_needed): Likewise.
22928         (ix86_mode_needed): Likewise.
22929         (ix86_avx_u128_mode_after): Likewise.
22930         (ix86_mode_after): Likewise.
22931         (ix86_adjust_cost): Likewise for params "insn", "dep_insn".
22932         (ix86_macro_fusion_pair_p): Likewise for params "condgen", "condjmp".
22933         (ix86_adjust_priority): Likewise for param "insn".
22934         (core2i7_first_cycle_multipass_issue): Likewise for param "insn".
22935         (do_dispatch): Likewise.
22936         (has_dispatch): Likewise.
22937         * config/i386/winnt.c (i386_pe_seh_unwind_emit): Likewise.
22939         * config/ia64/ia64.c (TARGET_INVALID_WITHIN_DOLOOP): Update to
22940         reflect renaming of default hook implementation from
22941         hook_constcharptr_const_rtx_null to
22942         hook_constcharptr_const_rtx_insn_null.
22943         (ia64_adjust_cost_2): Strengthen params "insn", "dep_insn" from
22944         rtx to rtx_insn *.
22945         (ia64_variable_issue): Likewise for param "insn".
22946         (ia64_first_cycle_multipass_dfa_lookahead_guard): Likewise.
22947         (ia64_dfa_new_cycle): Likewise.
22948         (ia64_get_insn_spec_ds): Likewise.
22949         (ia64_get_insn_checked_ds): Likewise.
22950         (ia64_speculate_insn): Likewise.
22951         (ia64_gen_spec_check): Likewise for params "insn", "label".
22952         (ia64_asm_unwind_emit): Likewise for param "insn".
22954         * config/m32r/m32r.c (m32r_adjust_priority): Likewise.
22956         * config/m68k/m68k.c (m68k_sched_adjust_cost): Likewise for params
22957         "insn", "def_insn".
22958         (m68k_sched_variable_issue): Likewise for param "insn".
22960         * config/mep/mep.c (mep_adjust_cost): Likewise for params "insn",
22961         "def_insn".
22963         * config/microblaze/microblaze.c (microblaze_adjust_cost):
22964         Likewise for params "insn", "dep".
22966         * config/mips/mips.c (mips_adjust_cost): Likewise.
22967         (mips_variable_issue): Likewise for param "insn".
22968         (mips_final_postscan_insn): Likewise.
22970         * config/mn10300/mn10300.c (mn10300_adjust_sched_cost): Likewise
22971         for params "insn", "dep".
22973         * config/pa/pa.c (pa_adjust_cost): Likewise for params "insn",
22974         "dep_insn".
22975         (pa_adjust_priority): Likewise for param "insn".
22977         * config/picochip/picochip.c (picochip_sched_adjust_cost):
22978         Likewise for params "insn", "dep_insn".
22980         * config/rs6000/rs6000.c (rs6000_variable_issue_1): Likewise for
22981         param "insn".
22982         (rs6000_variable_issue): Likewise.
22983         (rs6000_adjust_cost): Likewise for params "insn", "dep_insn".
22984         (rs6000_debug_adjust_cost): Likewise.
22985         (rs6000_adjust_priority): Likewise for param "insn".
22986         (rs6000_use_sched_lookahead_guard): Likewise.
22987         (get_next_active_insn): Likewise for return type and both params.
22988         (redefine_groups): Likewise for params "prev_head_insn", "tail"
22989         and locals "insn", "next_insn".
22990         (pad_groups): Likewise.
22992         * config/s390/s390.c (s390_adjust_priority): Likewise for param
22993         "insn".
22994         (s390_cannot_copy_insn_p): Likewise.
22995         (s390_sched_variable_issue): Likewise for third param, eliminating
22996         checked cast.
22997         (TARGET_INVALID_WITHIN_DOLOOP): Update to reflect renaming of
22998         default hook implementation from hook_constcharptr_const_rtx_null
22999         to hook_constcharptr_const_rtx_insn_null.
23001         * config/sh/sh.c (sh_cannot_copy_insn_p): Strengthen param "insn"
23002         from rtx to rtx_insn *.
23003         (sh_adjust_cost): Likewise for params "insn", "dep_insn".
23004         (sh_variable_issue): Likewise for param "insn".
23005         (sh_dfa_new_cycle): Likewise.
23006         (sh_mode_needed): Likewise.
23007         (sh_mode_after): Likewise.
23009         * config/sparc/sparc.c (supersparc_adjust_cost): Likewise for
23010         params "insn", "dep_insn".
23011         (hypersparc_adjust_cost): Likewise.
23012         (sparc_adjust_cost): Likewise.
23014         * config/spu/spu.c (spu_sched_variable_issue): Likewise for third
23015         param, eliminated checked cast.
23016         (spu_sched_adjust_cost): Likewise for first and third params.
23018         * config/tilegx/tilegx.c (tilegx_sched_adjust_cost): Strengthen
23019         params "insn" and "dep_insn" from rtx to rtx_insn *.
23021         * config/tilepro/tilepro.c (tilepro_sched_adjust_cost): Likewise.
23023 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
23025         * gcc/config/mn10300/mn10300.c (is_load_insn): Rename to...
23026         (set_is_load_p): ...this, updating to work on a SET pattern rather
23027         than an insn.
23028         (is_store_insn): Rename to...
23029         (set_is_store_p): ...this, updating to work on a SET pattern
23030         rather than an insn.
23031         (mn10300_adjust_sched_cost): Move call to get_attr_timings from
23032         top of function to where it is needed.  Rewrite the bogus
23033         condition that checks for "insn" and "dep" being PARALLEL to
23034         instead use single_set, introducing locals "insn_set" and
23035         "dep_set".  Given that we only ever returned "cost" for a non-pair
23036         of SETs, bail out early if we don't have a pair of SET.
23037         Rewrite all uses of PATTERN (dep) and PATTERN (insn) to instead
23038         use the new locals "insn_set" and "dep_set", and update calls to
23039         is_load_insn and is_store_insn to be calls to set_is_load_p and
23040         set_is_store_p.
23042 2014-08-27  Guozhi Wei  <carrot@google.com>
23044         PR target/62262
23045         * config/aarch64/aarch64.md (*andim_ashift<mode>_bfiz): Check the shift
23046         amount before using it.
23048 2014-08-27  Richard Biener  <rguenther@suse.de>
23050         * gimple-fold.c (get_maxval_strlen): Add overload wrapping
23051         get_maxval_strlen inside a more useful API.
23052         (gimple_fold_builtin_with_strlen): Remove and fold into ...
23053         (gimple_fold_builtin): ... caller.
23054         (gimple_fold_builtin_strlen, gimple_fold_builtin_strcpy,
23055         gimple_fold_builtin_strncpy, gimple_fold_builtin_strcat,
23056         gimple_fold_builtin_fputs, gimple_fold_builtin_memory_chk,
23057         gimple_fold_builtin_stxcpy_chk, gimple_fold_builtin_stxncpy_chk,
23058         gimple_fold_builtin_snprintf_chk, gimple_fold_builtin_snprintf,
23059         gimple_fold_builtin_sprintf): Adjust to compute maxval
23060         themselves.
23062 2014-08-27  Yvan Roux  <yvan.roux@linaro.org>
23064         PR other/62248
23065         * config.gcc (arm*-*-*): Check --with-fpu against arm-fpus.def.
23067 2014-08-27  Alexander Ivchenko  <alexander.ivchenko@intel.com>
23068             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
23069             Anna Tikhonova  <anna.tikhonova@intel.com>
23070             Ilya Tocar  <ilya.tocar@intel.com>
23071             Andrey Turetskiy  <andrey.turetskiy@intel.com>
23072             Ilya Verbin  <ilya.verbin@intel.com>
23073             Kirill Yukhin  <kirill.yukhin@intel.com>
23074             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
23076         * config/i386/sse.md
23077         (define_insn "<mask_codefor>avx512dq_broadcast<mode><mask_name>_1"):
23078         Use `concat_tg_mode' attribute to determine asm register size.
23080 2014-08-27  Alexander Ivchenko  <alexander.ivchenko@intel.com>
23081             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
23082             Anna Tikhonova  <anna.tikhonova@intel.com>
23083             Ilya Tocar  <ilya.tocar@intel.com>
23084             Andrey Turetskiy  <andrey.turetskiy@intel.com>
23085             Ilya Verbin  <ilya.verbin@intel.com>
23086             Kirill Yukhin  <kirill.yukhin@intel.com>
23087             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
23089         * config/i386/sse.md
23090         (define_mode_iterator VI48_AVX512VL): New.
23091         (define_mode_iterator VI_UNALIGNED_LOADSTORE): Delete.
23092         (define_mode_iterator VI_ULOADSTORE_BW_AVX512VL): New.
23093         (define_mode_iterator VI_ULOADSTORE_F_AVX512VL): Ditto.
23094         (define_expand "<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23095         with VI1): Change mode iterator.
23096         (define_expand "<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23097         with VI_ULOADSTORE_BW_AVX512VL): New.
23098         (define_expand "<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23099         with VI_ULOADSTORE_F_AVX512VL): Ditto.
23100         (define_insn "*<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23101         with VI1): Change mode iterator.
23102         (define_insn "*<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23103         with VI_ULOADSTORE_BW_AVX512VL): New.
23104         (define_insn "*<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23105         with VI_ULOADSTORE_F_AVX512VL): Ditto.
23106         (define_insn "<sse2_avx_avx512f>_storedqu<mode>
23107         with VI1): Change mode iterator.
23108         (define_insn "<sse2_avx_avx512f>_storedqu<mode>
23109         with VI_ULOADSTORE_BW_AVX512VL): New.
23110         (define_insn "<sse2_avx_avx512f>_storedqu<mode>
23111         with VI_ULOADSTORE_BW_AVX512VL): Ditto.
23112         (define_insn "avx512f_storedqu<mode>_mask"): Delete.
23113         (define_insn "<avx512>_storedqu<mode>_mask" with
23114         VI48_AVX512VL): New.
23115         (define_insn "<avx512>_storedqu<mode>_mask" with
23116         VI12_AVX512VL): Ditto.
23118 2014-08-27  Alexander Ivchenko  <alexander.ivchenko@intel.com>
23119             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
23120             Anna Tikhonova  <anna.tikhonova@intel.com>
23121             Ilya Tocar  <ilya.tocar@intel.com>
23122             Andrey Turetskiy  <andrey.turetskiy@intel.com>
23123             Ilya Verbin  <ilya.verbin@intel.com>
23124             Kirill Yukhin  <kirill.yukhin@intel.com>
23125             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
23127         * config/i386/sse.md
23128         (define_mode_iterator VI48_AVX2_48_AVX512F): Delete.
23129         (define_mode_iterator VI48_AVX512BW): New.
23130         (define_insn "<avx2_avx512f>_<shift_insn>v<mode><mask_name>"): Delete.
23131         (define_insn "<avx2_avx512bw>_<shift_insn>v<mode><mask_name>"
23132         with VI48_AVX2_48_AVX512F): New.
23133         (define_insn "<avx2_avx512bw>_<shift_insn>v<mode><mask_name>"
23134         with VI2_AVX512VL): Ditto.
23136 2014-08-27  Richard Biener  <rguenther@suse.de>
23138         PR middle-end/62239
23139         * builtins.c (fold_builtin_strcat_chk): Move to gimple-fold.c.
23140         (fold_builtin_3): Do not fold strcat_chk here.
23141         * gimple-fold.c (gimple_fold_builtin_strcat_chk): Move here
23142         from builtins.c.
23143         (gimple_fold_builtin): Fold strcat_chk here.
23145 2014-08-26  Aldy Hernandez  <aldyh@redhat.com>
23147         * dwarf2out.h (dwarf2out_decl): Remove prototype.
23148         * dwarf2out.c (dwarf2out_decl): Make static.
23150 2014-08-26  Joel Sherrill <joel.sherrill@oarcorp.com>
23152         * doc/invoke.texi: -fno-cxa-atexit should be -fno-use-cxa-atexit.
23154 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23156         * cselib.h (struct elt_loc_list): Strengthen field "setting_insn"
23157         from rtx to rtx_insn *.
23158         (cselib_lookup_from_insn): Likewise for final param.
23159         (cselib_subst_to_values_from_insn): Likewise.
23160         (cselib_add_permanent_equiv): Likewise.
23162         * cselib.c (cselib_current_insn): Likewise for this variable.
23163         (cselib_subst_to_values_from_insn): Likewise for param "insn".
23164         (cselib_lookup_from_insn): Likewise.
23165         (cselib_add_permanent_equiv): Likewise for param "insn" and local
23166         "save_cselib_current_insn".
23167         (cselib_process_insn): Replace use of NULL_RTX with NULL.
23169         * sched-deps.c (add_insn_mem_dependence): Strengthen param "insn"
23170         from rtx to rtx_insn *.
23172 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23174         * dse.c (dse_step6): Strengthen local "rinsn" from rtx to
23175         rtx_insn *.
23177 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23179         * df.h (df_dump_insn_problem_function): Strengthen first param of
23180         this callback from const_rtx to const rtx_insn *.
23181         (struct df_insn_info): Strengthen field "insn" from rtx to
23182         rtx_insn *.
23183         (DF_REF_INSN): Eliminate this function, reinstating the older
23184         macro definition.
23185         (df_find_def): Strengthen param 1 from rtx to rtx_insn *.
23186         (df_reg_defined): Likewise.
23187         (df_find_use): Likewise.
23188         (df_reg_used): Likewise.
23189         (df_dump_insn_top): Strengthen param 1 from const_rtx to
23190         const rtx_insn *.
23191         (df_dump_insn_bottom): Likewise.
23192         (df_insn_debug): Strengthen param 1 from rtx to rtx_insn *.
23193         (df_insn_debug_regno): Likewise.
23194         (debug_df_insn): Likewise.
23195         (df_rd_simulate_one_insn): Likewise for param 2.
23196         (df_word_lr_simulate_defs): Likewise for param 1.
23197         (df_word_lr_simulate_uses): Likewise.
23198         (df_md_simulate_one_insn): Likewise for param 2.
23199         (df_simulate_find_noclobber_defs): Likewise for param 1.
23200         (df_simulate_find_defs): Likewise.
23201         (df_simulate_defs): Likewise.
23202         (df_simulate_uses): Likewise.
23203         (df_simulate_one_insn_backwards): Likewise for param 2.
23204         (df_simulate_one_insn_forwards): Likewise.
23205         (df_uses_create): Likewise for param 2.
23206         (df_insn_create_insn_record): Likewise for param 1.
23207         (df_insn_delete): Likewise.
23208         (df_insn_rescan): Likewise.
23209         (df_insn_rescan_debug_internal): Likewise.
23210         (df_insn_change_bb): Likewise.
23211         (df_notes_rescan): Likewise.
23212         * rtl.h (remove_death): Likewise for param 2.
23213         (print_rtl_with_bb): Strengthen param 2 from const_rtx to
23214         const rtx_insn *.
23215         * sched-int.h (reemit_notes): Strengthen param from rtx to
23216         rtx_insn *.
23217         * valtrack.h (propagate_for_debug): Likewise for param 1.
23219         * cfgrtl.c (print_rtl_with_bb): Strengthen param "rtx_first" and
23220         local "tmp_rtx" from const_rtx to const rtx_insn *.
23221         * combine.c (remove_death): Strengthen param "insn" from rtx to
23222         rtx_insn *.
23223         (move_deaths): Likewise for local "where_dead".
23224         * cse.c (delete_trivially_dead_insns): Introduce local
23225         "bind_var_loc" so that "bind" can be strengthened to an rtx_insn *.
23226         * df-core.c (df_find_def): Strengthen param "insn" from rtx to
23227         rtx_insn *.
23228         (df_reg_defined): Likewise.
23229         (df_find_use): Likewise.
23230         (df_reg_used): Likewise.
23231         (df_dump_insn_problem_data): Strengthen param "insn" from
23232         const_rtx to const rtx_insn *.
23233         (df_dump_insn_top): Likewise.
23234         (df_dump_insn_bottom): Likewise.
23235         (df_insn_debug): Strengthen param "insn" from rtx to rtx_insn *.
23236         (df_insn_debug_regno): Likewise.
23237         (debug_df_insn): Likewise.
23238         (DF_REF_INSN): Delete.
23239         * df-problems.c (df_rd_simulate_one_insn): Strengthen param "insn"
23240         from rtx to rtx_insn *.
23241         (df_chain_insn_top_dump): Strengthen param "insn" from
23242         const_rtx to const rtx_insn *.
23243         (df_chain_insn_bottom_dump): Likewise.
23244         (df_word_lr_simulate_defs): Strengthen param "insn" from rtx to
23245         rtx_insn *.
23246         (df_word_lr_simulate_uses): Likewise.
23247         (df_print_note): Likewise.
23248         (df_remove_dead_and_unused_notes): Likewise.
23249         (df_set_unused_notes_for_mw): Likewise.
23250         (df_set_dead_notes_for_mw): Likewise.
23251         (df_create_unused_note): Likewise.
23252         (df_simulate_find_defs): Likewise.
23253         (df_simulate_find_uses): Likewise.
23254         (df_simulate_find_noclobber_defs): Likewise.
23255         (df_simulate_defs): Likewise.
23256         (df_simulate_uses): Likewise.
23257         (df_simulate_one_insn_backwards): Likewise.
23258         (df_simulate_one_insn_forwards): Likewise.
23259         (df_md_simulate_one_insn): Likewise.
23260         * df-scan.c (df_uses_create): Likewise.
23261         (df_insn_create_insn_record): Likewise.
23262         (df_insn_delete): Likewise.
23263         (df_insn_rescan): Likewise.
23264         (df_insn_rescan_debug_internal): Likewise.
23265         (df_insn_change_bb): Likewise.
23266         (df_notes_rescan): Likewise.
23267         (df_refs_add_to_chains): Likewise.
23268         (df_insn_refs_verify): Likewise.
23269         * emit-rtl.c (set_insn_deleted): Add checked cast to rtx_insn *
23270         when invoking df_insn_delete.
23271         (reorder_insns): Strengthen local "x" from rtx to rtx_insn *.
23272         (set_unique_reg_note): Add checked cast.
23273         * final.c (cleanup_subreg_operands): Likewise.
23274         * gcse.c (update_ld_motion_stores): Likewise, strengthening local
23275         "insn" from rtx to rtx_insn *.
23276         * haifa-sched.c (reemit_notes): Strengthen param "insn" and local
23277         "last" from rtx to rtx_insn *.
23278         * ira-emit.c (change_regs_in_insn): New function.
23279         (change_loop): Strengthen local "insn" from rtx to rtx_insn *.
23280         Invoke change_regs_in_insn rather than change_regs.
23281         * ira.c (update_equiv_regs): Strengthen locals "insn",
23282         "init_insn", "new_insn" from rtx to rtx_insn *.  Invoke
23283         for_each_rtx_in_insn rather than for_each_rtx.
23284         * recog.c (confirm_change_group): Add checked casts.
23285         (peep2_update_life): Strengthen local "x" from rtx to rtx_insn *.
23286         Add checked cast.
23287         (peep2_fill_buffer): Add checked cast.
23288         * rtlanal.c (remove_note): Likewise.
23289         * valtrack.c (propagate_for_debug): Strengthen param "insn" and
23290         locals "next" "end" from rtx to rtx_insn *.
23292 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23294         * sched-int.h (sched_init_insn_luid): Strengthen param 1 from rtx
23295         to rtx_insn *.
23296         (struct reg_use_data): Likewise for field "insn".
23297         (insn_cost): Likewise for param.
23298         (real_insn_for_shadow): Likewise for return type and param.
23299         (increase_insn_priority): Likewise for param 1.
23300         (debug_dependencies): Likewise for both params.
23302         * haifa-sched.c (insn_delay): Likewise for param "insn".
23303         (real_insn_for_shadow): Likewise for return type and param "insn".
23304         (update_insn_after_change): Likewise for param "insn".
23305         (recompute_todo_spec): Likewise for param "next" and locals "pro",
23306         "other".
23307         (insn_cost): Likewise for param "insn".
23308         (increase_insn_priority): Likewise.
23309         (calculate_reg_deaths): Likewise.
23310         (setup_insn_reg_pressure_info): Likewise.
23311         (model_schedule): Strengthen from vec<rtx> to vec<rtx_insn *>.
23312         (model_index): Strengthen param "insn" from rtx to rtx_insn *.
23313         (model_recompute): Likewise.
23314         (must_restore_pattern_p): Likewise for param "next".
23315         (model_excess_cost): Likewise for param "insn".
23316         (queue_remove): Likewise.
23317         (adjust_priority): Likewise for param "prev".
23318         (update_register_pressure): Likewise for param "insn".
23319         (setup_insn_max_reg_pressure): Likewise for local "insn".
23320         (update_reg_and_insn_max_reg_pressure): Likewise for param "insn".
23321         (model_add_to_schedule): Likewise.
23322         (model_reset_queue_indices): Likewise for local "insn".
23323         (unschedule_insns_until): Strengthen local "recompute_vec" from
23324         auto_vec<rtx> to auto_vec<rtx_insn *>.  Strengthen locals "last",
23325         "con" from rtx to rtx_insn *.
23326         (restore_last_backtrack_point): Likewise for both locals "x". Add
23327         checked casts.
23328         (estimate_insn_tick): Likewise for param "insn".
23329         (commit_schedule): Likewise for params "prev_head", "tail" and
23330         local "x".
23331         (verify_shadows): Likewise for locals "i1", "i2".
23332         (dump_insn_stream): Likewise for params "head", "tail" and locals
23333         "next_tail", "insn".
23334         (schedule_block): Likewise for locals "insn", "x".  Add a checked
23335         cast.
23336         (fix_inter_tick): Likewise for params "head", "tail".
23337         (create_check_block_twin): Likewise for local "jump".
23338         (haifa_change_pattern): Likewise for param "insn".
23339         (haifa_speculate_insn): Likewise.
23340         (dump_new_block_header): Likewise for params "head", "tail".
23341         (fix_jump_move): Likewise for param "jump".
23342         (move_block_after_check): Likewise.
23343         (sched_init_insn_luid): Likewise for param "insn".
23344         (sched_init_luids): Likewise for local "insn".
23345         (insn_luid): Likewise for param "insn".
23346         (init_h_i_d): Likewise.
23347         (haifa_init_h_i_d): Likewise for local "insn".
23348         (haifa_init_insn): Likewise for param "insn".
23349         * sched-deps.c (add_dependence): Likewise for local "real_pro",
23350         "other".
23351         (create_insn_reg_use): Likewise for param "insn".
23352         (setup_insn_reg_uses): Likewise.  Add a checked cast.
23353         * sched-ebb.c (debug_ebb_dependencies): Strengthen params "head",
23354         "tail" from rtx to rtx_insn *.
23355         * sched-rgn.c (void debug_dependencies): Likewise, also for locals
23356         "insn", "next_tail".
23358 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23360         * haifa-sched.c (struct model_insn_info): Strengthen field "insn"
23361         from rtx to rtx_insn *.
23362         (model_add_to_schedule): Likewise for locals "start", "end",
23363         "iter".
23365 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23367         * rtl.h (duplicate_insn_chain): Strengthen both params from rtx to
23368         rtx_insn *.
23369         * cfgrtl.c (duplicate_insn_chain): Likewise for  params "from",
23370         "to" and locals "insn", "next", "copy".  Remove now-redundant
23371         checked cast.
23373 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23375         * rtl.h (canonicalize_condition): Strengthen param 1 from rtx to
23376         rtx_insn * and param 4 from rtx * to rtx_insn **.
23377         (get_condition): Strengthen param 1 from rtx to rtx_insn * and
23378         param 2 from rtx * to rtx_insn **.
23380         * df.h (can_move_insns_across): Strengthen params 1-4 from rtx to
23381         rtx_insn * and final param from rtx * to rtx_insn **.
23383         * cfgcleanup.c (try_head_merge_bb): Strengthen local "move_before"
23384         from rtx to rtx_insn *.
23385         (try_head_merge_bb): Likewise for both locals named "move_upto".
23386         * df-problems.c (can_move_insns_across): Likewise for params
23387         "from", "to", "across_from", "across_to" and locals "insn",
23388         "next", "max_to".  Strengthen param "pmove_upto" from rtx * to
23389         rtx_insn **.
23390         * ifcvt.c (struct noce_if_info): Strengthen field "cond_earliest"
23391         from rtx to rtx_insn *.
23392         (noce_get_alt_condition): Strengthen param "earliest" from rtx *
23393         to rtx_insn **.  Strengthen local "insn" from rtx to rtx_insn *.
23394         (noce_try_minmax): Strengthen locals "earliest", "seq" from rtx to
23395         rtx_insn *.
23396         (noce_try_abs): Likewise.
23397         (noce_get_condition): Likewise for param "jump".  Strengthen param
23398         "earliest" from rtx * to rtx_insn **.
23399         (noce_find_if_block): Strengthen local "cond_earliest" from rtx to
23400         rtx_insn *.
23401         (find_cond_trap): Likewise.
23402         (dead_or_predicable): Likewise for local "earliest".
23403         * loop-iv.c (check_simple_exit): Likewise for local "at".  Add
23404         checked cast.
23405         * rtlanal.c (canonicalize_condition): Likewise for param "insn"
23406         and local "prev".  Strengthen param "earliest" from rtx * to
23407         rtx_insn **.
23408         (get_condition): Strengthen param "jump" from rtx to rtx_insn *
23409         Strengthen param "earliest" from rtx * to rtx_insn **.
23411 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23413         * fwprop.c (local_ref_killed_between_p): Strengthen params "from",
23414         "to" and local "insn" from rtx to rtx_insn *.
23416 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23418         * sel-sched.c (find_place_for_bookkeeping): Strengthen local "insn"
23419         from rtx to rtx_insn *.
23420         (need_nop_to_preserve_insn_bb): Likewise for param "insn".
23421         (code_motion_path_driver): Likewise for local "last_insn".
23422         (simplify_changed_insns): Likewise for local "insn".
23424 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23426         * rtl.h (push_to_sequence): Strengthen param from rtx to
23427         rtx_insn *.
23428         (push_to_sequence2): Likewise for both params.
23429         (delete_insns_since): Likewise for param.
23430         (reorder_insns_nobb): Likewise for all three params.
23431         (set_new_first_and_last_insn): Likewise for both params.
23433         * emit-rtl.h (set_first_insn): Strengthen param "insn" from rtx to
23434         rtx_insn *.  Remove now-redundant cast.
23435         (set_last_insn): Likewise.
23437         * builtins.c (expand_builtin_return): Strengthen local
23438         "call_fusage" from rtx to rtx_insn *.
23439         * cfgrtl.c (create_basic_block_structure): Likewise for local
23440         "after".
23441         * emit-rtl.c (set_new_first_and_last_insn): Likewise for params
23442         "first", "last" and local "insn".
23443         (delete_insns_since): Likewise for param "from".
23444         (reorder_insns_nobb): Likewise for params "from", "to", "after"
23445         and local "x".
23446         (push_to_sequence): Likewise for param "first" and local "last".
23447         (push_to_sequence2): Likewise for params "first" and "last".
23448         * lra.c (emit_add3_insn): Likewise for local "last".
23449         (lra_emit_add): Likewise.
23450         * lra-constraints.c (base_to_reg): Likewise for locals "insn",
23451         "last_insn".
23452         (process_address_1): Likewise for locals "insn", last".
23453         * modulo-sched.c (ps_first_note): Likewise for return type.
23454         * optabs.c (expand_binop_directly): Likewise for param "last".
23456 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23458         * rtl.h (get_last_insn_anywhere): Strengthen return type from rtx
23459         to rtx_insn*.
23460         * emit-rtl.c (get_last_insn_anywhere): Likewise.
23462 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23464         * function.h (struct sequence_stack): Strengthen fields "first"
23465         and "last" from rtx to rtx_insn *.
23466         (struct emit_status): Likewise for fields "x_first_insn" and
23467         "x_last_insn".
23469         * emit-rtl.h (get_insns): Remove now-redundant checked cast.
23470         (set_first_insn): Add checked cast.
23471         (get_last_insn): Remove now-redundant checked cast.
23472         (set_last_insn): Add checked cast.
23474         * config/m32c/m32c.c (m32c_leaf_function_p): Strengthen locals
23475         "saved_first" and "saved_last" from rtx to rtx_insn *.
23477 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23479         * rtl.h (add_insn): Strengthen param from rtx to rtx_insn *.
23480         (unlink_insn_chain): Strengthen both params from rtx to
23481         rtx_insn *.
23483         * cfgrtl.c (cfg_layout_function_header): Likewise for this
23484         variable.
23485         (unlink_insn_chain): Likewise for params "first" and "last".
23486         Remove now-redundant checked cast.
23487         (record_effective_endpoints): Replace use of NULL_RTX with NULL.
23488         (fixup_reorder_chain): Strengthen local "insn" from rtx to
23489         rtx_insn *.
23490         * emit-rtl.c (link_insn_into_chain): Likewise for all three
23491         params.
23492         (add_insn): Likewise for param "insn" and local "prev".
23493         (add_insn_after_nobb): Likewise for both params and local "next".
23494         (add_insn_before_nobb): Likewise for both params and local "prev".
23495         (add_insn_after): Rename param "after" to "uncast_after",
23496         introducing local "after" with another checked cast.
23497         (add_insn_before): Rename params "insn" and "before", giving them
23498         "uncast_" prefixes, adding the old names back using checked casts.
23499         (emit_note_after): Likewise for param "after".
23500         (emit_note_before): Likewise for param "before".
23501         (emit_label): Add a checked cast.
23503 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23505         * cselib.h (cselib_record_sets_hook):  Strengthen initial param
23506         "insn" from rtx to rtx_insn *.
23508         * cselib.c (cselib_record_sets_hook): Likewise.
23510         * var-tracking.c (add_with_sets): Likewise, renaming back from
23511         "uncast_insn" to "insn" and eliminating the checked cast from rtx
23512         to rtx_insn *.
23514 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23516         * basic-block.h (struct rtl_bb_info): Strengthen fields "end_"
23517         and "header_" from rtx to rtx_insn *.
23518         (struct basic_block_d): Likewise for field "head_" within "x"
23519         field of union basic_block_il_dependent.
23520         (BB_HEAD): Drop function...
23521         (SET_BB_HEAD): ...and this function in favor of...
23522         (BB_HEAD): ...reinstate macro.
23523         (BB_END): Drop function...
23524         (SET_BB_END): ...and this function in favor of...
23525         (BB_END): ...reinstate macro.
23526         (BB_HEADER): Drop function...
23527         (SET_BB_HEADER): ...and this function in favor of...
23528         (BB_HEADER): ...reinstate macro.
23530         * bb-reorder.c (add_labels_and_missing_jumps): Drop use of BB_END.
23531         (fix_crossing_unconditional_branches): Likewise.
23532         * caller-save.c (save_call_clobbered_regs): Likewise.
23533         (insert_one_insn): Drop use of SET_BB_HEAD and SET_BB_END.
23534         * cfgbuild.c (find_bb_boundaries): Drop use of SET_BB_END.
23535         * cfgcleanup.c (merge_blocks_move_successor_nojumps): Likewise.
23536         (merge_blocks_move_successor_nojumps): Likewise.
23537         (outgoing_edges_match): Update use of for_each_rtx to
23538         for_each_rtx_in_insn.
23539         * cfgexpand.c (expand_gimple_cond): Drop use of SET_BB_END.
23540         (expand_gimple_cond): Likewise.
23541         (expand_gimple_tailcall): Likewise.
23542         (expand_gimple_basic_block): Drop use of SET_BB_HEAD and
23543         SET_BB_END.
23544         (construct_exit_block): Drop use of SET_BB_END.
23545         * cfgrtl.c (cfg_layout_function_footer): Strengthen from rtx to
23546         rtx_insn *.
23547         (delete_insn): Rename param "insn" to "uncast_insn", introducing
23548         a new local "insn" with a checked cast to rtx_insn *.  Drop use of
23549         SET_BB_HEAD and SET_BB_END.
23550         (create_basic_block_structure): Drop use of SET_BB_HEAD and
23551         SET_BB_END.
23552         (rtl_delete_block): Drop use of SET_BB_HEAD.
23553         (rtl_split_block): Drop use of SET_BB_END.
23554         (emit_nop_for_unique_locus_between): Likewise.
23555         (rtl_merge_blocks): Drop use of SET_BB_END and SET_BB_HEAD.
23556         (block_label): Drop use of SET_BB_HEAD.
23557         (fixup_abnormal_edges): Drop use of SET_BB_END.
23558         (record_effective_endpoints): Drop use of SET_BB_HEADER.
23559         (relink_block_chain): Likewise.
23560         (fixup_reorder_chain): Drop use of SET_BB_END.
23561         (cfg_layout_duplicate_bb): Drop use of SET_BB_HEADER.
23562         (cfg_layout_delete_block): Strengthen local "to" from rtx * to
23563         rtx_insn **.  Drop use of SET_BB_HEADER.
23564         (cfg_layout_merge_blocks): Drop use of SET_BB_HEADER, SET_BB_END,
23565         SET_BB_HEAD.
23566         (BB_HEAD): Delete this function.
23567         (SET_BB_HEAD): Likewise.
23568         (BB_END): Likewise.
23569         (SET_BB_END): Likewise.
23570         (BB_HEADER): Likewise.
23571         (SET_BB_HEADER): Likewise.
23572         * emit-rtl.c (add_insn_after):  Rename param "insn" to
23573         "uncast_insn", adding a new local "insn" and a checked cast to
23574         rtx_insn *.  Drop use of SET_BB_END.
23575         (remove_insn): Strengthen locals "next" and "prev" from rtx to
23576         rtx_insn *.  Drop use of SET_BB_HEAD and SET_BB_END.
23577         (reorder_insns): Drop use of SET_BB_END.
23578         (emit_insn_after_1): Strengthen param "first" and locals "last",
23579         "after_after" from rtx to rtx_insn *.  Drop use of SET_BB_END.
23580         (emit_pattern_after_noloc): Add checked cast.
23581         * haifa-sched.c (get_ebb_head_tail): Drop use of SET_BB_END.
23582         (restore_other_notes): Likewise.
23583         (move_insn): Likewise.
23584         (sched_extend_bb): Likewise.
23585         (fix_jump_move): Likewise.
23586         * ifcvt.c (noce_process_if_block): Likewise.
23587         (dead_or_predicable): Likewise.
23588         * ira.c (update_equiv_regs): Drop use of SET_BB_HEAD.
23589         * reg-stack.c (change_stack): Drop use of SET_BB_END.
23590         * sel-sched-ir.c (sel_move_insn): Likewise.
23591         * sel-sched.c (move_nop_to_previous_block): Likewise.
23593         * config/c6x/c6x.c (hwloop_optimize): Drop use of SET_BB_HEAD and
23594         SET_BB_END.
23595         * config/ia64/ia64.c (emit_predicate_relation_info): Likewise.
23597 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23599         * basic-block.h (create_basic_block_structure): Strengthen params
23600         1 "head" and 2 "end" from rtx to rtx_insn *.
23601         * cfgrtl.c (create_basic_block_structure): Likewise.
23602         (rtl_create_basic_block): Update casts from void * to rtx to
23603         rtx_insn *, so that we can pass them as rtx_insn * to
23604         create_basic_block_structure.
23605         * sel-sched-ir.c (sel_create_basic_block): Likewise.
23607 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23609         * rtl.h (for_each_inc_dec): Strengthen param 1 from rtx * to
23610         rtx_insn **.
23611         (check_for_inc_dec): Strengthen param "insn" from rtx to
23612         rtx_insn *.
23614         * cselib.h (cselib_process_insn): Likewise.
23616         * cselib.c (cselib_record_sets): Likewise.
23617         (cselib_process_insn): Likewise.
23619         * dse.c (struct insn_info): Likewise for field "insn".
23620         (check_for_inc_dec_1): Likewise for local "insn".
23621         (check_for_inc_dec): Likewise for param "insn".
23622         (scan_insn): Likewise.
23623         (dse_step1): Likewise for local "insn".
23625         * rtlanal.c (for_each_inc_dec): Strengthen param 1 from rtx * to
23626         rtx_insn **.  Use for_each_rtx_in_insn rather than for_each_rtx.
23628 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23630         * sched-int.h (struct _dep): Strengthen fields "pro" and "con"
23631         from rtx to rtx_insn *.
23632         (DEP_PRO): Delete this function and...
23633         (SET_DEP_PRO): ...this function in favor of...
23634         (DEP_PRO): ...reinstate this macro.
23635         (DEP_CON): Delete this function and...
23636         (SET_DEP_CON): ...this function in favor of...
23637         (DEP_CON): ...reinstate this old macro.
23638         (init_dep_1): Strengthen params 2 and 3 from rtx to rtx_insn *.
23639         (init_dep): Likewise.
23640         (set_priorities): Likewise for both params.
23641         (sd_copy_back_deps): Likewise for params 1 and 2.
23643         * haifa-sched.c (priority): Likewise for param "insn" and local
23644         "next".
23645         (set_priorities): Likewise for params "head" and "tail" and local
23646         "insn".
23647         (process_insn_forw_deps_be_in_spec): Likewise for param "twin" and
23648         local "consumer".
23649         (add_to_speculative_block): Add a checked cast.
23650         (create_check_block_twin): Drop use of SET_DEP_CON.
23651         (add_jump_dependencies): Strengthen params "insn" and "jump" from
23652         rtx to rtx_insn *.
23654         * sched-deps.c (init_dep_1): Likewise for params "pro" and "con".
23655         Drop use of SET_DEP_PRO
23656         (init_dep): Strengthen params "pro" and "con" from rtx to
23657         rtx_insn *.
23658         (sd_copy_back_deps): Likewise for params "to" and "from".  Drop
23659         use of SET_DEP_CON.
23660         (DEP_PRO): Delete.
23661         (DEP_CON): Delete.
23662         (SET_DEP_PRO): Delete.
23663         (SET_DEP_CON): Delete.
23665 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23667         * sel-sched-ir.h (struct vinsn_def): Strengthen field "insn_rtx"
23668         from rtx to rtx_insn *.
23669         (VINSN_INSN_RTX): Eliminate rvalue function and...
23670         (SET_VINSN_INSN): ...lvalue function in favor of...
23671         (VINSN_INSN_RTX): reinstate this old macro.
23673         * sel-sched-ir.c (vinsn_init): Eliminate use of SET_VINSN_INSN_RTX
23674         in favor of VINSN_INSN_RTX.
23675         (VINSN_INSN_RTX): Delete this function.
23676         (SET_VINSN_INSN_RTX): Likewise.
23678 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23680         * sel-sched-ir.h (insn_t): Strengthen from rtx to rtx_insn *.
23681         (BND_TO): Delete this function and...
23682         (SET_BND_TO): ...this functions in favor of...
23683         (BND_TO): ...reinstating this macro.
23684         (struct _fence): Strengthen field "executing_insns" from
23685         vec<rtx, va_gc> * to vec<rtx_insn *, va_gc> *.  Strengthen fields
23686         "last_scheduled_insn" and "sched_next" from rtx to rtx_insn *.
23687         (_succ_iter_cond): Update param "succp" from rtx * to insn_t *
23688         and param "insn" from rtx to insn_t.
23689         (create_vinsn_from_insn_rtx): Strengthen first param from rtx to
23690         rtx_insn *.
23692         * sched-int.h (insn_vec_t): Strengthen from vec<rtx> to
23693         vec<rtx_insn *> .
23694         (rtx_vec_t): Likewise.
23695         (struct sched_deps_info_def): Strengthen param of "start_insn"
23696         callback from rtx to rtx_insn *.  Likewise for param "insn2" of
23697         "note_mem_dep" callback and first param of "note_dep" callback.
23699         * haifa-sched.c (add_to_speculative_block): Strengthen param
23700         "insn" from rtx to rtx_insn *.
23701         (clear_priorities): Likewise.
23702         (calc_priorities): Likewise for local "insn".
23704         * sched-deps.c (haifa_start_insn): Likewise for param "insn".
23705         Remove redundant checked cast.
23706         (haifa_note_mem_dep): Likewise for param "pending_insn".
23707         (haifa_note_dep): Likewise for param "elem".
23708         (note_mem_dep): Likewise for param "e".
23709         (sched_analyze_1): Add checked casts.
23710         (sched_analyze_2): Likewise.
23712         * sel-sched-dump.c (dump_insn_vector): Strengthen local "succ"
23713         from rtx to rtx_insn *.
23714         (debug): Update param from vec<rtx> & to vec<rtx_insn *>, and
23715         from vec<rtx> * to vec<rtx_insn *> *.
23717         * sel-sched-ir.c (blist_add): Remove use of SET_BND_TO
23718         scaffolding.
23719         (flist_add): Strengthen param "executing_insns" from
23720         vec<rtx, va_gc> * to vec<rtx_insn *, va_gc> *.
23721         (advance_deps_context): Remove now-redundant checked cast.
23722         (init_fences): Replace uses of NULL_RTX with NULL.
23723         (merge_fences): Strengthen params "last_scheduled_insn" and
23724         "sched_next" from rtx to rtx_insn * and "executing_insns" from
23725         vec<rtx, va_gc> * to vec<rtx_insn *, va_gc> *.
23726         (add_clean_fence_to_fences): Replace uses of NULL_RTX with NULL.
23727         (get_nop_from_pool): Add local "nop_pat" so that "nop" can be
23728         an instruction, rather than doing double-duty as a pattern.
23729         (return_nop_to_pool): Update for change of insn_t.
23730         (deps_init_id): Remove now-redundant checked cast.
23731         (struct sched_scan_info_def): Strengthen param of "init_insn"
23732         callback from rtx to insn_t.
23733         (sched_scan): Strengthen local "insn" from rtx to rtx_insn *.
23734         (init_global_and_expr_for_insn): Replace uses of NULL_RTX with
23735         NULL.
23736         (get_seqno_by_succs): Strengthen param "insn" and locals "tmp",
23737         "end" from rtx to rtx_insn *.
23738         (create_vinsn_from_insn_rtx): Likewise for param "insn_rtx".
23739         (rtx insn_rtx, bool force_unique_p)
23740         (BND_TO): Delete function.
23741         (SET_BND_TO): Delete function.
23743         * sel-sched.c (advance_one_cycle): Strengthen local "insn" from
23744         rtx to rtx_insn *.
23745         (extract_new_fences_from): Replace uses of NULL_RTX with NULL.
23746         (replace_dest_with_reg_in_expr): Strengthen local "insn_rtx" from
23747         rtx to rtx_insn *.
23748         (undo_transformations): Likewise for param "insn".
23749         (update_liveness_on_insn): Likewise.
23750         (compute_live_below_insn): Likewise for param "insn" and local
23751         "succ".
23752         (update_data_sets): Likewise for param "insn".
23753         (fill_vec_av_set): Replace uses of NULL_RTX with NULL.
23754         (convert_vec_av_set_to_ready): Drop now-redundant checked cast.
23755         (invoke_aftermath_hooks): Strengthen param "best_insn" from rtx to
23756         rtx_insn *.
23757         (move_cond_jump): Likewise for param "insn".
23758         (move_cond_jump): Drop use of SET_BND_TO.
23759         (compute_av_set_on_boundaries): Likewise.
23760         (update_fence_and_insn): Replace uses of NULL_RTX with NULL.
23761         (update_and_record_unavailable_insns): Strengthen local "bb_end"
23762         from rtx to rtx_insn *.
23763         (maybe_emit_renaming_copy): Likewise for param "insn".
23764         (maybe_emit_speculative_check): Likewise.
23765         (handle_emitting_transformations): Likewise.
23766         (remove_insn_from_stream): Likewise.
23767         (code_motion_process_successors): Strengthen local "succ" from rtx
23768         to insn_t.
23770 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23772         * sel-sched-ir.h (ilist_t): Redefine this typedef in terms of
23773         ilist_t, not _xlist_t;
23774         (ILIST_INSN): Define in terms of new union field "insn".
23775         (ILIST_NEXT): Define in terms of _LIST_NEXT rather than
23776         _XLIST_NEXT.
23777         (struct _list_node): Add new field "insn" to the union, of type
23778         insn_t.
23779         (ilist_add): Replace macro with an inline function, requiring an
23780         insn_t.
23781         (ilist_remove): Define this macro directly in terms of
23782         _list_remove, rather than indirectly via _xlist_remove.
23783         (ilist_clear): Likewise, in terms of _list_clear rather than
23784         _xlist_clear.
23785         (ilist_is_in_p): Replace macro with an inline function, requiring
23786         an insn_t.
23787         (_list_iter_cond_insn): New function.
23788         (ilist_iter_remove): Define this macro directly in terms of
23789         _list_iter_remove, rather than indirectly via _xlist_iter_remove.
23790         (ilist_iterator): Define directly in terms of _list_iterator
23791         rather than indirectly through _xlist_iterator.
23792         (FOR_EACH_INSN): Define in terms of _list_iter_cond_insn rather
23793         than in terms of _FOR_EACH_X.
23794         (FOR_EACH_INSN_1): Likewise.
23796 2014-08-26  Joseph Myers  <joseph@codesourcery.com>
23798         PR target/60606
23799         PR target/61330
23800         * varasm.c (make_decl_rtl): Clear DECL_ASSEMBLER_NAME and
23801         DECL_HARD_REGISTER and return for invalid register specifications.
23802         * cfgexpand.c (expand_one_var): If expand_one_hard_reg_var clears
23803         DECL_HARD_REGISTER, call expand_one_error_var.
23804         * config/arm/arm.c (arm_hard_regno_mode_ok): Do not allow
23805         CC_REGNUM with non-MODE_CC modes.
23806         (arm_regno_class): Return NO_REGS for PC_REGNUM.
23808 2014-08-26  Marek Polacek  <polacek@redhat.com>
23810         PR c/61271
23811         * sel-sched-ir.c (make_regions_from_the_rest): Fix condition.
23813 2014-08-26  Evandro Menezes <e.menezes@samsung.com>
23815         * config/arm/aarch64/aarch64.c (generic_addrcost_table): Delete
23816         qi cost; add di cost.
23817         (cortexa57_addrcost_table): Likewise.
23819 2014-08-26  Marek Polacek  <polacek@redhat.com>
23821         PR c/61271
23822         * expr.c (is_aligning_offset): Remove logical not.
23824 2014-08-26  Marek Polacek  <polacek@redhat.com>
23826         PR c/61271
23827         * tree-vectorizer.h (LOOP_REQUIRES_VERSIONING_FOR_ALIGNMENT,
23828         LOOP_REQUIRES_VERSIONING_FOR_ALIAS): Wrap in parens.
23830 2014-08-26  Richard Biener  <rguenther@suse.de>
23832         PR tree-optimization/62175
23833         * tree-ssa-loop-niter.c (expand_simple_operations): Do not
23834         expand possibly trapping operations.
23836 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23838         * config/rs6000/rs6000.c (class swap_web_entry): Strengthen field
23839         "insn" from rtx to rtx_insn *.
23840         (permute_load): Likewise for param "insn".
23841         (permute_store): Likewise.
23842         (handle_special_swappables): Likewise for local "insn".
23843         (replace_swap_with_copy): Likewise for locals "insn" and
23844         "new_insn".
23845         (rs6000_analyze_swaps): Likewise for local "insn".
23847 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
23849         * regrename.h (struct du_chain): Strengthen field "insn" from rtx
23850         to rtx_insn *.
23852 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
23854         * sel-sched-ir.h (struct sel_region_bb_info_def): Strengthen field
23855         "note_list" from rtx to rtx_insn *.
23856         (BB_NOTE_LIST): Replace this function and...
23857         (SET_BB_NOTE_LIST): ...this function with...
23858         (BB_NOTE_LIST): ...the former macro implementation.
23860         * sched-int.h (concat_note_lists): Strengthen param "from_end" and
23861         local "from_start" from rtx to rtx_insn *.  Strengthen param
23862         "to_endp" from rtx * to rtx_insn **.
23864         * haifa-sched.c (concat_note_lists): Likewise.
23865         * sel-sched-ir.c (init_bb): Eliminate SET_BB_NOTE_LIST in favor of
23866         BB_NOTE_LIST.
23867         (sel_restore_notes): Likewise.
23868         (move_bb_info): Likewise.
23869         (BB_NOTE_LIST): Delete this function.
23870         (SET_BB_NOTE_LIST): Delete this function.
23871         * sel-sched.c (create_block_for_bookkeeping): Eliminate
23872         SET_BB_NOTE_LIST in favor of BB_NOTE_LIST.
23874 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
23876         * target.def (reorder): Strengthen param "ready" of this DEFHOOK
23877         from rtx * to rtx_insn **.
23878         (reorder2): Likewise.
23879         (dependencies_evaluation_hook): Strengthen params "head", "tail"
23880         from rtx to rtx_insn *.
23882         * doc/tm.texi: Update mechanically for above change to target.def.
23884         * sched-int.h (note_list): Strengthen this variable from rtx to
23885         rtx_insn *.
23886         (remove_notes): Likewise for both params.
23887         (restore_other_notes): Likewise for return type and first param.
23888         (struct ready_list): Strengthen field "vec" from rtx * to
23889         rtx_insn **.
23890         (struct dep_replacement): Strenghten field "insn" from rtx to
23891         rtx_insn *.
23892         (struct deps_desc): Likewise for fields "last_debug_insn",
23893         "last_args_size".
23894         (struct haifa_sched_info): Likewise for callback field
23895         "can_schedule_ready_p"'s param, for first param of "new_ready"
23896         callback field, for both params of "rank" callback field, for
23897         first field of "print_insn" callback field (with a const), for
23898         both params of "contributes_to_priority" callback, for param
23899         of "insn_finishes_block_p" callback, for fields "prev_head",
23900         "next_tail", "head", "tail", for first param of "add_remove_insn"
23901         callback, for first param of "begin_schedule_ready" callback, for
23902         both params of "begin_move_insn" callback, and for second param
23903         of "advance_target_bb" callback.
23904         (add_dependence): Likewise for params 1 and 2.
23905         (sched_analyze): Likewise for params 2 and 3.
23906         (deps_analyze_insn): Likewise for param 2.
23907         (ready_element): Likewise for return type.
23908         (ready_lastpos): Strengthen return type from rtx * to rtx_insn **.
23909         (try_ready): Strenghten param from rtx to rtx_insn *.
23910         (sched_emit_insn): Likewise for return type.
23911         (record_delay_slot_pair): Likewise for params 1 and 2.
23912         (add_delay_dependencies): Likewise for param.
23913         (contributes_to_priority): Likewise for both params.
23914         (find_modifiable_mems): Likewise.
23916         * config/arm/arm.c (cortexa7_sched_reorder):  Strengthen param
23917         "ready" from rtx * to rtx_insn **.  Strengthen locals "insn",
23918         "first_older_only_insn" from rtx to rtx_insn *.
23919         (arm_sched_reorder):  Strengthen param "ready"  from rtx * to
23920         rtx_insn **.
23922         * config/c6x/c6x.c (struct c6x_sched_context): Strengthen field
23923         "last_scheduled_iter0" from rtx to rtx_insn *.
23924         (init_sched_state): Replace use of NULL_RTX with NULL for insn.
23925         (c6x_sched_reorder_1): Strengthen param "ready" and locals
23926         "e_ready", "insnp" from rtx * to rtx_insn **.  Strengthen local
23927         "insn" from rtx to rtx_insn *.
23928         (c6x_sched_reorder): Strengthen param "ready" from rtx * to
23929         rtx_insn **.
23930         (c6x_sched_reorder2): Strengthen param "ready" and locals
23931         "e_ready", "insnp" from rtx * to rtx_insn **. Strengthen local
23932         "insn" from rtx to rtx_insn *.
23933         (c6x_variable_issue):  Add a checked cast when assigning from insn
23934         to ss.last_scheduled_iter0.
23935         (split_delayed_branch): Strengthen param "insn" and local "i1"
23936         from rtx to rtx_insn *.
23937         (split_delayed_nonbranch): Likewise.
23938         (undo_split_delayed_nonbranch): Likewise for local "insn".
23939         (hwloop_optimize): Likewise for locals "seq", "insn", "prev",
23940         "entry_after", "end_packet", "head_insn", "tail_insn",
23941         "new_insns", "last_insn", "this_iter", "prev_stage_insn".
23942         Strengthen locals "orig_vec", "copies", "insn_copies" from rtx *
23943         to rtx_insn **.  Remove now-redundant checked cast on last_insn,
23944         but add a checked cast on loop->start_label.  Consolidate calls to
23945         avoid assigning result of gen_spkernel to "insn", now an
23946         rtx_insn *.
23948         * config/i386/i386.c (do_reorder_for_imul): Strengthen param
23949         "ready" from rtx * to rtx_insn **.  Strengthen local "insn" from
23950         rtx to rtx_insn *.
23951         (swap_top_of_ready_list): Strengthen param "ready" from rtx * to
23952         rtx_insn **.  Strengthen locals "top", "next" from rtx to
23953         rtx_insn *.
23954         (ix86_sched_reorder): Strengthen param "ready" from rtx * to
23955         rtx_insn **.  Strengthen local "insn" from rtx to rtx_insn *.
23956         (add_parameter_dependencies): Strengthen params "call", "head" and
23957         locals "insn", "last", "first_arg" from rtx to rtx_insn *.
23958         (avoid_func_arg_motion): Likewise for params "first_arg", "insn".
23959         (add_dependee_for_func_arg): Likewise for param "arg" and local
23960         "insn".
23961         (ix86_dependencies_evaluation_hook): Likewise for params "head",
23962         "tail" and locals "insn", "first_arg".
23964         * config/ia64/ia64.c (ia64_dependencies_evaluation_hook): Likewise
23965         for params "head", "tail" and locals "insn", "next", "next_tail".
23966         (ia64_dfa_sched_reorder): Strengthen param "ready" and locals
23967         "e_ready", "insnp" from rtx * to rtx_insn **. Strengthen locals
23968         "insn", "lowest", "highest" from rtx to rtx_insn *.
23969         (ia64_sched_reorder): Strengthen param "ready" from rtx * to
23970         rtx_insn **.
23971         (ia64_sched_reorder2): Likewise.
23973         * config/mep/mep.c (mep_find_ready_insn): Strengthen return type
23974         and local "insn" from rtx to rtx_insn *.  Strengthen param "ready"
23975         from rtx * to rtx_insn **.
23976         (mep_move_ready_insn): Strengthen param "ready" from rtx * to
23977         rtx_insn **.
23978         (mep_print_sched_insn): Strengthen param "insn" from rtx to
23979         rtx_insn *.
23980         (mep_sched_reorder): Strengthen param "ready" from rtx * to
23981         rtx_insn **.  Strengthen locals "core_insn", "cop_insn" from rtx
23982         to rtx_insn *.
23984         * config/mips/mips.c (mips_promote_ready): Strengthen param "ready"
23985         from rtx * to rtx_insn **.  Strengthen local "new_head" from rtx
23986         to rtx_insn *.
23987         (mips_maybe_swap_ready): Strengthen param "ready" from rtx * to
23988         rtx_insn **.  Strengthen local "temp" from rtx to rtx_insn *.
23989         (mips_macc_chains_reorder): Strengthen param "ready" from rtx * to
23990         rtx_insn **.
23991         (vr4130_reorder): Likewise.
23992         (mips_74k_agen_reorder): Likewise.  Strengthen local "insn" from
23993         rtx to rtx_insn *.
23994         (mips_sched_reorder_1): Strengthen param "ready" from rtx * to
23995         rtx_insn **.
23996         (mips_sched_reorder): Likewise.
23997         (mips_sched_reorder2): Likewise.
23999         * config/picochip/picochip.c (picochip_sched_reorder): Likewise.
24001         * config/rs6000/rs6000.c (rs6000_sched_reorder): Likewise.
24002         Strengthen local "tmp" from rtx to rtx_insn *.
24003         (rs6000_sched_reorder2): Likewise.
24005         * config/s390/s390.c (s390_z10_prevent_earlyload_conflicts):
24006         Likewise.  Update sizeof(rtx) to sizeof(rtx_insn *) in memmove.
24007         (s390_sched_reorder): Strengthen param "ready" from rtx * to
24008         rtx_insn **.  Strengthen local "tmp" from rtx to rtx_insn *.
24010         * config/sh/sh.c (rank_for_reorder): Strengthen locals "tmp",
24011         "tmp2" from rtx to rtx_insn *.
24012         (swap_reorder): Strengthen param "a" from rtx * to rtx_insn **.
24013         Strengthen local "insn" from rtx to rtx_insn *.
24014         (ready_reorder): Strengthen param "ready" from rtx * to
24015         rtx_insn **.  Update sizeof(rtx) to sizeof(rtx_insn *) in qsort.
24016         (sh_reorder):  Strengthen param "ready" from rtx * to rtx_insn **.
24017         (sh_reorder2): Likewise.
24019         * config/spu/spu.c (spu_sched_reorder): Likewise.  Strengthen
24020         local "insn" from rtx to rtx_insn *.
24022         * haifa-sched.c (note_list): Strengthen this variable from rtx to
24023         rtx_insn *.
24024         (scheduled_insns): Strengthen this variable from vec<rtx> to
24025         vec<rtx_insn *>.
24026         (set_modulo_params): Likewise for locals "i1", "i2".
24027         (record_delay_slot_pair): Likewise for params "i1", "i2".
24028         (add_delay_dependencies): Likewise for param "insn".
24029         (cond_clobbered_p): Likewise.
24030         (recompute_todo_spec): Likewise for local "prev".
24031         (last_scheduled_insn): Likewise for this variable.
24032         (nonscheduled_insns_begin): Likewise.
24033         (model_set_excess_costs): Strengthen param "insns" from rtx * to
24034         rtx_insn **.
24035         (rank_for_schedule): Strengthen locals "tmp", "tmp2" from rtx to
24036         rtx_insn *.
24037         (swap_sort): Strengthen param "a" from rtx * to rtx_insn **.
24038         Strengthen local "insn" from rtx to rtx_insn *.
24039         (queue_insn): Strengthen param "insn" from rtx to rtx_insn *.
24040         (ready_lastpos): Strengthen return type from rtx * to rtx_insn **.
24041         (ready_add): Strengthen param "insn" from rtx to rtx_insn *.
24042         (ready_remove_first): Likewise for return type and local "t".
24043         (ready_element): Likewise for return type.
24044         (ready_remove): Likewise for return type and local "t".
24045         (ready_sort): Strengthen local "first" from rtx * to rtx_insn **.
24046         (check_clobbered_conditions): Strengthen local "x" from rtx to
24047         rtx_insn *, adding a checked cast.
24048         (schedule_insn): Likewise for param "insn".
24049         (remove_notes): Likewise for params "head", "tail" and locals
24050         "next_tail", "insn", "next".
24051         (struct haifa_saved_data): Likewise for fields
24052         "last_scheduled_insn", "nonscheduled_insns_begin".
24053         (save_backtrack_point): Update for change to field "vec" of
24054         struct ready_list.
24055         (toggle_cancelled_flags): Strengthen local "first" from rtx * to
24056         rtx_insn **.
24057         (restore_last_backtrack_point): Likewise.  Strengthen local "insn"
24058         from rtx to rtx_insn *
24059         (resolve_dependencies): Strengthen param "insn" from rtx to
24060         rtx_insn *
24061         (restore_other_notes): Likewise for return type, for param "head"
24062         and local "note_head".
24063         (undo_all_replacements): Likewise for local "insn".
24064         (first_nonscheduled_insn): Likewise for return type and local "insn".
24065         (queue_to_ready): Likewise for local "insn", adding checked casts.
24066         (early_queue_to_ready): Likewise for local "insn".
24067         (debug_ready_list_1): Strengthen local "p" from rtx * to
24068         rtx_insn **.
24069         (move_insn): Strengthen param "insn" and local "note" from rtx to
24070         rtx_insn *
24071         (insn_finishes_cycle_p): Likewise for param "insn".
24072         (max_issue): Likewise for local "insn".
24073         (choose_ready): Likewise.  Strengthen param "insn_ptr" from rtx *
24074         to rtx_insn **.
24075         (commit_schedule): Strengthen param "prev_head" and local "insn"
24076         from rtx to rtx_insn *
24077         (prune_ready_list): Likewise for local "insn".
24078         (schedule_block): Likewise for locals "prev_head", "head", "tail",
24079         "skip_insn", "insn", "failed_insn", "x", adding a checked cast.
24080         (set_priorities): Likewise for local "prev_head".
24081         (try_ready): Likewise for param "next".
24082         (fix_tick_ready): Likewise.
24083         (change_queue_index): Likewise.
24084         (sched_extend_ready_list): Update for change to field "vec" of
24085         struct ready_list.
24086         (generate_recovery_code): Strengthen param "insn" from rtx to
24087         rtx_insn *.
24088         (begin_speculative_block): Likewise.
24089         (create_check_block_twin): Likewise for param "insn" and locals
24090         "label", "check", "twin".  Introduce local "check_pat" to avoid
24091         "check" being used as a plain rtx before being used as an insn.
24092         (fix_recovery_deps): Add a checked cast to rtx_insn * when
24093         extracting elements from ready_list.
24094         (sched_remove_insn): Strengthen param "insn" from rtx to
24095         rtx_insn *.
24096         (sched_emit_insn): Likewise for return type.
24097         (ready_remove_first_dispatch): Likewise for return type and local
24098         "insn".
24100         * hw-doloop.c (discover_loop): Add a checked cast to rtx_insn *.
24102         * modulo-sched.c (sms_print_insn): Strengthen from const_rtx to
24103         const rtx_insn *.
24105         * sched-deps.c (add_dependence): Strengthen params "con", "pro"
24106         from rtx to rtx_insn *.
24107         (add_dependence_list): Likewise for param "insn".  Add a checked
24108         cast.
24109         (add_dependence_list_and_free): Strengthen param "insn" from rtx
24110         to rtx_insn *.  Strengthen param "list_p" from rtx * to
24111         rtx_insn **.
24112         (chain_to_prev_insn): Strengthen param "insn" and locals
24113         "prec_nonnote", "i" from rtx to rtx_insn *.
24114         (flush_pending_lists): Likewise for param "insn".
24115         (cur_insn): Likewise for this variable.
24116         (haifa_start_insn): Add a checked cast.
24117         (note_dep): Strengthen param "e" from rtx to rtx_insn *.
24118         (sched_analyze_reg): Likewise for param "insn".
24119         (sched_analyze_1): Likewise.
24120         (sched_analyze_2): Likewise.  Add checked casts.
24121         (sched_analyze_insn): Likewise.  Also for local "prev".
24122         (deps_analyze_insn): Likewise for param "insn".
24123         (sched_analyze): Likewise for params "head", "tail" and local "insn".
24124         (add_dependence_1): Likewise for params "insn", "elem".
24125         (struct mem_inc_info): Likewise for fields "inc_insn", "mem_insn".
24126         (parse_add_or_inc): Likewise for param "insn".
24127         (find_inc): Likewise for local "inc_cand".
24128         (find_modifiable_mems): Likewise for params "head", "tail" and
24129         locals "insn", "next_tail".
24131         * sched-ebb.c (init_ready_list): Likewise for local "insn".
24132         (begin_schedule_ready): Likewise for param "insn".
24133         (begin_move_insn): Likewise for params "insn" and "last".
24134         (ebb_print_insn): Strengthen param "insn" from const_rtx to
24135         const rtx_insn *.
24136         (rank): Strengthen params "insn1", "insn2" from rtx to rtx_insn *.
24137         (ebb_contributes_to_priority): Likewise for params "next", "insn".
24138         (ebb_add_remove_insn): Likewise for param "insn".
24139         (advance_target_bb): Likewise.
24141         * sched-rgn.c (rgn_estimate_number_of_insns): Likewise for local
24142         "insn".
24143         (check_live): Likewise for param "insn".
24144         (init_ready_list): Likewise for local "insn".
24145         (can_schedule_ready_p): Likewise for param "insn".
24146         (begin_schedule_ready): Likewise.
24147         (new_ready): Likewise for param "next".
24148         (rgn_print_insn): Likewise for param "insn".
24149         (rgn_rank): Likewise for params "insn1", "insn2".
24150         (contributes_to_priority): Likewise for params "next", "insn".
24151         (rgn_insn_finishes_block_p): Likewise for param "insn".
24152         (add_branch_dependences): Likewise for params "head", "tail" and
24153         locals "insn", "last".
24154         (rgn_add_remove_insn): Likewise for param "insn".
24155         (advance_target_bb): Likewise.
24157         * sel-sched-dump.c (sel_print_insn): Strengthen param "insn" from
24158         const_rtx to const rtx_insn *.
24160         * sel-sched-dump.h (sel_print_insn): Likewise.
24162         * sel-sched-ir.c (advance_deps_context): Add a checked cast.
24163         (deps_init_id): Likewise.
24165         * sel-sched.c (convert_vec_av_set_to_ready): Likewise.
24166         (invoke_reorder_hooks): Strengthen local "arr" from rtx * to
24167         rtx_insn **.
24169 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24171         * output.h (final_start_function): Strengthen param 1 from rtx to
24172         rtx_insn *.
24174         * final.c (final_start_function): Likewise, renaming back from
24175         "uncast_first" to "first", and dropping the checked cast from rtx
24176         to rtx_insn *.
24178 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24180         * output.h (final): Strengthen param 1 from rtx to rtx_insn *.
24181         * final.c (final): Likewise.  Rename param back from
24182         "uncast_first" to "first" and eliminate the checked cast from rtx
24183         to rtx_insn *.
24185 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24187         * output.h (shorten_branches): Strengthen param from rtx to
24188         rtx_insn *.
24190         * final.c (shorten_branches): Likewise, renaming param back from
24191         "uncast_first" to "first", and dropping the checked cast from rtx
24192         to rtx_insn *.
24194         * genattr.c (gen_attr): Likewise when writing out the prototype of
24195         shorten_branches.
24197 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24199         * sched-int.h (struct haifa_sched_info): Strengthen fields
24200         "prev_head" and "next_tail" from rtx to rtx_insn *.
24202 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24204         * rtl.h (rtx_jump_table_data::get_labels): New method.
24205         * cfgbuild.c (make_edges): Replace hand-coded lookup of labels
24206         with use of the new rtx_jump_table_data::get_labels method.
24207         (purge_dead_tablejump_edges): Strengthen param "table" from rtx
24208         to rtx_jump_table_data *.  Simplify by using get_labels method.
24209         * cfgrtl.c (delete_insn): Replace use of JUMP_TABLE_DATA_P with
24210         a dyn_cast, introducing local "table", using it to replace
24211         label-lookup logic with a get_labels method call.
24212         (patch_jump_insn): Simplify using get_labels method.
24213         * dwarf2cfi.c (create_trace_edges): Likewise.
24214         * rtlanal.c (label_is_jump_target_p): Likewise.
24216 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24218         * rtl.h (unshare_all_rtl_again): Strengthen param "insn" from rtx
24219         to rtx_insn *.
24221         * emit-rtl.c (unshare_all_rtl_1): Likewise.
24222         (unshare_all_rtl_again): Likewise, also for local "p".
24224 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24226         * rtl.h (delete_insn_and_edges): Strengthen param "insn" from rtx
24227         to rtx_insn *.
24228         * cfgrtl.c (delete_insn_and_edges): Likewise.
24230 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24232         * rtl.h (reorder_insns): Strengthen params "from", "to", "after"
24233         from rtx to rtx_insn *.
24235         * emit-rtl.c (reorder_insns): Likewise, also for local "insn".
24237 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24239         * function.c (thread_prologue_and_epilogue_insns): Likewise for
24240         locals "returnjump", "epilogue_end", "insn", "next".
24242         * shrink-wrap.h (get_unconverted_simple_return): Strengthen param
24243         "returnjump" from rtx * to rtx_insn **.
24244         * shrink-wrap.c (get_unconverted_simple_return): Likewise.
24246 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24248         * basic-block.h (struct edge_def). Strengthen "r" within
24249         union edge_def_insns from rtx to rtx_insn *.
24251         * cfgexpand.c (pass_expand::execute): Remove now-redundant cast
24252         from rtx to rtx_insn *.  Strengthen local "insns" from rtx to
24253         rtx_insn *.
24254         * cfgrtl.c (commit_one_edge_insertion): Remove now-redundant cast
24255         from rtx to rtx_insn *.
24256         * cprop.c (find_bypass_set): Strengthen local "insn" from rtx to
24257         rtx_insn *.
24258         * postreload-gcse.c (reg_killed_on_edge): Likewise.
24259         (reg_used_on_edge): Likewise.
24260         * tree-cfg.c (gt_ggc_mx): New overload for rtx_insn *&.
24261         (gt_pch_nx): New overload for rtx_insn *&.
24262         * tree-outof-ssa.c (expand_phi_nodes): Strengthen local "insns"
24263         from rtx to rtx_insn *.
24265 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24267         * basic-block.h (struct rtl_bb_info): Strengthen field "footer_"
24268         from rtx to rtx_insn *.
24269         (BB_FOOTER): Replace function with access macro.
24270         (SET_BB_FOOTER): Delete.
24272         * cfgcleanup.c (try_optimize_cfg): Replace uses of SET_BB_FOOTER
24273         with BB_FOOTER.
24274         * cfgrtl.c (try_redirect_by_replacing_jump): Likewise.
24275         (emit_barrier_after_bb): Likewise.
24276         (record_effective_endpoints): Likewise.
24277         (relink_block_chain): Likewise.
24278         (fixup_fallthru_exit_predecessor): Likewise.
24279         (cfg_layout_duplicate_bb): Likewise.
24280         (cfg_layout_split_block): Likewise.
24281         (cfg_layout_delete_block): Likewise.
24282         (cfg_layout_merge_blocks): Likewise.
24283         (BB_FOOTER): Delete function.
24284         (SET_BB_FOOTER): Delete function.
24285         * combine.c (update_cfg_for_uncondjump): Replace uses of
24286         SET_BB_FOOTER with BB_FOOTER.
24288 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24290         * except.h (struct eh_landing_pad_d): Strengthen field
24291         "landing_pad" from rtx to rtx_code_label *.
24293         * except.c (sjlj_emit_dispatch_table): Likewise for param
24294         "dispatch_label"
24295         (sjlj_build_landing_pads): Likewise for local "dispatch_label".
24297 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24299         * config/xtensa/xtensa-protos.h (xtensa_emit_loop_end): Strengthen
24300         first param from rtx to rtx_insn *.
24301         * config/xtensa/xtensa.c (struct machine_function): Likewise for
24302         field "set_frame_ptr_insn".
24303         (xtensa_expand_compare_and_swap): Strengthen locals "csloop" and
24304         "csend" from rtx to rtx_code_label *.
24305         (xtensa_expand_atomic): Likewise for local "csloop".
24306         (xtensa_emit_loop_end): Strengthen param "insn" from rtx to
24307         rtx_insn *.
24308         (xtensa_call_tls_desc): Likewise for return type and locals
24309         "call_insn", "insns".
24310         (xtensa_legitimize_tls_address): Likewise for local "insns".
24311         (xtensa_expand_prologue): Likewise for locals "insn", "first".
24313 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24315         * config/v850/v850-protos.h (v850_adjust_insn_length): Strengthen
24316         first param from rtx to rtx_insn *.
24317         * config/v850/v850.c (v850_adjust_insn_length): Likewise for param
24318         "insn".
24320 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24322         * config/tilepro/tilepro-protos.h (tilepro_output_cbranch_with_opcode):
24323         Strengthen param 1 from rtx to rtx_insn *.
24324         (tilepro_output_cbranch): Likewise.
24325         (tilepro_adjust_insn_length): Likewise.
24326         (tilepro_final_prescan_insn): Likewise for sole param.
24328         * config/tilepro/tilepro.c (tilepro_legitimize_tls_address):
24329         Likewise for local "last".
24330         (cbranch_predicted_p): Likewise for param "insn".
24331         (tilepro_output_simple_cbranch_with_opcode): Likewise.
24332         (tilepro_output_cbranch_with_opcode): Likewise.
24333         (tilepro_output_cbranch): Likewise.
24334         (frame_emit_load): Likewise for return type and locals "seq",
24335         "insn".
24336         (emit_sp_adjust): Likewise for return type and local "insn".
24337         (tilepro_expand_epilogue): Likewise for locals "last_insn",
24338         "insn".
24339         (tilepro_adjust_insn_length): Likewise for param "insn".
24340         (next_insn_to_bundle): Likewise for return type and params
24341         "r", "end".
24342         (tilepro_gen_bundles): Likewise for locals "insn", "next", "end".
24343         (replace_pc_relative_symbol_ref): Likewise for param "insn" and
24344         local "new_insns".
24345         (match_addli_pcrel): Likewise for param "insn".
24346         (replace_addli_pcrel): Likewise.
24347         (match_auli_pcrel): Likewise.
24348         (replace_auli_pcrel): Likewise.
24349         (tilepro_fixup_pcrel_references): Likewise for locals "insn",
24350         "next_insn".
24351         (reorder_var_tracking_notes): Likewise for locals "insn", "next",
24352         "queue", "next_queue", "prev".
24353         (tilepro_asm_output_mi_thunk): Likewise for local "insn".
24354         (tilepro_final_prescan_insn): Likewise for param "insn".
24356 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24358         * config/tilegx/tilegx-protos.h (tilegx_output_cbranch_with_opcode):
24359         Strengthen param 1 from rtx to rtx_insn *.
24360         (tilegx_output_cbranch): Likewise.
24361         (tilegx_adjust_insn_length): Likewise.
24362         (tilegx_final_prescan_insn): Likewise for sole param.
24364         * config/tilegx/tilegx.c (tilegx_legitimize_tls_address): Likewise
24365         or local "last".
24366         (cbranch_predicted_p): Likewise for param "insn".
24367         (tilegx_output_simple_cbranch_with_opcode): Likewise.
24368         (tilegx_output_cbranch_with_opcode): Likewise.
24369         (tilegx_output_cbranch): Likewise.
24370         (frame_emit_load): Likewise for return type.
24371         (set_frame_related_p): Likewise for locals "seq", "insn".
24372         (emit_sp_adjust): Likewise for return type, and for local "insn".
24373         Introduce local "pat" for use in place of "insn" where the latter
24374         isn't an instruction.
24375         (tilegx_expand_epilogue): Strengthen locals "last_insn", "insn"
24376         from rtx to rtx_insn *.
24377         (tilegx_adjust_insn_length): Likewise for param "insn".
24378         (next_insn_to_bundle): Likewise for return type and params "r" and
24379         "end".
24380         (tilegx_gen_bundles): Likewise for locals "insn", "next", "prev",
24381         "end".
24382         (replace_insns): Likewise for params "old_insn", "new_insns".
24383         (replace_mov_pcrel_step1): Likewise for param "insn" and local
24384         "new_insns".
24385         (replace_mov_pcrel_step2): Likewise.
24386         (replace_mov_pcrel_step3): Likewise.
24387         (tilegx_fixup_pcrel_references): Likewise for locals "insn",
24388         "next_insn".
24389         (reorder_var_tracking_notes): Likewise for locals "insn", "next",
24390         "queue", "next_queue", "prev".
24391         (tilegx_output_mi_thunk): Likewise for local "insn".
24392         (tilegx_final_prescan_insn): Likewise for param "insn".
24394 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24396         * config/spu/spu.c (frame_emit_store): Strengthen return type from
24397         rtx to rtx_insn *.
24398         (frame_emit_load): Likewise.
24399         (frame_emit_add_imm): Likewise, also for local "insn".
24400         (spu_expand_prologue): Likewise for local "insn".
24401         (struct spu_bb_info): Likewise for field "prop_jump".
24402         (emit_nop_for_insn): Likewise for param "insn" and local
24403         "new_insn".
24404         (pad_bb): Likewise for locals "insn", "next_insn", "prev_insn",
24405         "hbr_insn".
24406         (spu_emit_branch_hint): Likewise for params "before", "branch" and
24407         locals "hint", "insn".
24408         (get_branch_target): Likewise for param "branch".
24409         (insn_clobbers_hbr): Likewise for param "insn".
24410         (insert_hbrp_for_ilb_runout): Likewise for param "first" and
24411         locals "insn", "before_4", "before_16".
24412         (insert_hbrp): Likewise for local "insn".
24413         (spu_machine_dependent_reorg): Likewise for locals "branch",
24414         "insn", "next", "bbend".
24415         (uses_ls_unit): Likewise for param "insn".
24416         (get_pipe): Likewise.
24417         (spu_sched_variable_issue): Rename param "insn" to "uncast_insn",
24418         introducing a checked cast.
24419         (spu_sched_adjust_cost): Likewise for params "insn" and
24420         "dep_insn".
24421         (ea_load_store_inline): Strengthen local "insn" from rtx to rtx_insn *.
24422         (spu_sms_res_mii): Likewise.
24424 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24426         * config/sparc/sparc-protos.h (output_ubranch): Strengthen param 2
24427         from rtx to rtx_insn *.
24428         (output_cbranch): Likewise for param 6.
24429         (output_return): Likewise for param 1.
24430         (output_sibcall): Likewise.
24431         (output_v8plus_shift): Likewise.
24432         (output_v8plus_mult): Likewise.
24433         (output_v9branch): Likewise for param 7.
24434         (output_cbcond):  Likewise for param 3.
24436         * config/sparc/sparc.c (sparc_legitimize_tls_address): Likewise
24437         for local "insn".
24438         (sparc_legitimize_pic_address): Likewise.
24439         (sparc_emit_call_insn): Likewise.
24440         (emit_save_or_restore_regs): Likewise.
24441         (emit_window_save): Likewise for return type and local "insn".
24442         (sparc_expand_prologue): Likewise for local "insn".
24443         (sparc_flat_expand_prologue): Likewise.
24444         (output_return): Likewise for param "insn".
24445         (output_sibcall): Likewise for param "insn" and local "delay".
24446         (output_ubranch): Likewise for param "insn".
24447         (output_cbranch): Likewise.
24448         (output_cbcond): Likewise.
24449         (output_v9branch): Likewise.
24450         (output_v8plus_shift): Likewise.
24451         (sparc_output_mi_thunk): Likewise for local "insn".
24452         (get_some_local_dynamic_name): Likewise.
24453         (output_v8plus_mult): Likewise for param "insn".
24455 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24457         * config/sh/sh-protos.h (output_ieee_ccmpeq): Strengthen param 1
24458         from rtx to rtx_insn *.
24459         (output_branchy_insn): Likewise for param 3.
24460         (output_far_jump): Likewise for param 1.
24461         (final_prescan_insn): Likewise.
24462         (sh_insn_length_adjustment): Likewise for sole param.
24464         * config/sh/sh.c (expand_cbranchsi4): Likewise for local "jump".
24465         (expand_cbranchdi4): Strengthen local "skip_label" from rtx to
24466         rtx_code_label *.
24467         (sh_emit_compare_and_set): Likewise for local "lab".
24468         (output_far_jump): Strengthen param "insn" and local "prev" from
24469         rtx to rtx_insn *.
24470         (output_branchy_insn): Likewise for param "insn" and local
24471         "next_insn".
24472         (output_ieee_ccmpeq): Likewise for param "insn".
24473         (struct label_ref_list_d): Strengthen field "label" from rtx to
24474         rtx_code_label *.
24475         (pool_node): Likewise.
24476         (pool_window_label): Likewise for this global.
24477         (add_constant): Likewise for return type and locals "lab", "new_rtx".
24478         (dump_table): Strengthen params "start", "barrier" and local
24479         "scan" from rtx to rtx_insn *.
24480         (broken_move): Likewise for param "insn".
24481         (untangle_mova): Likewise for params "first_mova" and "new_mova".
24482         Strengthen param "first_mova" from rtx * to rtx_insn **.
24483         (mova_p): Likewise for param "insn".
24484         (fixup_mova): Likewise for param "mova".
24485         (find_barrier): Likewise for return type, params "mova" and
24486         "from", and locals "barrier_before_mova", "found_barrier",
24487         "good_barrier", "orig", "last_symoff", "next".  Strengthen local
24488         "label" from rtx to rtx_code_label *.
24489         (sh_loop_align): Strengthen locals "first", "insn", "mova" from
24490         rtx to rtx_insn *.
24491         (sh_reorg): Likewise for locals "link", "scan", "barrier".
24492         (split_branches): Likewise for param "first" and local "insn".
24493         (final_prescan_insn): Likewise for param "insn".
24494         (sequence_insn_p): Likewise for locals "prev", "next".
24495         (sh_insn_length_adjustment): Likewise for param "insn".
24496         (sh_can_redirect_branch): Likewise for local "insn".
24497         (find_r0_life_regions): Likewise for locals "end", "insn".
24498         (sh_output_mi_thunk): Likewise for local "insns".
24500 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24502         * config/score/score.c (score_output_mi_thunk): Strengthen local
24503         "insn" from rtx to rtx_insn *.
24504         (score_prologue): Likewise.
24506 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24508         * config/s390/s390-protos.h (s390_match_ccmode): Strengthen param
24509         1 from rtx to rtx_insn *.
24510         (s390_emit_jump): Likewise for return type.
24511         (s390_emit_call): Likewise.
24512         (s390_load_got): Likewise.
24514         * config/s390/s390.c (last_scheduled_insn): Likewise for this
24515         variable.
24516         (s390_match_ccmode): Likewise for param "insn".
24517         (s390_emit_jump): Likewise for return type.
24518         (s390_split_branches): Likewise for local "label".
24519         (struct constant): Strengthen field "label" from rtx to
24520         rtx_code_label *.
24521         (struct constant_pool): Likewise for field "label".  Strengthen
24522         fields "first_insn", "pool_insn", "emit_pool_after" from rtx to
24523         rtx_insn *.
24524         (s390_alloc_pool): Replace NULL_RTX with NULL when dealing with
24525         insns.
24526         (s390_start_pool): Strengthen param "insn" from rtx to rtx_insn *.
24527         (s390_end_pool): Likewise.
24528         (s390_dump_pool): Likewise for local "insn".
24529         (s390_mainpool_start): Likewise.
24530         (s390_chunkify_start): Likewise.
24531         (s390_chunkify_start): Replace NULL_RTX with NULL when dealing
24532         with insns.  Strengthen locals "label", "jump", "barrier", "next",
24533         "prev", "vec_insn", "insn" from rtx to rtx_insn *.
24534         (s390_chunkify_finish): Strengthen local "insn" from rtx to
24535         rtx_insn *.
24536         (s390_chunkify_cancel): Likewise for locals "insn", "barrier",
24537         "jump", "label", "next_insn".
24538         (s390_regs_ever_clobbered): Likewise for local "cur_insn".
24539         (s390_optimize_nonescaping_tx): Likewise for locals "insn",
24540         "tbegin_insn".
24541         (s390_load_got): Likewise for return type and local "insns".
24542         (s390_save_gprs_to_fprs): Likewise for local "insn".
24543         (s390_restore_gprs_from_fprs): Likewise.
24544         (pass_s390_early_mach::execute): Likewise.
24545         (s390_emit_prologue): Likewise for local "insns".
24546         (s390_expand_tbegin): Strengthen local "leave_label" from rtx to
24547         rtx_code_label *.
24548         (s390_emit_call): Strengthen return type and local "insn" from
24549         rtx to rtx_insn *.
24550         (s390_emit_tpf_eh_return): Likewise for local "insn".
24551         (s390_optimize_prologue): Likewise for locals "insn", "new_insn",
24552         "next_insn", introducing locals "s_pat", "rpat" to allow this.
24553         (s390_fix_long_loop_prediction): Likewise for param "insn" and
24554         local "cur_insn".
24555         (s390_non_addr_reg_read_p): Likewise for param "insn".
24556         (find_cond_jump): Likewise for return type and param "insn".
24557         (s390_swap_cmp): Likewise for param "insn".
24558         (s390_z10_optimize_cmp): Likewise for param "insn" and locals
24559         "prev_insn", "next_insn".
24560         (s390_reorg): Likewise for locals "insn", "target".
24561         (s390_z10_prevent_earlyload_conflicts): Likewise for local "insn".
24562         (s390_sched_variable_issue): For now, rename param "insn" to
24563         "uncast_insn", introducing a checked cast.
24564         (s390_sched_init): Replace NULL_RTX with NULL when dealing with
24565         insn.
24566         (s390_loop_unroll_adjust): Strengthen local "insn" from rtx to
24567         rtx_insn *.  Use for_each_rtx_in_insn rather than for_each_rtx.
24569 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24571         * config/rx/rx-protos.h (rx_adjust_insn_length): Strengthen first
24572         param from rtx to rtx_insn *.
24573         * config/rx/rx.c (rx_adjust_insn_length): Likewise for param "insn".
24575 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24577         * config/rs6000/rs6000-protos.h (output_cbranch): Strengthen param
24578         4 from rtx to rtx_insn *.
24579         (rs6000_final_prescan_insn): Likewise for first param.
24580         * config/rs6000/rs6000.c (rs6000_emit_set_const): Likewise for
24581         local "insn".
24582         (rs6000_get_some_local_dynamic_name): Likewise.
24583         (output_cbranch): Likewise for param "insn".
24584         (spe_func_has_64bit_regs_p): Likewise for locals "insns", "insn".
24585         (rs6000_function_ok_for_sibcall): Likewise for locals "top", "insn".
24586         (rs6000_emit_allocate_stack): Likewise for local "insn".
24587         (load_cr_save): Likewise.
24588         (restore_saved_cr): Likewise.
24589         (restore_saved_lr): Likewise.
24590         (emit_cfa_restores): Likewise.
24591         (rs6000_output_function_epilogue): Likewise for locals "insn" and
24592         "deleted_debug_label".
24593         (rs6000_output_mi_thunk): Likewise for local "insn".
24594         (rs6000_final_prescan_insn): Likewise for param "insn".
24596 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24598         * config/picochip/picochip-protos.h (picochip_final_prescan_insn):
24599         Strengthen param "insn" from rtx to rtx_insn *.
24600         * config/picochip/picochip.c (picochip_current_prescan_insn):
24601         Likewise for this variable.
24602         (picochip_final_prescan_insn): Likewise for param "insn".
24604 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24606         * config/pa/pa-protos.h (pa_output_call): Strengthen first param
24607         from rtx to rtx_insn *.
24608         (pa_output_indirect_call): Likewise.
24609         (pa_adjust_insn_length): Likewise.
24610         (pa_attr_length_millicode_call): Likewise.
24611         (pa_attr_length_call): Likewise.
24612         (pa_attr_length_indirect_call): Likewise.
24614         * config/pa/pa.c (pa_adjust_insn_length): Likewise for param
24615         "insn".
24616         (pa_attr_length_millicode_call): Likewise.
24617         (pa_attr_length_call): Likewise.
24618         (pa_output_call): Likewise.
24619         (pa_attr_length_indirect_call): Likewise.
24620         (pa_output_indirect_call): Likewise.
24622 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24624         * config/nds32/nds32-protos.h (nds32_adjust_insn_length):
24625         Strengthen first param from rtx to rtx_insn *.
24626         * config/nds32/nds32.c (nds32_adjust_insn_length): Likewise for
24627         param "insn".
24629 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24631         * config/mips/mips-protos.h (mips_emit_move): Strengthen return
24632         type from rtx to rtx_insn *.
24633         (mips_expand_call): Likewise.
24634         (mips_adjust_insn_length): Likewise for first param.
24635         (mips_output_conditional_branch): Likewise.
24636         (mips_output_order_conditional_branch): Likewise.
24637         (mips_final_prescan_insn): Likewise.
24639         * config/mips/mips.c (SEQ_BEGIN): For now, add checked cast to
24640         rtx_insn * for the SEQUENCE case.
24641         (SEQ_END): Likewise.
24642         (mips_emit_move): Strengthen return type from rtx to rtx_insn *.
24643         (mips_emit_call_insn): Likewise, also for local "insn".
24644         (mips16_gp_pseudo_reg): Likewise for local "scan".
24645         (mips16_build_call_stub): Likewise for return type and for local
24646         "insn".  Introduce a new local "pattern" so that "insn" can indeed
24647         be an insn.
24648         (mips_expand_call): Strengthen return type and local "insn" from
24649         rtx to rtx_insn *.
24650         (mips_block_move_loop): Strengthen local "label" from rtx to
24651         rtx_code_label *.
24652         (mips_expand_synci_loop): Likewise for locals "label",
24653         "end_label".
24654         (mips_set_frame_expr): Strengthen local "insn" from rtx to
24655         rtx_insn *.
24656         (mips16e_collect_argument_saves): Likewise for locals "insn",
24657         "next".
24658         (mips_find_gp_ref): Likewise for param of callback for "pred"
24659         param, and for local "insn".
24660         (mips_insn_has_inflexible_gp_ref_p): Likewise for param "insn".
24661         (mips_insn_has_flexible_gp_ref_p): Likewise.
24662         (mips_epilogue_emit_cfa_restores): Likewise for return type and
24663         local "insn".
24664         (mips_epilogue_set_cfa): Likewise for local "insn".
24665         (mips_expand_epilogue): Likewise.
24666         (mips_adjust_insn_length): Likewise for param "insn".
24667         (mips_output_conditional_branch): Likewise.
24668         (mips_output_order_conditional_branch): Likewise.
24669         (struct mips_ls2): Likewise for fields "alu1_turn_enabled_insn",
24670         "alu2_turn_enabled_insn", "falu1_turn_enabled_insn",
24671         "falu2_turn_enabled_insn".
24672         (mips_builtin_branch_and_move): Strengthen locals "true_label",
24673         "done_label" from rtx to rtx_code_label *.
24674         (struct mips16_constant): Likewise for field "label".
24675         (mips16_add_constant): Likewise for return type.
24676         (mips16_emit_constants_1): Strengthen return type and param "insn"
24677         from rtx to rtx_insn *.
24678         (mips16_emit_constants): Likewise for param "insn".
24679         (mips16_insn_length): Likewise.
24680         (mips16_rewrite_pool_constant): Strengthen local "label" from rtx
24681         to rtx_code_label *.
24682         (struct mips16_rewrite_pool_refs_info): Strengthen field "insn"
24683         from rtx to rtx_insn *.
24684         (mips16_lay_out_constants): Likewise for locals "insn", "barrier",
24685         "jump".  Strengthen local "label" from rtx to rtx_code_label *.
24686         (r10k_simplify_address): Strengthen param "insn" and local
24687         "def_insn" from rtx to rtx_insn *.
24688         (r10k_safe_address_p): Strengthen param "insn" from rtx to
24689         rtx_insn *.
24690         (r10k_needs_protection_p_1): Update target type of cast of data
24691         from to rtx to rtx_insn *.
24692         (r10k_needs_protection_p_store): Strengthen local "insn_ptr" from
24693         rtx * to rtx_insn **.
24694         (r10k_needs_protection_p): Strengthen param "insn" from rtx to
24695         rtx_insn *.
24696         (r10k_insert_cache_barriers): Likewise for locals "insn", "end".
24697         (mips_call_expr_from_insn): Likewise for param "insn".
24698         (mips_pic_call_symbol_from_set): Likewise for local "def_insn".
24699         (mips_find_pic_call_symbol): Likewise for param "insn".
24700         (mips_annotate_pic_calls): Likewise for local "insn".
24701         (mips_sim_insn): Likewise for this variable.
24702         (struct mips_sim): Likewise for field "insn" within elements of
24703         last_set array.
24704         (mips_sim_wait_reg): Likewise for param "insn".
24705         (mips_sim_wait_regs): Likewise.
24706         (mips_sim_wait_units): Likewise.
24707         (mips_sim_wait_insn): Likewise.
24708         (mips_sim_issue_insn): Likewise.
24709         (mips_sim_finish_insn): Likewise.
24710         (mips_seq_time): Likewise for param "seq" and local "insn".
24711         (vr4130_avoid_branch_rt_conflict): Likewise for param "insn" and
24712         locals "first", "second".
24713         (vr4130_align_insns): Likewise for locals "insn", "subinsn",
24714         "last", "last2", "next".
24715         (mips_avoid_hazard): Likewise for params "after", "insn".
24716         (mips_reorg_process_insns): Likewise for locals "insn",
24717         "last_insn", "subinsn", "next_insn".
24718         (mips_has_long_branch_p): Likewise for locals "insn", "subinsn".
24719         (mips16_split_long_branches): Likewise for locals "insn" "jump",
24720         "jump_sequence".
24721         (mips_output_mi_thunk): Likewise for local "insn".
24722         (mips_final_prescan_insn): Likewise for param "insn".
24724 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24726         * config/microblaze/microblaze.c (microblaze_call_tls_get_addr):
24727         Strengthen return type and local "insns" from rtx to rtx_insn *.
24728         (microblaze_legitimize_tls_address): Likewise for local "insns".
24729         (microblaze_block_move_loop): Strengthen local "label" from rtx
24730         to rtx_code_label *.
24731         (microblaze_expand_prologue): Strengthen two locals named "insn"
24732         from rtx to rtx_insn *.
24733         (microblaze_asm_output_mi_thunk): Likewise for local "insn".
24734         (microblaze_expand_divide): Likewise for locals "jump", "cjump",
24735         "insn".  Strengthen locals "div_label", "div_end_label" from rtx
24736         to rtx_code_label *.
24738 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24740         * config/mep/mep-protos.h (mep_mulr_source): Strengthen first
24741         param from rtx to rtx_insn *.
24742         (mep_reuse_lo): Likewise for third param.
24743         (mep_use_post_modify_p): Likewise for first param.
24744         (mep_core_address_length): Likewise.
24745         (mep_cop_address_length): Likewise.
24746         (mep_final_prescan_insn): Likewise.
24747         (mep_store_data_bypass_p): Likewise for both params.
24748         (mep_mul_hilo_bypass_p): Likewise.
24749         (mep_ipipe_ldc_p): Likewise for param.
24751         * config/mep/mep.c (mep_mulr_source): Likewise for param "insn".
24752         (mep_rewrite_mult): Likewise.
24753         (mep_rewrite_mulsi3): Likewise.
24754         (mep_rewrite_maddsi3): Likewise.
24755         (mep_reuse_lo_p_1): Likewise.
24756         (mep_reuse_lo_p): Likewise.
24757         (mep_frame_expr): Likewise.
24758         (mep_make_parallel): Likewise for both params.
24759         (mep_use_post_modify_p_1): Likewise for param "set_insn" and
24760         local "insn".
24761         (mep_use_post_modify_p): Likewise for param "insn".
24762         (mep_core_address_length): Likewise.
24763         (mep_cop_address_length): Likewise.
24764         (mep_reg_set_in_function): Likewise for local "insn".
24765         (mep_asm_without_operands_p): Likewise.
24766         (F): Likewise for return type and param "x".
24767         (add_constant): Likewise for local "insn".
24768         (maybe_dead_move): Likewise for return type and local "insn".
24769         (mep_expand_prologue): Likewise for local "insn".
24770         (mep_final_prescan_insn): Likewise for param "insn".
24771         (mep_reorg_regmove): Likewise for param "insns" and locals "insn",
24772         "next", "follow", "x".
24773         (mep_insert_repeat_label_last): Likewise for return type, param
24774         "last_insn", and locals "next", "prev".  Strengthen param "label"
24775         from rtx to rtx_code_label *.
24776         (struct mep_doloop_begin): Strengthen field "insn" from rtx to
24777         rtx_insn *.
24778         (struct mep_doloop_end): Likewise for fields "insn" and
24779         "fallthrough".
24780         (mep_reorg_repeat): Likewise for param "insns" and local "insn".
24781         Strengthen local "repeat_label" from rtx to rtx_code_label *.
24782         (mep_invertable_branch_p): Strengthen param "insn" from rtx to
24783         rtx_insn *.
24784         (mep_invert_branch): Likewise for params "insn" and "after".
24785         (mep_reorg_erepeat): Likewise for param "insns" and locals
24786         "insn", "prev", "new_last", "barrier", "user".  Strengthen local
24787         "l" from rtx to rtx_code_label *.
24788         (mep_jmp_return_reorg): Strengthen param "insns" and local "insn"
24789         from rtx to rtx_insn *.
24790         (mep_reorg_addcombine): Likewise for param "insns" and locals
24791         "i", "n".
24792         (add_sp_insn_p): Likewise for param "insn".
24793         (mep_reorg_noframe): Likewise for param "insns" and locals
24794         "start_frame_insn", "end_frame_insn", "next".
24795         (mep_reorg): Likewise for local "insns".
24796         (mep_store_data_bypass_1): Likewise for param "prev".  Add checked
24797         cast.
24798         (mep_store_data_bypass_p): Likewise for params "prev", "insn".
24799         (mep_mul_hilo_bypass_p): Likewise.
24800         (mep_ipipe_ldc_p): Likewise for param "insn".
24801         (mep_make_bundle): Likewise for return type, param "cop" and local
24802         "insn", splitting out the latter into a new local "seq" for when it
24803         is a SEQUENCE rather than an insn.
24804         (core_insn_p): Likewise for param "insn".
24805         (mep_bundle_insns): Likewise for param "insns" and locals "insn",
24806         "last", "first", "note", "prev", "core_insn".
24808 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24810         * config/m68k/m68k-protos.h (output_btst): Strengthen param 4 from
24811         rtx to rtx_insn *.
24812         (strict_low_part_peephole_ok): Likewise for param 2 "first_insn".
24813         (m68k_final_prescan_insn): Likewise for first param.
24815         * config/m68k/m68k.c (m68k_emit_movem): Likewise for return type.
24816         (m68k_set_frame_related): Likewise for param "insn".
24817         (output_btst): Likewise for param "insn".
24818         (m68k_final_prescan_insn): Likewise.
24819         (m68k_move_to_reg): Likewise for local "insn".
24820         (m68k_call_tls_get_addr): Likewise for local "insns".
24821         (m68k_call_m68k_read_tp): Likewise.
24822         (strict_low_part_peephole_ok): Likewise for param "first_insn".
24823         (m68k_output_mi_thunk): Likewise for local "insn".
24825 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24827         * config/iq2000/iq2000-protos.h (final_prescan_insn): Strengthen
24828         first param from rtx to rtx_insn *.
24829         (iq2000_adjust_insn_length): Likewise.
24830         (iq2000_output_conditional_branch): Likewise.
24831         * config/iq2000/iq2000.c (final_prescan_insn): Likewise for param
24832         "insn" and local "nop_insn".
24833         (iq2000_annotate_frame_insn): Likewise for param "insn".
24834         (iq2000_expand_prologue): Likewise for both locals "insn".
24835         (iq2000_adjust_insn_length): Likewise for param "insn".
24836         (iq2000_output_conditional_branch): Likewise.
24838 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24840         * config/ia64/ia64.c (ia64_expand_tls_address): Strengthen local
24841         "insns" from rtx to rtx_insn *.
24842         (ia64_emit_cond_move): Likewise for locals "insn", "first".
24843         (struct spill_fill_data): Likewise for field "init_after" and for
24844         elements of array field "prev_insn".
24845         (spill_restore_mem): Likewise for locals "insn", "first".
24846         (do_spill): Likewise for local "insn".
24847         (do_restore): Likewise.
24848         (ia64_expand_prologue): Likewise.
24849         (ia64_expand_epilogue): Likewise.
24850         (emit_insn_group_barriers): Likewise for locals "insn",
24851         "last_label".
24852         (emit_all_insn_group_barriers): Likewise for locals "insn",
24853         "last".
24854         (dfa_stop_insn): Likewise for this global.
24855         (dfa_pre_cycle_insn): Likewise.
24856         (ia64_nop): Likewise.
24857         (final_emit_insn_group_barriers): Likewise for locals "insn",
24858         "last".
24859         (emit_predicate_relation_info): Likewise for locals "head", "n",
24860         "insn", "b", "a".
24861         (ia64_reorg): Likewise for local "insn".
24862         (ia64_output_mi_thunk): Likewise.
24863         (expand_vec_perm_interleave_2): Likewise for local "seq".
24865 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24867         * config/i386/i386-protos.h (ix86_avoid_lea_for_add): Strengthen
24868         param 1 "insn" from rtx to rtx_insn *.
24869         (ix86_use_lea_for_mov): Likewise.
24870         (ix86_avoid_lea_for_addr): Likewise.
24871         (ix86_split_lea_for_addr): Likewise.
24872         (ix86_lea_for_add_ok): Likewise.
24873         (ix86_output_call_insn): Likewise.
24875         * config/i386/i386.c (ix86_va_start): Likewise for local "seq".
24876         (ix86_get_drap_rtx): Likewise for locals "seq", "insn".
24877         (ix86_output_function_epilogue): Likewise for locals "insn",
24878         "deleted_debug_label".
24879         (legitimize_tls_address): Likewise for local "insn".
24880         (get_some_local_dynamic_name): Likewise.
24881         (increase_distance): Likewise for params "prev", "next".
24882         (distance_non_agu_define_in_bb): Likewise for params "insn",
24883         "start" and locals "prev", "next".
24884         (distance_non_agu_define): Likewise for param "insn".
24885         (distance_agu_use_in_bb): Likewise for params "insn", "start" and
24886         locals "next", "prev".
24887         (distance_agu_use): Likewise for param "insn".
24888         (ix86_lea_outperforms): Likewise.
24889         (ix86_ok_to_clobber_flags): Likewise.
24890         (ix86_avoid_lea_for_add): Likewise.
24891         (ix86_use_lea_for_mov): Likewise.
24892         (ix86_avoid_lea_for_addr): Likewise.
24893         (find_nearest_reg_def): Likewise, also for locals "prev", "start".
24894         (ix86_split_lea_for_addr): Likewise for param "insn".
24895         (ix86_lea_for_add_ok): Likewise for param "insn".
24896         (ix86_expand_carry_flag_compare): Likewise for local
24897         "compare_seq".
24898         (ix86_expand_int_movcc): Likewise.
24899         (ix86_output_call_insn): Likewise for param "insn".
24900         (ix86_output_call_insn): Likewise for local "i".
24901         (x86_output_mi_thunk): Introduce local "insn", using it in place
24902         of "tmp" when dealing with insns.
24903         (ix86_avoid_jump_mispredicts): Likewise for locals "insn",
24904         "start".
24905         (ix86_pad_returns): Likewise for locals "ret", "prev".
24906         (ix86_count_insn_bb): Likewise for local "insn".
24907         (ix86_pad_short_function): Likewise for locals "ret", "insn".
24908         (ix86_seh_fixup_eh_fallthru): Likewise for locals "insn", "next".
24909         (ix86_vector_duplicate_value): Likewise for local "insn", "seq".
24910         (expand_vec_perm_interleave2): Likewise for local "seq".
24911         (expand_vec_perm_vperm2f128_vblend): Likewise.
24912         (ix86_loop_unroll_adjust): Likewise for local "insn".  Convert
24913         call to for_each_rtx with for_each_rtx_in_insn.
24915 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24917         * config/i386/i386.c (setup_incoming_varargs_64): Strengthen local
24918         "label" from rtx to rtx_code_label *.
24919         (ix86_expand_prologue): Likewise.
24920         (ix86_expand_split_stack_prologue): Likewise for locals "label",
24921         "varargs_label".
24922         (ix86_split_idivmod): Likewise for locals "end_label" and
24923         "qimode_label".
24924         (ix86_expand_branch): Likewise for local "label2".
24925         (ix86_expand_aligntest): Likewise for return type and local "label".
24926         (expand_set_or_movmem_via_loop): Likewise for locals "out_label" and
24927         "top_label".
24928         (expand_movmem_epilogue): Likewise for the various locals named
24929         "label".
24930         (expand_setmem_epilogue): Likewise.
24931         (expand_small_movmem_or_setmem): Likewise for local "label".
24932         (expand_set_or_movmem_prologue_epilogue_by_misaligned_moves):
24933         Strengthen param "done_label" from rtx * to rtx_code_label **.
24934         Strengthen locals "loop_label" and "label" from rtx to
24935         rtx_code_label *.
24936         (expand_set_or_movmem_prologue_epilogue_by_misaligned_moves):
24937         Likewise for locals "loop_label", "label".
24938         (ix86_expand_set_or_movmem): Likewise for locals "label",
24939         "jump_around_label", "hot_label".
24940         (ix86_expand_strlensi_unroll_1): Likewise for locals
24941         "align_2_label", align_3_label", "align_4_label", "end_0_label",
24942         "end_2_label".
24943         (x86_emit_floatuns): Likewise for locals "neglab", "donelab".
24944         (void ix86_emit_i387_log1p): Likewise for locals "label1",
24945         "label2", "jump_label".
24946         (ix86_expand_sse_compare_and_jump): Likewise for return type and
24947         local "label".
24948         (ix86_expand_lfloorceil): Likewise for local "label".
24949         (ix86_expand_rint): Likewise.
24950         (ix86_expand_floorceildf_32): Likewise.
24951         (ix86_expand_floorceil): Likewise.
24952         (ix86_expand_rounddf_32): Likewise.
24953         (ix86_expand_trunc): Likewise.
24954         (ix86_expand_truncdf_32): Likewise.
24955         (ix86_expand_round): Likewise.
24957 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24959         * config/h8300/h8300-protos.h (final_prescan_insn): Strengthen
24960         first param from rtx to rtx_insn *.
24961         (h8300_insn_length_from_table): Likewise.
24962         * config/h8300/h8300.c (F): Likewise for return type and param
24963         "x".
24964         (Fpa): Add a checked cast to rtx_insn *.
24965         (h8300_emit_stack_adjustment): Strengthen local "x" from rtx to
24966         rtx_insn *.
24967         (final_prescan_insn): Likewise for param "insn".
24968         (h8300_binary_length): Likewise.
24969         (h8300_insn_length_from_table): Likewise.
24971 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24973         * config/epiphany/epiphany-protos.h (epiphany_final_prescan_insn):
24974         Strengthen first param "insn" from rtx to rtx_insn *.
24976         * config/epiphany/epiphany.c (epiphany_final_prescan_insn):
24977         Likewise.
24978         (frame_insn): Likewise for return type.  Introduce local "insn"
24979         for use in place of local "x" for use as an rtx_insn *.
24980         (frame_move_insn): Strengthen return type from rtx to rtx_insn *.
24981         (epiphany_expand_prologue): Likewise for local "insn".
24982         * config/epiphany/mode-switch-use.c (insert_uses): Likewise.
24983         * config/epiphany/resolve-sw-modes.c
24984         (pass_resolve_sw_modes::execute): Likewise for locals "insn" and
24985         "seq".
24987 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24989         * config/c6x/c6x-protos.h (c6x_get_unit_specifier): Strengthen
24990         param from rtx to rtx_insn *.
24991         (c6x_final_prescan_insn): Likewise for first param.
24993         * config/c6x/c6x.c (c6x_current_insn): Likewise for this variable.
24994         (c6x_output_mi_thunk): Replace use of NULL_RTX with NULL.
24995         (c6x_expand_compare): Strengthen local "insns" from rtx to
24996         rtx_insn *.
24997         (c6x_get_unit_specifier): Likewise for param "insn".
24998         (c6x_print_unit_specifier_field): Likewise.
24999         (c6x_final_prescan_insn): Likewise.
25000         (emit_add_sp_const): Likewise for local "insn".
25001         (c6x_expand_prologue): Likewise.
25003 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25005         * config/bfin/bfin-protos.h (asm_conditional_branch): Strengthen
25006         param 1 from rtx to rtx_insn *.
25007         * config/bfin/bfin.c (expand_prologue_reg_save): Likewise for
25008         the various locals named "insn".
25009         (expand_epilogue_reg_restore): Likewise.
25010         (frame_related_constant_load): Likewise.
25011         (add_to_reg): Likewise.
25012         (emit_link_insn): Likewise.
25013         (do_link): Likewise.
25014         (expand_interrupt_handler_prologue): Likewise.
25015         (branch_dest): Likewise for param "branch".
25016         (asm_conditional_branch): Likewise for param "insn".
25017         (gen_one_bundle): Likewise for elements of param "slot" and local
25018         "t".
25019         (bfin_gen_bundles): Likewise for locals "insn", "next" and
25020         elements of local "slot".
25021         (reorder_var_tracking_notes): Likewise for locals "insn", "next",
25022         "queue", "next_queue", "prev".
25023         (workaround_rts_anomaly): Likewise for locals "insn", "first_insn".
25024         (add_sched_insns_for_speculation): Likewise for local "insn".
25026 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25028         * config/avr/avr-protos.h (output_movqi): Strengthen first param
25029         from rtx to rtx_insn *.
25030         (output_movhi): Likewise.
25031         (output_movsisf): Likewise.
25032         (avr_out_tstsi): Likewise.
25033         (avr_out_tsthi): Likewise.
25034         (avr_out_tstpsi): Likewise.
25035         (avr_out_compare): Likewise.
25036         (avr_out_compare64): Likewise.
25037         (avr_out_movpsi): Likewise.
25038         (ashlqi3_out): Likewise.
25039         (ashlhi3_out): Likewise.
25040         (ashlsi3_out): Likewise.
25041         (ashrqi3_out): Likewise.
25042         (ashrhi3_out): Likewise.
25043         (ashrsi3_out): Likewise.
25044         (lshrqi3_out): Likewise.
25045         (lshrhi3_out): Likewise.
25046         (lshrsi3_out): Likewise.
25047         (avr_out_ashlpsi3): Likewise.
25048         (avr_out_ashrpsi3): Likewise.
25049         (avr_out_lshrpsi3): Likewise.
25050         (avr_out_fract): Likewise.
25051         (avr_out_sbxx_branch): Likewise.
25052         (avr_out_round): Likewise.
25053         (avr_out_xload): Likewise.
25054         (avr_out_movmem): Likewise.
25055         (adjust_insn_length): Likewise.
25056         (avr_out_lpm): Likewise.
25057         (reg_unused_after): Likewise.
25058         (_reg_unused_after): Likewise.
25059         (avr_jump_mode): Likewise for second param.
25060         (jump_over_one_insn): Likewise for first param.
25061         (avr_final_prescan_insn): Likewise.
25062         (out_shift_with_cnt): Likewise for second param.
25064         * config/avr/avr.c (get_sequence_length): Likewise for param
25065         "insns" and local "insn".
25066         (emit_push_byte): Likewise for local "insn".
25067         (emit_push_sfr): Likewise.
25068         (avr_prologue_setup_frame): Likewise for locals "insn",
25069         "fp_plus_insns", "sp_plus_insns".
25070         (avr_expand_epilogue): Likewise for local "fp_plus_insns",
25071         "sp_plus_insns".
25072         (avr_jump_mode): Likewise for param "insn".
25073         (avr_final_prescan_insn): Likewise.
25074         (avr_find_unused_d_reg): Likewise.
25075         (avr_out_lpm_no_lpmx): Likewise.
25076         (avr_out_lpm): Likewise.
25077         (avr_out_xload): Likewise.
25078         (output_movqi): Likewise.
25079         (output_movhi): Likewise.
25080         (out_movqi_r_mr): Likewise.
25081         (out_movhi_r_mr): Likewise.
25082         (out_movsi_r_mr): Likewise.
25083         (out_movsi_mr_r): Likewise.
25084         (output_movsisf): Likewise.
25085         (avr_out_load_psi): Likewise.
25086         (avr_out_store_psi): Likewise.
25087         (avr_out_movpsi): Likewise.
25088         (out_movqi_mr_r): Likewise.
25089         (avr_out_movhi_mr_r_xmega): Likewise.
25090         (out_movhi_mr_r): Likewise.
25091         (compare_condition): Likewise for param "insn" and local "next".
25092         (compare_sign_p): Likewise for param "insn".
25093         (compare_diff_p): Likewise.
25094         (compare_eq_p): Likewise.
25095         (avr_out_compare): Likewise.
25096         (avr_out_compare64): Likewise.
25097         (avr_out_tsthi): Likewise.
25098         (avr_out_tstpsi): Likewise.
25099         (avr_out_tstsi): Likewise.
25100         (out_shift_with_cnt): Likewise.
25101         (ashlqi3_out): Likewise.
25102         (ashlhi3_out): Likewise.
25103         (avr_out_ashlpsi3): Likewise.
25104         (ashlsi3_out): Likewise.
25105         (ashrqi3_out): Likewise.
25106         (ashrhi3_out): Likewise.
25107         (avr_out_ashrpsi3): Likewise.
25108         (ashrsi3_out): Likewise.
25109         (lshrqi3_out): Likewise.
25110         (lshrhi3_out): Likewise.
25111         (avr_out_lshrpsi3): Likewise.
25112         (lshrsi3_out): Likewise.
25113         (avr_out_fract): Likewise.
25114         (avr_out_round): Likewise.
25115         (avr_adjust_insn_length): Likewise.
25116         (reg_unused_after): Likewise.
25117         (_reg_unused_after): Likewise.
25118         (avr_compare_pattern): Likewise.
25119         (avr_reorg_remove_redundant_compare): Likewise for param "insn1"
25120         and locals "branch1", "branch2", "insn2", "jump".
25121         (avr_reorg): Likewise for local "insn".
25122         (avr_2word_insn_p): Likewise for param "insn".
25123         (jump_over_one_insn_p): Likewise.
25124         (avr_out_sbxx_branch): Likewise.
25125         (avr_out_movmem): Likewise.
25127 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25129         * config/arm/arm-protos.h (arm_final_prescan_insn): Strengthen
25130         param from rtx to rtx_insn *.
25131         (thumb1_final_prescan_insn): Likewise.
25132         (thumb2_final_prescan_insn): Likewise.
25134         * config/arm/arm.c (emit_set_insn): Strengthen return type from
25135         rtx to rtx_insn *.
25136         (struct minipool_node): Likewise for field "insn".
25137         (dump_minipool): Likewise for param "scan".
25138         (create_fix_barrier): Likewise for local "from".  Strengthen local
25139         "label" from rtx to rtx_code_label *.
25140         (push_minipool_barrier): Strengthen param "insn" from rtx to
25141         rtx_insn *.
25142         (push_minipool_fix): Likewise.
25143         (note_invalid_constants): Likewise.
25144         (thumb2_reorg): Likewise for local "insn".
25145         (arm_reorg): Likewise.
25146         (thumb2_final_prescan_insn): Likewise for param
25147         "insn" and local "first_insn".
25148         (arm_final_prescan_insn): Likewise for param "insn" and locals
25149         "start_insn", "this_insn".
25150         (arm_debugger_arg_offset): Likewise for param "insn".
25151         (thumb1_emit_multi_reg_push): Likewise for return type and local
25152         "insn".
25153         (thumb1_final_prescan_insn): Likewise for param "insn".
25154         (thumb_far_jump_used_p): Likewise for local "insn".
25155         (thumb1_expand_prologue): Likewise.
25156         (arm_expand_epilogue_apcs_frame): Likewise.
25157         (arm_expand_epilogue): Likewise for locals "insn", "tmp".
25158         (arm_split_compare_and_swap): Strengthen locals "label1", "label2"
25159         from rtx to rtx_code_label *.
25160         (arm_split_atomic_op): Likewise for local "label".
25161         (arm_emit_coreregs_64bit_shift): Likewise for local "done_label".
25163 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25165         * config/arc/arc-protos.h (arc_final_prescan_insn): Strengthen
25166         first param from rtx to rtx_insn *.
25167         (arc_verify_short): Likewise.
25168         (arc_short_long): Likewise.
25169         (arc_need_delay): Likewise.
25171         * config/arc/arc.c (struct arc_ccfsm): Likewise for field
25172         "target_insn".
25173         (arc_ccfsm_advance): Likewise for param "insn" and locals
25174         "start_insn", "this_insn".
25175         (arc_ccfsm_record_condition): Likewise for local "seq_insn".
25176         (arc_ccfsm_post_advance): Likewise for param "insn".
25177         (arc_next_active_insn): Likewise for return type and param "insn".
25178         Convert NULL_RTX to NULL as appropriate.  Add a checked cast.
25179         (arc_verify_short): Strengthen param "insn" from rtx to rtx_insn *.
25180         (output_short_suffix): Likewise for local "insn".
25181         (arc_final_prescan_insn): Likewise for param "insn".  Remove
25182         now-redundant checked cast.
25183         (arc_reorg): Strengthen locals "insn", "top_label", "lp", "prev",
25184         "lp_simple", "next", "mov", "scan", "link_insn" from rtx to
25185         rtx_insn *.  Add a checked cast.  Introduce local "lc_set_insn"
25186         for use where lc_set became an insn.
25187         (arc_adjust_insn_length): Strengthen locals "prev", "succ" from
25188         rtx to rtx_insn *.
25189         (arc_get_insn_variants): Likewise for local "prev".
25190         (arc_ifcvt): Likewise for locals "insn", "seq", "prev", "pprev",
25191         "next".
25192         (arc_predicate_delay_insns): Likewise for local "insn".
25193         (arc_pad_return): Likewise for local "prev".  For now, add a
25194         checked cast when extracting the insn from "final_sequence".
25195         (arc_short_long): Likewise for param "insn".
25196         (arc_need_delay): Likewise for param "insn" and local "next".
25197         (arc_label_align): Likewise for locals "prev", "next".
25199 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25201         * config/alpha/alpha.c (alpha_emit_set_const): Strengthen local
25202         "insn" from rtx to rtx_insn *.
25203         (alpha_gp_save_rtx): Likewise for local "seq".
25204         (alpha_instantiate_decls): Likewise for local "top".
25205         (get_some_local_dynamic_name): Likewise for local "insn".
25206         (alpha_does_function_need_gp): Likewise.
25207         (set_frame_related_p): Likewise for return type and for locals
25208         "seq" and "insn".
25209         (emit_frame_store_1): Likewise for local "insn".
25210         (alpha_expand_prologue): Likewise for locals "insn", "seq".
25211         (alpha_end_function): Likewise for local "insn".
25212         (alpha_output_mi_thunk_osf): Likewise.
25213         (alphaev4_insn_pipe): Likewise for param "insn".
25214         (alphaev5_insn_pipe): Likewise.
25215         (alphaev4_next_group): Likewise for return type and param 1
25216         "insn".
25217         (alphaev5_next_group): Likewise.
25218         (alpha_align_insns_1): Likewise for return type and param 1 of
25219         callback param "next_group", and for locals "i", "next", "prev",
25220         "where", "where2", "insn".
25222 2014-08-25  Bernd Schmidt  <bernds@codesourcery.com>
25224         * tree-nested.c (finalize_nesting_tree_1): Initialize temporary earlier
25225         rather than modifying the stmt.
25227 2014-08-25  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
25229         * config/rs6000/rs6000.c (rs6000_return_in_msb): Fix fallout from
25230         cgraph_state conversion.
25232 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25234         * config/aarch64/aarch64.c (aarch64_load_symref_appropriately):
25235         Strengthen local "insns" from rtx to rtx_insn *.
25236         (aarch64_set_frame_expr): Likewise for local "insn".
25237         (aarch64_save_or_restore_fprs): Likewise.
25238         (aarch64_save_or_restore_callee_save_registers): Likewise.
25239         (aarch64_expand_prologue): Likewise.
25240         (aarch64_expand_epilogue): Likewise.
25241         (aarch64_output_mi_thunk): Likewise.
25242         (aarch64_split_compare_and_swap): Strengthen locals "label1" and
25243         "label2" from rtx to rtx_code_label *.
25244         (aarch64_split_atomic_op): Likewise for local "label".
25246 2014-08-25  Martin Liska  <mliska@suse.cz>
25248         * cgraph.h (symtab_node):
25249         (bool needed_p (void)): created from decide_is_symbol_needed
25250         (bool referred_to_p (void)): created from referred_to_p
25251         (static cgraph_node *get_for_asmname (tree asmname)):
25252         created from symtab_node_for_asm
25253         * cgraph.h (cgraph_node):
25254         (void assemble_thunks_and_aliases (void)):
25255         created from assemble_thunks_and_aliases
25256         (void expand (void)): created from expand_function
25257         (static void finalize_function (tree, bool)):
25258         created from cgraph_finalize_function
25259         (static cgraph_local_info *local_info (tree decl)):
25260         created from cgraph_local_info
25261         (static cgraph_global_info *global_info (tree)):
25262         created from cgraph_global_info
25263         (static cgraph_rtl_info *rtl_info (tree)): created from cgraph_rtl_info
25264         * cgraph.h (varpool_node):
25265         (static void add (tree decl): created from varpool_add_new_variable
25266         * cgraph.h (cgraph_edge):
25267         void remove (void);
25268         (void remove_caller (void)): created from cgraph_edge_remove_caller
25269         (void remove_callee (void)): created from cgraph_edge_remove_callee
25270         (void set_call_stmt (gimple new_stmt, bool update_speculative = true)):
25271         created from cgraph_set_call_stmt
25272         (void redirect_callee (cgraph_node *n)): created from
25273         cgraph_redirect_edge_callee
25274         (cgraph_edge *make_direct (cgraph_node *callee)): created from
25275         cgraph_make_edge_direct
25276         (cgraph_edge *make_speculative (cgraph_node *n2, gcov_type direct_count,
25277         gimple redirect_call_stmt_to_callee (void)): created from
25278         cgraph_turn_edge_to_speculative
25279         (void speculative_call_info (cgraph_edge *&direct,
25280         cgraph_edge *&indirect, ipa_ref *&reference)): created from
25281         cgraph_speculative_call_info
25282         (cgraph_edge * clone (cgraph_node *n, gimple call_stmt,
25283         unsigned stmt_uid, gcov_type count_scale,
25284         int freq_scale, bool update_original)): created from cgraph_clone_edge
25285         (cgraph_edge *resolve_speculation (tree callee_decl)):
25286         created from cgraph_resolve_speculation
25287         (bool cannot_lead_to_return_p (void)): created from
25288         cannot_lead_to_return_p
25289         (bool recursive_p (void)): created from cgraph_edge_recursive_p
25290         (bool maybe_hot_p (void)): created from cgraph_maybe_hot_edge_p
25291         (static unsigned int rebuild_edges (void)): created from
25292         rebuild_cgraph_edges
25293         (static void rebuild_references (void)): created from
25294         cgraph_rebuild_references
25295         * cgraph.h (symbol_table):
25296         (create_reference): renamed from add_reference
25297         (maybe_create_reference): renamed from maybe_add_reference
25298         (void register_symbol (symtab_node *node)): new function
25299         (void clear_asm_symbols (void)): new function
25300         (void unregister (symtab_node *node)): new function
25301         (void release_symbol (cgraph_node *node, int uid)): new function
25302         (cgraph_node * allocate_cgraph_symbol (void)): new function
25303         (void initialize (void)): created from cgraph_init
25304         (symtab_node *first_symbol (void)):new function
25305         (asm_node *first_asm_symbol (void)):new function
25306         (symtab_node *first_defined_symbol (void)):new function
25307         (varpool_node *first_variable (void)):new function
25308         (varpool_node *next_variable (varpool_node *node)):new function
25309         (varpool_node *first_static_initializer (void)):new function
25310         (varpool_node *next_static_initializer (varpool_node *node)):new
25311         function
25312         (varpool_node *first_defined_variable (void)):new function
25313         (varpool_node *next_defined_variable (varpool_node *node)):new function
25314         (cgraph_node *first_defined_function (void)):new function
25315         (cgraph_node *next_defined_function (cgraph_node *node)):new function
25316         (cgraph_node *first_function (void)):new function
25317         (cgraph_node *next_function (cgraph_node *node)):new function
25318         (cgraph_node *first_function_with_gimple_body (void)):new function
25319         (asm_node *finalize_toplevel_asm (tree asm_str)): created from
25320         add_asm_node
25321         (bool remove_unreachable_nodes (bool before_inlining_p, FILE *file)):
25322         created from symtab_remove_unreachable_nodes
25323         (void remove_unreferenced_decls (void)): created from
25324         varpool_remove_unreferenced_decls
25325         (void process_new_functions (void)): created from
25326         cgraph_process_new_functions
25327         (void process_same_body_aliases (void)): created from
25328         cgraph_process_same_body_aliases
25329         (bool output_variables (void)): created from
25330         varpool_node::output_variables
25331         (void output_asm_statements (void)): created from output_asm_statements
25332         (void finalize_compilation_unit (void)): created from
25333         finalize_compilation_unit
25334         (void compile (void)): created from compile
25335         (void output_weakrefs (void)): created from output_weakrefs
25336         (cgraph_node *create_empty (void)): created from
25337         cgraph_node::create_empty
25338         (cgraph_edge *create_edge (cgraph_node *caller, cgraph_node *callee,
25339         gimple call_stmt, gcov_type count, int freq,
25340         bool indir_unknown_callee)): created from cgraph_node::create_edge
25341         (void free_edge (cgraph_edge *e)): created from cgraph_free_edge
25342         (cgraph_node *next_function_with_gimple_body (cgraph_node *node)):
25343         created from cgraph_next_function_with_gimple_body
25344         (void remove_edge_removal_hook (cgraph_edge_hook_list *)):
25345         created from cgraph_remove_edge_removal_hook
25346         (cgraph_node_hook_list *add_cgraph_removal_hook (cgraph_node_hook,
25347         void *)): created from cgraph_add_node_removal_hook
25348         (void remove_cgraph_removal_hook (cgraph_node_hook_list *)):
25349         created from cgraph_remove_node_removal_hook
25350         (varpool_node_hook_list *add_varpool_removal_hook (varpool_node_hook,
25351         void *)): created from varpool_add_node_removal_hook
25352         (void remove_varpool_removal_hook (varpool_node_hook_list *)):
25353         created from varpool_remove_node_removal_hook
25354         (cgraph_node_hook_list *add_cgraph_insertion_hook (cgraph_node_hook,
25355         void *)): created from cgraph_add_function_insertion_hook
25356         (void remove_cgraph_insertion_hook (cgraph_node_hook_list *)):
25357         created from cgraph_remove_function_insertion_hook
25358         (varpool_node_hook_list *add_varpool_insertion_hook (varpool_node_hook,
25359         void *)): created from varpool_add_variable_insertion_hook
25360         (void remove_varpool_insertion_hook (varpool_node_hook_list *)):
25361           created from varpool_remove_variable_insertion_hook
25362         (cgraph_2edge_hook_list *add_edge_duplication_hook (cgraph_2edge_hook,
25363         void *)): created from cgraph_add_edge_duplication_hook
25364         (void remove_edge_duplication_hook (cgraph_2edge_hook_list *)):
25365         created from cgraph_remove_edge_duplication_hook
25366         (cgraph_2node_hook_list *add_cgraph_duplication_hook (cgraph_2node_hook,
25367         void *)): created from cgraph_add_node_duplication_hook
25368         (void remove_cgraph_duplication_hook (cgraph_2node_hook_list *)):
25369         created from cgraph_remove_node_duplication_hook
25370         (void call_edge_removal_hooks (cgraph_edge *e)):
25371         created from cgraph_call_edge_removal_hooks
25372         (void call_cgraph_insertion_hooks (cgraph_node *node)):
25373         created from call_function_insertion_hooks
25374         (void call_cgraph_removal_hooks (cgraph_node *node)):
25375         created from cgraph_call_node_removal_hooks
25376         (void call_cgraph_duplication_hooks (cgraph_node *node,
25377         cgraph_node *node2)): created from cgraph_node::call_duplication_hooks
25378         (void call_edge_duplication_hooks (cgraph_edge *cs1, cgraph_edge *cs2)):
25379         created from cgraph_call_edge_duplication_hooks
25380         (void call_varpool_removal_hooks (varpool_node *node)):
25381         created from varpool_call_node_removal_hooks
25382         (void call_varpool_insertion_hooks (varpool_node *node)):
25383         created from varpool_call_variable_insertion_hooks
25384         (void insert_to_assembler_name_hash (symtab_node *node,
25385         bool with_clones)): created from insert_to_assembler_name_hash
25386         (void unlink_from_assembler_name_hash (symtab_node *node,
25387         bool with_clones)): created from unlink_from_assembler_name_hash
25388         (void symtab_prevail_in_asm_name_hash (symtab_node *node)):
25389         created from symtab_prevail_in_asm_name_hash
25390         (void symtab_initialize_asm_name_hash (void)):
25391         created from symtab_initialize_asm_name_hash
25392         (void change_decl_assembler_name (tree decl, tree name)):
25393         created from change_decl_assembler_name
25394         (void materialize_all_clones (void)): created from
25395         cgraph_materialize_all_clones
25396         (static hashval_t decl_assembler_name_hash (const_tree asmname)):
25397         created from decl_assembler_name_hash
25398         (static bool decl_assembler_name_equal (tree decl, const_tree asmname)):
25399         created from decl_assembler_name_equal
25400         (static hashval_t hash_node_by_assembler_name (const void *p)):
25401         created from hash_node_by_assembler_name
25402         (static int eq_assembler_name (const void *p1, const void *p2)):
25403         created from eq_assembler_name
25405 2014-08-25  Marek Polacek  <polacek@redhat.com>
25407         * config/i386/i386.md (SWI1248_AVX512BW): Add missing paren.
25409 2014-08-25  Petr Murzin  <petr.murzin@intel.com>
25411         * config/i386/i386.md (SWI1248_AVX512BW): New mode iterator.
25412         (*k<logic><mode>): Add *k<logic>qi and *k<logic>hi and use
25413         SWI1248_AVX512BW mode iterator.
25415 2014-08-25  Kaz Kojima  <kkojima@gcc.gnu.org>
25417         PR target/62111
25418         * config/sh/predicates.md (general_extend_operand): Disable
25419         TRUNCATE before reload completes.
25421 2014-08-24  Gerald Pfeifer  <gerald@pfeifer.com>
25423         * doc/invoke.texi (Optimize Options): Fix markup in two cases.
25425 2014-08-24  Oleg Endo  <olegendo@gcc.gnu.org>
25427         PR target/61996
25428         * config/sh/sh.opt (musermode): Allow negative form.
25429         * config/sh/sh.c (sh_option_override): Disable TARGET_USERMODE for
25430         targets that don't support it.
25431         * doc/invoke.texi (SH Options): Rename sh-*-linux* to sh*-*-linux*.
25432         Document -mno-usermode option.
25434 2014-08-24  Kito Cheng  <kito@0xlab.org>
25436         * system.h (CALLER_SAVE_PROFITABLE): Poison.
25437         * regs.h (CALLER_SAVE_PROFITABLE): Remove.
25438         * doc/tm.texi.in (CALLER_SAVE_PROFITABLE): Remove.
25439         * doc/tm.texi: Regenerate.
25441 2014-08-24  Kito Cheng  <kito@0xlab.org>
25443         * ira.c: Fix typo in comment.
25445 2014-08-23  Edward Smith-Rowland  <3dw4rd@verizon.net>
25447         * doc/invoke.texi: Change c++1y to c++14 and gnu++1y to gnu++14.
25448         Deprecate c++1y. Change language to reflect greater confidence in C++14.
25450 2014-08-23  John David Anglin  <danglin@gcc.gnu.org>
25452         PR target/62038
25453         * config/pa/pa.c (pa_output_function_epilogue): Don't set
25454         last_address when the current function is a thunk.
25455         (pa_asm_output_mi_thunk): When we don't have named sections or they
25456         are not being used, check that thunk can reach the stub table with a
25457         short branch.
25459 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25461         * web.c (union_match_dups): Strengthen param "insn" from rtx to
25462         rtx_insn *.
25463         (pass_web::execute): Likewise for local "insn".
25465 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25467         * var-tracking.c (struct micro_operation_def): Strengthen field
25468         "insn" from rtx to rtx_insn *.
25469         (struct emit_note_data_def): Likewise.
25470         (insn_stack_adjust_offset_pre_post): Likewise for param "insn".
25471         (vt_stack_adjustments): Likewise for local "insn".
25472         (adjust_insn): Likewise for param "insn".
25473         (val_store): Likewise.
25474         (val_resolve): Likewise.
25475         (struct count_use_info): Likewise for field "insn".
25476         (log_op_type): Likewise for param "insn".
25477         (reverse_op): Likewise.
25478         (prepare_call_arguments): Likewise.
25479         (add_with_sets):  The initial param takes an insn, but we can't
25480         yet strengthen it from rtx to rtx_insn * since it's used as a
25481         cselib_record_sets_hook callback.  For now rename initial param
25482         from "insn" to "uncast_insn", and introduce a local "insn" of
25483         the stronger rtx_insn * type, with a checked cast.
25484         (compute_bb_dataflow): Strengthen local "insn" from rtx to
25485         rtx_insn *.
25486         (emit_note_insn_var_location): Likewise.
25487         (emit_notes_for_changes): Likewise.
25488         (emit_notes_for_differences): Likewise.
25489         (next_non_note_insn_var_location): Likewise for return type and
25490         for param "insn".
25491         (emit_notes_in_bb): Likewise for locals "insn" and "next_insn".
25492         (vt_initialize): Likewise for local "insn".
25493         (delete_debug_insns): Likewise for locals "insn" and "next".
25495 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25497         * varasm.c (mark_constants): Strengthen param "insn" from rtx to
25498         rtx_insn *.
25499         (mark_constant_pool): Likewise for local "insn".
25501 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25503         * valtrack.c (dead_debug_reset_uses): Strengthen local "insn" from
25504         rtx to rtx_insn *.
25505         (dead_debug_promote_uses): Likewise.
25506         (dead_debug_insert_temp): Likewise.
25508 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25510         * store-motion.c (store_killed_in_insn): Strengthen param "insn"
25511         from const_rtx to const rtx_insn *.
25512         (store_killed_after): Likewise.  Strengthen locals "last", "act"
25513         from rtx to rtx_insn *.
25514         (store_killed_before): Strengthen param "insn" from const_rtx to
25515         const rtx_insn *.  Strengthen local "first" from rtx to rtx_insn *.
25516         (find_moveable_store): Strengthen param "insn" from rtx to
25517         rtx_insn *.
25518         (compute_store_table): Likewise for local "insn".
25519         (insert_insn_start_basic_block): Likewise for param "insn" and
25520         locals "prev", "before", "insn".
25521         (insert_store): For now, add a checked cast to rtx_insn * on the
25522         result of gen_move_insn.
25523         (remove_reachable_equiv_notes): Strengthen local "insn" from rtx
25524         to rtx_insn *.
25525         (replace_store_insn): Likewise.  For now, add a checked cast to
25526         rtx_insn * on the result of gen_move_insn.
25528 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25530         * stmt.c (expand_case): Strengthen local "before_case" from rtx to
25531         rtx_insn *.
25532         (expand_sjlj_dispatch_table): Likewise.
25534 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25536         * stack-ptr-mod.c (pass_stack_ptr_mod::execute): Strengthen local
25537         "insn" from rtx to rtx_insn *.
25539 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25541         * shrink-wrap.h (requires_stack_frame_p): Strengthen param 1
25542         "insn" from rtx to rtx_insn *.
25543         (dup_block_and_redirect): Likewise for param 3 "before".
25545         * shrink-wrap.c (requires_stack_frame_p): Strengthen param "insn"
25546         from rtx to rtx_insn *.
25547         (move_insn_for_shrink_wrap): Likewise.
25548         (prepare_shrink_wrap): Likewise for locals "insn", "curr".
25549         (dup_block_and_redirect): Likewise for param "before" and local
25550         "insn".
25551         (try_shrink_wrapping): Likewise for locals "insn", "insert_point",
25552         "end".
25553         (convert_to_simple_return): Likewise for local "start".
25555         * config/i386/i386.c (ix86_finalize_stack_realign_flags):
25556         Strengthen local "insn" from rtx to rtx_insn *, for use when
25557         invoking requires_stack_frame_p.
25559 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25561         * sel-sched-ir.c (vinsn_copy): Strengthen local "copy" from rtx to
25562         rtx_insn *.
25563         (speculate_expr): Likewise for locals "orig_insn_rtx",
25564         "spec_insn_rtx".
25565         (eq_transformed_insns): Likewise for locals "i1", "i2".
25566         (check_for_new_jump): Likewise for return type and local "end".
25567         (find_new_jump): Likewise for return type and local "jump".
25568         (sel_split_edge): Likewise for local "jump".
25569         (sel_create_recovery_block): Likewise.
25570         (sel_redirect_edge_and_branch_force): Likewise.
25571         (sel_redirect_edge_and_branch): Likewise.
25573 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25575         * sel-sched.c (substitute_reg_in_expr): Strengthen local
25576         "new_insn" from rtx to rtx_insn *.
25577         (create_insn_rtx_with_rhs): Likewise for return type and for local
25578         "insn_rtx".
25579         (create_insn_rtx_with_lhs): Likewise.
25580         (create_speculation_check): Likewise for local "insn_rtx".
25581         (implicit_clobber_conflict_p): Likewise for local "insn".
25582         (get_expr_cost): Likewise.
25583         (emit_bookkeeping_insn): Likewise for local "new_insn_rtx".
25584         (move_cond_jump): Likewise for locals "next", "prev", "link",
25585         "head", "from", "to".
25587 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25589         * sched-rgn.c (is_cfg_nonregular): Strengthen locals "insn" and
25590         "next" from rtx to rtx_insn *.
25591         (find_conditional_protection): Likewise for local "next".
25592         (is_conditionally_protected): Likewise for local "insn1".
25593         (is_pfree): Likewise for locals "insn1", "insn2".
25595 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25597         * sched-int.h (schedule_ebb): Strengthen params "head", "tail"
25598         from rtx to rtx_insn *.
25600         * sched-ebb.c (earliest_block_with_similiar_load): Strengthen
25601         locals "insn1", "insn2" from rtx to rtx_insn *.
25602         (add_deps_for_risky_insns): Likewise for params "head", "tail" and
25603         locals "insn", "prev", "last_jump", "next_tail".
25604         (schedule_ebb): Likewise for params "head", "tail".
25605         (schedule_ebbs): Likewise for locals "tail", "head".
25607         * config/c6x/c6x.c (hwloop_optimize): For now, add a checked cast
25608         to rtx_insn on "last_insn" in one of the invocations of
25609         schedule_ebb.
25611 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25613         * sched-deps.c (maybe_add_or_update_dep_1): Strengthen locals
25614         "elem", "insn" from rtx to rtx_insn *.
25615         (change_spec_dep_to_hard): Likewise.
25616         (get_back_and_forw_lists): Likewise for local "con".
25617         (sd_add_dep): Likewise for locals "elem", "insn".
25618         (sd_resolve_dep): Likewise for locals "pro", "con".
25619         (sd_unresolve_dep): Likewise.
25620         (sd_delete_dep): Likewise.
25621         (chain_to_prev_insn): Likewise for local "pro".
25622         (find_inc): Likewise for locals "pro", "con".
25624 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25626         * rtlanal.c (reg_used_between_p): Strengthen local "insn" from rtx
25627         to rtx_insn *.
25628         (reg_set_between_p): Strengthen local "insn" from const_rtx to
25629         const rtx_insn *.
25630         (modified_between_p): Strengthen local "insn" from rtx to
25631         rtx_insn *.
25632         (remove_reg_equal_equiv_notes_for_regno): Likewise.
25633         (keep_with_call_p): Strengthen local "i2" from const_rtx to
25634         const rtx_insn *.
25636 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25638         * resource.c (next_insn_no_annul): Strengthen local "next" from
25639         rtx to rtx_insn *.
25640         (mark_referenced_resources): Likewise for local "insn".
25642 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25644         * reload.h (struct insn_chain): Strengthen field "insn" from rtx
25645         to rtx_insn *.
25646         (find_reloads): Likewise for param 1.
25647         (subst_reloads): Likewise for sole param.
25648         (find_equiv_reg): Likwise for param 2.
25649         (regno_clobbered_p): Likwise for param 2.
25650         (reload): Likewise for param 1.
25652         * caller-save.c (save_call_clobbered_regs): Strengthen local
25653         "insn" from rtx to rtx_insn *.
25654         (insert_one_insn): Likewise for local "insn".
25656         * reload.c (this_insn): Likewise for this global.
25657         (find_reloads): Likewise for param "insn".
25658         (find_reloads_toplev): Likewise.
25659         (find_reloads_address): Likewise.
25660         (subst_reg_equivs): Likewise.
25661         (update_auto_inc_notes): Likewise.
25662         (find_reloads_address_1): Likewise.
25663         (find_reloads_subreg_address): Likewise.
25664         (subst_reloads): Likewise.
25665         (find_equiv_reg): Likewise, also for local "p".
25666         (regno_clobbered_p): Likewise for param "insn".
25668         * reload1.c (reg_reloaded_insn): Likewise for the elements of this
25669         array.
25670         (spill_reg_store): Likewise for the elements of this array.
25671         (remove_init_insns): Likewise for local "equiv_insn".
25672         (will_delete_init_insn_p): Likewise for param "insn".
25673         (reload): Likewise for param ""first" and local "insn".
25674         (calculate_needs_all_insns): Strengthen local "insn" from rtx to
25675         rtx_insn *.
25676         (calculate_elim_costs_all_insns): Likewise.
25677         (delete_caller_save_insns): Likewise.
25678         (spill_failure): Likewise for param "insn".
25679         (delete_dead_insn): Likewise.
25680         (set_label_offsets): Likewise.
25681         (eliminate_regs_in_insn): Likewise, also for locals "base_insn" and
25682         "prev_insn".
25683         (elimination_costs_in_insn): Likewise for param "insn".
25684         (set_initial_eh_label_offset): Replace use of NULL_RTX with NULL
25685         when referring to an insn.
25686         (set_initial_label_offsets): Likewise.
25687         (set_offsets_for_label): Strengthen param "insn" from rtx to
25688         rtx_insn *.
25689         (init_eliminable_invariants): Likewise for param "first" and local
25690         "insn".
25691         (fixup_eh_region_note): Likewise for param "insn".
25692         (reload_as_needed): Likewise for locals "prev", "insn",
25693         "old_next", "old_prev", "next".
25694         (gen_reload_chain_without_interm_reg_p): Likewise for locals "insn",
25695         "last".
25696         (reload_inheritance_insn): Strengthen elements of this array from
25697         rtx to rtx_insn *.
25698         (failed_reload): Likewise for param "insn".
25699         (choose_reload_regs): Likewise for local "insn".  Replace use of
25700         NULL_RTX with NULL when referring to an insn.
25701         (input_reload_insns): Strengthen elements of this array from rtx
25702         to rtx_insn *.
25703         (other_input_address_reload_insns): Likewise for this global.
25704         (other_input_reload_insns): Likewise for this global.
25705         (input_address_reload_insns): Likwise for the elements of this
25706         array.
25707         (inpaddr_address_reload_insns): Likwise for the elements of this
25708         array.
25709         (output_reload_insns): Likewise for the elements of this array.
25710         (output_address_reload_insns): Likewise for the elements of this
25711         array.
25712         (outaddr_address_reload_insns): Likewise for the elements of this
25713         array.
25714         (operand_reload_insns): Likewise for this global.
25715         (other_operand_reload_insns): Likewise for this global.
25716         (other_output_reload_insns): Likewise for the elements of this
25717         array.
25718         (new_spill_reg_store): Likewise for the elements of this
25719         array.
25720         (emit_input_reload_insns): Likewise for locals "insn", "temp".
25721         Strengthen local "where" from rtx * to rtx_insn **.
25722         (emit_output_reload_insns): Strengthen locals "insn", "p", "next"
25723         from rtx to rtx_insn *.
25724         (do_input_reload): Likewise for local "insn".
25725         (do_output_reload): Likewise for local "insn".
25726         (emit_reload_insns): Likewise for locals "insn" and "store_insn".
25727         (emit_insn_if_valid_for_reload): Likewise for return type and local
25728         "last".  Add checked cast to rtx_insn when returning "insn" since
25729         this has been through emit_insn.
25730         (gen_reload): Strengthen return type and locals "last", "insn", "set"
25731         from rtx to rtx_insn *.  Add checked cast to rtx_insn when
25732         returning "insn" since it's been through
25733         emit_insn_if_valid_for_reload at this point.
25734         (delete_output_reload): Strengthen param "insn" and locals
25735         "output_reload_insn", "i2" from rtx to rtx_insn *.
25736         (delete_address_reloads): Likewise for params "dead_insn",
25737         "current_insn" and locals "prev", "next".
25738         (delete_address_reloads_1): Likewise for params "dead_insn",
25739         "current_insn" and locals "prev", "i2".
25740         (inc_for_reload): Likewise for locals "last", "add_insn".
25741         (add_auto_inc_notes): Strengthen param "insn" from rtx to
25742         rtx_insn *.
25744         * config/arc/arc-protos.h (regno_clobbered_p): Likewise for 2nd
25745         param of this duplicate of the prototype from reload.h
25747 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25749         * regstat.c (regstat_bb_compute_ri): Strengthen local "insn" from
25750         rtx to rtx_insn *.
25751         (regstat_bb_compute_calls_crossed): Likewise.
25753 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25755         * regrename.c (create_new_chain): Strengthen param "insn" from rtx
25756         to rtx_insn *.
25757         (init_rename_info): Replace use of NULL_RTX with NULL when dealing
25758         with an insn.
25759         (regrename_analyze): Strengthen local "insn" from rtx to
25760         rtx_insn *.
25761         (scan_rtx_reg): Likewise for param "insn".
25762         (scan_rtx_address): Likewise.
25763         (scan_rtx): Likewise.
25764         (restore_operands): Likewise.
25765         (record_out_operands): Likewise.
25766         (build_def_use): Likewise for local "insn".  Replace use of
25767         NULL_RTX with NULL when dealing with an insn.
25769 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25771         * rtl.h (reg_scan): Strengthen param "f" from rtx to rtx_insn *.
25772         * reginfo.c (reg_scan): Likewise, also for local "insn".
25773         (reg_scan_mark_refs): Likewise for param "insn".
25774         (init_subregs_of_mode): Likewise for local "insn".
25776 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25778         * regcprop.c (struct queued_debug_insn_change): Strengthen field
25779         "insn" from rtx to rtx_insn *.
25780         (replace_oldest_value_reg): Likewise for param "insn".
25781         (replace_oldest_value_addr): Likewise.
25782         (replace_oldest_value_mem): Likewise.
25783         (apply_debug_insn_changes): Likewise for local "last_insn".
25784         (copyprop_hardreg_forward_1): Likewise for local "insn".
25786 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25788         * reg-stack.c (next_flags_user): Strengthen return type and param
25789         "insn" from rtx to rtx_insn *.
25790         (straighten_stack): Likewise for param "insn".
25791         (check_asm_stack_operands): Likewise.
25792         (remove_regno_note): Likewise.
25793         (emit_pop_insn): Likewise for return type, param "insn", local
25794         "pop_insn".
25795         (emit_swap_insn):  Strengthen param "insn" and locals "i1", "tmp",
25796         "limit" from rtx to rtx_insn *.
25797         (swap_to_top): Likewise for param "insn".
25798         (move_for_stack_reg): Likewise.
25799         (move_nan_for_stack_reg): Likewise.
25800         (swap_rtx_condition): Likewise.
25801         (compare_for_stack_reg): Likewise.
25802         (subst_all_stack_regs_in_debug_insn): Likewise.
25803         (subst_stack_regs_pat): Likewise, and local "insn2".
25804         (subst_asm_stack_regs): Strengthen param "insn" from rtx to
25805         rtx_insn *.
25806         (subst_stack_regs): Likewise.
25807         (change_stack): Likewise.
25808         (convert_regs_1): Likewise for locals "insn", "next".
25810 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25812         * ree.c (struct ext_cand): Strengthen field "insn" from rtx to
25813         rtx_insn *.
25814         (combine_set_extension): Likewise for param "curr_insn".
25815         (transform_ifelse): Likewise for param "def_insn".
25816         (get_defs): Likewise for param "def_insn".  Strengthen param "dest"
25817         from vec<rtx> * to vec<rtx_insn *> *.
25818         (is_cond_copy_insn): Likewise for param "insn".
25819         (struct ext_state): Strengthen the four vec fields from vec<rtx>
25820         to vec<rtx_insn *>.
25821         (make_defs_and_copies_lists): Strengthen param "extend_insn" and
25822         local "def_insn" from rtx to rtx_insn *.
25823         (get_sub_rtx): Likewise for param "def_insn".
25824         (merge_def_and_ext): Likewise.
25825         (combine_reaching_defs): Likewise.
25826         (add_removable_extension): Likewise for param "insn".
25827         (find_removable_extensions): Likewise for local "insn".
25828         (find_and_remove_re): Likewise for locals "curr_insn" and
25829         "def_insn".  Strengthen locals "reinsn_del_list" and
25830         "reinsn_del_list" from auto_vec<rtx> to auto_vec<rtx_insn *>.
25832 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25834         * recog.c (split_insn): Strengthen param "insn" and locals
25835         "first", "last" from rtx to rtx_insn *.
25836         (split_all_insns): Likewise for locals "insn", "next".
25837         (split_all_insns_noflow): Likewise.
25839 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25841         * rtl.h (debug_rtx_list): Strengthen param 1 "x" from const_rtx to
25842         const rtx_insn *.
25843         (debug_rtx_range): Likewise for params 1 and 2 "start" and "end".
25844         (debug_rtx_find): Likewise for param 1 "x".
25846         * print-rtl.c (debug_rtx_list): Strengthen param 1 "x" from
25847         const_rtx to const rtx_insn *.  Likewise for local "insn".
25848         (debug_rtx_range): Likewise for params 1 and 2 "start" and "end".
25849         (debug_rtx_find): Likewise for param 1 "x".
25850         (print_rtl): Likewise for local "tmp_rtx", adding a checked cast
25851         from const_rtx to const rtx_insn * within the appropriate cases of
25852         the switch statement.
25854         * config/rs6000/rs6000.c (rs6000_debug_legitimize_address):
25855         Strengthen local "insns" from rtx to rtx_insn * since this is
25856         passed to a call to debug_rtx_list.
25858 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25860         * predict.h (predict_insn_def): Strengthen param "insn" from rtx
25861         to rtx_insn *.
25863         * function.c (stack_protect_epilogue): Add checked cast to
25864         rtx_insn for now when invoking predict_insn_def.
25866         * predict.c (predict_insn): Strengthen param "insn" from rtx to
25867         rtx_insn *.
25868         (predict_insn_def): Likewise.
25869         (rtl_predict_edge): Likewise for local "last_insn".
25870         (can_predict_insn_p): Strengthen param "insn" from const_rtx to
25871         const rtx_insn *.
25872         (combine_predictions_for_insn): Strengthen param "insn" from rtx
25873         to rtx_insn *.
25874         (bb_estimate_probability_locally): Likewise for local "last_insn".
25875         (expensive_function_p): Likewise for local "insn".
25877         * config/cris/cris.c (cris_emit_trap_for_misalignment): Likewise for
25878         local "jmp", since this is used when invoking predict_insn_def.
25880 2014-08-22  Marek Polacek  <polacek@redhat.com>
25882         PR c++/62199
25883         * doc/invoke.texi: Update -Wlogical-not-parentheses description.
25885 2014-08-22  Marek Polacek  <polacek@redhat.com>
25887         PR c/61271
25888         * ira-color.c (coalesced_pseudo_reg_slot_compare): Wrap LHS of
25889         a comparison in parens.
25890         * lra-spills.c (pseudo_reg_slot_compare): Wrap LHS of a comparison
25891         in parens.
25893 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25895         * rtl.h (fis_get_condition): Strengthen param "jump" from rtx to
25896         rtx_insn *.
25898         * cprop.c (fis_get_condition): Likewise.
25900         * postreload.c (reload_cse_regs): Likewise for param "first".
25901         (reload_cse_simplify): Likewise for param "insn".
25902         (reload_cse_regs_1): Likewise for local "insn".
25903         (reload_cse_simplify_set): Likewise for param "insn".
25904         (reload_cse_simplify_operands): Likewise.
25905         (struct reg_use): Likewise for field "insn".
25906         (reload_combine_purge_insn_uses): Likewise for param "insn".
25907         (fixup_debug_insns): Likewise for params "from", "to" and local
25908         "insn".
25909         (try_replace_in_use): Likewise for local "use_insn".
25910         (reload_combine_recognize_const_pattern): Likewise for param
25911         "insn" and locals "add_moved_after_insn", "use_insn".
25912         (reload_combine_recognize_pattern): Likewise for param "insn" and
25913         local "prev".
25914         (reload_combine): Likewise for locals "insn", "prev".
25915         (reload_combine_note_use): Likewise for param "insn".
25916         (move2add_use_add2_insn): Likewise.
25917         (move2add_use_add3_insn): Likewise.
25918         (reload_cse_move2add): Likewise, also for local "next".
25919         (move2add_note_store): Likewise for local "insn".
25921 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25923         * postreload-gcse.c (struct occr): Strengthen field "insn" from
25924         rtx to rtx_insn *.
25925         (struct unoccr): Likewise.
25926         (struct modifies_mem): Likewise.
25927         (alloc_mem): Likewise for local "insn".
25928         (insert_expr_in_table): Likewise for param "insn".
25929         (dump_expr_hash_table_entry): Likewise for local "insn".
25930         (oprs_unchanged_p): Likewise for param "insn".
25931         (load_killed_in_block_p): Likewise for local "setter".
25932         (record_last_reg_set_info): Likewise for param "insn".
25933         (record_last_reg_set_info_regno): Likewise.
25934         (record_last_mem_set_info): Likewise.
25935         (record_last_set_info): Likewise for local "last_set_insn".
25936         (record_opr_changes): Likewise for param "insn".
25937         (hash_scan_set): Likewise.
25938         (compute_hash_table): Likewise for local "insn".
25939         (get_avail_load_store_reg): Likewise for param "insn".
25940         (eliminate_partially_redundant_load): Likewise, also for locals
25941         "avail_insn", "next_pred_bb_end".  Replace use of NULL_RTX with
25942         RTX for insns.
25943         (eliminate_partially_redundant_loads): Likewise for local "insn".
25945 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25947         * optabs.c (expand_doubleword_shift): Strengthen local "insn" from
25948         rtx to rtx_insn *.
25949         (expand_binop): Likewise for locals "entry_last", "last", "insns"
25950         (expand_twoval_unop): Likewise for locals entry_last", "last".
25951         (expand_twoval_binop): Likewise.
25952         (expand_twoval_binop_libfunc): Likewise for local "insns".
25953         (widen_leading): Likewise for local "last".
25954         (expand_doubleword_clz): Likewise for local "seq".  Strengthen
25955         locals "hi0_label", "after_label" from rtx to rtx_code_label *.
25956         (widen_bswap): Strengthen local "last" from rtx to rtx_insn *.
25957         (expand_parity): Likewise for locals "last" and "seq".
25958         (expand_ffs): Likewise for local "seq".  Strengthen local
25959         "nonzero_label" from rtx to rtx_code_label *.
25960         (expand_absneg_bit): Strengthen local "insns" from rtx to
25961         rtx_insn *.
25962         (expand_unop_direct): Likewise for local "last".
25963         (expand_unop): Likewise for locals "last", "insns".
25964         (expand_abs_nojump): Likewise for local "last".
25965         (expand_abs): Strengthen local "op1" from rtx to rtx_code_label *.
25966         (expand_one_cmpl_abs_nojump): Strengthen local "last" from rtx to
25967         rtx_insn *.
25968         (expand_copysign_absneg): Strengthen local "label" from rtx to
25969         rtx_code_label *.
25970         (expand_copysign_bit): Strengthen local "insns" from rtx to
25971         rtx_insn *.
25972         (struct no_conflict_data): Likewise for fields "first", "insn".
25973         (emit_libcall_block_1): Likewise for param "insns" and locals
25974         "next", "last", "insn".
25975         (emit_libcall_block): For now, add a checked cast to rtx_insn *
25976         on "insns" when invoking emit_libcall_block_1.  Ultimately we
25977         want to strengthen insns itself.
25978         (prepare_cmp_insn): Strengthen local "last" from rtx to
25979         rtx_insn *.
25980         (emit_cmp_and_jump_insn_1): Likewise for local "insn".
25981         (prepare_float_lib_cmp): Likewise for local "insns".
25982         (emit_conditional_move): Likewise for local "last".
25983         (emit_conditional_add): Likewise.
25984         (have_sub2_insn): Likewise for local "seq".
25985         (expand_float): Likewise for local "insns".  Strengthen locals
25986         "label", "neglabel" from rtx to rtx_code_label *.
25987         (expand_fix): Likewise for locals "last", "insn", "insns" (to
25988         rtx_insn *) and locals "lab1", "lab2" (to rtx_code_label *).
25989         (expand_fixed_convert): Likewise for local "insns" (to
25990         rtx_insn *).
25991         (expand_sfix_optab): Likewise for local "last".
25992         (expand_compare_and_swap_loop): Strengthen local "label" from rtx
25993         to rtx_code_label *.
25994         (maybe_emit_sync_lock_test_and_set): Strengthen local "last_insn"
25995         from rtx to rtx_insn *.
25996         (expand_atomic_fetch_op): Likewise for local "insn".
25997         (maybe_legitimize_operand_same_code): Likewise for local "last".
25998         (maybe_legitimize_operands): Likewise.
26000 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26002         * modulo-sched.c (struct ps_reg_move_info): Strengthen field
26003         "insn" from rtx to rtx_insn *.
26004         (ps_rtl_insn): Likewise for return type.
26005         (doloop_register_get): Likewise for params "head", "tail" and
26006         locals "insn", "first_insn_not_to_check".
26007         (schedule_reg_move): Likewise for local "this_insn".
26008         (schedule_reg_moves): Add a checked cast to rtx_insn * to result
26009         of gen_move_insn for now.
26010         (reset_sched_times): Strengthen local "insn" from rtx to
26011         rtx_insn *.
26012         (permute_partial_schedule): Likewise.
26013         (duplicate_insns_of_cycles): Likewise for local "u_insn".
26014         (dump_insn_location): Likewise for param "insn".
26015         (loop_canon_p): Likewise for local "insn".
26016         (sms_schedule): Likewise.
26017         (print_partial_schedule): Likewise.
26018         (ps_has_conflicts): Likewise.
26020 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26022         * sched-int.h (get_ebb_head_tail): Strengthen params "headp" and
26023         "tailp" from rtx * to rtx_insn **.
26025         * ddg.c (build_intra_loop_deps): Strengthen locals head", "tail"
26026         from rtx to rtx_insn *.
26027         * haifa-sched.c (get_ebb_head_tail): Strengthen params "headp" and
26028         "tailp" from rtx * to rtx_insn **.  Strengthen locals "beg_head",
26029         "beg_tail", "end_head", "end_tail", "note", "next", "prev" from
26030         rtx to rtx_insn *.
26031         * modulo-sched.c (const_iteration_count): Strengthen return type
26032         and locals "insn", "head", "tail" from rtx to rtx_insn *.  Replace
26033         use of NULL_RTX with NULL when working with insns.
26034         (loop_single_full_bb_p): Strengthen locals "head", "tail" from rtx
26035         to rtx_insn *.
26036         (sms_schedule): Likewise.
26037         * sched-rgn.c (init_ready_list): Likewise, also for locals
26038         "src_head" and "src_next_tail".
26039         (compute_block_dependences): Likewise.
26040         (free_block_dependencies): Likewise.
26041         (debug_rgn_dependencies): Likewise.
26042         (free_rgn_deps): Likewise.
26043         (compute_priorities): Likewise.
26044         (schedule_region): Likewise.
26045         * sel-sched.c (find_ebb_boundaries): Likewise.
26047         * config/sh/sh.c (find_insn_regmode_weight): Strengthen locals
26048         "insn", "next_tail", "head", "tail" from rtx to rtx_insn *.
26050 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26052         * mode-switching.c (struct seginfo): Strengthen field "insn_ptr"
26053         from rtx to rtx_insn *.
26054         (new_seginfo): Likewise for param "insn".
26055         (create_pre_exit): Likewise for locals "last_insn",
26056         "before_return_copy", "return_copy".
26057         (optimize_mode_switching): Likewise for locals "insn", "ins_pos",
26058         "mode_set".
26060 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26062         * lra-int.h (struct lra_insn_recog_data): Strengthen field "insn"
26063         from rtx to rtx_insn *.
26064         (lra_push_insn): Likewise for 1st param.
26065         (lra_push_insn_and_update_insn_regno_info): Likewise.
26066         (lra_pop_insn): Likewise for return type.
26067         (lra_invalidate_insn_data): Likewise for 1st param.
26068         (lra_set_insn_deleted): Likewise.
26069         (lra_delete_dead_insn): Likewise.
26070         (lra_process_new_insns): Likewise for first 3 params.
26071         (lra_set_insn_recog_data): Likewise for 1st param.
26072         (lra_update_insn_recog_data): Likewise.
26073         (lra_set_used_insn_alternative): Likewise.
26074         (lra_invalidate_insn_regno_info): Likewise.
26075         (lra_update_insn_regno_info): Likewise.
26076         (lra_former_scratch_operand_p): Likewise.
26077         (lra_eliminate_regs_1): Likewise.
26078         (lra_get_insn_recog_data): Likewise.
26080         * lra-assigns.c (assign_by_spills): Strengthen local "insn" from
26081         rtx to rtx_insn *.
26083         * lra-coalesce.c (move_freq_compare_func): Likewise for locals
26084         "mv1" and "mv2".
26085         (substitute_within_insn): New.
26086         (lra_coalesce): Strengthen locals "mv", "insn", "next" from rtx to
26087         rtx_insn *.  Strengthen sorted_moves from rtx * to rxt_insn **.
26088         Replace call to "substitute" with call to substitute_within_insn.
26090         * lra-constraints.c (curr_insn): Strengthen from rtx to
26091         rtx_insn *.
26092         (get_equiv_with_elimination): Likewise for param "insn".
26093         (match_reload): Strengthen params "before" and "after" from rtx *
26094         to rtx_insn **.
26095         (emit_spill_move): Likewise for return type.  Add a checked cast
26096         to rtx_insn * on result of gen_move_insn for now.
26097         (check_and_process_move): Likewise for local "before".  Replace
26098         NULL_RTX with NULL when referring to insns.
26099         (process_addr_reg): Strengthen params "before" and "after" from
26100         rtx * to rtx_insn **.
26101         (insert_move_for_subreg): Likewise.
26102         (simplify_operand_subreg): Strengthen locals "before" and "after"
26103         from rtx to rtx_insn *.
26104         (process_address_1): Strengthen params "before" and "after" from
26105         rtx * to rtx_insn **.  Strengthen locals "insns", "last_insn" from
26106         rtx to rtx_insn *.
26107         (process_address): Strengthen params "before" and "after" from
26108         rtx * to rtx_insn **.
26109         (emit_inc): Strengthen local "last" from rtx to rtx_insn *.
26110         (curr_insn_transform): Strengthen locals "before" and "after"
26111         from rtx to rtx_insn *.  Replace NULL_RTX with NULL when referring
26112         to insns.
26113         (loc_equivalence_callback): Update cast of "data", changing
26114         resulting type from rtx to rtx_insn *.
26115         (substitute_pseudo_within_insn): New.
26116         (inherit_reload_reg): Strengthen param "insn" from rtx to
26117         rtx_insn *; likewise for local "new_insns".  Replace NULL_RTX with
26118         NULL when referring to insns.  Add a checked cast to rtx_insn *
26119         when using usage_insn to invoke lra_update_insn_regno_info.
26120         (split_reg): Strengthen param "insn" from rtx to rtx_insn *;
26121         likewise for locals "restore", "save".  Add checked casts to
26122         rtx_insn * when using usage_insn to invoke
26123         lra_update_insn_regno_info and lra_process_new_insns.  Replace
26124         NULL_RTX with NULL when referring to insns.
26125         (split_if_necessary): Strengthen param "insn" from rtx to
26126         rtx_insn *.
26127         (update_ebb_live_info): Likewise for params "head", "tail" and local
26128         "prev_insn".
26129         (get_last_insertion_point): Likewise for return type and local "insn".
26130         (get_live_on_other_edges): Likewise for local "last".
26131         (inherit_in_ebb): Likewise for params "head", "tail" and locals
26132         "prev_insn", "next_insn", "restore".
26133         (remove_inheritance_pseudos): Likewise for local "prev_insn".
26134         (undo_optional_reloads): Likewise for local "insn".
26136         * lra-eliminations.c (lra_eliminate_regs_1): Likewise for param
26137         "insn".
26138         (lra_eliminate_regs): Replace NULL_RTX with NULL when referring to
26139         insns.
26140         (eliminate_regs_in_insn): Strengthen param "insn" from rtx to
26141         rtx_insn *.
26142         (spill_pseudos): Likewise for local "insn".
26143         (init_elimination): Likewise.
26144         (process_insn_for_elimination): Likewise for param "insn".
26146         * lra-lives.c (curr_insn): Likewise.;
26148         * lra-spills.c (assign_spill_hard_regs): Likewise for local "insn".
26149         (remove_pseudos): Likewise for param "insn".
26150         (spill_pseudos): Likewise for local "insn".
26151         (lra_final_code_change): Likewise for locals "insn", "curr".
26153         * lra.c (lra_invalidate_insn_data): Likewise for param "insn".
26154         (lra_set_insn_deleted): Likewise.
26155         (lra_delete_dead_insn): Likewise, and for local "prev".
26156         (new_insn_reg): Likewise for param "insn".
26157         (lra_set_insn_recog_data): Likewise.
26158         (lra_update_insn_recog_data): Likewise.
26159         (lra_set_used_insn_alternative): Likewise.
26160         (get_insn_freq): Likewise.
26161         (invalidate_insn_data_regno_info): Likewise.
26162         (lra_invalidate_insn_regno_info): Likewise.
26163         (lra_update_insn_regno_info): Likewise.
26164         (lra_constraint_insn_stack): Strengthen from vec<rtx> to
26165         vec<rtx_insn *>.
26166         (lra_push_insn_1): Strengthen param "insn" from rtx to
26167         rtx_insn *.
26168         (lra_push_insn): Likewise.
26169         (lra_push_insn_and_update_insn_regno_info): Likewise.
26170         (lra_pop_insn): Likewise for return type and local "insn".
26171         (push_insns): Likewise for params "from", "to", and local "insn".
26172         (setup_sp_offset): Likewise for params "from", "last" and locals
26173         "before", "insn".
26174         (lra_process_new_insns): Likewise for params "insn", "before",
26175         "after" and local "last".
26176         (struct sloc): Likewise for field "insn".
26177         (lra_former_scratch_operand_p): Likewise for param "insn".
26178         (remove_scratches): Likewise for locals "insn", "last".
26179         (check_rtl): Likewise for local "insn".
26180         (add_auto_inc_notes): Likewise for param "insn".
26181         (update_inc_notes): Likewise for local "insn".
26182         (lra): Replace NULL_RTX with NULL when referring to insn.
26184 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26186         * lower-subreg.c (simple_move): Strengthen param "insn" from rtx
26187         to rtx_insn *.
26188         (resolve_reg_notes): Likewise.
26189         (resolve_simple_move): Likewise for return type, param "insn", and
26190         locals "insns", "minsn".
26191         (resolve_clobber): Strengthen param "insn" from rtx to rtx_insn *.
26192         (resolve_use): Likewise.
26193         (resolve_debug): Likewise.
26194         (find_decomposable_shift_zext): Likewise.
26195         (resolve_shift_zext): Likewise for return type, param "insn", and
26196         locals "insns", "in".  Eliminate use of NULL_RTX in favor of NULL.
26197         (decompose_multiword_subregs): Likewise for local "insn",
26198         "orig_insn", "decomposed_shift", "end".
26200 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26202         * basic-block.h (basic_block split_edge_and_insert): Strengthen
26203         param "insns" from rtx to rtx_insn *.
26205         * loop-unroll.c (struct iv_to_split): Strengthen field "insn" from
26206         rtx to rtx_insn *.
26207         (struct iv_to_split): Likewise.
26208         (loop_exit_at_end_p): Likewise for local "insn".
26209         (split_edge_and_insert): Likewise for param "insns".
26210         (compare_and_jump_seq): Likewise for return type, param "cinsn",
26211         and locals "seq", "jump".
26212         (unroll_loop_runtime_iterations): Likewise for locals "init_code",
26213         "branch_code"; update invocations of compare_and_jump_seq to
26214         eliminate NULL_RTX in favor of NULL.
26215         (referenced_in_one_insn_in_loop_p): Strengthen local "insn" from
26216         rtx to rtx_insn *.
26217         (reset_debug_uses_in_loop): Likewise.
26218         (analyze_insn_to_expand_var): Likewise for param "insn".
26219         (analyze_iv_to_split_insn): Likewise.
26220         (analyze_insns_in_loop): Likewise for local "insn".
26221         (insert_base_initialization): Likewise for param
26222         "insn" and local "seq".
26223         (split_iv): Likewise for param "insn" and local "seq".
26224         (expand_var_during_unrolling): Likewise for param "insn".
26225         (insert_var_expansion_initialization): Likewise for local "seq".
26226         (combine_var_copies_in_loop_exit): Likewise.
26227         (combine_var_copies_in_loop_exit): Likewise for locals "seq" and
26228         "insn".
26229         (maybe_strip_eq_note_for_split_iv): Likewise for param "insn".
26230         (apply_opt_in_copies): Likewise for locals "insn", "orig_insn",
26231         "next".
26233 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26235         * cfgloop.h (iv_analyze): Strengthen param 1 "insn" from rtx to
26236         rtx_insn *.
26237         (iv_analyze_result): Likewise.
26238         (iv_analyze_expr): Likewise.
26239         (biv_p): Likewise.
26241         * loop-iv.c (iv_get_reaching_def): Strengthen param "insn" and
26242         local "def_insn" from rtx to rtx_insn *.
26243         (get_biv_step_1): Likewise for local "insn".
26244         (iv_analyze_expr): Likewise for param "insn".
26245         (iv_analyze_def): Likewise for local "insn".
26246         (iv_analyze_op): Likewise for param "insn".
26247         (iv_analyze): Likewise.
26248         (iv_analyze_result): Likewise.
26249         (biv_p): Likewise.
26250         (suitable_set_for_replacement): Likewise.
26251         (simplify_using_initial_values): Likewise for local "insn".
26252         (iv_number_of_iterations): Likewise for param "insn".
26253         (check_simple_exit): Add checked cast to rtx_insn when invoking
26254         iv_number_of_iterations for now (until get_condition is
26255         strengthened).
26257         * loop-unroll.c (analyze_iv_to_split_insn): Strengthen param
26258         "insn" from rtx to rtx_insn *.
26259         (analyze_insns_in_loop): Likewise for local "insn".
26261 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26263         * loop-invariant.c (struct use): Strengthen field "insn" from rtx
26264         to rtx_insn *.
26265         (struct invariant): Likewise.
26266         (hash_invariant_expr_1): Likewise for param "insn".
26267         (invariant_expr_equal_p): Likewise for param "insn1", "insn2".
26268         (find_exits): Likewise for local "insn".
26269         (create_new_invariant): Likewise for param "insn".
26270         (check_dependencies): Likewise.
26271         (find_invariant_insn): Likewise.
26272         (record_uses): Likewise.
26273         (find_invariants_insn): Likewise.
26274         (find_invariants_bb): Likewise for local "insn".
26275         (get_pressure_class_and_nregs): Likewise for param "insn".
26276         (calculate_loop_reg_pressure): Likewise for local "insn".
26278 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26280         * loop-doloop.c (doloop_valid_p): Strengthen local "insn" from rtx
26281         to rtx_insn *.
26282         (add_test): Likewise for locals "seq", "jump".
26283         (doloop_modify): Likewise for locals "sequence", "jump_insn".
26285 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26287         * rtl.h (rebuild_jump_labels): Strengthen param "f" from rtx to
26288         rtx_insn *.
26289         (rebuild_jump_labels_chain): Likewise for param "chain".
26291         * cfgexpand.c (pass_expand::execute): Add checked cast to
26292         rtx_insn * when calling rebuild_jump_labels_chain in region where
26293         we know e->insns.r is non-NULL.
26295         * jump.c (rebuild_jump_labels_1): Strengthen param "f" from rtx to
26296         rtx_insn *.
26297         (rebuild_jump_labels): Likewise.
26298         (rebuild_jump_labels_chain): Likewise for param "chain".
26299         (cleanup_barriers): Likewise for locals "insn", "next", "prev".
26300         (init_label_info): Likewise for param "f".
26301         (maybe_propagate_label_ref): Likewise for params "jump_insn",
26302         "prev_nonjump_insn".
26303         (mark_all_labels): Likewise for param "f" and locals "insn",
26304         "prev_nonjump_insn".
26306 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26308         * ira-int.h (struct ira_allocno_copy): Strengthen field "insn"
26309         from rtx to rtx_insn *insn.
26310         (ira_create_copy): Strengthen param "insn" from rtx to rtx_insn *.
26311         (ira_add_allocno_copy): Likewise.
26312         * ira-build.c (find_allocno_copy): Strengthen param "insn" from
26313         rtx to rtx_insn *.
26314         (ira_create_copy): Likewise.
26315         (ira_add_allocno_copy): Likewise.
26316         (create_bb_allocnos): Likewise for local "insn".
26317         * ira-conflicts.c (process_regs_for_copy): Likewise for param "insn".
26318         (process_reg_shuffles): Update NULL_RTX to NULL in invocation of
26319         process_regs_for_copy for rtx_insn * param.
26320         (add_insn_allocno_copies): Strengthen param "insn" from rtx to
26321         rtx_insn *insn.  Update NULL_RTX to NULL in invocation of
26322         process_regs_for_copy for rtx_insn * param.
26323         (add_copies): Strengthen local "insn" from rtx to rtx_insn *insn.
26324         * ira-costs.c (record_reg_classes): Likewise for param "insn".
26325         (record_operand_costs): Likewise.
26326         (scan_one_insn): Likewise for return type, and for param "insn".
26327         (process_bb_for_costs): Likewise for local "insn".
26328         (process_bb_node_for_hard_reg_moves): Likewise.
26329         * ira-emit.c (struct move): Likewise for field "insn".
26330         (create_move): Eliminate use of NULL_RTX when dealing with an
26331         rtx_insn *.
26332         (emit_move_list): Strengthen return type and locals "result",
26333         "insn" from rtx to rtx_insn *insn.
26334         (emit_moves): Likewise for locals "insns", "tmp".
26335         (ira_emit): Likewise for local "insn".
26336         * ira-lives.c (mark_hard_reg_early_clobbers): Likewise for param
26337         "insn".
26338         (find_call_crossed_cheap_reg): Likewise.
26339         (process_bb_node_lives): Likewise for local "insn".
26340         * ira.c (decrease_live_ranges_number): Likewise.
26341         (compute_regs_asm_clobbered): Likewise.
26342         (build_insn_chain): Likewise.
26343         (find_moveable_pseudos): Likewise, also locals "def_insn",
26344         "use_insn", "x".  Also strengthen local "closest_uses" from rtx *
26345         to rtx_insn **.  Add a checked cast when assigning from
26346         "closest_use" into closest_uses array in a region where we know
26347         it's a non-NULL insn.
26348         (interesting_dest_for_shprep): Strengthen param "insn" from rtx
26349         to rtx_insn *.
26350         (split_live_ranges_for_shrink_wrap): Likewise for locals "insn",
26351         "last_interesting_insn", "uin".
26352         (move_unallocated_pseudos): Likewise for locals "def_insn",
26353         "move_insn", "newinsn".
26355 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26357         * internal-fn.c (ubsan_expand_si_overflow_addsub_check):
26358         Strengthen locals "done_label", "do_error" from rtx to
26359         rtx_code_label *.
26360         (ubsan_expand_si_overflow_addsub_check): Strengthen local "last"
26361         from rtx to rtx_insn *.  Strengthen local "sub_check from rtx to
26362         rtx_code_label *.
26363         (ubsan_expand_si_overflow_neg_check): Likewise for locals
26364         "done_label", "do_error" to rtx_code_label * and local  "last" to
26365         rtx_insn *.
26366         (ubsan_expand_si_overflow_mul_check): Likewise for locals
26367         "done_label", "do_error", "large_op0", "small_op0_large_op1",
26368         "one_small_one_large", "both_ops_large", "after_hipart_neg",
26369         "after_lopart_neg", "do_overflow", "hipart_different"  to
26370         rtx_code_label * and local  "last" to rtx_insn *.
26372 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26374         * init-regs.c (initialize_uninitialized_regs): Strengthen locals
26375         "insn" and "move_insn" from rtx to rtx_insn *.
26377 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26379         * ifcvt.c (count_bb_insns): Strengthen local "insn" from rtx to
26380         rtx_insn *.
26381         (cheap_bb_rtx_cost_p): Likewise.
26382         (first_active_insn): Likewise for return type and local "insn".
26383         (last_active_insn):  Likewise for return type and locals "insn",
26384         "head".
26385         (struct noce_if_info): Likewise for fields "jump", "insn_a",
26386         "insn_b".
26387         (end_ifcvt_sequence): Likewise for return type and locals "insn",
26388         "seq".
26389         (noce_try_move): Likewise for local "seq".
26390         (noce_try_store_flag): Likewise.
26391         (noce_try_store_flag_constants): Likewise.
26392         (noce_try_addcc): Likewise.
26393         (noce_try_store_flag_mask): Likewise.
26394         (noce_try_cmove): Likewise.
26395         (noce_try_minmax): Likewise.
26396         (noce_try_abs): Likewise.
26397         (noce_try_sign_mask): Likewise.
26398         (noce_try_bitop): Likewise.
26399         (noce_can_store_speculate_p): Likewise for local "insn".
26400         (noce_process_if_block): Likewise for locals "insn_a", "insn_b",
26401         seq".
26402         (check_cond_move_block): Likewise for local "insn".
26403         (cond_move_convert_if_block): Likewise.
26404         (cond_move_process_if_block): Likewise for locals "seq",
26405         "loc_insn".
26406         (noce_find_if_block): Likewise for local "jump".
26407         (merge_if_block): Likewise for local "last".
26408         (block_jumps_and_fallthru_p): Likewise for locals "insn", "end".
26409         (find_cond_trap): Likewise for locals "trap", "jump", "newjump".
26410         (block_has_only_trap): Likewise for return type and local "trap".
26411         (find_if_case_1): Likewise for local "jump".
26412         (dead_or_predicable): Likewise for locals "head", "end", "jump",
26413         "insn".
26415 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26417         * hw-doloop.h (struct hwloop_info_d): Strengthen fields
26418         "last_insn", "loop_end" from rtx to rtx_insn *.
26420         * hw-doloop.c (scan_loop): Likewise for local "insn".
26421         (discover_loop): Likewise for param "tail_insn".
26422         (discover_loops): Likewise for local "tail".
26424         * config/bfin/bfin.c (hwloop_optimize): For now, add a checked
26425         cast to rtx_insn * when assigning from an rtx local to a
26426         hwloop_info's "last_insn" field.
26428 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26430         * haifa-sched.c (bb_header): Strengthen from rtx * to rtx_insn **.
26431         (add_delay_dependencies): Strengthen local "pro" from rtx to
26432         rtx_insn *.
26433         (recompute_todo_spec): Likewise.
26434         (dep_cost_1): Likewise for locals "insn", "used".
26435         (schedule_insn): Likewise for local "dbg".
26436         (schedule_insn): Likewise for locals "pro", "next".
26437         (unschedule_insns_until): Likewise for local "con".
26438         (restore_pattern): Likewise for local "next".
26439         (estimate_insn_tick): Likewise for local "pro".
26440         (resolve_dependencies): Likewise for local "next".
26441         (fix_inter_tick): Likewise.
26442         (fix_tick_ready): Likewise for local "pro".
26443         (add_to_speculative_block): Likewise for locals "check", "twin",
26444         "pro".
26445         (sched_extend_bb): Likewise for locals "end", "insn".
26446         (init_before_recovery): Likewise for local "x".
26447         (sched_create_recovery_block): Likewise for local "barrier".
26448         (create_check_block_twin): Likewise for local "pro".
26449         (fix_recovery_deps): Likewise for locals "note", "insn", "jump",
26450         "consumer".
26451         (unlink_bb_notes): Update for change to type of bb_header.
26452         Strengthen locals "prev", "label", "note", "next" from rtx to
26453         rtx_insn *.
26454         (clear_priorities): Likewise for local "pro".
26456 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26458         * gcse.c (struct occr): Strengthen field "insn" from rtx to
26459         rtx_insn *.
26460         (test_insn): Likewise for this global.
26461         (oprs_unchanged_p): Strengthen param "insn" from const_rtx to
26462         const rtx_insn *.
26463         (oprs_anticipatable_p): Likewise.
26464         (oprs_available_p): Likewise.
26465         (insert_expr_in_table): Strengthen param "insn" from  rtx to
26466         rtx_insn *.
26467         (hash_scan_set): Likewise.
26468         (hash_scan_clobber): Likewise.
26469         (hash_scan_call): Likewise.
26470         (hash_scan_insn): Likewise.
26471         (compute_hash_table_work): Likewise for local "insn".
26472         (process_insert_insn): Likewise for return type and local "pat".
26473         (insert_insn_end_basic_block): Likewise for locals "new_insn",
26474         "pat", "pat_end", "maybe_cc0_setter".
26475         (pre_edge_insert): Likewise for local "insn".
26476         (pre_insert_copy_insn): Likewise for param "insn".
26477         (pre_insert_copies): Likewise for local "insn".
26478         (struct set_data): Likewise for field "insn".
26479         (single_set_gcse): Likewise for param "insn".
26480         (gcse_emit_move_after): Likewise.
26481         (pre_delete): Likewise for local "insn".
26482         (update_bb_reg_pressure): Likewise for param "from" and local
26483         "insn".
26484         (should_hoist_expr_to_dom): Likewise for param "from".
26485         (hoist_code): Likewise for local "insn".
26486         (get_pressure_class_and_nregs): Likewise for param "insn".
26487         (calculate_bb_reg_pressure): Likewise for local "insn".
26488         (compute_ld_motion_mems): Likewise.
26490 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26492         * genpeep.c (main): Rename param back from "uncast_ins1" to
26493         "ins1", strengthening from rtx to rtx_insn *.  Drop now-redundant
26494         checked cast.
26496         * output.h (peephole): Strengthen param from rtx to rtx_insn *.
26498 2014-08-22  Michael Meissner  <meissner@linux.vnet.ibm.com>
26500         PR target/62195
26501         * doc/md.texi (Machine Constraints): Update PowerPC wi constraint
26502         documentation to state it is only for VSX operations.
26504         * config/rs6000/rs6000.c (rs6000_init_hard_regno_mode_ok): Make wi
26505         constraint only active if VSX.
26507         * config/rs6000/rs6000.md (lfiwax): Use wj constraint instead of
26508         wi cosntraint for ISA 2.07 lxsiwax/lxsiwzx instructions.
26509         (lfiwzx): Likewise.
26511 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26513         * fwprop.c (single_def_use_dom_walker::before_dom_children):
26514         Strengthen local "insn" from rtx to rtx_insn *.
26515         (use_killed_between): Likewise for param "target_insn".
26516         (all_uses_available_at): Likewise for param "target_insn" and
26517         local "next".
26518         (update_df_init): Likewise for params "def_insn", "insn".
26519         (update_df): Likewise for param "insn".
26520         (try_fwprop_subst): Likewise for param "def_insn" and local
26521         "insn".
26522         (free_load_extend): Likewise for param "insn".
26523         (forward_propagate_subreg): Likewise for param "def_insn" and
26524         local "use_insn".
26525         (forward_propagate_asm): Likewise for param "def_insn" and local
26526         "use_insn".
26527         (forward_propagate_and_simplify): Likewise for param "def_insn"
26528         and local "use_insn".
26529         (forward_propagate_into): Likewise for locals "def_insn" and
26530         "use_insn".
26532 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26534         * function.c (emit_initial_value_sets): Strengthen local "seq"
26535         from rtx to rtx_insn *.
26536         (instantiate_virtual_regs_in_insn): Likewise for param "insn" and
26537         local "seq".
26538         (instantiate_virtual_regs): Likewise for local "insn".
26539         (assign_parm_setup_reg): Likewise for locals "linsn", "sinsn".
26540         (reorder_blocks_1): Likewise for param "insns" and local "insn".
26541         (expand_function_end): Likewise for locals "insn" and "seq".
26542         (epilogue_done): Likewise for local "insn".
26543         (thread_prologue_and_epilogue_insns): Likewise for locals "prev",
26544         "last", "trial".
26545         (reposition_prologue_and_epilogue_notes): Likewise for locals
26546         "insn", "last", "note", "first".
26547         (match_asm_constraints_1): Likewise for param "insn" and local "insns".
26548         (pass_match_asm_constraints::execute): Likewise for local "insn".
26550 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26552         * output.h (final_scan_insn): Strengthen return type from rtx to
26553         rtx_insn *.
26554         (final_forward_branch_p): Likewise for param.
26555         (current_output_insn): Likewise for this global.
26557         * final.c (rtx debug_insn): Likewise for this variable.
26558         (current_output_insn): Likewise.
26559         (get_attr_length_1): Rename param "insn" to "uncast_insn",
26560         adding "insn" back in as an rtx_insn * with a checked cast, so
26561         that macro ADJUST_INSN_LENGTH can be passed an rtx_insn * as the
26562         first param.
26563         (compute_alignments): Strengthen local "label" from rtx to
26564         rtx_insn *.
26565         (shorten_branches): Rename param from "first" to "uncast_first",
26566         introducing a new local rtx_insn * "first" using a checked cast to
26567         effectively strengthen "first" from rtx to rtx_insn * without
26568         affecting the type signature.  Strengthen locals "insn", "seq",
26569         "next", "label" from rtx to rtx_insn *.
26570         (change_scope): Strengthen param "orig_insn" and local "insn" from
26571         rtx to rtx_insn *.
26572         (final_start_function): Rename param from "first" to "uncast_first",
26573         introducing a new local rtx_insn * "first" using a checked cast to
26574         effectively strengthen "first" from rtx to rtx_insn * without
26575         affecting the type signature.  Strengthen local "insn" from rtx to
26576         rtx_insn *.
26577         (dump_basic_block_info): Strengthen param "insn" from rtx to
26578         rtx_insn *.
26579         (final): Rename param from "first" to "uncast_first",
26580         introducing a new local rtx_insn * "first" using a checked cast to
26581         effectively strengthen "first" from rtx to rtx_insn * without
26582         affecting the type signature.  Strengthen locals "insn", "next"
26583         from rtx to rtx_insn *.
26584         (output_alternate_entry_point): Strengthen param "insn" from rtx to
26585         rtx_insn *.
26586         (call_from_call_insn): Strengthen param "insn" from rtx to
26587         rtx_call_insn *.
26588         (final_scan_insn): Rename param from "insn" to "uncast_insn",
26589         introducing a new local rtx_insn * "insn" using a checked cast to
26590         effectively strengthen "insn" from rtx to rtx_insn * without
26591         affecting the type signature.  Strengthen return type and locals
26592         "next", "note", "prev", "new_rtx" from rtx to rtx_insn *.  Remove
26593         now-redundant checked cast to rtx_insn * from both invocations of
26594         debug_hooks->var_location.  Convert CALL_P into a dyn_cast,
26595         introducing a local "call_insn" for use when invoking
26596         call_from_call_insn.
26597         (notice_source_line): Strengthen param "insn" from rtx to
26598         rtx_insn *.
26599         (leaf_function_p): Likewise for local "insn".
26600         (final_forward_branch_p): Likewise.
26601         (leaf_renumber_regs): Likewise for param "first".
26602         (rest_of_clean_state): Likewise for locals "insn" and "next".
26603         (self_recursive_call_p): Likewise for param "insn".
26604         (collect_fn_hard_reg_usage): Likewise for local "insn".
26605         (get_call_fndecl): Likewise for param "insn".
26606         (get_call_cgraph_rtl_info): Likewise.
26607         (get_call_reg_set_usage): Rename param from "insn" to "uncast_insn",
26608         introducing a new local rtx_insn * "insn" using a checked cast to
26609         effectively strengthen "insn" from rtx to rtx_insn * without
26610         affecting the type signature.
26612         * config/arc/arc.c (arc_final_prescan_insn): For now, add checked
26613         cast when assigning from param "insn" to current_output_insn.
26614         (arc_pad_return): Strengthen local "insn" from rtx to rtx_insn *
26615         so that we can assign it back to current_output_insn.
26617 2014-08-20  Pitchumani Sivanupandi <pitchumani.s@atmel.com>
26619         * config/avr/avr-mcus.def: Remove atmega26hvg, atmega64rfa2,
26620         atmega48hvf, atxmega32x1, atmxt224, atmxt224e, atmxt336s,
26621         atmxt540s and atmxt540sreva devices.
26622         * config/avr/avr-tables.opt: Regenerate.
26623         * config/avr/t-multilib: Regenerate.
26624         * doc/avr-mmcu.texi: Regenerate.
26626 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26628         * expr.c (convert_move): Strengthen local "insns" from rtx to
26629         rtx_insn *.
26630         (emit_block_move_via_loop): Strengthen locals "cmp_label" and
26631         "top_label" from rtx to rtx_code_label *.
26632         (move_block_to_reg): Strengthen local "insn", "last" from rtx to
26633         rtx_insn *.
26634         (emit_single_push_insn): Likewise for locals "prev", "last".
26635         (store_expr): Strengthen locals "lab1", "lab2", "label" from rtx
26636         to rtx_code_label *.
26637         (store_constructor): Likewise for locals "loop_start", "loop_end".
26638         (expand_cond_expr_using_cmove): Strengthen local "seq" from rtx to
26639         rtx_insn *.
26640         (expand_expr_real_2): Likewise.
26641         (expand_expr_real_1): Strengthen local "label" from rtx to
26642         rtx_code_label *.
26644 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26646         * expmed.c (store_bit_field_using_insv): Strengthen local "last"
26647         from rtx to rtx_insn *.
26648         (store_bit_field_1): Likewise.
26649         (extract_bit_field_1): Likewise.
26650         (expand_mult_const): Likewise for local "insns".
26651         (expmed_mult_highpart): Strengthen local "label" from rtx to
26652         rtx_code_label *.
26653         (expand_smod_pow2): Likewise.
26654         (expand_sdiv_pow2): Likewise.
26655         (expand_divmod): Strengthen locals "last", "insn" from rtx to
26656         rtx_insn *.  Strengthen locals "label", "label1", "label2",
26657         "label3", "label4", "label5", "lab" from rtx to rtx_code_label *.
26658         (emit_cstore): Strengthen local "last" from rtx to rtx_insn *.
26659         (emit_store_flag): Likewise.
26660         (emit_store_flag_force): Strengthen local "label" from rtx to
26661         rtx_code_label *.
26662         (do_cmp_and_jump): Likewise for param "label".
26664 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26666         * explow.c (force_reg): Strengthen local "insn" from rtx to
26667         rtx_insn *.
26668         (adjust_stack_1): Likewise.
26669         (allocate_dynamic_stack_space): Likewise.  Strengthen locals
26670         "final_label", "available_label", "space_available" from rtx to
26671         rtx_code_label *.
26672         (probe_stack_range): Likewise for locals "loop_lab", "end_lab".
26673         (anti_adjust_stack_and_probe): Likewise.
26675 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26677         * except.h (sjlj_emit_function_exit_after): Strengthen param
26678         "after" from rtx to rtx_insn *.  This is only called with
26679         result of get_last_insn (in function.c) so type-change should be
26680         self-contained.
26682         * function.h (struct rtl_eh): Strengthen field "ehr_label" from
26683         rtx to rtx_code_label *, and field "sjlj_exit_after" from rtx
26684         to rtx_insn *.  These fields are only used from except.c so this
26685         type-change should be self-contained to this patch.
26687         * except.c (emit_to_new_bb_before): Strengthen param "seq" and
26688         local "last" from rtx to rtx_insn *.
26689         (dw2_build_landing_pads): Likewise for local "seq".
26690         (sjlj_mark_call_sites): Likewise for locals "insn", "before", p".
26691         (sjlj_emit_function_enter): Strengthen param "dispatch_label" from
26692         rtx to rtx_code_label *.  Strengthen locals "fn_begin", "seq" from
26693         rtx to rtx_insn *.
26694         (sjlj_emit_function_exit_after): Strengthen param "after" from rtx
26695         to rtx_insn *.
26696         (sjlj_emit_function_exit): Likewise for locals "seq", "insn".
26697         (sjlj_emit_dispatch_table): Likewise for locals "seq", "seq2".
26698         (sjlj_build_landing_pads): Replace NULL_RTX with NULL when
26699         referring to an insn.  Strengthen local "dispatch_label" from
26700         rtx to rtx_code_label *.
26701         (set_nothrow_function_flags): Strengthen local "insn" from rtx to
26702         rtx_insn *.
26703         (expand_eh_return): Strengthen local "around_label" from
26704         rtx to rtx_code_label *.
26705         (convert_to_eh_region_ranges): Strengthen locals "iter",
26706         "last_action_insn", "first_no_action_insn",
26707         "first_no_action_insn_before_switch",
26708         "last_no_action_insn_before_switch", from rtx to rtx_insn *.
26710 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26712         * dwarf2out.c (last_var_location_insn): Strengthen this variable
26713         from rtx to rtx_insn *.
26714         (cached_next_real_insn): Likewise.
26715         (dwarf2out_end_epilogue): Replace use of NULL_RTX with NULL when
26716         working with insns.
26717         (dwarf2out_var_location): Strengthen locals "next_real",
26718         "next_note", "expected_next_loc_note", "last_start", "insn" from
26719         rtx to rtx_insn *.
26721 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26723         * dwarf2cfi.c (add_cfis_to_fde): Strengthen locals "insn", "next"
26724         from rtx to rtx_insn *.
26725         (create_pseudo_cfg): Likewise for local "insn".
26727 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26729         * df-core.c (df_bb_regno_first_def_find): Strengthen local "insn"
26730         from rtx to rtx_insn *.
26731         (df_bb_regno_last_def_find): Likewise.
26733         * df-problems.c (df_rd_bb_local_compute): Likewise.
26734         (df_lr_bb_local_compute): Likewise.
26735         (df_live_bb_local_compute): Likewise.
26736         (df_chain_remove_problem): Likewise.
26737         (df_chain_create_bb): Likewise.
26738         (df_word_lr_bb_local_compute): Likewise.
26739         (df_remove_dead_eq_notes): Likewise for param "insn".
26740         (df_note_bb_compute): Likewise for local "insn".
26741         (simulate_backwards_to_point): Likewise.
26742         (df_md_bb_local_compute): Likewise.
26744         * df-scan.c (df_scan_free_bb_info): Likewise.
26745         (df_scan_start_dump): Likewise.
26746         (df_scan_start_block): Likewise.
26747         (df_install_ref_incremental): Likewise for local "insn".
26748         (df_insn_rescan_all): Likewise.
26749         (df_reorganize_refs_by_reg_by_insn): Likewise.
26750         (df_reorganize_refs_by_insn_bb): Likewise.
26751         (df_recompute_luids): Likewise.
26752         (df_bb_refs_record): Likewise.
26753         (df_update_entry_exit_and_calls): Likewise.
26754         (df_bb_verify): Likewise.
26756 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26758         * ddg.h (struct ddg_node): Strengthen fields "insn" and
26759         "first_note" from rtx to rtx_insn *.
26760         (get_node_of_insn): Likewise for param 2 "insn".
26761         (autoinc_var_is_used_p): Likewise for params "def_insn" and "use_insn".
26763         * ddg.c (mem_read_insn_p): Strengthen param "insn" from rtx to
26764         rtx_insn *.
26765         (mem_write_insn_p): Likewise.
26766         (mem_access_insn_p): Likewise.
26767         (autoinc_var_is_used_p): Likewise for params "def_insn" and "use_insn".
26768         (def_has_ccmode_p): Likewise for param "insn".
26769         (add_cross_iteration_register_deps): Likewise for locals
26770         "def_insn" and "use_insn".
26771         (insns_may_alias_p): Likewise for params "insn1" and "insn2".
26772         (build_intra_loop_deps): Likewise for local "src_insn".
26773         (create_ddg): Strengthen locals "insn" and "first_note" from rtx
26774         to rtx_insn *.
26775         (get_node_of_insn): Likewise for param "insn".
26777 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26779         * dce.c (worklist): Strengthen from vec<rtx> to vec<rtx_insn *>.
26780         (deletable_insn_p): Strengthen param "insn" from rtx to
26781         rtx_insn *.  Add checked cast to rtx_call_insn when invoking
26782         find_call_stack_args, since this is guarded by CALL_P (insn).
26783         (marked_insn_p): Strengthen param "insn" from rtx to
26784         rtx_insn *.
26785         (mark_insn): Likewise.  Add checked cast to rtx_call_insn when
26786         invoking find_call_stack_args, since this is guarded by
26787         CALL_P (insn).
26788         (mark_nonreg_stores_1): Strengthen cast of "data" from rtx to
26789         rtx_insn *; we know this is an insn since this was called by
26790         mark_nonreg_stores.
26791         (mark_nonreg_stores_2): Likewise.
26792         (mark_nonreg_stores): Strengthen param "insn" from rtx to
26793         rtx_insn *.
26794         (find_call_stack_args): Strengthen param "call_insn" from rtx to
26795         rtx_call_insn *; strengthen locals "insn" and "prev_insn" from rtx
26796         to rtx_insn *.
26797         (remove_reg_equal_equiv_notes_for_defs): Strengthen param "insn"
26798         from rtx to rtx_insn *.
26799         (reset_unmarked_insns_debug_uses): Likewise for locals "insn",
26800         "next", "ref_insn".
26801         (delete_unmarked_insns): Likewise for locals "insn", "next".
26802         (prescan_insns_for_dce): Likewise for locals "insn", "prev".
26803         (mark_reg_dependencies): Likewise for param "insn".
26804         (rest_of_handle_ud_dce): Likewise for local "insn".
26805         (word_dce_process_block): Likewise.
26806         (dce_process_block): Likewise.
26808 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26810         * cse.c (struct qty_table_elem): Strengthen field "const_insn"
26811         from rtx to rtx_insn *.
26812         (struct change_cc_mode_args): Likewise for field "insn".
26813         (this_insn): Strengthen from rtx to rtx_insn *.
26814         (make_new_qty): Replace use of NULL_RTX with NULL when dealing
26815         with insn.
26816         (validate_canon_reg): Strengthen param "insn" from rtx to
26817         rtx_insn *.
26818         (canon_reg): Likewise.
26819         (fold_rtx): Likewise.  Replace use of NULL_RTX with NULL when
26820         dealing with insn.
26821         (record_jump_equiv): Strengthen param "insn" from rtx to
26822         rtx_insn *.
26823         (try_back_substitute_reg): Likewise, also for locals "prev",
26824         "bb_head".
26825         (find_sets_in_insn): Likewise for param "insn".
26826         (canonicalize_insn): Likewise.
26827         (cse_insn): Likewise.  Add a checked cast.
26828         (invalidate_from_clobbers): Likewise for param "insn".
26829         (invalidate_from_sets_and_clobbers): Likewise.
26830         (cse_process_notes_1): Replace use of NULL_RTX with NULL when
26831         dealing with insn.
26832         (cse_prescan_path): Strengthen local "insn" from rtx to
26833         rtx_insn *.
26834         (cse_extended_basic_block): Likewise for locals "insn" and
26835         "prev_insn".
26836         (cse_main): Likewise for param "f".
26837         (check_for_label_ref): Likewise for local "insn".
26838         (set_live_p): Likewise for second param ("insn").
26839         (insn_live_p): Likewise for first param ("insn") and for local
26840         "next".
26841         (cse_change_cc_mode_insn): Likewise for first param "insn".
26842         (cse_change_cc_mode_insns): Likewise for first and second params
26843         "start" and "end".
26844         (cse_cc_succs): Likewise for locals "insns", "last_insns", "insn"
26845         and "end".
26846         (cse_condition_code_reg): Likewise for locals "last_insn", "insn",
26847         "cc_src_insn".
26849 2014-08-22  Alexander Ivchenko  <alexander.ivchenko@intel.com>
26850             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
26851             Anna Tikhonova  <anna.tikhonova@intel.com>
26852             Ilya Tocar  <ilya.tocar@intel.com>
26853             Andrey Turetskiy  <andrey.turetskiy@intel.com>
26854             Ilya Verbin  <ilya.verbin@intel.com>
26855             Kirill Yukhin  <kirill.yukhin@intel.com>
26856             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
26858         * config/i386/subst.md (define_subst_attr "mask_avx512bw_condition"):
26859         New.
26860         * config/i386/sse.md
26861         (define_mode_iterator VI248_AVX2): Delete.
26862         (define_mode_iterator VI2_AVX2_AVX512BW): New.
26863         (define_mode_iterator VI48_AVX2): Ditto.
26864         (define_insn <shift_insn><mode>3): Delete.
26865         (define_insn "<shift_insn><mode>3<mask_name>" with
26866         VI2_AVX2_AVX512BW): New.
26867         (define_insn "<shift_insn><mode>3<mask_name>" with
26868         VI48_AVX2): Ditto.
26870 2014-08-22  Alexander Ivchenko  <alexander.ivchenko@intel.com>
26871             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
26872             Anna Tikhonova  <anna.tikhonova@intel.com>
26873             Ilya Tocar  <ilya.tocar@intel.com>
26874             Andrey Turetskiy  <andrey.turetskiy@intel.com>
26875             Ilya Verbin  <ilya.verbin@intel.com>
26876             Kirill Yukhin  <kirill.yukhin@intel.com>
26877             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
26879         * config/i386/sse.md
26880         (define_mode_iterator VI4F_BRCST32x2): New.
26881         (define_mode_attr 64x2_mode): Ditto.
26882         (define_mode_attr 32x2mode): Ditto.
26883         (define_insn "<mask_codefor>avx512dq_broadcast<mode><mask_name>"
26884         with VI4F_BRCST32x2): Ditto.
26885         (define_insn "<mask_codefor>avx512vl_broadcast<mode><mask_name>_1"
26886         with V16FI mode iterator): Ditto.
26887         (define_insn "<mask_codefor>avx512dq_broadcast<mode><mask_name>_1"
26888         with V16FI): Ditto.
26889         (define_insn "<mask_codefor>avx512dq_broadcast<mode><mask_name>_1"
26890         with VI8F_BRCST64x2): Ditto.
26892 2014-08-22  Alexander Ivchenko  <alexander.ivchenko@intel.com>
26893             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
26894             Anna Tikhonova  <anna.tikhonova@intel.com>
26895             Ilya Tocar  <ilya.tocar@intel.com>
26896             Andrey Turetskiy  <andrey.turetskiy@intel.com>
26897             Ilya Verbin  <ilya.verbin@intel.com>
26898             Kirill Yukhin  <kirill.yukhin@intel.com>
26899             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
26901         * config/i386/sse.md
26902         (define_mode_iterator VI8_AVX512VL): New.
26903         (define_insn "avx512cd_maskb_vec_dup<mode>"): Macroize.
26905 2014-08-22  Kirill Yukhin  <kirill.yukhin@intel.com>
26907         * gcc/config/i386/sse.md (define_mode_iterator V_AVX512VL): Delete.
26908         (define_mode_iterator V48_AVX512VL): New.
26909         (define_mode_iterator V12_AVX512VL): Ditto.
26910         (define_insn <avx512>_load<mode>_mask): Split into two similar
26911         patterns which use different mode iterators: V48_AVX512VL V12_AVX512VL.
26912         Refactor output template.
26913         (define_insn "<avx512>_store<mode>_mask"): Ditto.
26915 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26917         * cprop.c (struct occr): Strengthen field "insn" from rtx to
26918         rtx_insn *.
26919         (reg_available_p): Likewise for param "insn".
26920         (insert_set_in_table): Likewise.
26921         (hash_scan_set): Likewise.
26922         (hash_scan_insn): Likewise.
26923         (make_set_regs_unavailable): Likewise.
26924         (compute_hash_table_work): Likewise for local "insn".
26925         (reg_not_set_p): Strengthen param "insn" from const_rtx to
26926         const rtx_insn *.
26927         (mark_oprs_set): Strengthen param "insn" from rtx to rtx_insn *.
26928         (try_replace_reg): Likewise.
26929         (find_avail_set): Likewise.
26930         (cprop_jump): Likewise for params "setcc", "jump".
26931         (constprop_register): Likewise for param "insn".
26932         (cprop_insn): Likewise.
26933         (do_local_cprop): Likewise.
26934         (local_cprop_pass): Likewise for local "insn".
26935         (bypass_block): Likewise for params "setcc" and "jump".
26936         (bypass_conditional_jumps): Likewise for locals "setcc" and
26937         "insn".
26938         (one_cprop_pass): Likewise for local "insn".
26940 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26942         * compare-elim.c (struct comparison_use): Strengthen field "insn"
26943         from rtx to rtx_insn *.
26944         (struct comparison): Likewise, also for field "prev_clobber".
26945         (conforming_compare): Likewise for param "insn".
26946         (arithmetic_flags_clobber_p): Likewise.
26947         (find_flags_uses_in_insn): Likewise.
26948         (find_comparison_dom_walker::before_dom_children): Likewise for
26949         locals "insn", "next", "last_clobber".
26950         (try_eliminate_compare): Likewise for locals "insn", "bb_head".
26952 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26954         * combine-stack-adj.c (struct csa_reflist): Strengthen field
26955         "insn" from rtx to rtx_insn *.
26956         (single_set_for_csa): Likewise for param "insn".
26957         (record_one_stack_ref): Likewise.
26958         (try_apply_stack_adjustment): Likewise.
26959         (struct record_stack_refs_data): Likewise for field "insn".
26960         (maybe_move_args_size_note): Likewise for params "last" and "insn".
26961         (prev_active_insn_bb): Likewise for return type and param "insn".
26962         (next_active_insn_bb): Likewise.
26963         (force_move_args_size_note): Likewise for params "prev" and "last"
26964         and locals "test", "next_candidate", "prev_candidate".
26965         (combine_stack_adjustments_for_block): Strengthen locals
26966         "last_sp_set", "last2_sp_set", "insn", "next" from rtx to
26967         rtx_insn *.
26969 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
26971         * combine.c (i2mod): Strengthen this variable from rtx to rtx_insn *.
26972         (struct reg_stat_struct): Likewise for fields "last_death", "last_set".
26973         (subst_insn): Likewise for this variable.
26974         (added_links_insn): Likewise.
26975         (struct insn_link): Likewise for field "insn".
26976         (alloc_insn_link): Likewise for param "insn".
26977         (struct undobuf): Likewise for field "other_insn".
26978         (find_single_use): Likewise for param "insn" and local "next".
26979         (combine_validate_cost): Likewise for params "i0", "i1", "i2", "i3".
26980         (delete_noop_moves): Likewise for locals "insn", "next".
26981         (create_log_links): Likewise for locals "insn", "use_insn".
26982         Strengthen local "next_use" from rtx * to rtx_insn **.
26983         (insn_a_feeds_b): Likewise for params "a", "b".
26984         (combine_instructions): Likewise for param "f" and locals "insn",
26985         "next", "prev", "first", "last_combined_insn", "link", "link1",
26986         "temp".  Replace use of NULL_RTX with NULL when referring to
26987         insns.
26988         (setup_incoming_promotions): Likewise for param "first"
26989         (set_nonzero_bits_and_sign_copies): Likewise for local "insn".
26990         (can_combine_p): Likewise for params "insn", "i3", "pred",
26991         "pred2", "succ", "succ2" and for local "p".
26992         (combinable_i3pat): Likewise for param "i3".
26993         (cant_combine_insn_p): Likewise for param "insn".
26994         (likely_spilled_retval_p): Likewise.
26995         (adjust_for_new_dest): Likewise.
26996         (update_cfg_for_uncondjump): Likewise, also for local "insn".
26997         (try_combine): Likewise for return type and for params "i3", "i2",
26998         "i1", "i0", "last_combined_insn", and for locals "insn",
26999         "cc_use_insn", "p", "first", "last", "i2_insn", "i1_insn",
27000         "i0_insn".  Eliminate local "tem" in favor of new locals
27001         "tem_note" and "tem_insn", the latter being an rtx_insn *.  Add a
27002         checked cast for now to rtx_insn * on the return type of
27003         gen_rtx_INSN.  Replace use of NULL_RTX with NULL when referring to
27004         insns.
27005         (find_split_point): Strengthen param "insn" from rtx to
27006         rtx_insn *.
27007         (simplify_set): Likewise for local "other_insn".
27008         (recog_for_combine): Likewise for param "insn".
27009         (record_value_for_reg): Likewise.
27010         (record_dead_and_set_regs_1): Likewise for local
27011         "record_dead_insn".
27012         (record_dead_and_set_regs): Likewise for param "insn".
27013         (record_promoted_value): Likewise.
27014         (check_promoted_subreg): Likewise.
27015         (get_last_value_validate): Likewise.
27016         (reg_dead_at_p): Likewise.
27017         (move_deaths): Likewise for param "to_insn".
27018         (distribute_notes): Likewise for params "from_insn", "i3", "i2"
27019         and locals "place", "place2", "cc0_setter".  Eliminate local "tem
27020         in favor of new locals "tem_note" and "tem_insn", the latter being
27021         an rtx_insn *.
27022         (distribute_links): Strengthen locals "place", "insn" from rtx to
27023         rtx_insn *.
27025 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27027         * cfgrtl.c (can_delete_note_p): Require a const rtx_note * rather
27028         than a const_rtx.
27029         (can_delete_label_p): Require a const rtx_code_label * rather than
27030         a const_rtx.
27031         (delete_insn): Add checked cast to rtx_code_label * when we know
27032         we're dealing with LABEL_P (insn).  Strengthen local "bb_note" from
27033         rtx to rtx_insn *.
27034         (delete_insn_chain): Strengthen locals "prev" and "current" from
27035         rtx to rtx_insn *.  Add a checked cast when assigning from
27036         "finish" (strengthening the params will come later).  Add a
27037         checked cast to rtx_note * in region where we know
27038         NOTE_P (current).
27039         (rtl_delete_block): Strengthen locals "insn" and "end" from rtx to
27040         rtx_insn *.
27041         (compute_bb_for_insn): Likewise.
27042         (free_bb_for_insn): Likewise for local "insn".
27043         (compute_bb_for_insn): Likewise.
27044         (update_bb_for_insn_chain): Strengthen params "begin", "end" and
27045         local "insn" from rtx to rtx_insn *
27046         (flow_active_insn_p): Require a const rtx_insn * rather than a
27047         const_rtx.
27048         (contains_no_active_insn_p): Strengthen local "insn" from rtx to
27049         rtx_insn *.
27050         (can_fallthru): Likewise for locals "insn" and "insn2".
27051         (bb_note): Likewise for local "note".
27052         (first_insn_after_basic_block_note): Likewise for local "note" and
27053         for return type.
27054         (rtl_split_block): Likewise for locals "insn" and "next".
27055         (unique_locus_on_edge_between_p): Likewise for locals "insn" and
27056         "end".
27057         (rtl_merge_blocks): Likewise for locals "b_head", "b_end",
27058         "a_end", "del_first", "del_last", "b_debug_start", "b_debug_end",
27059         "prev", "tmp".
27060         (try_redirect_by_replacing_jump): Likewise for locals "insn" (both of
27061         them), "kill_from", "barrier", "new_insn".
27062         (patch_jump_insn): Likewise for params "insn", "old_label".
27063         (redirect_branch_edge): Likewise for locals "old_label", "insn".
27064         (force_nonfallthru_and_redirect): Likewise for locals "insn",
27065         "old_label", "new_label".
27066         (rtl_tidy_fallthru_edge): Likewise for local "q".
27067         (rtl_split_edge): Likewise for locals "before", "last".
27068         (commit_one_edge_insertion): Likewise for locals "before",
27069         "after", "insns", "tmp", "last", adding a checked cast where
27070         currently necessary.
27071         (commit_edge_insertions): Likewise.
27072         (rtl_dump_bb): Likewise for locals "insn", "last".
27073         (print_rtl_with_bb): Likewise for local "x".
27074         (rtl_verify_bb_insns): Likewise for local "x".
27075         (rtl_verify_bb_pointers): Likewise for local "insn".
27076         (rtl_verify_bb_insn_chain): Likewise for locals "x", "last_head",
27077         "head", "end".
27078         (rtl_verify_fallthru): Likewise for local "insn".
27079         (rtl_verify_bb_layout): Likewise for locals "x" and "rtx_first".
27080         (purge_dead_edges): Likewise for local "insn".
27081         (fixup_abnormal_edges): Likewise for locals "insn", "stop", "next".
27082         (skip_insns_after_block): Likewise for return type and for locals
27083         "insn", "last_insn", "next_head", "prev".
27084         (record_effective_endpoints): Likewise for locals "next_insn",
27085         "insn", "end".
27086         (fixup_reorder_chain): Likewise for locals "bb_end_insn" and "end".
27087         (verify_insn_chain): Likewise for locals "x", "prevx", "nextx".
27088         (cfg_layout_can_duplicate_bb_p): Likewise for local "insn".
27089         (duplicate_insn_chain): For now, add checked cast from rtx to
27090         rtx_insn * when returning insn.
27091         (cfg_layout_duplicate_bb): Likewise for local "insn".
27092         (cfg_layout_delete_block): Likewise for locals "insn", "next",
27093         "prev", "remaints".
27094         (cfg_layout_merge_blocks): Likewise for local "insn", "last".
27095         (rtl_block_empty_p): Likewise.
27096         (rtl_split_block_before_cond_jump): Likewise for locals "insn",
27097         "split_point", "last".
27098         (rtl_block_ends_with_call_p): Likewise for local "insn".
27099         (need_fake_edge_p): Strengthen param "insn" from const_rtx to
27100         const rtx_insn *.
27101         (rtl_flow_call_edges_add): Strengthen locals "insn", "prev_insn",
27102         "split_at_insn" from rtx to rtx_insn *.
27103         (rtl_lv_add_condition_to_bb): Likewise for locals "seq", "jump".
27104         (rtl_can_remove_branch_p): Strengthen local "insn" from const_rtx
27105         to const rtx_insn *.
27106         (rtl_account_profile_record): Likewise.
27108 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27110         * cfgloopanal.c (num_loop_insns): Strengthen local "insn" from
27111         rtx to rtx_insn *.
27112         (average_num_loop_insns): Likewise.
27113         (init_set_costs): Likewise for local "seq".
27114         (seq_cost): Likewise for param "seq", from const_rtx to const
27115         rtx_insn *.
27117 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27119         * cfgloop.c (loop_exits_from_bb_p): Strengthen local "insn" from
27120         rtx to rtx_insn *.
27122 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27124         * basic-block.h (flow_find_cross_jump): Strengthen params 3 and 4
27125         "f1" and "f2" from rtx * to rtx_insn **.
27126         (flow_find_head_matching_sequence): Likewise.
27128         * cfgcleanup.c (try_simplify_condjump): Strengthen local
27129         "cbranch_insn" from rtx to rtx_insn *.
27130         (thread_jump): Likewise for local "insn".
27131         (try_forward_edges): Likewise for local "last".
27132         (merge_blocks_move_predecessor_nojumps): Likewise for local "barrier".
27133         (merge_blocks_move_successor_nojumps): Likewise for locals "barrier",
27134         "real_b_end".
27135         (can_replace_by): Likewise for params "i1", "i2".
27136         (old_insns_match_p): Likewise.
27137         (merge_notes): Likewise.
27138         (walk_to_nondebug_insn): Likewise for param "i1".
27139         (flow_find_cross_jump): Strengthen params "f1" and "f2" from rtx *
27140         to rtx_insn **.  Strengthen locals "i1", "i2", "last1", "last2",
27141         "afterlast1", "afterlast2" from rtx to rtx_insn *.
27142         (flow_find_head_matching_sequence): Strengthen params "f1" and
27143         "f2" from rtx * to rtx_insn **.  Strengthen locals "i1", "i2",
27144         "last1", "last2", "beforelast1", "beforelast2" from rtx to
27145         rtx_insn *.
27146         (outgoing_edges_match): Likewise for locals "last1", "last2".
27147         (try_crossjump_to_edge): Likewise for local "insn".
27148         Replace call to for_each_rtx with for_each_rtx_in_insn.
27150         (try_crossjump_to_edge): Likewise for locals "newpos1", "newpos2".
27151         (try_head_merge_bb): Likewise for locals "e0_last_head_, "jump",
27152         "e0_last", "e_last", "head", "curr", "insn".  Strengthen locals
27153         "headptr", "currptr", "nextptr" from rtx * to rtx_insn **.
27154         (try_optimize_cfg): Strengthen local "last" from rtx to
27155         rtx_insn *.
27156         (delete_dead_jumptables): Likewise for locals "insn", "next",
27157         "label".
27159         * ifcvt.c (cond_exec_process_if_block): Likewise for locals
27160         "rtx then_last_head", "rtx else_last_head", "rtx then_first_tail",
27161         "rtx else_first_tail", to reflect the basic-block.h changes above.
27163 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27165         * cfgbuild.c (make_edges): Strengthen local "insn" from rtx to
27166         rtx_insn *.
27167         (purge_dead_tablejump_edges): Likewise.
27168         (find_bb_boundaries): Likewise for locals "insn", "end",
27169         "flow_transfer_insn".
27171 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27173         * caller-save.c (save_call_clobbered_regs): Strengthen locals
27174         "ins" and "prev" from rtx to rtx_insn *.
27176 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27178         * calls.c (emit_call_1): Strengthen local "call_insn" from rtx to
27179         rtx_insn *.
27180         (internal_arg_pointer_exp_state): Likewise for field "scan_start".
27181         (internal_arg_pointer_based_exp_scan): Likewise for locals "insn",
27182         "scan_start".
27183         (load_register_parameters): Likewise for local "before_arg".
27184         (check_sibcall_argument_overlap): Likewise for param "insn".
27185         (expand_call): Likewise for locals "normal_call_insns",
27186         "tail_call_insns", "insns", "before_call", "after_args",
27187         "before_arg", "last", "prev".  Strengthen one of the "last" from
27188         rtx to rtx_call_insn *.
27189         (fixup_tail_calls): Strengthen local "insn" from rtx to
27190         rtx_insn *.
27191         (emit_library_call_value_1): Likewise for locals "before_call" and
27192         "last".
27194 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27196         * builtins.c (expand_builtin_longjmp): Strengthen locals "insn"
27197         and "last" from rtx to rtx_insn *.
27198         (expand_builtin_nonlocal_goto): Likewise for local "insn".
27199         (expand_builtin_apply): Strengthen local "call_insn" from rtx to
27200         rtx_call_insn *.
27201         (expand_errno_check): Strengthen local "lab" from rtx to
27202         rtx_code_label *.
27203         (expand_builtin_mathfn): Strengthen local "insns" from rtx to
27204         rtx_insn *.
27205         (expand_builtin_mathfn_2): Likewise.
27206         (expand_builtin_mathfn_ternary): Likewise.
27207         (expand_builtin_mathfn_3): Likewise.
27208         (expand_builtin_interclass_mathfn): Likewise for local "last".
27209         (expand_builtin_int_roundingfn): Likewise for local "insns".
27210         (expand_builtin_int_roundingfn_2): Likewise.
27211         (expand_builtin_strlen): Likewise for local "before_strlen".
27212         (expand_builtin_strncmp): Likewise for local "seq".
27213         (expand_builtin_signbit): Likewise for local "last".
27214         (expand_builtin_atomic_compare_exchange): Strengthen local "label"
27215         from rtx to rtx_code_label *.
27216         (expand_stack_restore):  Strengthen local "prev" from rtx to
27217         rtx_insn *.
27219 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27221         * bt-load.c (struct btr_user_s): Strengthen field "insn" from rtx
27222         to rtx_insn *.
27223         (struct btr_def_s): Likewise.
27224         (insn_sets_btr_p): Strengthen param "insn" from const_rtx to
27225         const rtx_insn *.
27226         (add_btr_def): Likewise.
27227         (new_btr_user): Likewise.
27228         (compute_defs_uses_and_gen): Strengthen locals "insn", "last" from
27229         rtx to rtx_insn *.
27230         (link_btr_uses): Likewise.
27231         (move_btr_def): Likewise for locals "insp", "old_insn",
27232         "new_insn".  Add checked cast to rtx_insn * for now on result of
27233         gen_move_insn.
27234         (can_move_up): Strengthen param "insn" from const_rtx to
27235         const rtx_insn *.
27237 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27239         * bb-reorder.c (copy_bb_p): Strengthen local "insn" from rtx to
27240         rtx_insn *.
27241         (get_uncond_jump_length): Likewise for locals "label", "jump".
27242         (fix_up_crossing_landing_pad): Likewise for locals "new_label",
27243         "jump", "insn".
27244         (add_labels_and_missing_jumps): Likewise for local "new_jump".
27245         (fix_up_fall_thru_edges): Likewise for local "old_jump".
27246         (find_jump_block): Likewise for local "insn".
27247         (fix_crossing_conditional_branches): Likewise for locals
27248         "old_jump", "new_jump".
27249         (fix_crossing_unconditional_branches): Likewise for locals
27250         "last_insn", "indirect_jump_sequence", "jump_insn", "cur_insn".
27251         (pass_duplicate_computed_gotos::execute): Likewise for local "insn".
27253 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27255         * auto-inc-dec.c (struct inc_insn): Strengthen field "insn" from
27256         rtx to rtx_insn *.
27257         (struct mem_insn): Likewise for field "insn".
27258         (reg_next_use): Strengthen from rtx * to rtx_insn **.
27259         (reg_next_inc_use): Likewise.
27260         (reg_next_def): Likewise.
27261         (move_dead_notes): Strengthen params "to_insn" and "from_insn"
27262         from rtx to rtx_insn *.
27263         (move_insn_before): Likewise for param "next_insn" and local "insns".
27264         (attempt_change): Likewise for local "mov_insn".
27265         (try_merge): Likewise for param "last_insn".
27266         (get_next_ref): Likewise for return type and local "insn".
27267         Strengthen param "next_array" from rtx * to rtx_insn **.
27268         (parse_add_or_inc): Strengthen param "insn" from rtx to
27269         rtx_insn *.
27270         (find_inc): Likewise for locals "insn" and "other_insn" (three of
27271         the latter).
27272         (merge_in_block): Likewise for locals "insn", "curr",
27273         "other_insn".
27274         (pass_inc_dec::execute): Update allocations of the arrays to
27275         reflect the stronger types.
27277 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27279         * asan.c (asan_clear_shadow): Strengthen locals "insn", "insns"
27280         and "jump" from rtx to rtx_insn *.  Strengthen local "top_label"
27281         from rtx to rtx_code_label *.
27283 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27285         * alias.c (init_alias_analysis): Strengthen local "insn" from rtx
27286         to rtx_insn *.
27288 2014-08-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
27290         * config/rs6000/rs6000.c (print_operand, 'y' case): Fix code that
27291         generated a warning and prevented bootstrapping the compiler.
27293 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27295         * rtl.h (delete_related_insns): Strengthen return type from rtx to
27296         rtx_insn *.
27298         * jump.c (delete_related_insns): Likewise, also for locals "next"
27299         and "prev".
27301 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27303         * genautomata.c (output_internal_insn_latency_func): When writing
27304         the function "internal_insn_latency" to insn-automata.c,
27305         strengthen params "insn" and "insn2" from rtx to rtx_insn *, thus
27306         allowing the optional guard function of (define_bypass) clauses to
27307         expect a pair of rtx_insn *, rather than a pair of rtx.
27308         (output_insn_latency_func): When writing the function
27309         "insn_latency", add an "uncast_" prefix to params "insn" and
27310         "insn2", reintroducing "insn" and "insn2" as rtx_insn * locals
27311         using checked casts from the params, thus enabling the above
27312         change to the generated "internal_insn_latency" function.
27314 2014-08-21  Jan Hubicka  <hubicka@ucw.cz>
27316         PR tree-optimization/62091
27317         * ipa-devirt.c (ipa_polymorphic_call_context::restrict_to_inner_type):
27318         handle correctly arrays.
27319         (extr_type_from_vtbl_ptr_store): Add debug output; handle multiple
27320         inheritance binfos.
27321         (record_known_type): Walk into inner type.
27322         (ipa_polymorphic_call_context::get_dynamic_type): Likewise; strenghten
27323         condition on no type changes.
27325 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27327         * genattrtab.c (write_attr_get): Within the generated get_attr_
27328         functions, rename param "insn" to "uncast_insn" and reintroduce
27329         "insn" as an local rtx_insn * using a checked cast, so that "insn"
27330         is an rtx_insn * within insn-attrtab.c
27332 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27334         * output.h (peephole): Strengthen return type from rtx to
27335         rtx_insn *.
27336         * rtl.h (delete_for_peephole): Likewise for both params.
27337         * genpeep.c (main): In generated "peephole" function, strengthen
27338         return type and local "insn" from rtx to rtx_insn *.  For now,
27339         rename param "ins1" to "uncast_ins1", adding "ins1" back as an
27340         rtx_insn *, with a checked cast.
27341         * jump.c (delete_for_peephole): Strengthen params "from", "to" and
27342         locals "insn", "next", "prev" from rtx to rtx_insn *.
27344 2014-08-21  Marc Glisse  <marc.glisse@inria.fr>
27346         PR tree-optimization/62112
27347         * gimple-iterator.c (gsi_replace): Return whether EH cleanup is needed.
27348         * gimple-iterator.h (gsi_replace): Return bool.
27349         * tree-ssa-alias.c (ref_may_alias_global_p_1): New helper, code
27350         moved from ref_may_alias_global_p.
27351         (ref_may_alias_global_p, refs_may_alias_p, ref_maybe_used_by_stmt_p):
27352         New overloads.
27353         (ref_maybe_used_by_call_p): Take ao_ref* instead of tree.
27354         (stmt_kills_ref_p_1): Rename...
27355         (stmt_kills_ref_p): ... to this.
27356         * tree-ssa-alias.h (ref_may_alias_global_p, ref_maybe_used_by_stmt_p,
27357         stmt_kills_ref_p): Declare.
27358         * tree-ssa-dse.c (dse_possible_dead_store_p): New argument, use it.
27359         Move the self-assignment case...
27360         (dse_optimize_stmt): ... here. Handle builtin calls. Remove dead code.
27362 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27364         * rtl.h (try_split): Strengthen return type from rtx to rtx_insn *.
27366         * emit-rtl.c (try_split): Likewise, also for locals "before" and
27367         "after".  For now, don't strengthen param "trial", which requires
27368         adding checked casts when returning it.
27370 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27372         * debug.h (struct gcc_debug_hooks): Strengthen param 1 of hook
27373         "label" from rtx to rtx_code_label *.  Strengthen param 1 of
27374         "var_location" hook from rtx to rtx_insn *.
27375         (debug_nothing_rtx): Delete in favor of...
27376         (debug_nothing_rtx_code_label): New prototype.
27377         (debug_nothing_rtx_rtx): Delete unused prototype.
27378         (debug_nothing_rtx_insn): New prototype.
27380         * final.c (final_scan_insn): Add checked cast to rtx_insn * when
27381         invoking debug_hooks->var_location (in two places, one in a NOTE
27382         case of a switch statement, the other guarded by a CALL_P
27383         conditional.  Add checked cast to rtx_code_label * when invoking
27384         debug_hooks->label (within CODE_LABEL case of switch statement).
27386         * dbxout.c (dbx_debug_hooks): Update "label" hook from
27387         debug_nothing_rtx to debug_nothing_rtx_code_label.  Update
27388         "var_location" from debug_nothing_rtx to debug_nothing_rtx_insn.
27389         (xcoff_debug_hooks): Likewise.
27390         * debug.c (do_nothing_debug_hooks): Likewise.
27391         (debug_nothing_rtx): Delete in favor of...
27392         (debug_nothing_rtx_insn): New function.
27393         (debug_nothing_rtx_rtx): Delete unused function.
27394         (debug_nothing_rtx_code_label): New function.
27395         * dwarf2out.c (dwarf2_debug_hooks): Update "label" hook from
27396         debug_nothing_rtx to debug_nothing_rtx_code_label.
27397         (dwarf2out_var_location): Strengthen param "loc_note" from rtx
27398         to rtx_insn *.
27399         * sdbout.c (sdb_debug_hooks): Update "var_location" hook from
27400         debug_nothing_rtx to debug_nothing_rtx_insn.
27401         (sdbout_label): Strengthen param "insn" from rtx to
27402         rtx_code_label *.
27403         * vmsdbgout.c (vmsdbg_debug_hooks): Update "label" hook from
27404         debug_nothing_rtx to debug_nothing_rtx_code_label.  Update
27405         "var_location" hook from debug_nothing_rtx to
27406         debug_nothing_rtx_insn.
27408 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27410         * recog.h (insn_output_fn): Update this function typedef to match
27411         the changes below to the generated output functions, strengthening
27412         the 2nd param from rtx to rtx_insn *.
27414         * final.c (get_insn_template): Add a checked cast to rtx_insn * on
27415         insn when invoking an output function, to match the new signature
27416         of insn_output_fn with a stronger second param.
27418         * genconditions.c (write_header): In the generated code for
27419         gencondmd.c, strengthen the global "insn" from rtx to rtx_insn *
27420         to match the other changes in this patch.
27422         * genemit.c (gen_split): Strengthen the 1st param "curr_insn" of
27423         the generated "gen_" functions from rtx to rtx_insn * within their
27424         implementations.
27426         * genrecog.c (write_subroutine): Strengthen the 2nd param "insn" of
27427         the subfunctions within the generated "recog_", "split", "peephole2"
27428         function trees from rtx to rtx_insn *.  For now, the top-level
27429         generated functions ("recog", "split", "peephole2") continue to
27430         take a plain rtx for "insn", to avoid introducing dependencies on
27431         other patches.  Rename this 2nd param from "insn" to
27432         "uncast_insn", and reintroduce "insn" as a local variable of type
27433         rtx_insn *, initialized at the top of the generated function with
27434         a checked cast on "uncast_insn".
27435         (make_insn_sequence): Strengthen the 1st param "curr_insn" of
27436         the generated "gen_" functions from rtx to rtx_insn * within their
27437         prototypes.
27439         * genoutput.c (process_template): Strengthen the 2nd param within
27440         the generated "output_" functions "insn" from rtx to rtx_insn *.
27442 2014-08-20  Jan Hubicka  <hubicka@ucw.cz>
27444         * tree-profile.c (tree_profiling): Skip external functions
27445         when doing coverage instrumentation.
27446         * cgraphunit.c (compile): Do not assert that all nodes are reachable.
27448 2014-08-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
27450         * config/rs6000/altivec.h (vec_cpsgn): New #define.
27451         (vec_mergee): Likewise.
27452         (vec_mergeo): Likewise.
27453         (vec_cntlz): Likewise.
27454         * config/rs600/rs6000-c.c (altivec_overloaded_builtins): Add new
27455         entries for VEC_AND, VEC_ANDC, VEC_MERGEH, VEC_MERGEL, VEC_NOR,
27456         VEC_OR, VEC_PACKSU, VEC_XOR, VEC_PERM, VEC_SEL, VEC_VCMPGT_P,
27457         VMRGEW, and VMRGOW.
27458         * doc/extend.texi: Document various forms of vec_cpsgn,
27459         vec_splats, vec_and, vec_andc, vec_mergeh, vec_mergel, vec_nor,
27460         vec_or, vec_perm, vec_sel, vec_sub, vec_xor, vec_all_eq,
27461         vec_all_ge, vec_all_gt, vec_all_le, vec_all_lt, vec_all_ne,
27462         vec_any_eq, vec_any_ge, vec_any_gt, vec_any_le, vec_any_lt,
27463         vec_any_ne, vec_mergee, vec_mergeo, vec_packsu, and vec_cntlz.
27465 2014-08-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
27467         * config/rs6000/rs6000.c (context.h): New include.
27468         (tree-pass.h): Likewise.
27469         (make_pass_analyze_swaps): New decl.
27470         (rs6000_option_override): Register pass_analyze_swaps.
27471         (swap_web_entry): New subsclass of web_entry_base (df.h).
27472         (special_handling_values): New enum.
27473         (union_defs): New function.
27474         (union_uses): Likewise.
27475         (insn_is_load_p): Likewise.
27476         (insn_is_store_p): Likewise.
27477         (insn_is_swap_p): Likewise.
27478         (rtx_is_swappable_p): Likewise.
27479         (insn_is_swappable_p): Likewise.
27480         (chain_purpose): New enum.
27481         (chain_contains_only_swaps): New function.
27482         (mark_swaps_for_removal): Likewise.
27483         (swap_const_vector_halves): Likewise.
27484         (adjust_subreg_index): Likewise.
27485         (permute_load): Likewise.
27486         (permute_store): Likewise.
27487         (handle_special_swappables): Likewise.
27488         (replace_swap_with_copy): Likewise.
27489         (dump_swap_insn_table): Likewise.
27490         (rs6000_analyze_swaps): Likewise.
27491         (pass_data_analyze_swaps): New pass_data.
27492         (pass_analyze_swaps): New rtl_opt_pass.
27493         (make_pass_analyze_swaps): New function.
27494         * config/rs6000/rs6000.opt (moptimize-swaps): New option.
27496 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27498         * sel-sched-ir.h (create_insn_rtx_from_pattern): Strengthen return
27499         type from rtx to rtx_insn *.
27500         (create_copy_of_insn_rtx): Likewise.
27501         * sel-sched-ir.c (create_insn_rtx_from_pattern): Likewise.
27502         (create_copy_of_insn_rtx): Likewise, also for local "res".
27504 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27506         * rtl.h (find_first_parameter_load): Strengthen return type from
27507         rtx to rtx_insn *.
27508         * rtlanal.c (find_first_parameter_load): Strengthen return type
27509         from rtx to rtx_insn *.  Add checked cast for now, to postpone
27510         strengthening the params.
27512 2014-08-21  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27514         PR fortran/44054
27515         * diagnostic.c: Set default caret.
27516         (diagnostic_show_locus): Use it. Tell pretty-printer that a new
27517         line is needed.
27518         * diagnostic.h (struct diagnostic_context):
27520 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27522         * sel-sched-ir.h (exit_insn): Strengthen from rtx to rtx_insn *.
27523         (sel_bb_head): Strengthen return type insn_t (currently just an
27524         rtx) to rtx_insn *.
27525         (sel_bb_end): Likewise.
27527         * sel-sched-ir.c (exit_insn): Strengthen from rtx to rtx_insn *.
27528         (sel_bb_head): Strengthen return type and local "head" from
27529         insn_t (currently just an rtx) to rtx_insn *.
27530         (sel_bb_end): Likewise for return type.
27531         (free_nop_and_exit_insns): Replace use of NULL_RTX with NULL when
27532         working with insn.
27534 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27536         * basic-block.h (get_last_bb_insn): Strengthen return type from
27537         rtx to rtx_insn *.
27538         * cfgrtl.c (get_last_bb_insn): Likewise, and for locals "tmp" and
27539         end".
27541 2014-08-21  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27543         PR fortran/44054
27544         * diagnostic.c (default_diagnostic_finalizer): Move caret printing
27545         to here ...
27546         (diagnostic_report_diagnostic): ... from here.
27547         * toplev.c (general_init): Move code to c-family.
27549 2014-08-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
27551         * df.h (web_entry_base): Replace existing struct web_entry with a
27552         new class web_entry_base with only the predecessor member.
27553         (unionfind_root): Remove declaration and move to class member.
27554         (unionfind_union): Remove declaration and move to friend
27555         function.
27556         (union_defs): Remove declaration.
27557         * web.c (web_entry_base::unionfind_root): Modify to be member
27558         function and adjust accessors.
27559         (unionfind_union): Modify to be friend function and adjust
27560         accessors.
27561         (web_entry): New subclass of web_entry_base containing the reg
27562         member.
27563         (union_match_dups): Modify for struct -> class changes.
27564         (union_defs): Likewise.
27565         (entry_register): Likewise.
27566         (pass_web::execute): Likewise.
27568 2014-08-20  Bill Schmidt  <wschmidt@vnet.ibm.com>
27570         * config/rs6000/rs6000-c.c (rs6000_cpu_cpp_builtins): Provide
27571         builtin define __VEC_ELEMENT_REG_ORDER__.
27573 2014-08-20  Martin Jambor  <mjambor@suse.cz>
27574             Wei Mi  <wmi@google.com>
27576         PR ipa/60449
27577         PR middle-end/61776
27578         * tree-ssa-operands.c (update_stmt_operands): Remove
27579         MODIFIED_NORETURN_CALLS.
27580         * tree-cfgcleanup.c (cleanup_call_ctrl_altering_flag): New func.
27581         (cleanup_control_flow_bb): Use cleanup_call_ctrl_altering_flag.
27582         (split_bb_on_noreturn_calls): Renamed from split_bbs_on_noreturn_calls.
27583         (cleanup_tree_cfg_1): Use split_bb_on_noreturn_calls.
27584         * tree-ssanames.h: Remove MODIFIED_NORETURN_CALLS.
27585         * gimple.h (enum gf_mask): Add GF_CALL_CTRL_ALTERING.
27586         (gimple_call_set_ctrl_altering): New func.
27587         (gimple_call_ctrl_altering_p): Ditto.
27588         * tree-cfg.c (gimple_call_initialize_ctrl_altering): Ditto.
27589         (make_blocks): Use gimple_call_initialize_ctrl_altering.
27590         (is_ctrl_altering_stmt): Use gimple_call_ctrl_altering_p.
27591         (execute_fixup_cfg): Use gimple_call_ctrl_altering_p and
27592         remove MODIFIED_NORETURN_CALLS.
27594 2014-08-20  Jan Hubicka  <hubicka@ucw.cz>
27596         * coverage.c (coverage_compute_profile_id): Return non-0;
27597         also handle symbols with unique name.
27598         (coverage_end_function): Do not skip DECL_EXTERNAL functions.
27600 2014-08-20  Steve Ellcey  <sellcey@mips.com>
27602         PR middle-end/49191
27603         * doc/sourcebuild.texi (non_strict_align): New.
27605 2014-08-20  Jan Hubicka  <hubicka@ucw.cz>
27607         * cgraphunit.c (ipa_passes, compile): Reshedule
27608         symtab_remove_unreachable_nodes passes; update comments.
27609         * ipa-inline.c (pass_data_ipa_inline): Do not schedule
27610         TODO_remove_functions before the pass; the functions ought to be
27611         already removed.
27612         * ipa.c (pass_data_ipa_free_inline_summary): Enable dump; schedule
27613         TODO_remove_functions.
27614         * passes.c (pass_data_early_local_passes): Do not schedule function
27615         removal.
27616         (execute_one_pass): Fix call of symtab_remove_unreachable_nodes.
27618 2014-08-20  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27620         PR c/59304
27621         * opts-common.c (set_option): Call diagnostic_classify_diagnostic
27622         before setting the option.
27623         * diagnostic.c (diagnostic_classify_diagnostic): Record
27624         command-line status.
27626 2014-08-20  Richard Biener  <rguenther@suse.de>
27628         PR lto/62190
27629         * tree.c (build_common_tree_nodes): Use make_or_reuse_type
27630         to build uint{16,32,64}_type_node.
27632 2014-08-20  Terry Guo  <terry.guo@arm.com>
27634         * config/arm/thumb1.md (64bit splitter): Replace const_double_operand
27635         with immediate_operand.
27637 2014-08-20  David Malcolm  <dmalcolm@redhat.com>
27639         * cfgrtl.c (duplicate_insn_chain): Convert the checked cast on
27640         "insn" from an as_a to a safe_as_a, for the case when "insn" is
27641         NULL.
27643 2014-08-20  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27645         PR preprocessor/51303
27646         * incpath.c (remove_duplicates): Use cpp_warning.
27648 2014-08-20  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27650         PR c/60975
27651         PR c/53063
27652         * doc/options.texi (CPP): Document it.
27653         * doc/invoke.texi (Wvariadic-macros): Fix documentation.
27654         * optc-gen.awk: Handle CPP.
27655         * opth-gen.awk: Likewise.
27657 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27659         * rtl.h (unlink_insn_chain): Strengthen return type from rtx to
27660         rtx_insn *.
27661         (duplicate_insn_chain): Likewise.
27662         * cfgrtl.c (unlink_insn_chain): Strengthen return type from rtx to
27663         rtx_insn *, also for locals "prevfirst" and "nextlast".  Add a
27664         checked cast for now (until we can strengthen the params in the
27665         same way).
27666         (duplicate_insn_chain): Likewise.
27668 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27670         * rtl.h (next_cc0_user): Strengthen return type from rtx to
27671         rtx_insn *.
27672         (prev_cc0_setter): Likewise.
27674         * emit-rtl.c (next_cc0_user): Strengthen return type from rtx to
27675         rtx_insn *, adding checked casts for now as necessary.
27676         (prev_cc0_setter): Likewise.
27678 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27680         * expr.h (emit_move_insn): Strengthen return type from rtx to
27681         rtx_insn *.
27682         (emit_move_insn_1): Likewise.
27683         (emit_move_complex_push): Likewise.
27684         (emit_move_complex_parts): Likewise.
27686         * expr.c (emit_move_via_integer): Strengthen return type from rtx
27687         to rtx_insn *.  Replace use of NULL_RTX with NULL when working
27688         with insns.
27689         (emit_move_complex_push): Strengthen return type from rtx to
27690         rtx_insn *.
27691         (emit_move_complex): Likewise, also for local "ret".
27692         (emit_move_ccmode): Likewise.
27693         (emit_move_multi_word): Likewise for return type and locals
27694         "last_insn", "seq".
27695         (emit_move_insn_1): Likewise for return type and locals "result",
27696         "ret".
27697         (emit_move_insn): Likewise for return type and local "last_insn".
27698         (compress_float_constant): Likewise.
27700 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27702         * emit-rtl.h (emit_copy_of_insn_after): Strengthen return type
27703         from rtx to rtx_insn *.
27705         * rtl.h (emit_insn_before): Likewise.
27706         (emit_insn_before_noloc): Likewise.
27707         (emit_insn_before_setloc): Likewise.
27708         (emit_jump_insn_before): Likewise.
27709         (emit_jump_insn_before_noloc): Likewise.
27710         (emit_jump_insn_before_setloc): Likewise.
27711         (emit_call_insn_before): Likewise.
27712         (emit_call_insn_before_noloc): Likewise.
27713         (emit_call_insn_before_setloc): Likewise.
27714         (emit_debug_insn_before): Likewise.
27715         (emit_debug_insn_before_noloc): Likewise.
27716         (emit_debug_insn_before_setloc): Likewise.
27717         (emit_label_before): Likewise.
27718         (emit_insn_after): Likewise.
27719         (emit_insn_after_noloc): Likewise.
27720         (emit_insn_after_setloc): Likewise.
27721         (emit_jump_insn_after): Likewise.
27722         (emit_jump_insn_after_noloc): Likewise.
27723         (emit_jump_insn_after_setloc): Likewise.
27724         (emit_call_insn_after): Likewise.
27725         (emit_call_insn_after_noloc): Likewise.
27726         (emit_call_insn_after_setloc): Likewise.
27727         (emit_debug_insn_after): Likewise.
27728         (emit_debug_insn_after_noloc): Likewise.
27729         (emit_debug_insn_after_setloc): Likewise.
27730         (emit_label_after): Likewise.
27731         (emit_insn): Likewise.
27732         (emit_debug_insn): Likewise.
27733         (emit_jump_insn): Likewise.
27734         (emit_call_insn): Likewise.
27735         (emit_label): Likewise.
27736         (gen_clobber): Likewise.
27737         (emit_clobber): Likewise.
27738         (gen_use): Likewise.
27739         (emit_use): Likewise.
27740         (emit): Likewise.
27742         (emit_barrier_before): Strengthen return type from rtx to
27743         rtx_barrier *.
27744         (emit_barrier_after): Likewise.
27745         (emit_barrier): Likewise.
27747         * emit-rtl.c (emit_pattern_before_noloc):  Strengthen return type
27748         from rtx to rtx_insn *.  Add checked casts for now when converting
27749         "last" from rtx to rtx_insn *.
27750         (emit_insn_before_noloc): Likewise for return type.
27751         (emit_jump_insn_before_noloc): Likewise.
27752         (emit_call_insn_before_noloc): Likewise.
27753         (emit_debug_insn_before_noloc): Likewise.
27754         (emit_barrier_before): Strengthen return type and local "insn"
27755         from rtx to rtx_barrier *.
27756         (emit_label_before): Strengthen return type from rtx to
27757         rtx_insn *.  Add checked cast for now when returning param
27758         (emit_pattern_after_noloc): Strengthen return type from rtx to
27759         rtx_insn *.  Add checked casts for now when converting "last" from
27760         rtx to rtx_insn *.
27761         (emit_insn_after_noloc): Strengthen return type from rtx to
27762         rtx_insn *.
27763         (emit_jump_insn_after_noloc): Likewise.
27764         (emit_call_insn_after_noloc): Likewise.
27765         (emit_debug_insn_after_noloc): Likewise.
27766         (emit_barrier_after): Strengthen return type from rtx to
27767         rtx_barrier *.
27768         (emit_label_after): Strengthen return type from rtx to rtx_insn *.
27769         Add checked cast for now when converting "label" from rtx to
27770         rtx_insn *.
27771         (emit_pattern_after_setloc): Strengthen return type from rtx to
27772         rtx_insn *.  Add checked casts for now when converting "last" from
27773         rtx to rtx_insn *.
27774         (emit_pattern_after): Strengthen return type from rtx to
27775         rtx_insn *.
27776         (emit_insn_after_setloc): Likewise.
27777         (emit_insn_after): Likewise.
27778         (emit_jump_insn_after_setloc): Likewise.
27779         (emit_jump_insn_after): Likewise.
27780         (emit_call_insn_after_setloc): Likewise.
27781         (emit_call_insn_after): Likewise.
27782         (emit_debug_insn_after_setloc): Likewise.
27783         (emit_debug_insn_after): Likewise.
27784         (emit_pattern_before_setloc): Likewise.  Add checked casts for now
27785         when converting "last" from rtx to rtx_insn *.
27786         (emit_pattern_before): Strengthen return type from rtx to
27787         rtx_insn *.
27788         (emit_insn_before_setloc): Likewise.
27789         (emit_insn_before): Likewise.
27790         (emit_jump_insn_before_setloc): Likewise.
27791         (emit_jump_insn_before): Likewise.
27792         (emit_call_insn_before_setloc): Likewise.
27793         (emit_call_insn_before): Likewise.
27794         (emit_debug_insn_before_setloc): Likewise.
27795         (emit_debug_insn_before): Likewise.
27796         (emit_insn): Strengthen return type and locals "last", "insn",
27797         "next" from rtx to rtx_insn *.  Add checked cast to rtx_insn
27798         within cases where we know we have an insn.
27799         (emit_debug_insn): Likewise.
27800         (emit_jump_insn): Likewise.
27801         (emit_call_insn): Strengthen return type and local "insn" from rtx
27802         to rtx_insn *.
27803         (emit_label): Strengthen return type from rtx to rtx_insn *.  Add
27804         a checked cast to rtx_insn * for now on "label".
27805         (emit_barrier): Strengthen return type from rtx to rtx_barrier *.
27806         (emit_clobber): Strengthen return type from rtx to rtx_insn *.
27807         (emit_use): Likewise.
27808         (gen_use): Likewise, also for local "seq".
27809         (emit): Likewise for return type and local "insn".
27810         (rtx_insn): Likewise for return type and local "new_rtx".
27812         * cfgrtl.c (emit_barrier_after_bb): Strengthen local "barrier"
27813         from rtx to rtx_barrier *.
27815         * config/sh/sh.c (output_stack_adjust): Since emit_insn has
27816         changed return type from rtx to rtx_insn *, we must update
27817         "emit_fn" type, and this in turn means updating...
27818         (frame_insn): ...this.  Strengthen return type from rtx to
27819         rtx_insn *.  Introduce a new local "insn" of the appropriate type.
27821 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27823         * emit-rtl.c (emit_jump_table_data): Strengthen return type from
27824         rtx to rtx_jump_table_data *.  Also for local.
27825         * rtl.h (emit_jump_table_data): Likewise.
27827 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27829         * basic-block.h (create_basic_block_structure): Strengthen third
27830         param "bb_note" from rtx to rtx_note *.
27831         * rtl.h (emit_note_before): Strengthen return type from rtx to
27832         rtx_note *.
27833         (emit_note_after): Likewise.
27834         (emit_note): Likewise.
27835         (emit_note_copy): Likewise.  Also, strengthen param similarly.
27836         * function.h (struct rtl_data): Strengthen field
27837         "x_stack_check_probe_note" from rtx to rtx_note *.
27839         * cfgexpand.c (expand_gimple_basic_block): Strengthen local "note"
27840         from rtx to rtx_note *.
27841         * cfgrtl.c (create_basic_block_structure): Strengthen third param
27842         "bb_note" from rtx to rtx_note *.
27843         (duplicate_insn_chain): Likewise for local "last".  Add a checked cast
27844         when calling emit_note_copy.
27845         * emit-rtl.c (make_note_raw): Strengthen return type from rtx to
27846         rtx_note *.
27847         (emit_note_after): Likewise.
27848         (emit_note_before): Likewise.
27849         (emit_note_copy): Likewise.  Also, strengthen param similarly.
27850         (emit_note): Likewise.
27851         * except.c (emit_note_eh_region_end): Likewise for return type.
27852         Strengthen local "next" from rtx to rtx_insn *.
27853         (convert_to_eh_region_ranges): Strengthen local "note"
27854         from rtx to rtx_note *.
27855         * final.c (change_scope): Likewise.
27856         (reemit_insn_block_notes): Likewise, for both locals named "note".
27857         Also, strengthen local "insn" from rtx to rtx_insn *.
27858         * haifa-sched.c (sched_extend_bb): Strengthen local "note" from
27859         rtx to rtx_note *.
27860         * reg-stack.c (compensate_edge): Likewise for local "after". Also,
27861         strengthen local "seq" from rtx to rtx_insn *.
27862         * reload1.c (reload_as_needed): Strengthen local "marker" from rtx
27863         to rtx_note *.
27864         * sel-sched-ir.c (bb_note_pool): Strengthen from rtx_vec_t to
27865         vec<rtx_note *>.
27866         (get_bb_note_from_pool): Strengthen return type from rtx to
27867         rtx_note *.
27868         (sel_create_basic_block): Strengthen local "new_bb_note" from
27869         insn_t to rtx_note *.
27870         * var-tracking.c (emit_note_insn_var_location): Strengthen local
27871         "note" from rtx to rtx_note *.
27872         (emit_notes_in_bb): Likewise.
27874 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27876         * function.h (struct rtl_data): Strengthen field
27877         "x_parm_birth_insn" from rtx to rtx_insn *.
27878         * function.c (struct assign_parm_data_all): Strengthen fields
27879         "first_conversion_insn" and "last_conversion_insn" from rtx to
27880         rtx_insn *.
27882 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27884         * cfgexpand.c (expand_used_vars): Strengthen return type from rtx
27885         to rtx_insn *; also for local "var_end_seq".
27886         (maybe_dump_rtl_for_gimple_stmt): Likewise for param "since".
27887         (maybe_cleanup_end_of_block): Likewise for param "last" and local
27888         "insn".
27889         (expand_gimple_cond): Likewise for locals "last2" and "last".
27890         (mark_transaction_restart_calls): Likewise for local "insn".
27891         (expand_gimple_stmt): Likewise for return type and locals "last"
27892         and "insn".
27893         (expand_gimple_tailcall): Likewise for locals "last2" and "last".
27894         (avoid_complex_debug_insns): Likewise for param "insn".
27895         (expand_debug_locations): Likewise for locals "insn", "last",
27896         "prev_insn" and "insn2".
27897         (expand_gimple_basic_block): Likewise for local "last".
27898         (construct_exit_block): Likewise for locals "head", "end",
27899         "orig_end".
27900         (pass_expand::execute): Likewise for locals "var_seq",
27901         "var_ret_seq", "next".
27903 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27905         * asan.h (asan_emit_stack_protection): Strengthen return type from
27906         rtx to rtx_insn *.
27907         * asan.c (asan_emit_stack_protection): Likewise.  Add local
27908         "insns" to hold the return value.
27910 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27912         * basic-block.h (bb_note): Strengthen return type from rtx to
27913         rtx_note *.
27914         * sched-int.h (bb_note): Likewise.
27915         * cfgrtl.c (bb_note): Likewise.  Add a checked cast to rtx_note *.
27917 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27919         * rtl.h (make_insn_raw): Strengthen return type from rtx to
27920         rtx_insn *.
27922         * emit-rtl.c (make_insn_raw): Strengthen return type and local
27923         "insn" from rtx to rtx_insn *.
27924         (make_debug_insn_raw): Strengthen return type from rtx to
27925         rtx_insn *; strengthen local "insn" from rtx to rtx_debug_insn *.
27926         (make_jump_insn_raw):  Strengthen return type from rtx to
27927         rtx_insn *; strengthen local "insn" from rtx to rtx_jump_insn *.
27928         (make_call_insn_raw):  Strengthen return type from rtx to
27929         rtx_insn *; strengthen local "insn" from rtx to rtx_call_insn *.
27930         (emit_pattern_before_noloc): Strengthen return type of "make_raw"
27931         callback from rtx to rtx_insn *; likewise for local "insn" and
27932         "next", adding a checked cast to rtx_insn in the relevant cases of
27933         the switch statement.
27934         (emit_pattern_after_noloc): Strengthen return type of "make_raw"
27935         callback from rtx to rtx_insn *.
27936         (emit_pattern_after_setloc): Likewise.
27937         (emit_pattern_after): Likewise.
27938         (emit_pattern_before_setloc): Likewise.
27939         (emit_pattern_before): Likewise.
27941 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27943         * emit-rtl.c (last_call_insn): Strengthen return type from rtx to
27944         rtx_call_insn *.
27945         * rtl.h (is_a_helper <rtx_call_insn *>::test): New overload,
27946         accepting an rtx_insn *.
27947         (last_call_insn): Strengthen return type from rtx to
27948         rtx_call_insn *.
27950 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27952         * rtl.h (delete_trivially_dead_insns): Strengthen initial param
27953         "insns" from rtx to rtx_insn *.
27954         * cse.c (delete_trivially_dead_insns): Likewise, also do it for
27955         locals "insn" and "prev".
27957 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27959         * rtl.h (tablejump_p): Strengthen third param from rtx * to
27960         rtx_jump_table_data **.
27962         * cfgbuild.c (make_edges): Introduce local "table", using it in
27963         place of "tmp" for jump table data.
27964         (find_bb_boundaries): Strengthen local "table" from rtx to
27965         rtx_jump_table_data *.
27966         * cfgcleanup.c (merge_blocks_move_successor_nojumps): Likewise.
27967         (outgoing_edges_match): Likewise for locals "table1" and "table2".
27968         (try_crossjump_to_edge): Likewise.
27969         * cfgrtl.c (try_redirect_by_replacing_jump): Likewise for local
27970         "table".
27971         (patch_jump_insn): Introduce local "table", using it in place of
27972         "tmp" for jump table data.
27973         (force_nonfallthru_and_redirect): Introduce local "table", so that
27974         call to tablejump_p can receive an rtx_jump_table_data **.  Update
27975         logic around the call to overwrite "note" appropriately if
27976         tablejump_p returns non-zero.
27977         (get_last_bb_insn): Introduce local "table", using it in place of
27978         "tmp" for jump table data.
27979         * dwarf2cfi.c (create_trace_edges): Likewise.
27981         * config/arm/arm.c (get_jump_table_size): Strengthen param "insn"
27982         from rtx to rtx_jump_table_data *.
27983         (create_fix_barrier): Strengthen local "tmp" from rtx to
27984         rtx_jump_table_data *.
27985         (arm_reorg): Likewise for local "table".
27987         * config/s390/s390.c (s390_chunkify_start): Likewise.
27989         * config/spu/spu.c (spu_emit_branch_hint): Likewise.
27991         * jump.c (delete_related_insns): Strengthen local "lab_next" from
27992         rtx to rtx_jump_table_data *.
27994         * rtlanal.c (tablejump_p): Strengthen param "tablep" from rtx * to
27995         rtx_jump_table_data **.  Add a checked cast when writing through
27996         the pointer: we know there that local "table" is non-NULL and that
27997         JUMP_TABLE_DATA_P (table) holds.
27998         (label_is_jump_target_p): Introduce local "table", using it in
27999         place of "tmp" for jump table data.
28001 2014-08-19  Marek Polacek  <polacek@redhat.com>
28003         PR c++/62153
28004         * doc/invoke.texi: Document -Wbool-compare.
28006 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28008         * rtl.h (entry_of_function): Strengthen return type from rtx to
28009         rtx_insn *.
28010         * cfgrtl.c (entry_of_function): Likewise.
28012 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28014         * emit-rtl.h (get_insns): Strengthen return type from rtx to
28015         rtx_insn *, adding a checked cast for now.
28016         (get_last_insn): Likewise.
28018 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28020         * rtl.h (gen_label_rtx): Strengthen return type from rtx to
28021         rtx_code_label *.
28023         * emit-rtl.c (gen_label_rtx): Likewise.
28025 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28027         * rtl.h (previous_insn): Strengthen return type from rtx to
28028         rtx_insn *.
28029         (next_insn): Likewise.
28030         (prev_nonnote_insn): Likewise.
28031         (prev_nonnote_insn_bb): Likewise.
28032         (next_nonnote_insn): Likewise.
28033         (next_nonnote_insn_bb): Likewise.
28034         (prev_nondebug_insn): Likewise.
28035         (next_nondebug_insn): Likewise.
28036         (prev_nonnote_nondebug_insn): Likewise.
28037         (next_nonnote_nondebug_insn): Likewise.
28038         (prev_real_insn): Likewise.
28039         (next_real_insn): Likewise.
28040         (prev_active_insn): Likewise.
28041         (next_active_insn): Likewise.
28043         * emit-rtl.c (next_insn): Strengthen return type from rtx to
28044         rtx_insn *, adding a checked cast.
28045         (previous_insn): Likewise.
28046         (next_nonnote_insn): Likewise.
28047         (next_nonnote_insn_bb): Likewise.
28048         (prev_nonnote_insn): Likewise.
28049         (prev_nonnote_insn_bb): Likewise.
28050         (next_nondebug_insn): Likewise.
28051         (prev_nondebug_insn): Likewise.
28052         (next_nonnote_nondebug_insn): Likewise.
28053         (prev_nonnote_nondebug_insn): Likewise.
28054         (next_real_insn): Likewise.
28055         (prev_real_insn): Likewise.
28056         (next_active_insn): Likewise.
28057         (prev_active_insn): Likewise.
28059         * config/sh/sh-protos.h (sh_find_set_of_reg): Convert function ptr
28060         param "stepfunc" so that it returns an rtx_insn * rather than an
28061         rtx, to track the change to prev_nonnote_insn_bb, which is the
28062         only function this is called with.
28063         * config/sh/sh.c (sh_find_set_of_reg): Likewise.
28065 2014-08-19  Jan Hubicka  <hubicka@ucw.cz>
28067         * ipa-visibility.c (update_visibility_by_resolution_info): Fix
28068         assert.
28070 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28072         * coretypes.h (class rtx_debug_insn): Add forward declaration.
28073         (class rtx_nonjump_insn): Likewise.
28074         (class rtx_jump_insn): Likewise.
28075         (class rtx_call_insn): Likewise.
28076         (class rtx_jump_table_data): Likewise.
28077         (class rtx_barrier): Likewise.
28078         (class rtx_code_label): Likewise.
28079         (class rtx_note): Likewise.
28081         * rtl.h (class rtx_debug_insn): New, a subclass of rtx_insn,
28082         adding the invariant DEBUG_INSN_P (X).
28083         (class rtx_nonjump_insn): New, a subclass of rtx_insn, adding
28084         the invariant NONJUMP_INSN_P (X).
28085         (class rtx_jump_insn): New, a subclass of rtx_insn, adding
28086         the invariant JUMP_P (X).
28087         (class rtx_call_insn): New, a subclass of rtx_insn, adding
28088         the invariant CALL_P (X).
28089         (class rtx_jump_table): New, a subclass of rtx_insn, adding the
28090         invariant JUMP_TABLE_DATA_P (X).
28091         (class rtx_barrier): New, a subclass of rtx_insn, adding the
28092         invariant BARRIER_P (X).
28093         (class rtx_code_label): New, a subclass of rtx_insn, adding
28094         the invariant LABEL_P (X).
28095         (class rtx_note): New, a subclass of rtx_insn, adding
28096         the invariant NOTE_P(X).
28097         (is_a_helper <rtx_debug_insn *>::test): New.
28098         (is_a_helper <rtx_nonjump_insn *>::test): New.
28099         (is_a_helper <rtx_jump_insn *>::test): New.
28100         (is_a_helper <rtx_call_insn *>::test): New.
28101         (is_a_helper <rtx_jump_table_data *>::test): New functions,
28102         overloaded for both rtx and rtx_insn *.
28103         (is_a_helper <rtx_barrier *>::test): New.
28104         (is_a_helper <rtx_code_label *>::test): New functions, overloaded
28105         for both rtx and rtx_insn *.
28106         (is_a_helper <rtx_note *>::test): New.
28108 2014-08-19  Marek Polacek  <polacek@redhat.com>
28110         * config/alpha/alpha.h (CLZ_DEFINED_VALUE_AT_ZERO,
28111         CTZ_DEFINED_VALUE_AT_ZERO): Return 0/1 rather than bool.
28112         * config/i386/i386.h (CLZ_DEFINED_VALUE_AT_ZERO,
28113         CTZ_DEFINED_VALUE_AT_ZERO): Return 0/1 rather than bool.
28115 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28117         * sel-sched-ir.h (BND_TO): insn_t will eventually be an
28118         rtx_insn *.  To help with transition, for now, convert from an
28119         access macro into a pair of functions: BND_TO, returning an
28120         rtx_insn *, and...
28121         (SET_BND_TO): New function, for use where BND_TO is used as an
28122         lvalue.
28124         * sel-sched-ir.c (blist_add): Update lvalue usage of BND_TO to
28125         SET_BND_TO.
28126         (BND_TO): New function, adding a checked cast.
28127         (SET_BND_TO): New function.
28129         * sel-sched.c (move_cond_jump): Update lvalue usage of BND_TO to
28130         SET_BND_TO.
28131         (compute_av_set_on_boundaries): Likewise.
28133 2014-08-19  H.J. Lu  <hongjiu.lu@intel.com>
28135         * config/i386/i386.md (*ctz<mode>2_falsedep_1): Don't clear
28136         destination if it is used in source.
28137         (*clz<mode>2_lzcnt_falsedep_1): Likewise.
28138         (*popcount<mode>2_falsedep_1): Likewise.
28140 2014-08-19  H.J. Lu  <hongjiu.lu@intel.com>
28142         PR other/62168
28143         * configure.ac: Set install_gold_as_default to no first.
28144         * configure: Regenerated.
28146 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28148         * sel-sched-ir.h (BB_NOTE_LIST): struct sel_region_bb_info_def's
28149         "note_list" field will eventually be an rtx_insn *.  To help with
28150         transition, for now, convert from an access macro into a pair of
28151         functions: BB_NOTE_LIST, returning an rtx_insn *, and...
28152         (SET_BB_NOTE_LIST): New function, for use where BB_NOTE_LIST is
28153         used as an lvalue.
28155         * sel-sched.c (create_block_for_bookkeeping): Update lvalue usage
28156         of BB_NOTE_LIST to SET_BB_NOTE_LIST.
28158         * sel-sched-ir.c (init_bb): Likewise.
28159         (sel_restore_notes): Likewise.
28160         (move_bb_info): Likewise.
28161         (BB_NOTE_LIST): New function, adding a checked cast to rtx_insn *.
28162         (SET_BB_NOTE_LIST): New function.
28164 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28166         * sel-sched-ir.h (VINSN_INSN_RTX): struct vinsn_def's "insn_rtx"
28167         field will eventually be an rtx_insn *.  To help with transition,
28168         for now, convert from an access macro into a pair of functions:
28169         VINSN_INSN_RTX, returning an rtx_insn *, and...
28170         (SET_VINSN_INSN_RTX): New function, for use where VINSN_INSN_RTX
28171         is used as an lvalue.
28173         * sel-sched-ir.c (vinsn_init): Replace VINSN_INSN_RTX with
28174         SET_VINSN_INSN_RTX where it's used as an lvalue.
28175         (VINSN_INSN_RTX): New function.
28176         (SET_VINSN_INSN_RTX): New function.
28178 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28180         * sched-int.h (DEP_PRO): struct _dep's "pro" and "con" fields will
28181         eventually be rtx_insn *, but to help with transition, for now,
28182         convert from an access macro into a pair of functions: DEP_PRO
28183         returning an rtx_insn * and...
28184         (SET_DEP_PRO): New function, for use where DEP_PRO is used as an
28185         lvalue, returning an rtx&.
28186         (DEP_CON): Analogous changes to DEP_PRO above.
28187         (SET_DEP_CON): Likewise.
28189         * haifa-sched.c (create_check_block_twin): Replace DEP_CON used as
28190         an lvalue to SET_DEP_CON.
28191         * sched-deps.c (init_dep_1): Likewise for DEP_PRO and DEP_CON.
28192         (sd_copy_back_deps): Likewise for DEP_CON.
28193         (DEP_PRO): New function, adding a checked cast for now.
28194         (DEP_CON): Likewise.
28195         (SET_DEP_PRO): New function.
28196         (SET_DEP_CON): Likewise.
28198 2014-08-19  Yaakov Selkowitz  <yselkowi@redhat.com>
28200         * config.gcc (*-*-cygwin*): Use __cxa_atexit by default.
28201         (extra_options): Add i386/cygwin.opt.
28202         * config/i386/cygwin.h (STARTFILE_SPEC): Use crtbeginS.o if shared.
28203         (CPP_SPEC): Accept -pthread.
28204         (LINK_SPEC): Ditto.
28205         (GOMP_SELF_SPECS): Update comment.
28206         * config/i386/cygwin.opt: New file for -pthread flag.
28208 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28210         * df-core.c (DF_REF_INSN): New, using a checked cast for now.
28211         * df.h (DF_REF_INSN): Convert from a macro to a function, so
28212         that we can return an rtx_insn *.
28214 2014-08-19  Yaakov Selkowitz  <yselkowi@redhat.com>
28216         * config/i386/cygwin.h (LINK_SPEC): Pass --tsaware flag only
28217         when building executables, not DLLs.  Add --large-address-aware
28218         under the same conditions.
28219         * config/i386/cygwin-w64.h (LINK_SPEC): Pass --tsaware flag only
28220         when building executables, not DLLs.  Add --large-address-aware
28221         under the same conditions when using -m32.
28223         * config/i386/cygwin-stdint.h: Throughout, make type
28224         definitions dependent on target architecture, not host.
28226 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28228         * rtl.h (PREV_INSN): Convert to an inline function.  Strengthen
28229         the return type from rtx to rtx_insn *,  which will enable various
28230         conversions in followup patches.  For now this is is done by a
28231         checked cast.
28232         (NEXT_INSN): Likewise.
28233         (SET_PREV_INSN): Convert to an inline function.  This is intended
28234         for use as an lvalue, and so returns an rtx& to allow in-place
28235         modification.
28236         (SET_NEXT_INSN): Likewise.
28238 2014-07-08  Mark Wielaard  <mjw@redhat.com>
28240         PR debug/59051
28241         * dwarf2out.c (modified_type_die): Handle TYPE_QUAL_RESTRICT.
28243 2014-08-19  Marek Polacek  <polacek@redhat.com>
28245         PR c/61271
28246         * cgraphunit.c (handle_alias_pairs): Fix condition.
28248 2014-08-19  Richard Biener  <rguenther@suse.de>
28250         * gimple-fold.c (fold_gimple_assign): Properly build a
28251         null-pointer constant when devirtualizing addresses.
28253 2014-07-07  Mark Wielaard  <mjw@redhat.com>
28255         * dwarf2out.c (decl_quals): New function.
28256         (modified_type_die): Take one cv_quals argument instead of two,
28257         one for const and one for volatile.
28258         (add_type_attribute): Likewise.
28259         (generic_parameter_die): Call add_type_attribute with one modifier
28260         argument.
28261         (base_type_for_mode): Likewise.
28262         (add_bounds_info): Likewise.
28263         (add_subscript_info): Likewise.
28264         (gen_array_type_die): Likewise.
28265         (gen_descr_array_type_die): Likewise.
28266         (gen_entry_point_die): Likewise.
28267         (gen_enumeration_type_die): Likewise.
28268         (gen_formal_parameter_die): Likewise.
28269         (gen_subprogram_die): Likewise.
28270         (gen_variable_die): Likewise.
28271         (gen_const_die): Likewise.
28272         (gen_field_die): Likewise.
28273         (gen_pointer_type_die): Likewise.
28274         (gen_reference_type_die): Likewise.
28275         (gen_ptr_to_mbr_type_die): Likewise.
28276         (gen_inheritance_die): Likewise.
28277         (gen_subroutine_type_die): Likewise.
28278         (gen_typedef_die): Likewise.
28279         (force_type_die): Likewise.
28281 2014-08-19  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
28283         * configure.ac (gcc_cv_as_comdat_group_group): Only default to no
28284         if unset.
28285         * configure: Regenerate.
28287 2014-08-19  Richard Biener  <rguenther@suse.de>
28289         * lto-streamer-out.c (DFS::DFS_write_tree_body): Stream
28290         DECL_EXTERNALs in BLOCKs as non-references.
28291         * tree-streamer-out.c (streamer_write_chain): Likewise.
28293 2014-08-19  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28294             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28295             Anna Tikhonova  <anna.tikhonova@intel.com>
28296             Ilya Tocar  <ilya.tocar@intel.com>
28297             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28298             Ilya Verbin  <ilya.verbin@intel.com>
28299             Kirill Yukhin  <kirill.yukhin@intel.com>
28300             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28302         * config/i386/sse.md
28303         (define_mode_iterator VI48_AVX512F): Delete.
28304         (define_mode_iterator VI48_AVX512F_AVX512VL): New.
28305         (define_mode_iterator VI2_AVX512VL): Ditto.
28306         (define_insn "<mask_codefor>avx512f_ufix_notruncv16sfv16si<mask_name><round_name>"):
28307         Delete.
28308         (define_insn
28309         ("<mask_codefor><avx512>_ufix_notrunc<sf2simodelower><mode><mask_name><round_name>"):
28310         New.
28311         (define_insn "avx512cd_maskw_vec_dup<mode>"): Macroize.
28312         (define_insn "<avx2_avx512f>_ashrv<mode><mask_name>"): Delete.
28313         (define_insn "<avx2_avx512bw>_ashrv<mode><mask_name>",
28314         with VI48_AVX512F_AVX512VL): New.
28315         (define_insn "<avx2_avx512bw>_ashrv<mode><mask_name>",
28316         with VI2_AVX512VL): Ditto.
28318 2014-08-19  Marek Polacek  <polacek@redhat.com>
28320         * doc/invoke.texi: Document -Wc99-c11-compat.
28322 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28324         * rtl.h (PREV_INSN): Split macro in two: the existing one,
28325         for rvalues, and...
28326         (SET_PREV_INSN): New macro, for use as an lvalue.
28327         (NEXT_INSN, SET_NEXT_INSN): Likewise.
28329         * caller-save.c (save_call_clobbered_regs): Convert lvalue use of
28330         PREV_INSN/NEXT_INSN into SET_PREV_INSN/SET_NEXT_INSN.
28331         * cfgrtl.c (try_redirect_by_replacing_jump): Likewise.
28332         (fixup_abnormal_edges): Likewise.
28333         (unlink_insn_chain): Likewise.
28334         (fixup_reorder_chain): Likewise.
28335         (cfg_layout_delete_block): Likewise.
28336         (cfg_layout_merge_blocks): Likewise.
28337         * combine.c (update_cfg_for_uncondjump): Likewise.
28338         * emit-rtl.c (link_insn_into_chain): Likewise.
28339         (remove_insn): Likewise.
28340         (delete_insns_since): Likewise.
28341         (reorder_insns_nobb): Likewise.
28342         (emit_insn_after_1): Likewise.
28343         * final.c (rest_of_clean_state): Likewise.
28344         (final_scan_insn): Likewise.
28345         * gcse.c (can_assign_to_reg_without_clobbers_p): Likewise.
28346         * haifa-sched.c (concat_note_lists): Likewise.
28347         (remove_notes): Likewise.
28348         (restore_other_notes): Likewise.
28349         (move_insn): Likewise.
28350         (unlink_bb_notes): Likewise.
28351         (restore_bb_notes): Likewise.
28352         * jump.c (delete_for_peephole): Likewise.
28353         * optabs.c (emit_libcall_block_1): Likewise.
28354         * reorg.c (emit_delay_sequence): Likewise.
28355         (fill_simple_delay_slots): Likewise.
28356         * sel-sched-ir.c (sel_move_insn): Likewise.
28357         (sel_remove_insn): Likewise.
28358         (get_bb_note_from_pool): Likewise.
28359         * sel-sched.c (move_nop_to_previous_block): Likewise.
28361         * config/bfin/bfin.c (reorder_var_tracking_notes): Likewise.
28362         * config/c6x/c6x.c (gen_one_bundle): Likewise.
28363         (c6x_gen_bundles): Likewise.
28364         (hwloop_optimize): Likewise.
28365         * config/frv/frv.c (frv_function_prologue): Likewise.
28366         (frv_register_nop): Likewise.
28367         * config/ia64/ia64.c (ia64_init_dfa_pre_cycle_insn): Likewise.
28368         (ia64_reorg): Likewise.
28369         * config/mep/mep.c (mep_reorg_addcombine): Likewise.
28370         (mep_make_bundle): Likewise.
28371         (mep_bundle_insns): Likewise.
28372         * config/picochip/picochip.c (reorder_var_tracking_notes): Likewise.
28373         * config/tilegx/tilegx.c (reorder_var_tracking_notes): Likewise.
28374         * config/tilepro/tilepro.c (reorder_var_tracking_notes): Likewise.
28376 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28378         * basic-block.h (BB_HEAD): Convert to a function.  Strengthen the
28379         return type from rtx to rtx_insn *.
28380         (BB_END): Likewise.
28381         (BB_HEADER): Likewise.
28382         (BB_FOOTER): Likewise.
28383         (SET_BB_HEAD): Convert to a function.
28384         (SET_BB_END): Likewise.
28385         (SET_BB_HEADER): Likewise.
28386         (SET_BB_FOOTER): Likewise.
28388         * cfgrtl.c (BB_HEAD): New function, from macro of same name.
28389         Strengthen the return type from rtx to rtx_insn *.  For now, this
28390         is done by adding a checked cast, but this will eventually
28391         become a field lookup.
28392         (BB_END): Likewise.
28393         (BB_HEADER): Likewise.
28394         (BB_FOOTER): Likewise.
28395         (SET_BB_HEAD): New function, from macro of same name.  This is
28396         intended for use as an lvalue, and so returns an rtx& to allow
28397         in-place modification.
28398         (SET_BB_END): Likewise.
28399         (SET_BB_HEADER): Likewise.
28400         (SET_BB_FOOTER): Likewise.
28402 2014-08-18  David Malcolm  <dmalcolm@redhat.com>
28404         * basic-block.h (BB_HEAD): Split macro in two: the existing one,
28405         for rvalues, and...
28406         (SET_BB_HEAD): New macro, for use as a lvalue.
28407         (BB_END, SET_BB_END): Likewise.
28408         (BB_HEADER, SET_BB_HEADER): Likewise.
28409         (BB_FOOTER, SET_BB_FOOTER): Likewise.
28411         * bb-reorder.c (add_labels_and_missing_jumps): Convert lvalue use
28412         of BB_* macros into SET_BB_* macros.
28413         (fix_crossing_unconditional_branches): Likewise.
28414         * caller-save.c (save_call_clobbered_regs): Likewise.
28415         (insert_one_insn): Likewise.
28416         * cfgbuild.c (find_bb_boundaries): Likewise.
28417         * cfgcleanup.c (merge_blocks_move_successor_nojumps): Likewise.
28418         (outgoing_edges_match): Likewise.
28419         (try_optimize_cfg): Likewise.
28420         * cfgexpand.c (expand_gimple_cond): Likewise.
28421         (expand_gimple_tailcall): Likewise.
28422         (expand_gimple_basic_block): Likewise.
28423         (construct_exit_block): Likewise.
28424         * cfgrtl.c (delete_insn): Likewise.
28425         (create_basic_block_structure): Likewise.
28426         (rtl_delete_block): Likewise.
28427         (rtl_split_block): Likewise.
28428         (emit_nop_for_unique_locus_between): Likewise.
28429         (rtl_merge_blocks): Likewise.
28430         (block_label): Likewise.
28431         (try_redirect_by_replacing_jump): Likewise.
28432         (emit_barrier_after_bb): Likewise.
28433         (fixup_abnormal_edges): Likewise.
28434         (record_effective_endpoints): Likewise.
28435         (relink_block_chain): Likewise.
28436         (fixup_reorder_chain): Likewise.
28437         (fixup_fallthru_exit_predecessor): Likewise.
28438         (cfg_layout_duplicate_bb): Likewise.
28439         (cfg_layout_split_block): Likewise.
28440         (cfg_layout_delete_block): Likewise.
28441         (cfg_layout_merge_blocks): Likewise.
28442         * combine.c (update_cfg_for_uncondjump): Likewise.
28443         * emit-rtl.c (add_insn_after): Likewise.
28444         (remove_insn): Likewise.
28445         (reorder_insns): Likewise.
28446         (emit_insn_after_1): Likewise.
28447         * haifa-sched.c (get_ebb_head_tail): Likewise.
28448         (restore_other_notes): Likewise.
28449         (move_insn): Likewise.
28450         (sched_extend_bb): Likewise.
28451         (fix_jump_move): Likewise.
28452         * ifcvt.c (noce_process_if_block): Likewise.
28453         (dead_or_predicable): Likewise.
28454         * ira.c (update_equiv_regs): Likewise.
28455         * reg-stack.c (change_stack): Likewise.
28456         * sel-sched-ir.c (sel_move_insn): Likewise.
28457         * sel-sched.c (move_nop_to_previous_block): Likewise.
28459         * config/c6x/c6x.c (hwloop_optimize): Likewise.
28460         * config/ia64/ia64.c (emit_predicate_relation_info): Likewise.
28462 2014-08-18  David Malcolm  <dmalcolm@redhat.com>
28464         * rtl.h (for_each_rtx_in_insn): New function.
28465         * rtlanal.c (for_each_rtx_in_insn): Likewise.
28467 2014-08-18  David Malcolm  <dmalcolm@redhat.com>
28469         * coretypes.h (class rtx_insn): Add forward declaration.
28471         * rtl.h: Include is-a.h.
28472         (struct rtx_def): Add dummy "desc" and "tag" GTY options as a
28473         workaround to ensure gengtype knows inheritance is occurring,
28474         whilst continuing to use the pre-existing special-casing for
28475         rtx_def.
28476         (class rtx_insn): New subclass of rtx_def, adding the
28477         invariant that we're dealing with something we can sanely use
28478         INSN_UID, NEXT_INSN, PREV_INSN on.
28479         (is_a_helper <rtx_insn *>::test): New.
28480         (is_a_helper <const rtx_insn *>::test): New.
28482 2014-08-18  David Malcolm  <dmalcolm@redhat.com>
28484         * is-a.h (template<T, U> safe_as_a <U *p>) New function.
28486 2014-08-18  Jan Hubicka  <hubicka@ucw.cz>
28488         * ipa-visibility.c (update_visibility_by_resolution_info): Do no
28489         turn UNDEF comdats as extern.
28491 2014-08-18  Jan Hubicka  <hubicka@ucw.cz>
28493         * gimple-fold.c (fold_gimple_assign): Do not intorudce referneces
28494         to BUILT_IN_UNREACHABLE.
28496 2014-08-18  Uros Bizjak  <ubizjak@gmail.com>
28498         PR target/62011
28499         * config/i386/x86-tune.def (X86_TUNE_AVOID_FALSE_DEP_FOR_BMI):
28500         New tune flag.
28501         * config/i386/i386.h (TARGET_AVOID_FALSE_DEP_FOR_BMI): New define.
28502         * config/i386/i386.md (unspec) <UNSPEC_INSN_FALSE_DEP>: New unspec.
28503         (ffs<mode>2): Do not expand with tzcnt for
28504         TARGET_AVOID_FALSE_DEP_FOR_BMI.
28505         (ffssi2_no_cmove): Ditto.
28506         (*tzcnt<mode>_1): Disable for TARGET_AVOID_FALSE_DEP_FOR_BMI.
28507         (ctz<mode>2): New expander.
28508         (*ctz<mode>2_falsedep_1): New insn_and_split pattern.
28509         (*ctz<mode>2_falsedep): New insn.
28510         (*ctz<mode>2): Rename from ctz<mode>2.
28511         (clz<mode>2_lzcnt): New expander.
28512         (*clz<mode>2_lzcnt_falsedep_1): New insn_and_split pattern.
28513         (*clz<mode>2_lzcnt_falsedep): New insn.
28514         (*clz<mode>2): Rename from ctz<mode>2.
28515         (popcount<mode>2): New expander.
28516         (*popcount<mode>2_falsedep_1): New insn_and_split pattern.
28517         (*popcount<mode>2_falsedep): New insn.
28518         (*popcount<mode>2): Rename from ctz<mode>2.
28519         (*popcount<mode>2_cmp): Remove.
28520         (*popcountsi2_cmp_zext): Ditto.
28522 2014-08-18  Ajit Agarwal  <ajitkum@xilinx.com>
28524         * config/microblaze/microblaze.c (microblaze_elf_asm_cdtor): New.
28525         (microblaze_elf_asm_constructor,microblaze_elf_asm_destructor): New.
28526         * config/microblaze/microblaze.h
28527         (TARGET_ASM_CONSTRUCTOR,TARGET_ASM_DESTRUCTOR): New Macros.
28529 2014-08-18  H.J. Lu  <hongjiu.lu@intel.com>
28531         PR other/62168
28532         * configure.ac: Set install_gold_as_default to no for
28533         --enable-gold=no.
28534         * configure: Regenerated.
28536 2014-08-18 Roman Gareev  <gareevroman@gmail.com>
28538         * Makefile.in: Add definition of ISLLIBS, HOST_ISLLIBS.
28539         * config.in: Add undef of HAVE_isl.
28540         * configure: Regenerate.
28541         * configure.ac: Add definition of HAVE_isl.
28542         * graphite-blocking.c: Add checking of HAVE_isl.
28543         * graphite-dependences.c: Likewise.
28544         * graphite-interchange.c: Likewise.
28545         * graphite-isl-ast-to-gimple.c: Likewise.
28546         * graphite-optimize-isl.c: Likewise.
28547         * graphite-poly.c: Likewise.
28548         * graphite-scop-detection.c: Likewise.
28549         * graphite-sese-to-poly.c: Likewise.
28550         * graphite.c: Likewise.
28551         * toplev.c: Replace the checking of HAVE_cloog with the checking
28552         of HAVE_isl.
28554 2014-08-18  Richard Biener  <rguenther@suse.de>
28556         PR tree-optimization/62090
28557         * builtins.c (fold_builtin_snprintf): Move to gimple-fold.c.
28558         (fold_builtin_3): Do not fold snprintf.
28559         (fold_builtin_4): Likewise.
28560         * gimple-fold.c (gimple_fold_builtin_snprintf): New function
28561         moved from builtins.c.
28562         (gimple_fold_builtin_with_strlen): Fold snprintf and sprintf.
28563         (gimple_fold_builtin): Do not fold sprintf here.
28565 2014-08-18  Richard Biener  <rguenther@suse.de>
28567         * gimple-fold.c (maybe_fold_reference): Move re-gimplification
28568         code to ...
28569         (maybe_canonicalize_mem_ref_addr): ... this function.
28570         (fold_stmt_1): Apply it here before all simplification.
28572 2014-08-18  Ilya Enkovich  <ilya.enkovich@intel.com>
28574         PR ipa/61800
28575         * cgraph.h (cgraph_node::create_indirect_edge): Add
28576         compute_indirect_info param.
28577         * cgraph.c (cgraph_node::create_indirect_edge): Compute
28578         indirect_info only when it is required.
28579         * cgraphclones.c (cgraph_clone_edge): Do not recompute
28580         indirect_info fore cloned indirect edge.
28582 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28583             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28584             Anna Tikhonova  <anna.tikhonova@intel.com>
28585             Ilya Tocar  <ilya.tocar@intel.com>
28586             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28587             Ilya Verbin  <ilya.verbin@intel.com>
28588             Kirill Yukhin  <kirill.yukhin@intel.com>
28589             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28591         * config/i386/sse.md
28592         (define_mode_iterator VI8_AVX2_AVX512BW): New.
28593         (define_insn "<sse2_avx2>_psadbw"): Add evex version.
28595 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28596             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28597             Anna Tikhonova  <anna.tikhonova@intel.com>
28598             Ilya Tocar  <ilya.tocar@intel.com>
28599             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28600             Ilya Verbin  <ilya.verbin@intel.com>
28601             Kirill Yukhin  <kirill.yukhin@intel.com>
28602             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28604         * config/i386/sse.md
28605         (define_mode_iterator VF1_AVX512VL): New.
28606         (define_insn "ufloatv16siv16sf2<mask_name><round_name>"): Delete.
28607         (define_insn "ufloat<sseintvecmodelower><mode>2<mask_name><round_name>"):
28608         New.
28610 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28611             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28612             Anna Tikhonova  <anna.tikhonova@intel.com>
28613             Ilya Tocar  <ilya.tocar@intel.com>
28614             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28615             Ilya Verbin  <ilya.verbin@intel.com>
28616             Kirill Yukhin  <kirill.yukhin@intel.com>
28617             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28619         * config/i386/i386.c: Rename ufloatv8siv8df_mask to
28620         ufloatv8siv8df2_mask.
28621         * config/i386/i386.md
28622         (define_code_iterator any_float): New.
28623         (define_code_attr floatsuffix): New.
28624         * config/i386/sse.md
28625         (define_mode_iterator VF1_128_256VL): New.
28626         (define_mode_iterator VF2_512_256VL): New.
28627         (define_insn "float<si2dfmodelower><mode>2<mask_name>"): Remove
28628         unnecessary TARGET check.
28629         (define_insn "ufloatv8siv8df<mask_name>"): Delete.
28630         (define_insn "<floatsuffix>float<sseintvecmodelower><mode>2<mask_name><round_name>"):
28631         New.
28632         (define_mode_attr qq2pssuff): New.
28633         (define_mode_attr sselongvecmode): New.
28634         (define_mode_attr sselongvecmodelower): New.
28635         (define_mode_attr sseintvecmode3): New.
28636         (define_insn "<floatsuffix>float<sselongvecmodelower><mode>2<mask_name><round_name>"):
28637         New.
28638         (define_insn "*<floatsuffix>floatv2div2sf2"): New.
28639         (define_insn "<floatsuffix>floatv2div2sf2_mask"): New.
28640         (define_insn "ufloat<si2dfmodelower><mode>2<mask_name>"): New.
28641         (define_insn "ufloatv2siv2df2<mask_name>"): New.
28643 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28644             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28645             Anna Tikhonova  <anna.tikhonova@intel.com>
28646             Ilya Tocar  <ilya.tocar@intel.com>
28647             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28648             Ilya Verbin  <ilya.verbin@intel.com>
28649             Kirill Yukhin  <kirill.yukhin@intel.com>
28650             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28652         * config/i386/sse.md
28653         (define_mode_iterator VF2_AVX512VL): New.
28654         (define_mode_attr sseintvecmode2): New.
28655         (define_insn "ufix_truncv2dfv2si2<mask_name>"): Add masking.
28656         (define_insn "fix_truncv4dfv4si2<mask_name>"): New.
28657         (define_insn "ufix_truncv4dfv4si2<mask_name>"): Ditto.
28658         (define_insn
28659         "<fixsuffix>fix_trunc<mode><sseintvecmodelower>2<mask_name><round_saeonly_name>"):
28660         Ditto.
28661         (define_insn "fix_notrunc<mode><sseintvecmodelower>2<mask_name><round_name>"):
28662         Ditto.
28663         (define_insn "ufix_notrunc<mode><sseintvecmodelower>2<mask_name><round_name>"):
28664         Ditto.
28666 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28667             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28668             Anna Tikhonova  <anna.tikhonova@intel.com>
28669             Ilya Tocar  <ilya.tocar@intel.com>
28670             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28671             Ilya Verbin  <ilya.verbin@intel.com>
28672             Kirill Yukhin  <kirill.yukhin@intel.com>
28673             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28675         * config/i386/i386.md
28676         (define_insn "*movoi_internal_avx"): Add evex version.
28677         (define_insn "*movti_internal"): Ditto.
28679 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28680             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28681             Anna Tikhonova  <anna.tikhonova@intel.com>
28682             Ilya Tocar  <ilya.tocar@intel.com>
28683             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28684             Ilya Verbin  <ilya.verbin@intel.com>
28685             Kirill Yukhin  <kirill.yukhin@intel.com>
28686             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28688         * config/i386/i386.md
28689         (define_attr "isa"): Add avx512dq, noavx512dq.
28690         (define_attr "enabled"): Ditto.
28691         * config/i386/sse.md
28692         (define_insn "vec_extract_hi_<mode><mask_name>"): Support masking.
28694 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28695             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28696             Anna Tikhonova  <anna.tikhonova@intel.com>
28697             Ilya Tocar  <ilya.tocar@intel.com>
28698             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28699             Ilya Verbin  <ilya.verbin@intel.com>
28700             Kirill Yukhin  <kirill.yukhin@intel.com>
28701             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28703         * config/i386/i386.c
28704         (ix86_expand_special_args_builtin): Handle avx512vl_storev8sf_mask,
28705         avx512vl_storev8si_mask, avx512vl_storev4df_mask, avx512vl_storev4di_mask,
28706         avx512vl_storev4sf_mask, avx512vl_storev4si_mask, avx512vl_storev2df_mask,
28707         avx512vl_storev2di_mask, avx512vl_loadv8sf_mask, avx512vl_loadv8si_mask,
28708         avx512vl_loadv4df_mask, avx512vl_loadv4di_mask, avx512vl_loadv4sf_mask,
28709         avx512vl_loadv4si_mask, avx512vl_loadv2df_mask, avx512vl_loadv2di_mask,
28710         avx512bw_loadv64qi_mask, avx512vl_loadv32qi_mask, avx512vl_loadv16qi_mask,
28711         avx512bw_loadv32hi_mask, avx512vl_loadv16hi_mask, avx512vl_loadv8hi_mask.
28712         * config/i386/i386.md (define_mode_attr ssemodesuffix): Allow V32HI mode.
28713         * config/i386/sse.md
28714         (define_mode_iterator VMOVE): Allow V4TI mode.
28715         (define_mode_iterator V_AVX512VL): New.
28716         (define_mode_iterator V): New handling for AVX512VL.
28717         (define_insn "avx512f_load<mode>_mask"): Delete.
28718         (define_insn "<avx512>_load<mode>_mask"): New.
28719         (define_insn "avx512f_store<mode>_mask"): Delete.
28720         (define_insn "<avx512>_store<mode>_mask"): New.
28723 2014-08-18  Yury Gribov  <y.gribov@samsung.com>
28725         PR sanitizer/62089
28726         * asan.c (instrument_derefs): Fix bitfield check.
28728 2014-08-17  Segher Boessenkool  <segher@kernel.crashing.org>
28730         * config/rs6000/constraints.md ("S"): Require TARGET_POWERPC64.
28731         * config/rs6000/htm.md (ttest): Remove clobber.
28732         * config/rs6000/predicates.md (any_mask_operand): New predicate.
28733         (and_operand): Reformat.
28734         (and_2rld_operand): New predicate.
28735         * config/rs6000/rs6000-protos.h (rs6000_split_logical): Remove last
28736         parameter.
28737         * config/rs6000/rs6000.c (rs6000_split_logical_inner): Remove last
28738         parameter.  Handle AND directly.
28739         (rs6000_split_logical_di): Remove last parameter.
28740         (rs6000_split_logical): Remove last parameter.  Remove obsolete
28741         comment.
28742         * config/rs6000/rs6000.md (BOOL_REGS_AND_CR0): Delete.
28743         (one_cmpl<mode>2): Adjust call of rs6000_split_logical.
28744         (ctz<mode>2, ffs<mode>2): Delete clobber.  Reformat.
28745         (andsi3, andsi3_mc, andsi3_nomc, *andsi3_internal2_mc,
28746         *andsi3_internal3_mc, *andsi3_internal4, *andsi3_internal5_mc,
28747         and 5 anonymous splitters):  Delete.
28748         (and<mode>3): New expander.
28749         (*and<mode>3, *and<mode>3_dot, *and<mode>3_dot2): New.
28750         (and<mode>3_imm, *and<mode>3_imm_dot, *and<mode>3_imm_dot2): New.
28751         (*and<mode>3_mask, *and<mode>3_mask_dot, *and<mode>3_mask_dot2): New.
28752         (ior<mode>, xor<mode>3): Adjust call of rs6000_split_logical.
28753         (floatdisf2_internal1): Remove clobbers.
28754         (anddi3, anddi3_mc, anddi3_nomc, anddi3_internal2_mc,
28755         *anddi3_internal3_mc, and 4 anonymous splitters): Delete.
28756         (*anddi3_2rld, *anddi3_2rld_dot, *anddi3_2rld_dot2): New.
28757         (and<mode>3 for BOOL_128): Remove clobber.
28758         (*and<mode>3_internal for BOOL_128): Remove clobber.  Adjust call of
28759         rs6000_split_logical.
28760         (*bool<mode>3_internal for BOOL_128): Adjust call of
28761         rs6000_split_logical.
28762         (*boolc<mode>3_internal1 for BOOL_128,
28763         *boolc<mode>3_internal2 for BOOL_128,
28764         *boolcc<mode>3_internal1 for BOOL_128,
28765         *boolcc<mode>3_internal2 for BOOL_128,
28766         *eqv<mode>3_internal1 for BOOL_128,
28767         *eqv<mode>3_internal2 for BOOL_128,
28768         *one_cmpl<mode>3_internal for BOOL_128): Ditto.
28769         * config/rs6000/vector.md (*vec_reload_and_plus_<mptrsize): Remove
28770         clobber.
28771         (*vec_reload_and_reg_<mptrsize>): Delete.
28773 2014-08-17  Segher Boessenkool  <segher@kernel.crashing.org>
28775         * config/rs6000/rs6000.md (*boolccsi3_internal1, *boolccsi3_internal2
28776         and split, *boolccsi3_internal3 and split): Delete.
28777         (*boolccdi3_internal1, *boolccdi3_internal2 and split,
28778         *boolccdi3_internal3 and split): Delete.
28779         (*boolcc<mode>3, *boolcc<mode>3_dot, *boolcc<mode>3_dot2): New.
28780         (*eqv<mode>3): Move.  Add TODO comment.  Fix attributes.
28782 2014-08-17  Segher Boessenkool  <segher@kernel.crashing.org>
28784         * config/rs6000/rs6000.md (*boolcsi3_internal1, *boolcsi3_internal2
28785         and split, *boolcsi3_internal3 and split): Delete.
28786         (*boolcdi3_internal1, *boolcdi3_internal2 and split,
28787         *boolcdi3_internal3 and split): Delete.
28788         (*boolc<mode>3, *boolc<mode>3_dot, *boolc<mode>3_dot2): New.
28790 2014-08-17  Segher Boessenkool  <segher@kernel.crashing.org>
28792         * config/rs6000/rs6000.c (print_operand) <'e'>: New.
28793         <'u'>: Also support printing the low-order 16 bits.
28794         * config/rs6000/rs6000.md (iorsi3, xorsi3, *boolsi3_internal1,
28795         *boolsi3_internal2 and split, *boolsi3_internal3 and split): Delete.
28796         (iordi3, xordi3, *booldi3_internal1, *booldi3_internal2 and split,
28797         *booldi3_internal3 and split): Delete.
28798         (ior<mode>3, xor<mode>3, *bool<mode>3, *bool<mode>3_dot,
28799         *bool<mode>3_dot2): New.
28800         (two anonymous define_splits for non_logical_cint_operand): Merge.
28802 2014-08-17  Marek Polacek  <polacek@redhat.com>
28803             Manuel López-Ibáñez  <manu@gcc.gnu.org>
28805         PR c/62059
28806         * diagnostic.c (adjust_line): Add gcc_checking_assert.
28807         (diagnostic_show_locus): Don't print caret diagnostic
28808         if a column is larger than the line_width.
28810 2014-08-17 Roman Gareev  <gareevroman@gmail.com>
28812         * common.opt: Make the ISL AST generator to be the main code generator
28813         of Graphite.
28815 2014-08-16  Gerald Pfeifer  <gerald@pfeifer.com>
28817         * wide-int.h (generic_wide_int): Declare as class instead of struct.
28819 2014-08-16  John David Anglin  <danglin@gcc.gnu.org>
28821         PR target/61641
28822         * config/pa/pa-protos.h (pa_output_addr_vec, pa_output_addr_diff_vec):
28823         Declare.
28824         * config/pa/pa.c (pa_reorg): Remove code to insert brtab marker insns.
28825         (pa_output_addr_vec, pa_output_addr_diff_vec): New.
28826         * config/pa/pa.h (ASM_OUTPUT_ADDR_VEC, ASM_OUTPUT_ADDR_DIFF_VEC):
28827         Define.
28828         * config/pa/pa.md (begin_brtab): Delete insn.
28829         (end_brtab): Likewise.
28831 2014-08-16  Manuel López-Ibáñez  <manu@gcc.gnu.org>
28833         * doc/cppopts.texi (ftrack-macro-expansion): Add missing @code.
28835 2014-08-15  Jan Hubicka  <hubicka@ucw.cz>
28837         * ipa-utils.h (ipa_polymorphic_call_context): Turn into class; add ctors.
28838         (possible_polymorphic_call_targets, dump_possible_polymorphic_call_targets,
28839         possible_polymorphic_call_target_p, possible_polymorphic_call_target_p): Simplify.
28840         (get_dynamic_type): Remove.
28841         * ipa-devirt.c (ipa_dummy_polymorphic_call_context): Remove.
28842         (clear_speculation): Bring to ipa-deivrt.h
28843         (get_class_context): Rename to ...
28844         (ipa_polymorphic_call_context::restrict_to_inner_class): ... this one.
28845         (contains_type_p): Update.
28846         (get_dynamic_type): Rename to ...
28847         ipa_polymorphic_call_context::get_dynamic_type(): ... this one.
28848         (possible_polymorphic_call_targets): UPdate.
28849         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children): Update.
28850         * ipa-prop.c (ipa_analyze_call_uses): Update.
28852 2014-08-15  Oleg Endo  <olegendo@gcc.gnu.org>
28854         * doc/invoke.texi (SH options): Document missing processor variant
28855         options.  Remove references to Hitachi.  Undocument deprecated mspace
28856         option.
28858 2014-08-15  Jason Merrill  <jason@redhat.com>
28860         * tree.c (type_hash_canon): Uncomment assert.
28862 2014-08-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
28864         * input.h (in_system_header_at): Add comment.
28866 2014-08-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
28868         PR fortran/44054
28869         * diagnostic.c (build_message_string): Make it extern.
28870         * diagnostic.h (build_message_string): Make it extern.
28872 2014-08-15  Vladimir Makarov  <vmakarov@redhat.com>
28874         * config/rs6000/rs6000.c (rs6000_emit_move): Use SDmode for
28875         load/store from/to non-floating class pseudo.
28877 2014-08-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
28879         * input.c (diagnostic_file_cache_fini): Fix typo in comment.
28881 2014-08-15  Richard Biener  <rguenther@suse.de>
28883         * tree-ssa-structalias.c (readonly_id): Rename to string_id.
28884         (get_constraint_for_ssa_var): Remove dead code.
28885         (get_constraint_for_1): Adjust.
28886         (find_what_var_points_to): Likewise.
28887         (init_base_vars): Likewise.  STRING_CSTs do not contain pointers.
28889 2014-08-15  Ilya Tocar  <tocarip@gmail.com>
28891         PR target/61878
28892         * config/i386/avx512fintrin.h (_mm512_mask_cmpge_epi32_mask): New.
28893         (_mm512_mask_cmpge_epu32_mask): Ditto.
28894         (_mm512_cmpge_epu32_mask): Ditto.
28895         (_mm512_mask_cmpge_epi64_mask): Ditto.
28896         (_mm512_cmpge_epi64_mask): Ditto.
28897         (_mm512_mask_cmpge_epu64_mask): Ditto.
28898         (_mm512_cmpge_epu64_mask): Ditto.
28899         (_mm512_mask_cmple_epi32_mask): Ditto.
28900         (_mm512_cmple_epi32_mask): Ditto.
28901         (_mm512_mask_cmple_epu32_mask): Ditto.
28902         (_mm512_cmple_epu32_mask): Ditto.
28903         (_mm512_mask_cmple_epi64_mask): Ditto.
28904         (_mm512_cmple_epi64_mask): Ditto.
28905         (_mm512_mask_cmple_epu64_mask): Ditto.
28906         (_mm512_cmple_epu64_mask): Ditto.
28907         (_mm512_mask_cmplt_epi32_mask): Ditto.
28908         (_mm512_cmplt_epi32_mask): Ditto.
28909         (_mm512_mask_cmplt_epu32_mask): Ditto.
28910         (_mm512_cmplt_epu32_mask): Ditto.
28911         (_mm512_mask_cmplt_epi64_mask): Ditto.
28912         (_mm512_cmplt_epi64_mask): Ditto.
28913         (_mm512_mask_cmplt_epu64_mask): Ditto.
28914         (_mm512_cmplt_epu64_mask): Ditto.
28915         (_mm512_mask_cmpneq_epi32_mask): Ditto.
28916         (_mm512_mask_cmpneq_epu32_mask): Ditto.
28917         (_mm512_cmpneq_epu32_mask): Ditto.
28918         (_mm512_mask_cmpneq_epi64_mask): Ditto.
28919         (_mm512_cmpneq_epi64_mask): Ditto.
28920         (_mm512_mask_cmpneq_epu64_mask): Ditto.
28921         (_mm512_cmpneq_epu64_mask): Ditto.
28922         (_mm512_castpd_ps): Ditto.
28923         (_mm512_castpd_si512): Ditto.
28924         (_mm512_castps_pd): Ditto.
28925         (_mm512_castps_si512): Ditto.
28926         (_mm512_castsi512_ps): Ditto.
28927         (_mm512_castsi512_pd): Ditto.
28928         (_mm512_castpd512_pd128): Ditto.
28929         (_mm512_castps512_ps128): Ditto.
28930         (_mm512_castsi512_si128): Ditto.
28931         (_mm512_castpd512_pd256): Ditto.
28932         (_mm512_castps512_ps256): Ditto.
28933         (_mm512_castsi512_si256): Ditto.
28934         (_mm512_castpd128_pd512): Ditto.
28935         (_mm512_castps128_ps512): Ditto.
28936         (_mm512_castsi128_si512): Ditto.
28937         (_mm512_castpd256_pd512): Ditto.
28938         (_mm512_castps256_ps512): Ditto.
28939         (_mm512_castsi256_si512): Ditto.
28940         (_mm512_cmpeq_epu32_mask): Ditto.
28941         (_mm512_mask_cmpeq_epu32_mask): Ditto.
28942         (_mm512_mask_cmpeq_epu64_mask): Ditto.
28943         (_mm512_cmpeq_epu64_mask): Ditto.
28944         (_mm512_cmpgt_epu32_mask): Ditto.
28945         (_mm512_mask_cmpgt_epu32_mask): Ditto.
28946         (_mm512_mask_cmpgt_epu64_mask): Ditto.
28947         (_mm512_cmpgt_epu64_mask): Ditto.
28948         * config/i386/i386-builtin-types.def: Add V16SF_FTYPE_V8SF,
28949         V16SI_FTYPE_V8SI, V16SI_FTYPE_V4SI, V8DF_FTYPE_V2DF.
28950         * config/i386/i386.c (enum ix86_builtins): Add
28951         IX86_BUILTIN_SI512_SI256, IX86_BUILTIN_PD512_PD256,
28952         IX86_BUILTIN_PS512_PS256, IX86_BUILTIN_SI512_SI,
28953         IX86_BUILTIN_PD512_PD, IX86_BUILTIN_PS512_PS.
28954         (bdesc_args): Add __builtin_ia32_si512_256si,
28955         __builtin_ia32_ps512_256ps, __builtin_ia32_pd512_256pd,
28956         __builtin_ia32_si512_si, __builtin_ia32_ps512_ps,
28957         __builtin_ia32_pd512_pd.
28958         (ix86_expand_args_builtin): Handle new FTYPEs.
28959         * config/i386/sse.md (castmode): Add 512-bit modes.
28960         (AVX512MODE2P): New.
28961         (avx512f_<castmode><avxsizesuffix>_<castmode): New.
28962         (avx512f_<castmode><avxsizesuffix>_256<castmode): Ditto.
28964 2014-08-15  Richard Biener  <rguenther@suse.de>
28966         * fold-const.c (tree_swap_operands_p): Put all constants
28967         last, also strip sign-changing NOPs when considering further
28968         canonicalization.  Canonicalize also when optimizing for size.
28970 2014-08-15  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
28972         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate): Move
28973         one_match > zero_match case to just before simple_sequence.
28975 2014-08-15  Richard Biener  <rguenther@suse.de>
28977         * data-streamer.h (streamer_string_index, string_for_index):
28978         Remove.
28979         * data-streamer-out.c (streamer_string_index): Make static.
28980         * data-streamer-in.c (string_for_index): Likewise.
28981         * lto-streamer-out.c (lto_output_location): Use bp_pack_string.
28982         * lto-streamer-in.c (lto_input_location): Use bp_unpack_string.
28984 2014-08-15  Richard Biener  <rguenther@suse.de>
28986         PR tree-optimization/62031
28987         * tree-data-ref.c (dr_analyze_indices): Do not set
28988         DR_UNCONSTRAINED_BASE.
28989         (dr_may_alias_p): All indirect accesses have to go the
28990         formerly DR_UNCONSTRAINED_BASE path.
28991         * tree-data-ref.h (struct indices): Remove
28992         unconstrained_base member.
28993         (DR_UNCONSTRAINED_BASE): Remove.
28995 2014-08-15  Jakub Jelinek  <jakub@redhat.com>
28997         PR middle-end/62092
28998         * gimplify.c (gimplify_adjust_omp_clauses_1): Don't remove
28999         OMP_CLAUSE_SHARED for global vars if the global var is mentioned
29000         in OMP_CLAUSE_MAP in some outer target region.
29002 2014-08-15  Bin Cheng  <bin.cheng@arm.com>
29004         * tree-ssa-loop-ivopts.c (ivopts_data): New field
29005         name_expansion_cache.
29006         (tree_ssa_iv_optimize_init): Initialize name_expansion_cache.
29007         (tree_ssa_iv_optimize_finalize): Free name_expansion_cache.
29008         (strip_wrap_conserving_type_conversions, expr_equal_p): Delete.
29009         (difference_cannot_overflow_p): New parameter.  Use affine
29010         expansion for equality check.
29011         (iv_elimination_compare_lt): Pass new argument.
29013 2014-08-14  DJ Delorie  <dj@redhat.com>
29015         * config/rl78/rl78-real.md (addqi3_real): Allow adding global
29016         variables to the accumulator.
29018         * config/rl78/predicates.md (rl78_near_mem_operand): New.
29019         * config/rl78/rl78-virt.md (movqi_virt_mm, movqi_virt)
29020         (movhi_virt_mm): Split out near mem-mem moves to avoid problems
29021         with far-far moves.
29023         * config/rl78/rl78-expand.md (umulqihi3): Disable for G10.
29024         * config/rl78/rl78-virt.md (umulhi3_shift_virt): Likewise.
29025         (umulqihi3_virt): Likewise.
29026         * config/rl78/rl78-real.md (umulhi3_shift_real): Likewise.
29027         (umulqihi3_real): Likewise.
29029         * config/rl78/rl78-virt.md (movhi_virt): Allow const->far moves.
29031 2014-08-14  Jan Hubicka  <hubicka@ucw.cz>
29033         PR tree-optimization/62091
29034         * tree-ssa-alias.c (walk_aliased_vdefs_1): Do not clear
29035         function_entry_reached.
29036         (walk_aliased_vdefs): Clear it here.
29037         * ipa-devirt.c (check_stmt_for_type_change): Handle static storage.
29039 2014-08-14  Jan Hubicka  <hubicka@ucw.cz>
29041         * ipa-utils.h (compare_virtual_tables): Declare.
29042         * ipa-devirt.c (odr_subtypes_equivalent_p): New function
29044 2014-08-14  Marek Polacek  <polacek@redhat.com>
29046         DR 458
29047         * ginclude/stdatomic.h (__atomic_type_lock_free): Remove.
29048         (ATOMIC_*_LOCK_FREE): Map to __GCC_ATOMIC_*_LOCK_FREE.
29050 2014-08-14  Tom de Vries  <tom@codesourcery.com>
29052         * emit-rtl.h (mem_attrs_eq_p): Remove duplicate declaration.
29054 2014-08-14  Tom de Vries  <tom@codesourcery.com>
29056         PR rtl-optimization/62004
29057         PR rtl-optimization/62030
29058         * ifcvt.c (rtx_interchangeable_p): New function.
29059         (noce_try_move, noce_process_if_block): Use rtx_interchangeable_p.
29060         * emit-rtl.h (mem_attrs_eq_p): Declare.
29062 2014-08-14  Roman Gareev  <gareevroman@gmail.com>
29064         * graphite-scop-detection.c:
29065         Add inclusion of cp-tree.h.
29066         (graphite_can_represent_scev): Disables the handling of SSA_NAME nodes
29067         in case they are pointers to object types
29069 2014-08-14  Richard Biener  <rguenther@suse.de>
29071         * BASE-VER: Change to 5.0.0
29073 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29074             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29075             Anna Tikhonova  <anna.tikhonova@intel.com>
29076             Ilya Tocar  <ilya.tocar@intel.com>
29077             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29078             Ilya Verbin  <ilya.verbin@intel.com>
29079             Kirill Yukhin  <kirill.yukhin@intel.com>
29080             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29082         * config/i386/sse.md (define_mode_attr avx512): New.
29083         (define_mode_attr sse2_avx_avx512f): Allow V8HI, V16HI, V32HI, V2DI,
29084         V4DI modes.
29085         (define_mode_attr sse2_avx2): Allow V64QI, V32HI, V4TI modes.
29086         (define_mode_attr ssse3_avx2): Ditto.
29087         (define_mode_attr sse4_1_avx2): Allow V64QI, V32HI, V8DI modes.
29088         (define_mode_attr avx2_avx512bw): New.
29089         (define_mode_attr ssedoublemodelower): New.
29090         (define_mode_attr ssedoublemode): Allow V8SF, V8SI, V4DI, V4DF, V4SI,
29091         V32HI, V64QI modes.
29092         (define_mode_attr ssebytemode): Allow V8DI modes.
29093         (define_mode_attr sseinsnmode): Allow V4TI, V32HI, V64QI modes.
29094         (define_mode_attr sseintvecmodelower): Allow V8DF, V4TI modes.
29095         (define_mode_attr ssePSmode2): New.
29096         (define_mode_attr ssescalarsize): Allow V64QI, V32QI, V16QI, V8HI,
29097         V16HI, V32HI modes.
29098         (define_mode_attr dbpsadbwmode): New.
29099         (define_mode_attr bcstscalarsuff): Allow V64QI, V32QI, V16QI, V32HI,
29100         V16HI, V8HI, V8SI, V4SI, V4DI, V2DI, V8SF, V4SF, V4DF, V2DF modes.
29101         (vi8_sse4_1_avx2_avx512): New.
29102         (define_insn <sse4_1_avx2>_movntdqa): Use <vi8_sse4_1_avx2_avx512>
29103         mode attribute.
29104         (define_mode_attr blendbits): Move before its immediate use.
29106 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29107             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29108             Anna Tikhonova  <anna.tikhonova@intel.com>
29109             Ilya Tocar  <ilya.tocar@intel.com>
29110             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29111             Ilya Verbin  <ilya.verbin@intel.com>
29112             Kirill Yukhin  <kirill.yukhin@intel.com>
29113             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29115         * config/i386/sse.md: Allow V64QI, V32QI, V32HI, V4HI modes.
29116         * config/i386/subst.md
29117         (define_mode_iterator SUBST_V): Update.
29118         (define_mode_iterator SUBST_A): Ditto.
29119         (define_subst_attr "mask_operand7"): New.
29120         (define_subst_attr "mask_operand10"): New.
29121         (define_subst_attr "mask_operand_arg34") : New.
29122         (define_subst_attr "mask_expand_op3"): New.
29123         (define_subst_attr "mask_mode512bit_condition"): Handle TARGET_AVX512VL.
29124         (define_subst_attr "sd_mask_mode512bit_condition"): Ditto.
29125         (define_subst_attr "mask_avx512vl_condition"): New.
29126         (define_subst_attr "round_mask_operand4"): Ditto.
29127         (define_subst_attr "round_mask_scalar_op3"): Delete.
29128         (define_subst_attr "round_mask_op4"): New.
29129         (define_subst_attr "round_mode512bit_condition"): Allow V8DImode,
29130         V16SImode.
29131         (define_subst_attr "round_modev8sf_condition"): New.
29132         (define_subst_attr "round_modev4sf_condition"): GET_MODE instead of
29133         <MODE>mode.
29134         (define_subst_attr "round_saeonly_mask_operand4"): New.
29135         (define_subst_attr "round_saeonly_mask_op4"): New.
29136         (define_subst_attr "round_saeonly_mode512bit_condition"): Allow
29137         V8DImode, V16SImode.
29138         (define_subst_attr "round_saeonly_modev8sf_condition"): New.
29139         (define_subst_attr "mask_expand4_name" "mask_expand4"): New.
29140         (define_subst_attr "mask_expand4_args"): New.
29141         (define_subst "mask_expand4"): New.
29143 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29144             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29145             Anna Tikhonova  <anna.tikhonova@intel.com>
29146             Ilya Tocar  <ilya.tocar@intel.com>
29147             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29148             Ilya Verbin  <ilya.verbin@intel.com>
29149             Kirill Yukhin  <kirill.yukhin@intel.com>
29150             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29152         * config/i386/i386.md
29153         (define_attr "isa"): Add avx512bw,noavx512bw.
29154         (define_attr "enabled"): Ditto.
29155         (define_split): Add 32/64-bit mask logic.
29156         (define_insn "*k<logic>qi"): New.
29157         (define_insn "*k<logic>hi"): New.
29158         (define_insn "*anddi_1"): Add mask version.
29159         (define_insn "*andsi_1"): Ditto.
29160         (define_insn "*<code><mode>_1"): Ditto.
29161         (define_insn "*<code>hi_1"): Ditto.
29162         (define_insn "kxnor<mode>"): New.
29163         (define_insn "kunpcksi"): New.
29164         (define_insn "kunpckdi"): New.
29165         (define_insn "*one_cmpl<mode>2_1"): Add mask version.
29166         (define_insn "*one_cmplhi2_1"): Ditto.
29168 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29169             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29170             Anna Tikhonova  <anna.tikhonova@intel.com>
29171             Ilya Tocar  <ilya.tocar@intel.com>
29172             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29173             Ilya Verbin  <ilya.verbin@intel.com>
29174             Kirill Yukhin  <kirill.yukhin@intel.com>
29175             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29177         * config/i386/i386.c (ix86_preferred_simd_mode): Allow V64QImode and
29178         V32HImode.
29180 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29181             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29182             Anna Tikhonova  <anna.tikhonova@intel.com>
29183             Ilya Tocar  <ilya.tocar@intel.com>
29184             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29185             Ilya Verbin  <ilya.verbin@intel.com>
29186             Kirill Yukhin  <kirill.yukhin@intel.com>
29187             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29189         * config/i386/i386.c (print_reg): Ð¡orrectly print 64-bit mask
29190         registers.
29191         (inline_secondary_memory_needed): Allow 64 bit wide mask registers.
29192         (ix86_hard_regno_mode_ok): Allow 32/64-bit mask registers and
29193         xmm/ymm16+ when availble.
29194         * config/i386/i386.h
29195         (HARD_REGNO_NREGS): Add mask regs.
29196         (VALID_AVX512F_REG_MODE): Ditto.
29197         (VALID_AVX512F_REG_MODE) : Define.
29198         (VALID_MASK_AVX512BW_MODE): Ditto.
29199         (reg_class) (MASK_REG_P(X)): Define.
29200         * config/i386/i386.md: Do not split long moves with mask register,
29201         use kmovb if avx512bw is availible.
29202         (movdi_internal): Handle mask registers.
29204 2014-08-14  Richard Biener  <rguenther@suse.de>
29206         PR tree-optimization/62081
29207         * tree-ssa-loop.c (pass_fix_loops): New pass.
29208         (pass_tree_loop::gate):  Do not fixup loops here.
29209         * tree-pass.h (make_pass_fix_loops): Declare.
29210         * passes.def: Schedule pass_fix_loops before GIMPLE loop passes.
29212 2014-08-14  Richard Biener  <rguenther@suse.de>
29214         * tree.c (type_hash_lookup, type_hash_add): Merge into ...
29215         (type_hash_canon): ... this and avoid 2nd lookup for the add.
29217 2014-08-14  Richard Biener  <rguenther@suse.de>
29219         PR tree-optimization/62090
29220         * builtins.c (fold_builtin_sprintf): Move to gimple-fold.c.
29221         (fold_builtin_2): Do not fold sprintf.
29222         (fold_builtin_3): Likewise.
29223         * gimple-fold.c (gimple_fold_builtin_sprintf): New function
29224         moved from builtins.c.
29225         (gimple_fold_builtin): Fold sprintf.
29227 2014-08-14  Richard Biener  <rguenther@suse.de>
29229         PR rtl-optimization/62079
29230         * recog.c (peephole2_optimize): If peep2_do_cleanup_cfg
29231         run cleanup_cfg.
29233 2014-08-14  Ilya Enkovich  <ilya.enkovich@intel.com>
29235         * ipa-devirt.c (get_polymorphic_call_info): Use fndecl instead of
29236         current_function_decl.
29238 2014-08-14  Ilya Enkovich  <ilya.enkovich@intel.com>
29240         * cgraph.c (cgraph_node::function_symbol): Fix wrong
29241         cgraph_function_node to cgraph_node::function_symbol
29242         refactoring.
29244 2014-08-14  Zhenqiang Chen  <zhenqiang.chen@arm.com>
29246         * config/arm/arm.c (arm_option_override): Set max_insns_skipped
29247         to MAX_INSN_PER_IT_BLOCK when optimize_size for THUMB2.
29249 2014-08-13  Chen Gang  gang.chen.5i5j@gmail.com
29251         * microblaze/microblaze.md: Remove redundant '@' to avoid compiling
29252         warning.
29254 2014-08-13  Roman Gareev  <gareevroman@gmail.com>
29256         * gcc.dg/graphite/pr35356-2.c: Update according to the ISL code
29257         generator.
29259 2014-08-12  Jakub Jelinek  <jakub@redhat.com>
29261         PR target/62025
29262         * sched-deps.c (find_inc): Check if inc_insn doesn't clobber
29263         any registers that are used in mem_insn.
29265 2014-08-12  Steve Ellcey  <sellcey@mips.com>
29267         * config/mips/mips.h (ASM_SPEC): Pass float options to assembler.
29269 2014-08-12  Steve Ellcey  <sellcey@mips.com>
29271         * config/mips/t-mti-elf (MULTILIB_OPTIONS): Remove fp64 multilib.
29272         (MULTILIB_DIRNAMES): Ditto.
29273         * config/mips/t-mti-elf (MULTILIB_OPTIONS): Ditto.
29274         * config/mips/t-mti-elf (MULTILIB_EXCEPTIONS): Ditto.
29275         * config/mips/t-mti-linux (MULTILIB_OPTIONS): Ditto.
29276         * config/mips/t-mti-linux (MULTILIB_DIRNAMES): Ditto.
29277         * config/mips/t-mti-linux (MULTILIB_EXCEPTIONS): Ditto.
29278         * config/mips/mti-linux.h (SYSROOT_SUFFIX_SPEC): Ditto.
29280 2014-08-12  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
29282         PR target/61413
29283         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Fix definition
29284         of __ARM_SIZEOF_WCHAR_T.
29286 2014-08-12  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
29288         PR target/62098
29289         * config/arm/vfp.md (*combine_vcvtf2i): Fix constraint.
29290         Remove unnecessary attributes.
29292 2014-08-12  Yury Gribov  <y.gribov@samsung.com>
29294         * internal-fn.c (init_internal_fns): Fix off-by-one.
29296 2014-08-12  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29297             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29298             Anna Tikhonova  <anna.tikhonova@intel.com>
29299             Ilya Tocar  <ilya.tocar@intel.com>
29300             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29301             Ilya Verbin  <ilya.verbin@intel.com>
29302             Kirill Yukhin  <kirill.yukhin@intel.com>
29303             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29305         * config/i386/i386.c (standard_sse_constant_opcode): Use
29306         vpxord/vpternlog if avx512 is availible.
29308 2014-08-12  Thomas Preud'homme  <thomas.preudhomme@arm.com>
29310         PR middle-end/62103
29311         * gimple-fold.c (fold_ctor_reference): Don't fold in presence of
29312         bitfields, that is when size doesn't match the size of type or the
29313         size of the constructor.
29315 2014-08-11  Michael Meissner  <meissner@linux.vnet.ibm.com>
29317         * config/rs6000/constraints.md (wh constraint): New constraint,
29318         for FP registers if direct move is available.
29319         (wi constraint): New constraint, for VSX/FP registers that can
29320         handle 64-bit integers.
29321         (wj constraint): New constraint for VSX/FP registers that can
29322         handle 64-bit integers for direct moves.
29323         (wk constraint): New constraint for VSX/FP registers that can
29324         handle 64-bit doubles for direct moves.
29325         (wy constraint): Make documentation match implementation.
29327         * config/rs6000/rs6000.c (struct rs6000_reg_addr): Add
29328         scalar_in_vmx_p field to simplify tests of whether SFmode or
29329         DFmode can go in the Altivec registers.
29330         (rs6000_hard_regno_mode_ok): Use scalar_in_vmx_p field.
29331         (rs6000_setup_reg_addr_masks): Likewise.
29332         (rs6000_debug_print_mode): Add debug support for scalar_in_vmx_p
29333         field, and wh/wi/wj/wk constraints.
29334         (rs6000_init_hard_regno_mode_ok): Setup scalar_in_vmx_p field, and
29335         the wh/wi/wj/wk constraints.
29336         (rs6000_preferred_reload_class): If SFmode/DFmode can go in the
29337         upper registers, prefer VSX registers unless the operation is a
29338         memory operation with REG+OFFSET addressing.
29340         * config/rs6000/vsx.md (VSr mode attribute): Add support for
29341         DImode.  Change SFmode to use ww constraint instead of d to allow
29342         SF registers in the upper registers.
29343         (VSr2): Likewise.
29344         (VSr3): Likewise.
29345         (VSr5): Fix thinko in comment.
29346         (VSa): New mode attribute that is an alternative to wa, that
29347         returns the VSX register class that a mode can go in, but may not
29348         be the preferred register class.
29349         (VS_64dm): New mode attribute for appropriate register classes for
29350         referencing 64-bit elements of vectors for direct moves and normal
29351         moves.
29352         (VS_64reg): Likewise.
29353         (vsx_mov<mode>): Change wa constraint to <VSa> to limit the
29354         register allocator to only registers the data type can handle.
29355         (vsx_le_perm_load_<mode>): Likewise.
29356         (vsx_le_perm_store_<mode>): Likewise.
29357         (vsx_xxpermdi2_le_<mode>): Likewise.
29358         (vsx_xxpermdi4_le_<mode>): Likewise.
29359         (vsx_lxvd2x2_le_<mode>): Likewise.
29360         (vsx_lxvd2x4_le_<mode>): Likewise.
29361         (vsx_stxvd2x2_le_<mode>): Likewise.
29362         (vsx_add<mode>3): Likewise.
29363         (vsx_sub<mode>3): Likewise.
29364         (vsx_mul<mode>3): Likewise.
29365         (vsx_div<mode>3): Likewise.
29366         (vsx_tdiv<mode>3_internal): Likewise.
29367         (vsx_fre<mode>2): Likewise.
29368         (vsx_neg<mode>2): Likewise.
29369         (vsx_abs<mode>2): Likewise.
29370         (vsx_nabs<mode>2): Likewise.
29371         (vsx_smax<mode>3): Likewise.
29372         (vsx_smin<mode>3): Likewise.
29373         (vsx_sqrt<mode>2): Likewise.
29374         (vsx_rsqrte<mode>2): Likewise.
29375         (vsx_tsqrt<mode>2_internal): Likewise.
29376         (vsx_fms<mode>4): Likewise.
29377         (vsx_nfma<mode>4): Likewise.
29378         (vsx_eq<mode>): Likewise.
29379         (vsx_gt<mode>): Likewise.
29380         (vsx_ge<mode>): Likewise.
29381         (vsx_eq<mode>_p): Likewise.
29382         (vsx_gt<mode>_p): Likewise.
29383         (vsx_ge<mode>_p): Likewise.
29384         (vsx_xxsel<mode>): Likewise.
29385         (vsx_xxsel<mode>_uns): Likewise.
29386         (vsx_copysign<mode>3): Likewise.
29387         (vsx_float<VSi><mode>2): Likewise.
29388         (vsx_floatuns<VSi><mode>2): Likewise.
29389         (vsx_fix_trunc<mode><VSi>2): Likewise.
29390         (vsx_fixuns_trunc<mode><VSi>2): Likewise.
29391         (vsx_x<VSv>r<VSs>i): Likewise.
29392         (vsx_x<VSv>r<VSs>ic): Likewise.
29393         (vsx_btrunc<mode>2): Likewise.
29394         (vsx_b2trunc<mode>2): Likewise.
29395         (vsx_floor<mode>2): Likewise.
29396         (vsx_ceil<mode>2): Likewise.
29397         (vsx_<VS_spdp_insn>): Likewise.
29398         (vsx_xscvspdp): Likewise.
29399         (vsx_xvcvspuxds): Likewise.
29400         (vsx_float_fix_<mode>2): Likewise.
29401         (vsx_set_<mode>): Likewise.
29402         (vsx_extract_<mode>_internal1): Likewise.
29403         (vsx_extract_<mode>_internal2): Likewise.
29404         (vsx_extract_<mode>_load): Likewise.
29405         (vsx_extract_<mode>_store): Likewise.
29406         (vsx_splat_<mode>): Likewise.
29407         (vsx_xxspltw_<mode>): Likewise.
29408         (vsx_xxspltw_<mode>_direct): Likewise.
29409         (vsx_xxmrghw_<mode>): Likewise.
29410         (vsx_xxmrglw_<mode>): Likewise.
29411         (vsx_xxsldwi_<mode>): Likewise.
29412         (vsx_xscvdpspn): Tighten constraints to only use register classes
29413         the types use.
29414         (vsx_xscvspdpn): Likewise.
29415         (vsx_xscvdpspn_scalar): Likewise.
29417         * config/rs6000/rs6000.h (enum rs6000_reg_class_enum): Add wh, wi,
29418         wj, and wk constraints.
29419         (GPR_REG_CLASS_P): New helper macro for register classes targeting
29420         general purpose registers.
29422         * config/rs6000/rs6000.md (f32_dm): Use wh constraint for SDmode
29423         direct moves.
29424         (zero_extendsidi2_lfiwz): Use wj constraint for direct move of
29425         DImode instead of wm.  Use wk constraint for direct move of DFmode
29426         instead of wm.
29427         (extendsidi2_lfiwax): Likewise.
29428         (lfiwax): Likewise.
29429         (lfiwzx): Likewise.
29430         (movdi_internal64): Likewise.
29432         * doc/md.texi (PowerPC and IBM RS6000): Document wh, wi, wj, and
29433         wk constraints. Make the wy constraint documentation match them
29434         implementation.
29436 2014-08-11  Mircea Namolaru  <mircea.namolaru@inria.fr>
29438         Replacement of isl_int by isl_val
29439         * graphite-clast-to-gimple.c: include isl/val.h, isl/val_gmp.h
29440         (compute_bounds_for_param): use isl_val instead of isl_int
29441         (compute_bounds_for_loop): likewise
29442         * graphite-interchange.c: include isl/val.h, isl/val_gmp.h
29443         (build_linearized_memory_access): use isl_val instead of isl_int
29444         (pdr_stride_in_loop): likewise
29445         * graphite-optimize-isl.c:
29446         (getPrevectorMap): use isl_val instead of isl_int
29447         * graphite-poly.c:
29448         (pbb_number_of_iterations_at_time): use isl_val instead of isl_int
29449         graphite-sese-to-poly.c: include isl/val.h, isl/val_gmp.h
29450         (extern the_isl_ctx): declare
29451         (build_pbb_scattering_polyhedrons): use isl_val instead of isl_int
29452         (extract_affine_gmp): likewise
29453         (wrap): likewise
29454         (build_loop_iteration_domains): likewise
29455         (add_param_constraints): likewise
29457 2014-08-11  Richard Biener  <rguenther@suse.de>
29459         PR tree-optimization/62075
29460         * tree-vect-slp.c (vect_detect_hybrid_slp_stmts): Properly
29461         handle uses in patterns.
29463 2014-08-11  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29464             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29465             Anna Tikhonova  <anna.tikhonova@intel.com>
29466             Ilya Tocar  <ilya.tocar@intel.com>
29467             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29468             Ilya Verbin  <ilya.verbin@intel.com>
29469             Kirill Yukhin  <kirill.yukhin@intel.com>
29470             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29472         * common/config/i386/i386-common.c
29473         (OPTION_MASK_ISA_AVX512VL_SET): Define.
29474         (OPTION_MASK_ISA_AVX512F_UNSET): Update.
29475         (ix86_handle_option): Handle OPT_mavx512vl.
29476         * config/i386/cpuid.h (bit_AVX512VL): Define.
29477         * config/i386/driver-i386.c (host_detect_local_cpu): Detect avx512vl,
29478         set -mavx512vl accordingly.
29479         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
29480         OPTION_MASK_ISA_AVX512VL.
29481         * config/i386/i386.c (ix86_target_string): Handle -mavx512vl.
29482         (ix86_option_override_internal): Define PTA_AVX512VL, handle
29483         PTA_AVX512VL and OPTION_MASK_ISA_AVX512VL.
29484         (ix86_valid_target_attribute_inner_p): Handle OPT_mavx512vl.
29485         * config/i386/i386.h (TARGET_AVX512VL): Define.
29486         (TARGET_AVX512VL_P(x)): Ditto.
29487         * config/i386/i386.opt: Add mavx512vl.
29489 2014-08-11  Felix Yang  <fei.yang0953@gmail.com>
29491         PR tree-optimization/62073
29492         * tree-vect-loop.c (vect_is_simple_reduction_1): Check that DEF1 has
29493         a basic block.
29495 2014-08-11  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29496             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29497             Anna Tikhonova  <anna.tikhonova@intel.com>
29498             Ilya Tocar  <ilya.tocar@intel.com>
29499             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29500             Ilya Verbin  <ilya.verbin@intel.com>
29501             Kirill Yukhin  <kirill.yukhin@intel.com>
29502             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29504         * common/config/i386/i386-common.c
29505         (OPTION_MASK_ISA_AVX512BW_SET) : Define.
29506         (OPTION_MASK_ISA_AVX512BW_UNSET): Ditto.
29507         (OPTION_MASK_ISA_AVX512VL_UNSET) : Ditto.
29508         (ix86_handle_option): Handle OPT_mavx512bw.
29509         * config/i386/cpuid.h (bit_AVX512BW): Define.
29510         * config/i386/driver-i386.c (host_detect_local_cpu): Detect avx512bw,
29511         set -mavx512bw accordingly.
29512         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
29513         OPTION_MASK_ISA_AVX512BW.
29514         * config/i386/i386.c (ix86_target_string): Handle -mavx512bw.
29515         (ix86_option_override_internal): Define PTA_AVX512BW, handle
29516         PTA_AVX512BW and OPTION_MASK_ISA_AVX512BW.
29517         (ix86_valid_target_attribute_inner_p): Handle OPT_mavx512bw.
29518         * config/i386/i386.h (TARGET_AVX512BW): Define.
29519         (TARGET_AVX512BW_P(x)): Ditto.
29520         * config/i386/i386.opt: Add mavx512bw.
29522 2014-08-11  Richard Biener  <rguenther@suse.de>
29524         PR tree-optimization/62070
29525         * tree-ssa-loop-manip.c (gimple_duplicate_loop_to_header_edge):
29526         Remove SSA checking.
29528 2014-08-11  Yury Gribov  <y.gribov@samsung.com>
29530         * asan.c (asan_check_flags): New enum.
29531         (build_check_stmt_with_calls): Removed function.
29532         (build_check_stmt): Split inlining logic to
29533         asan_expand_check_ifn.
29534         (instrument_derefs): Rename parameter.
29535         (instrument_mem_region_access): Rename parameter.
29536         (instrument_strlen_call): Likewise.
29537         (asan_expand_check_ifn): New function.
29538         (asan_instrument): Remove old code.
29539         (pass_sanopt::execute): Change handling of
29540         asan-instrumentation-with-call-threshold.
29541         (asan_clear_shadow): Fix formatting.
29542         (asan_function_start): Likewise.
29543         (asan_emit_stack_protection): Likewise.
29544         * doc/invoke.texi (asan-instrumentation-with-call-threshold):
29545         Update description.
29546         * internal-fn.c (expand_ASAN_CHECK): New function.
29547         * internal-fn.def (ASAN_CHECK): New internal function.
29548         * params.def (PARAM_ASAN_INSTRUMENTATION_WITH_CALL_THRESHOLD):
29549         Update description.
29550         (PARAM_ASAN_USE_AFTER_RETURN): Likewise.
29551         * tree.c: Small comment fix.
29553 2014-08-11  Yury Gribov  <y.gribov@samsung.com>
29555         * gimple.c (gimple_call_fnspec): Support internal functions.
29556         (gimple_call_return_flags): Use const.
29557         * Makefile.in (GTFILES): Add internal-fn.h to list of GC files.
29558         * internal-fn.def: Add fnspec information.
29559         * internal-fn.h (internal_fn_fnspec): New function.
29560         (init_internal_fns): Declare new function.
29561         * internal-fn.c (internal_fn_fnspec_array): New global variable.
29562         (init_internal_fns): New function.
29563         * tree-core.h: Update macro call.
29564         * tree.c (build_common_builtin_nodes): Initialize internal fns.
29566 2014-08-10  Gerald Pfeifer  <gerald@pfeifer.com>
29568         * lto-streamer.h (struct output_block::symbol): Change from
29569         struct symtab_node to plain symtab_node.
29570         (referenced_from_this_partition_p): Change first parameter
29571         from struct symtab_node to plain symtab_node.
29573 2014-08-10  Marek Polacek  <polacek@redhat.com>
29575         PR c/51849
29576         * gcc/doc/invoke.texi: Document -Wc90-c99-compat.
29578 2014-08-09  Jan Hubicka  <hubicka@ucw.cz>
29580         * ipa-devirt.c (get_dynamic_type): Handle case when instance is in
29581         DECL correctly; do not give up on types in static storage.
29583 2014-08-09  Paolo Carlini  <paolo.carlini@oracle.com>
29585         * doc/invoke.texi ([Wnarrowing]): Update for non-constants in C++11.
29587 2014-08-09  Roman Gareev  <gareevroman@gmail.com>
29589         * graphite-isl-ast-to-gimple.c:
29590         (translate_isl_ast_node_user): Use nb_loops instead of loop->num + 1.
29592         * gcc.dg/graphite/isl-ast-gen-user-1.c: New testcase.
29594 2014-08-08  Guozhi Wei  <carrot@google.com>
29596         * config/rs6000/rs6000.md (*movdi_internal64): Add a new constraint.
29598 2014-08-08  Cary Coutant  <ccoutant@google.com>
29600         * dwarf2out.c (get_skeleton_type_unit): Remove.
29601         (output_skeleton_debug_sections): Remove skeleton type units.
29602         (output_comdat_type_unit): Likewise.
29603         (dwarf2out_finish): Likewise.
29605 2014-08-07  Yi Yang  <ahyangyi@google.com>
29607         * predict.c (expr_expected_value_1): Remove the redundant assignment.
29609 2014-08-08  Richard Biener  <rguenther@suse.de>
29611         * lto-streamer.h (struct lto_input_block): Make it a class
29612         with a constructor.
29613         (LTO_INIT_INPUT_BLOCK, LTO_INIT_INPUT_BLOCK_PTR): Remove.
29614         (struct lto_function_header, struct lto_simple_header,
29615         struct lto_simple_header_with_strings,
29616         struct lto_decl_header, struct lto_function_header): Make
29617         a simple inheritance hieararchy.  Remove unused fields.
29618         (struct lto_asm_header): Remove.
29619         * lto-streamer-out.c (produce_asm): Adjust.
29620         (lto_output_toplevel_asms): Likewise.
29621         (produce_asm_for_decls): Likewise.
29622         * lto-section-out.c (lto_destroy_simple_output_block): Likewise.
29623         * data-streamer-in.c (string_for_index): Likewise.
29624         * ipa-inline-analysis.c (inline_read_section): Likewise.
29625         * ipa-prop.c (ipa_prop_read_section): Likewise.
29626         (read_replacements_section): Likewise.
29627         * lto-cgraph.c (input_cgraph_opt_section): Likewise.
29628         * lto-section-in.c (lto_create_simple_input_block): Likewise.
29629         (lto_destroy_simple_input_block): Likewise.
29630         * lto-streamer-in.c (lto_read_body_or_constructor): Likewise.
29631         (lto_input_toplevel_asms): Likewise.
29633 2014-08-08  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29634             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29635             Anna Tikhonova  <anna.tikhonova@intel.com>
29636             Ilya Tocar  <ilya.tocar@intel.com>
29637             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29638             Ilya Verbin  <ilya.verbin@intel.com>
29639             Kirill Yukhin  <kirill.yukhin@intel.com>
29640             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29642         * common/config/i386/i386-common.c
29643         (OPTION_MASK_ISA_AVX512DQ_SET): Define.
29644         (OPTION_MASK_ISA_AVX512DQ_UNSET): Ditto.
29645         (ix86_handle_option): Handle OPT_mavx512dq.
29646         * config/i386/cpuid.h (bit_AVX512DQ): Define.
29647         * config/i386/driver-i386.c (host_detect_local_cpu): Detect avx512dq,
29648         set -mavx512dq accordingly.
29649         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
29650         OPTION_MASK_ISA_AVX512DQ.
29651         * config/i386/i386.c (ix86_target_string): Handle -mavx512dq.
29652         (ix86_option_override_internal): Define PTA_AVX512DQ, handle
29653         PTA_AVX512DQ and OPTION_MASK_ISA_AVX512DQ.
29654         (ix86_valid_target_attribute_inner_p): Handle OPT_mavx512dq.
29655         * config/i386/i386.h (TARGET_AVX512DQ): Define.
29656         (TARGET_AVX512DQ_P(x)): Ditto.
29657         * config/i386/i386.opt: Add mavx512dq.
29659 2014-08-08  Richard Biener  <rguenther@suse.de>
29661         * builtins.c (c_getstr, readonly_data_expr, init_target_chars,
29662         target_percent, target_percent_s): Export.
29663         (var_decl_component_p, fold_builtin_memory_op, fold_builtin_memset,
29664         fold_builtin_bzero, fold_builtin_strcpy, fold_builtin_strncpy,
29665         fold_builtin_strcat, fold_builtin_fputs, fold_builtin_memory_chk,
29666         fold_builtin_stxcpy_chk, fold_builtin_stxncpy_chk,
29667         fold_builtin_sprintf_chk_1, fold_builtin_snprintf_chk_1):
29668         Move to gimple-fold.c.
29669         (fold_builtin_2): Remove handling of bzero, fputs, fputs_unlocked,
29670         strcat and strcpy.
29671         (fold_builtin_3): Remove handling of memset, bcopy, memcpy,
29672         mempcpy, memmove, strncpy, strcpy_chk and stpcpy_chk.
29673         (fold_builtin_4): Remove handling of memcpy_chk, mempcpy_chk,
29674         memmove_chk, memset_chk, strncpy_chk and stpncpy_chk.
29675         (rewrite_call_expr_array): Remove.
29676         (fold_builtin_sprintf_chk): Likewise.
29677         (fold_builtin_snprintf_chk): Likewise.
29678         (fold_builtin_varargs): Remove handling of sprintf_chk,
29679         vsprintf_chk, snprintf_chk and vsnprintf_chk.
29680         (gimple_fold_builtin_sprintf_chk): Remove.
29681         (gimple_fold_builtin_snprintf_chk): Likewise.
29682         (gimple_fold_builtin_varargs): Likewise.
29683         (fold_call_stmt): Do not call gimple_fold_builtin_varargs.
29684         * predict.c (optimize_bb_for_size_p): Handle NULL bb.
29685         * gimple.c (gimple_seq_add_seq_without_update): New function.
29686         * gimple.h (gimple_seq_add_seq_without_update): Declare.
29687         * gimple-fold.c: Include output.h.
29688         (gsi_replace_with_seq_vops): New function, split out from ...
29689         (gimplify_and_update_call_from_tree): ... here.
29690         (replace_call_with_value): New function.
29691         (replace_call_with_call_and_fold): Likewise.
29692         (var_decl_component_p): Moved from builtins.c.
29693         (gimple_fold_builtin_memory_op): Moved from builtins.c
29694         fold_builtin_memory_op and rewritten to GIMPLE.
29695         (gimple_fold_builtin_memset): Likewise.
29696         (gimple_fold_builtin_strcpy): Likewise.
29697         (gimple_fold_builtin_strncpy): Likewise.
29698         (gimple_fold_builtin_strcat): Likewise.
29699         (gimple_fold_builtin_fputs): Likewise.
29700         (gimple_fold_builtin_memory_chk): Likewise.
29701         (gimple_fold_builtin_stxcpy_chk): Likewise.
29702         (gimple_fold_builtin_stxncpy_chk): Likewise.
29703         (gimple_fold_builtin_snprintf_chk): Likewise.
29704         (gimple_fold_builtin_sprintf_chk): Likewise.
29705         (gimple_fold_builtin_strlen): New function.
29706         (gimple_fold_builtin_with_strlen): New function split out from
29707         gimple_fold_builtin.
29708         (gimple_fold_builtin): Change signature and handle
29709         bzero, memset, bcopy, memcpy, mempcpy and memmove folding
29710         here.  Call gimple_fold_builtin_with_strlen.
29711         (gimple_fold_call): Adjust.
29713 2014-08-08  Kugan Vivekanandarajah  <kuganv@linaro.org>
29715         * calls.c (precompute_arguments): Check
29716         promoted_for_signed_and_unsigned_p and set the promoted mode.
29717         (promoted_for_signed_and_unsigned_p): New function.
29718         (expand_expr_real_1): Check promoted_for_signed_and_unsigned_p
29719         and set the promoted mode.
29720         * expr.h (promoted_for_signed_and_unsigned_p): New function definition.
29721         * cfgexpand.c (expand_gimple_stmt_1): Call emit_move_insn if
29722         SUBREG is promoted with SRP_SIGNED_AND_UNSIGNED.
29725 2014-08-08  Kugan Vivekanandarajah  <kuganv@linaro.org>
29727         * calls.c (precompute_arguments): Use new SUBREG_PROMOTED_SET
29728         instead of SUBREG_PROMOTED_UNSIGNED_SET.
29729         (expand_call): Likewise.
29730         * cfgexpand.c (expand_gimple_stmt_1): Use SUBREG_PROMOTED_SIGN
29731         to get promoted mode.
29732         * combine.c (record_promoted_value): Skip > 0 comparison with
29733         SUBREG_PROMOTED_UNSIGNED_P as it now returns only 0 or 1.
29734         * expr.c (convert_move): Use SUBREG_CHECK_PROMOTED_SIGN instead
29735         of SUBREG_PROMOTED_UNSIGNED_P.
29736         (convert_modes): Likewise.
29737         (store_expr): Use SUBREG_PROMOTED_SIGN to get promoted mode.
29738         Use SUBREG_CHECK_PROMOTED_SIGN instead of SUBREG_PROMOTED_UNSIGNED_P.
29739         (expand_expr_real_1): Use new SUBREG_PROMOTED_SET instead of
29740         SUBREG_PROMOTED_UNSIGNED_SET.
29741         * function.c (assign_parm_setup_reg): Use new SUBREG_PROMOTED_SET
29742         instead of SUBREG_PROMOTED_UNSIGNED_SET.
29743         * ifcvt.c (noce_emit_cmove): Updated to use SUBREG_PROMOTED_GET and
29744         SUBREG_PROMOTED_SET.
29745         * internal-fn.c (ubsan_expand_si_overflow_mul_check): Use
29746         SUBREG_PROMOTED_SET instead of SUBREG_PROMOTED_UNSIGNED_SET.
29747         * optabs.c (widen_operand): Use SUBREG_CHECK_PROMOTED_SIGN instead
29748         of SUBREG_PROMOTED_UNSIGNED_P.
29749         * rtl.h (SUBREG_PROMOTED_UNSIGNED_SET): Remove.
29750         (SUBREG_PROMOTED_SET): New define.
29751         (SUBREG_PROMOTED_GET): Likewise.
29752         (SUBREG_PROMOTED_SIGN): Likewise.
29753         (SUBREG_PROMOTED_SIGNED_P): Likewise.
29754         (SUBREG_CHECK_PROMOTED_SIGN): Likewise.
29755         (SUBREG_PROMOTED_UNSIGNED_P): Updated.
29756         * rtlanal.c (unsigned_reg_p): Use new SUBREG_PROMOTED_GET
29757         instead of SUBREG_PROMOTED_UNSIGNED_GET.
29758         (nonzero_bits1): Skip > 0 comparison with the results as
29759         SUBREG_PROMOTED_UNSIGNED_P now returns only 0 or 1.
29760         (num_sign_bit_copies1): Use SUBREG_PROMOTED_SIGNED_P instead
29761         of !SUBREG_PROMOTED_UNSIGNED_P.
29762         * simplify-rtx.c (simplify_unary_operation_1): Use new
29763         SUBREG_PROMOTED_SIGNED_P instead of !SUBREG_PROMOTED_UNSIGNED_P.
29764         (simplify_subreg): Use new SUBREG_PROMOTED_SIGNED_P,
29765         SUBREG_PROMOTED_UNSIGNED_P and SUBREG_PROMOTED_SET instead of
29766         SUBREG_PROMOTED_UNSIGNED_P and SUBREG_PROMOTED_UNSIGNED_SET.
29768 2014-08-07  Jan Hubicka  <hubicka@ucw.cz>
29770         * ipa-devirt.c: Include gimple-pretty-print.h
29771         (referenced_from_vtable_p): Exclude DECL_EXTERNAL from
29772         further tests.
29773         (decl_maybe_in_construction_p): Fix conditional on cdtor check
29774         (get_polymorphic_call_info): Fix return value
29775         (type_change_info): New sturcture based on ipa-prop
29776         variant.
29777         (noncall_stmt_may_be_vtbl_ptr_store): New predicate
29778         based on ipa-prop variant.
29779         (extr_type_from_vtbl_ptr_store): New function
29780         based on ipa-prop variant.
29781         (record_known_type): New function.
29782         (check_stmt_for_type_change): New function.
29783         (get_dynamic_type): New function.
29784         * ipa-prop.c (ipa_analyze_call_uses): Use get_dynamic_type.
29785         * tree-ssa-pre.c: ipa-utils.h
29786         (eliminate_dom_walker::before_dom_children): Use ipa-devirt
29787         machinery; sanity check with ipa-prop devirtualization.
29788         * trans-mem.c (ipa_tm_insert_gettmclone_call): Clear
29789         polymorphic flag.
29791 2014-08-07  Trevor Saunders  <tsaunders@mozilla.com>
29793         * Makefile.in: Remove references to pointer-set.c and pointer-set.h.
29794         * alias.c, cfgexpand.c, cgraphbuild.c,
29795         config/aarch64/aarch64-builtins.c, config/aarch64/aarch64.c,
29796         config/alpha/alpha.c, config/darwin.c, config/i386/i386.c,
29797         config/i386/winnt.c, config/ia64/ia64.c, config/m32c/m32c.c,
29798         config/mep/mep.c, config/mips/mips.c, config/rs6000/rs6000.c,
29799         config/s390/s390.c, config/sh/sh.c, config/sparc/sparc.c,
29800         config/spu/spu.c, config/stormy16/stormy16.c, config/tilegx/tilegx.c,
29801         config/tilepro/tilepro.c, config/xtensa/xtensa.c, dominance.c,
29802         dse.c, except.c, gengtype.c, gimple-expr.c,
29803         gimple-ssa-strength-reduction.c, gimplify.c, ifcvt.c,
29804         ipa-visibility.c, lto-streamer.h, omp-low.c, predict.c, stmt.c,
29805         tree-affine.c, tree-cfg.c, tree-eh.c, tree-inline.c, tree-nested.c,
29806         tree-scalar-evolution.c, tree-ssa-loop-im.c, tree-ssa-loop-niter.c,
29807         tree-ssa-phiopt.c, tree-ssa-structalias.c, tree-ssa-uninit.c,
29808         tree-ssa.c, tree.c, var-tracking.c, varpool.c: Remove includes of
29809         pointer-set.h.
29810         * pointer-set.c: Remove file.
29811         * pointer-set.h: Remove file.
29813 2014-08-07  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29815         * config/arm/arm.md (*cmov<mode>): Set type attribute to fcsel.
29816         * config/arm/types.md (f_sels, f_seld): Delete.
29818 2014-08-07  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29820         * config/aarch64/aarch64.md (absdi2): Set simd attribute.
29821         (aarch64_reload_mov<mode>): Predicate on TARGET_FLOAT.
29822         (aarch64_movdi_<mode>high): Likewise.
29823         (aarch64_mov<mode>high_di): Likewise.
29824         (aarch64_movdi_<mode>low): Likewise.
29825         (aarch64_mov<mode>low_di): Likewise.
29826         (aarch64_movtilow_tilow): Likewise.
29827         Add comment explaining usage of fp,simd attributes and of
29828         TARGET_FLOAT and TARGET_SIMD.
29830 2014-08-07  Ian Bolton  <ian.bolton@arm.com>
29831             Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29833         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate):
29834         Use MOVN when one of the half-words is 0xffff.
29836 2014-08-07  Marat Zakirov  <m.zakirov@samsung.com>
29838         * config/arm/thumb1.md (*thumb1_movqi_insn): Copy of thumb1_movhi_insn.
29840 2014-08-07  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
29842         * haifa-sched.c (SCHED_SORT): Delete.  Macro used exactly once.
29843         (enum rfs_decition:RFS_*): New constants wrapped in an enum.
29844         (rfs_str): String corresponding to RFS_* constants.
29845         (rank_for_schedule_stats_t): New typedef.
29846         (rank_for_schedule_stats): New static variable.
29847         (rfs_result): New static function.
29848         (rank_for_schedule): Track statistics for deciding heuristics.
29849         (rank_for_schedule_stats_diff, print_rank_for_schedule_stats): New
29850         static functions.
29851         (ready_sort): Use them for debug printouts.
29852         (schedule_block): Init statistics state.  Print statistics on
29853         rank_for_schedule decisions.
29855 2014-08-07  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
29857         * haifa-sched.c (rank_for_schedule): Fix INSN_TICK-based heuristics.
29859 2014-08-07  Ilya Tocar  <ilya.tocar@intel.com>
29861         * config/i386/sse.md (vec_extract_lo_<mode><mask_name>): Fix
29862         constraint.
29864 2014-08-07  Trevor Saunders  <tsaunders@mozilla.com>
29866         * hash-map.h (default_hashmap_traits): Adjust overloads of hash
29867         function to not conflict.
29868         * alias.c, cfgexpand.c, dse.c, except.h, gimple-expr.c,
29869         gimple-ssa-strength-reduction.c, gimple-ssa.h, ifcvt.c,
29870         lto-streamer-out.c, lto-streamer.h, tree-affine.c, tree-affine.h,
29871         tree-predcom.c, tree-scalar-evolution.c, tree-ssa-loop-im.c,
29872         tree-ssa-loop-niter.c, tree-ssa.c, value-prof.c: Use hash_map instead
29873         of pointer_map.
29875 2014-08-07  Marek Polacek  <polacek@redhat.com>
29877         * fold-const.c (fold_binary_loc): Add folding of
29878         (PTR0 - (PTR1 p+ A) -> (PTR0 - PTR1) - A.
29880 2013-08-07  Ilya Enkovich  <ilya.enkovich@intel.com>
29882         * config/elfos.h (ASM_DECLARE_OBJECT_NAME): Use decl size
29883         instead of type size.
29884         (ASM_FINISH_DECLARE_OBJECT): Likewise.
29886 2014-08-07  Marat Zakirov  <m.zakirov@samsung.com>
29888         * config/arm/thumb1.md (*thumb1_movhi_insn): Handle stack pointer.
29889         (*thumb1_movqi_insn): Likewise.
29890         * config/arm/thumb2.md (*thumb2_movhi_insn): Likewise.
29892 2014-08-07  Tom de Vries  <tom@codesourcery.com>
29894         * doc/sourcebuild.texi (glibc, glibc_2_12_or_later)
29895         (glibc_2_11_or_earlier): Remove effective-target keywords.
29897 2014-08-07  Kugan Vivekanandarajah  <kuganv@linaro.org>
29899         * config/arm/arm.c (bdesc_2arg): Fix typo.
29900         (arm_atomic_assign_expand_fenv): Remove The default implementation.
29902 2014-08-07  Zhenqiang Chen  <zhenqiang.chen@arm.com>
29904         * tree-ssa-loop-ivopts.c (get_address_cost): Try aligned offset.
29906 2014-08-06  Vladimir Makarov  <vmakarov@redhat.com>
29908         PR debug/61923
29909         * haifa-sched.c (advance_one_cycle): Fix dump.
29910         (schedule_block): Don't advance cycle if we are already at the
29911         beginning of the cycle.
29913 2014-08-06  Martin Jambor  <mjambor@suse.cz>
29915         PR ipa/61393
29916         * cgraphclones.c (cgraph_node::create_clone): Also copy tm_clone.
29918 2014-08-06  Richard Biener  <rguenther@suse.de>
29920         PR lto/62034
29921         * lto-streamer-in.c (lto_input_tree_1): Assert we do not read
29922         SCCs here.
29923         (lto_input_tree): Pop SCCs here.
29925 2014-08-06  Richard Biener  <rguenther@suse.de>
29927         PR tree-optimization/61320
29928         * tree-ssa-loop-ivopts.c (may_be_unaligned_p): Properly
29929         handle misaligned loads.
29931 2014-08-06  Alan Lawrence  <alan.lawrence@arm.com>
29933         * config/aarch64/aarch64.c (aarch64_evpc_dup): Enable for bigendian.
29934         (aarch64_expand_vec_perm_const): Check for dup before zip.
29936 2014-08-06  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29938         * config/aarch64/aarch64.c (aarch64_classify_address): Use REG_P and
29939         CONST_INT_P instead of GET_CODE and compare.
29940         (aarch64_select_cc_mode): Likewise.
29941         (aarch64_print_operand): Likewise.
29942         (aarch64_rtx_costs): Likewise.
29943         (aarch64_simd_valid_immediate): Likewise.
29944         (aarch64_simd_check_vect_par_cnst_half): Likewise.
29945         (aarch64_simd_emit_pair_result_insn): Likewise.
29947 2014-08-05  David Malcolm  <dmalcolm@redhat.com>
29949         * gdbhooks.py (find_gcc_source_dir): New helper function.
29950         (class PassNames): New class, locating and parsing passes.def.
29951         (class BreakOnPass): New command "break-on-pass".
29953 2014-08-05  Trevor Saunders  <tsaunders@mozilla.com>
29955         * tree-ssa.c (redirect_edge_var_map_dup): insert newe before
29956         getting olde.
29958 2014-08-05  Richard Biener  <rguenther@suse.de>
29960         PR rtl-optimization/61672
29961         * emit-rtl.h (mem_attrs_eq_p): Declare.
29962         * emit-rtl.c (mem_attrs_eq_p): Export.  Handle NULL mem-attrs.
29963         * cse.c (exp_equiv_p): Use mem_attrs_eq_p.
29964         * cfgcleanup.c (merge_memattrs): Likewise.
29965         Include emit-rtl.h.
29967 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29969         * config/aarch64/arm_neon.h (vqdmlals_lane_s32): Use scalar types
29970         rather than singleton vectors.
29971         (vqdmlsls_lane_s32): Likewise.
29973 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29975         * config/aarch64/aarch64-simd.md (aarch64_sqdmulh_laneq<mode>):
29976         Use VSDQ_HSI mode iterator.
29977         (aarch64_sqrdmulh_laneq<mode>): Likewise.
29978         (aarch64_sq<r>dmulh_laneq<mode>_internal): New define_insn.
29979         * config/aarch64/aarch64-simd-builtins.def (sqdmulh_laneq):
29980         Use BUILTIN_VDQHS macro.
29981         (sqrdmulh_laneq): Likewise.
29982         * config/aarch64/arm_neon.h (vqdmlalh_laneq_s16): New intrinsic.
29983         (vqdmlals_laneq_s32): Likewise.
29984         (vqdmlslh_laneq_s16): Likewise.
29985         (vqdmlsls_laneq_s32): Likewise.
29986         (vqdmulhh_laneq_s16): Likewise.
29987         (vqdmulhs_laneq_s32): Likewise.
29988         (vqrdmulhh_laneq_s16): Likewise.
29989         (vqrdmulhs_laneq_s32): Likewise.
29991 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29993         * config/aarch64/arm_neon.h (vmul_f64): New intrinsic.
29994         (vmuld_laneq_f64): Likewise.
29995         (vmuls_laneq_f32): Likewise.
29996         (vmul_n_f64): Likewise.
29997         (vmuld_lane_f64): Reimplement in C.
29998         (vmuls_lane_f32): Likewise.
30000 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30002         * config/arm/cortex-a15.md (cortex_a15_alu_shift): Add crc type
30003         to reservation.
30004         * config/arm/cortex-a53.md (cortex_a53_alu_shift): Likewise.
30006 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30008         * config/arm/arm.md (clzsi2): Set predicable_short_it attr to no.
30009         (rbitsi2): Likewise.
30010         (*arm_rev): Set predicable and predicable_short_it attributes.
30012 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30014         * convert.c (convert_to_integer): Guard transformation to lrint by
30015         -fno-math-errno.
30017 2014-08-05  James Greenhalgh  <james.greenhalgh@arm.com>
30019         * config/aarch64/aarch64-builtins.c
30020         (aarch64_simd_builtin_type_mode): Delete.
30021         (v8qi_UP): Remap to V8QImode.
30022         (v4hi_UP): Remap to V4HImode.
30023         (v2si_UP): Remap to V2SImode.
30024         (v2sf_UP): Remap to V2SFmode.
30025         (v1df_UP): Remap to V1DFmode.
30026         (di_UP): Remap to DImode.
30027         (df_UP): Remap to DFmode.
30028         (v16qi_UP):V16QImode.
30029         (v8hi_UP): Remap to V8HImode.
30030         (v4si_UP): Remap to V4SImode.
30031         (v4sf_UP): Remap to V4SFmode.
30032         (v2di_UP): Remap to V2DImode.
30033         (v2df_UP): Remap to V2DFmode.
30034         (ti_UP): Remap to TImode.
30035         (ei_UP): Remap to EImode.
30036         (oi_UP): Remap to OImode.
30037         (ci_UP): Map to CImode.
30038         (xi_UP): Remap to XImode.
30039         (si_UP): Remap to SImode.
30040         (sf_UP): Remap to SFmode.
30041         (hi_UP): Remap to HImode.
30042         (qi_UP): Remap to QImode.
30043         (aarch64_simd_builtin_datum): Make mode a machine_mode.
30044         (VAR1): Build builtin name.
30045         (aarch64_init_simd_builtins): Remove dead code.
30047 2014-08-05  Roman Gareev  <gareevroman@gmail.com>
30049         * graphite-isl-ast-to-gimple.c:
30050         (set_options): New function.
30051         (scop_to_isl_ast): Add calling of set_options.
30053 2014-08-05  Jakub Jelinek  <jakub@redhat.com>
30055         * loop-unroll.c (struct iv_to_split): Remove n_loc and loc fields.
30056         (analyze_iv_to_split_insn): Don't initialize them.
30057         (get_ivts_expr): Removed.
30058         (allocate_basic_variable, insert_base_initialization): Use
30059         SET_SRC instead of *get_ivts_expr.
30060         (split_iv): Use &SET_SRC instead of get_ivts_expr.
30062 2014-08-05  Roman Gareev  <gareevroman@gmail.com>
30064         * graphite-isl-ast-to-gimple.c: Add a new struct ast_build_info.
30065         (translate_isl_ast_for_loop): Add checking of the
30066         flag_loop_parallelize_all.
30067         (ast_build_before_for): New function.
30068         (scop_to_isl_ast): Add checking of the
30069         flag_loop_parallelize_all.
30070         * graphite-dependences.c: Move the defenition of the
30071         scop_get_dependences from graphite-optimize-isl.c to this file.
30072         (apply_schedule_on_deps): Add checking of the ux's emptiness.
30073         (carries_deps): Add checking of the x's value.
30074         * graphite-optimize-isl.c: Move the defenition of the
30075         scop_get_dependences to graphite-dependences.c.
30076         * graphite-poly.h: Add declarations of scop_get_dependences
30077         and carries_deps.
30079 2014-08-04  Rohit  <rohitarulraj@freescale.com>
30081         PR target/60102
30082         * config/rs6000/rs6000.c (rs6000_reg_names): Add SPE high register
30083         names.
30084         (alt_reg_names): Likewise.
30085         (rs6000_dwarf_register_span): For SPE high registers, replace
30086         dwarf register numbers with GCC hard register numbers.
30087         (rs6000_init_dwarf_reg_sizes_extra): Likewise.
30088         (rs6000_dbx_register_number): For SPE high registers, return dwarf
30089         register number for the corresponding GCC hard register number.
30090         * config/rs6000/rs6000.h (FIRST_PSEUDO_REGISTER): Update based on 32
30091         newly added GCC hard register numbers for SPE high registers.
30092         (DWARF_FRAME_REGISTERS):  Likewise.
30093         (DWARF_REG_TO_UNWIND_COLUMN): Likewise.
30094         (DWARF_FRAME_REGNUM): Likewise.
30095         (FIXED_REGISTERS): Likewise.
30096         (CALL_USED_REGISTERS): Likewise.
30097         (CALL_REALLY_USED_REGISTERS): Likewise.
30098         (REG_ALLOC_ORDER): Likewise.
30099         (enum reg_class): Likewise.
30100         (REG_CLASS_NAMES): Likewise.
30101         (REG_CLASS_CONTENTS): Likewise.
30102         (SPE_HIGH_REGNO_P): New macro to identify SPE high registers.
30104 2014-08-04  Richard Biener  <rguenther@suse.de>
30106         * gimple-fold.h (gimple_fold_builtin): Remove.
30107         * gimple-fold.c (gimple_fold_builtin): Make static.
30108         * tree-ssa-ccp.c (pass_fold_builtins::execute): Use
30109         fold_stmt, not gimple_fold_builtin.
30111 2014-08-04  Martin Liska <mliska@suse.cz>
30113         * cgraph.h (csi_end_p): Removed.
30114         (csi_next): Likewise.
30115         (csi_node): Likewise.
30116         (csi_start): Likewise.
30117         (cgraph_node_in_set_p): Likewise.
30118         (cgraph_node_set_size): Likewise.
30119         (vsi_end_p): Likewise.
30120         (vsi_next): Likewise.
30121         (vsi_node): Likewise.
30122         (vsi_start): Likewise.
30123         (varpool_node_set_size): Likewise.
30124         (cgraph_node_set_nonempty_p): Likewise.
30125         (varpool_node_set_nonempty_p): Likewise.
30126         * cgraphunit.c (cgraph_process_new_functions): vec replaces
30127         cgraph_node_set.
30128         * ipa-inline-transform.c: Likewise.
30129         * ipa-utils.c (cgraph_node_set_new): Removed.
30130         (cgraph_node_set_add): Likewise.
30131         (cgraph_node_set_remove): Likewise.
30132         (cgraph_node_set_find): Likewise.
30133         (dump_cgraph_node_set): Likewise.
30134         (debug_cgraph_node_set): Likewise.
30135         (free_cgraph_node_set): Likewise.
30136         (varpool_node_set_new): Likewise.
30137         (varpool_node_set_add): Likewise.
30138         (varpool_node_set_remove): Likewise.
30139         (varpool_node_set_find): Likewise.
30140         (dump_varpool_node_set): Likewise.
30141         (free_varpool_node_set): Likewise.
30142         (debug_varpool_node_set): Likewise.
30143         * tree-emutls.c (struct tls_var_data):
30144         (emutls_index): Removed.
30145         (emutls_decl): Likewise.
30146         (gen_emutls_addr): Function implementation uses newly added
30147         hash_map<varpool_node *, tls_var_data>.
30148         (clear_access_vars): Likewise.
30149         (create_emultls_var): Likewise.
30150         (ipa_lower_emutls): Likewise.
30151         (reset_access): New function.
30153 2014-08-04 Ganesh Gopalasubramanian  <Ganesh.Gopalasubramanian@amd.com>
30155         * config/i386/i386.c (ix86_option_override_internal): Add
30156         PTA_RDRND and PTA_MOVBE for bdver4.
30158 2014-08-04  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30159             James Greenhalgh  <james.greenhalgh@arm.com>
30161         * doc/md.texi (clrsb): Document.
30162         (clz): Change reference to x into operand 1.
30163         (ctz): Likewise.
30164         (popcount): Likewise.
30166 2014-08-04  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30168         PR target/61713
30169         * gcc/optabs.c (expand_atomic_test_and_set): Do not try to emit
30170         move to subtarget in serial version if result is ignored.
30172 2014-08-04  Ramana Radhakrishnan <ramana.radhakrishnan@arm.com>
30173             Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30175         * sched-deps.c (try_group_insn): Generalise macro fusion hook usage
30176         to any two insns.  Update comment.  Rename to sched_macro_fuse_insns.
30177         (sched_analyze_insn): Update use of try_group_insn to
30178         sched_macro_fuse_insns.
30179         * config/i386/i386.c (ix86_macro_fusion_pair_p): Reject 2nd
30180         arguments that are not conditional jumps.
30182 2014-08-04  Ganesh Gopalasubramanian  <Ganesh.Gopalasubramanian@amd.com>
30184         * config/i386/driver-i386.c (host_detect_local_cpu): Handle AMD's
30185         extended family information. Handle BTVER2 cpu with cpuid family value.
30187 2014-08-04  Tom de Vries  <tom@codesourcery.com>
30189         * doc/sourcebuild.texi (glibc, glibc_2_12_or_later)
30190         (glibc_2_11_or_earlier): Document effective-target keywords.
30192 2014-08-01  Jan Hubicka  <hubicka@ucw.cz>
30194         * ipa-devirt.c (odr_type_warn_count): Add type.
30195         (possible_polymorphic_call_targets): Set it.
30196         (ipa_devirt): Use it.
30198 2014-08-01  Jan Hubicka  <hubicka@ucw.cz>
30200         * doc/invoke.texi (Wsuggest-final-types, Wsuggest-final-methods):
30201         Document.
30202         * ipa-devirt.c: Include hash-map.h
30203         (struct polymorphic_call_target_d): Add type_warning and decl_warning.
30204         (clear_speculation): Break out of ...
30205         (get_class_context): ... here; speed up handling obviously useless
30206         speculations.
30207         (odr_type_warn_count, decl_warn_count): New structures.
30208         (final_warning_record): New structure.
30209         (final_warning_records): New static variable.
30210         (possible_polymorphic_call_targets): Cleanup handling of
30211         speculative info; do not build speculation when user do not care;
30212         record info about warnings when asked for.
30213         (add_decl_warning): New function.
30214         (type_warning_cmp): New function.
30215         (decl_warning_cmp): New function.
30216         (ipa_devirt): Handle -Wsuggest-final-methods and -Wsuggest-final-types.
30217         (gate): Enable pass when warnings are requested.
30218         * common.opt (Wsuggest-final-types, Wsuggest-final-methods): New
30219         options.
30221 2014-08-02  Trevor Saunders  <tsaunders@mozilla.com>
30223         * hash-map.h (default_hashmap_traits::mark_key_deleted):
30224         Fix cast.
30225         (hash_map::remove): New method.
30226         (hash_map::traverse): New method.
30227         * cgraph.h, except.c, except.h, gimple-ssa-strength-reduction.c,
30228         ipa-utils.c, lto-cgraph.c, lto-streamer.h, omp-low.c, predict.c,
30229         tree-cfg.c, tree-cfgcleanup.c, tree-eh.c, tree-eh.h, tree-inline.c,
30230         tree-inline.h, tree-nested.c, tree-sra.c, tree-ssa-loop-im.c,
30231         tree-ssa-loop-ivopts.c, tree-ssa-reassoc.c, tree-ssa-structalias.c,
30232         tree-ssa.c, tree-ssa.h, var-tracking.c: Use hash_map instead of
30233         pointer_map.
30235 2014-08-02  Trevor Saunders  <tsaunders@mozilla.com>
30237         * hash-set.h: new File.
30238         * cfgexpand.c, cfgloop.c, cgraph.c, cgraphbuild.c, cgraphunit.c,
30239         cprop.c, cse.c, gimple-walk.c, gimple-walk.h, gimplify.c, godump.c,
30240         ipa-devirt.c, ipa-pure-const.c, ipa-visibility.c, ipa.c, lto-cgraph.c,
30241         lto-streamer-out.c, stmt.c, tree-cfg.c, tree-core.h, tree-eh.c,
30242         tree-inline.c, tree-inline.h, tree-nested.c, tree-pretty-print.c,
30243         tree-ssa-loop-niter.c, tree-ssa-phiopt.c, tree-ssa-threadedge.c,
30244         tree-ssa-uninit.c, tree.c, tree.h, value-prof.c, varasm.c,
30245         varpool.c: Use hash_set instead of pointer_set.
30247 2014-08-01  Alan Lawrence  <alan.lawrence@arm.com>
30249         * config/aarch64/aarch64-simd-builtins.def (dup_lane, get_lane): Delete.
30251 2014-08-01  Jiong Wang <jiong.wang@arm.com>
30253         * config/aarch64/aarch64.c (aarch64_classify_address): Accept all offset
30254         for frame access when strict_p is false.
30256 2014-08-01  Renlin Li <renlin.li@arm.com>
30257 2014-08-01  Jiong Wang <jiong.wang@arm.com>
30259         * config/aarch64/aarch64.c (offset_7bit_signed_scaled_p): Rename to
30260         aarch64_offset_7bit_signed_scaled_p, remove static and use it.
30261         * config/aarch64/aarch64-protos.h (aarch64_offset_7bit_signed_scaled_p):
30262         Declaration.
30263         * config/aarch64/predicates.md (aarch64_mem_pair_offset): Define new
30264         predicate.
30265         * config/aarch64/aarch64.md (loadwb_pair, storewb_pair): Use
30266         aarch64_mem_pair_offset.
30268 2014-08-01  Jiong Wang <jiong.wang@arm.com>
30270         * config/aarch64/aarch64.md (loadwb_pair<GPI:mode>_<P:mode>): Fix
30271         offset.
30272         (loadwb_pair<GPI:mode>_<P:mode>): Likewise.
30273         * config/aarch64/aarch64.c (aarch64_gen_loadwb_pair): Likewise.
30275 2014-08-01  Matthew Fortune  <matthew.fortune@imgtec.com>
30277         * config/mips/mips.h (REGISTER_PREFIX): Define macro.
30279 2014-08-01  James Greenhalgh  <james.greenhalgh@arm.com>
30281         PR regression/61510
30282         * cgraphunit.c (analyze_functions): Use get_create rather than get
30283         for decls which are clones of abstract functions.
30285 2014-08-01  Martin Liska  <mliska@suse.cz>
30287         * gimple-iterator.h (gsi_next_nonvirtual_phi): New function.
30288         * ipa-prop.h (count_formal_params): Global function created from static.
30289         * ipa-prop.c (count_formal_params): Likewise.
30290         * ipa-utils.c (ipa_merge_profiles): Be more tolerant if we merge
30291         profiles for semantically equivalent functions.
30292         * passes.c (do_per_function): If we load body of a function
30293         during WPA, this condition should behave same.
30294         * varpool.c (ctor_for_folding): More tolerant assert for variable
30295         aliases created during WPA.
30297 2014-08-01  Martin Liska  <mliska@suse.cz>
30299         * doc/invoke.texi (Options That Control Optimization): Documentation
30300         for -foptimize-strlen introduced. Optimization levels default options
30301         fixed.
30303 2014-08-01  Jakub Jelinek  <jakub@redhat.com>
30305         * opts.c (common_handle_option): Handle -fsanitize=alignment.
30306         * ubsan.h (enum ubsan_null_ckind): Add UBSAN_CTOR_CALL.
30307         (ubsan_expand_bounds_ifn, ubsan_expand_null_ifn): Change return
30308         type to bool.
30309         * stor-layout.h (min_align_of_type): New prototype.
30310         * asan.c (pass_sanopt::execute): Don't perform gsi_next if
30311         ubsan_expand* told us not to do it.  Remove the extra gsi_end_p
30312         check.
30313         * ubsan.c: Include builtins.h.
30314         (ubsan_expand_bounds_ifn): Change return type to bool,
30315         always return true.
30316         (ubsan_expand_null_ifn): Change return type to bool, change
30317         argument to gimple_stmt_iterator *.  Handle both null and alignment
30318         sanitization, take type from ckind argument's type rather than
30319         first argument.
30320         (instrument_member_call): Removed.
30321         (instrument_mem_ref): Remove t argument, add mem and base arguments.
30322         Handle both null and alignment sanitization, don't say whole
30323         struct access is member access.  Build 3 argument IFN_UBSAN_NULL
30324         call instead of 2 argument.
30325         (instrument_null): Adjust instrument_mem_ref caller.  Don't
30326         instrument calls here.
30327         (pass_ubsan::gate, pass_ubsan::execute): Handle SANITIZE_ALIGNMENT
30328         like SANITIZE_NULL.
30329         * stor-layout.c (min_align_of_type): New function.
30330         * flag-types.h (enum sanitize_code): Add SANITIZE_ALIGNMENT.
30331         Or it into SANITIZE_UNDEFINED.
30332         * doc/invoke.texi (-fsanitize=alignment): Document.
30334 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30336         * tree-ssa-tail-merge.c (same_succ_hash): Convert to inchash.
30338 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30340         * tree-ssa-sccvn.c (vn_reference_op_compute_hash): Convert to
30341         inchash.
30342         (vn_reference_compute_hash): Dito.
30343         (vn_nary_op_compute_hash): Dito.
30344         (vn_phi_compute_hash): Dito.
30345         * tree-ssa-sccvn.h (vn_hash_constant_with_type): Dito.
30347 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30349         * tree-ssa-dom.c (iterative_hash_exprs_commutative):
30350         Rename to inchash:add_expr_commutative. Convert to inchash.
30351         (iterative_hash_hashable_expr): Rename to
30352         inchash:add_hashable_expr. Convert to inchash.
30353         (avail_expr_hash): Dito.
30355 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30357         * ipa-devirt.c (polymorphic_call_target_hasher::hash):
30358         Convert to inchash.
30360 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30362         * asan.c (asan_mem_ref_hasher::hash): Convert to inchash.
30364 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30366         * Makefile.in (OBJS): Add rtlhash.o
30367         * dwarf2out.c (addr_table_entry_do_hash): Convert to inchash.
30368         (loc_checksum): Dito.
30369         (loc_checksum_ordered): Dito.
30370         (hash_loc_operands): Dito.
30371         (hash_locs): Dito.
30372         (hash_loc_list): Dito.
30373         * rtl.c (iterative_hash_rtx): Moved to rtlhash.c
30374         * rtl.h (iterative_hash_rtx): Moved to rtlhash.h
30375         * rtlhash.c: New file.
30376         * rtlhash.h: New file.
30378 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30380         * inchash.h (inchash): Change inchash class to namespace.
30381         (class hash): ... Rename from inchash.
30382         (add_object): Move from macro to class template.
30383         * lto-streamer-out.c (hash_tree): Change inchash
30384         to inchash::hash.
30385         * tree.c (build_type_attribute_qual_variant): Dito.
30386         (type_hash_list): Dito.
30387         (attribute_hash_list): Dito.
30388         (iterative_hstate_expr): Rename to inchash::add_expr
30389         (build_range_type_1): Change inchash to inchash::hash
30390         and use hash::add_expr.
30391         (build_array_type_1): Dito.
30392         (build_function_type): Dito
30393         (build_method_type_directly): Dito.
30394         (build_offset_type): Dito.
30395         (build_complex_type): Dito.
30396         (make_vector_type): Dito.
30397         * tree.h (iterative_hash_expr): Dito.
30399 2014-07-31  Chen Gang  <gang.chen.5i5j@gmail.com>
30401         * gcc.c (do_spec_1): Allocate enough space for saved_suffix.
30403 2014-07-31  James Greenhalgh  <james.greenhalgh@arm.com>
30405         * config/aarch64/arm_neon.h (vpadd_<suf><8,16,32,64>): Move to
30406         correct alphabetical position.
30407         (vpaddd_f64): Rewrite using builtins.
30408         (vpaddd_s64): Move to correct alphabetical position.
30409         (vpaddd_u64): New.
30411 2014-07-31  Oleg Endo  <olegendo@gcc.gnu.org>
30413         PR target/61844
30414         * config/sh/sh.c (sh_legitimate_address_p,
30415         sh_legitimize_reload_address): Handle reg+reg address modes when
30416         ALLOW_INDEXED_ADDRESS is false.
30417         * config/sh/predicates.md (general_movsrc_operand,
30418         general_movdst_operand): Likewise.
30420 2014-07-31  James Greenhalgh  <james.greenhalgh@arm.com>
30422         * config/aarch64/aarch64-builtins.c
30423         (aarch64_gimple_fold_builtin): Don't fold reduction operations for
30424         BYTES_BIG_ENDIAN.
30426 2014-07-31  James Greenhalgh  <james.greenhalgh@arm.com>
30428         * config/aarch64/aarch64.c (aarch64_simd_vect_par_cnst_half): Vary
30429         the generated mask based on BYTES_BIG_ENDIAN.
30430         (aarch64_simd_check_vect_par_cnst_half): New.
30431         * config/aarch64/aarch64-protos.h
30432         (aarch64_simd_check_vect_par_cnst_half): New.
30433         * config/aarch64/predicates.md (vect_par_cnst_hi_half): Refactor
30434         the check out to aarch64_simd_check_vect_par_cnst_half.
30435         (vect_par_cnst_lo_half): Likewise.
30436         * config/aarch64/aarch64-simd.md
30437         (aarch64_simd_move_hi_quad_<mode>): Always use vec_par_cnst_lo_half.
30438         (move_hi_quad_<mode>): Always generate a low mask.
30440 2014-07-30  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
30442         * doc/invoke.texi (AVR Options): Add documentation about
30443         __AVR_DEVICE_NAME__ built-in macro.
30445 2014-07-31  Charles Baylis  <charles.baylis@linaro.org>
30447         PR target/61948
30448         * config/arm/neon.md (ashldi3_neon): Don't emit arm_ashldi3_1bit unless
30449         constraints are satisfied.
30450         (<shift>di3_neon): Likewise.
30452 2014-07-31  Richard Biener  <rguenther@suse.de>
30454         PR tree-optimization/61964
30455         * tree-ssa-tail-merge.c (gimple_equal_p): Handle non-SSA LHS solely
30456         by structural equality.
30458 2014-07-31  Yury Gribov  <y.gribov@samsung.com>
30460         * doc/cpp.texi (__SANITIZE_ADDRESS__): Updated description.
30461         * doc/invoke.texi (-fsanitize=kernel-address): Describe new option.
30462         * flag-types.h (SANITIZE_USER_ADDRESS, SANITIZE_KERNEL_ADDRESS):
30463         New enums.
30464         * gcc.c (sanitize_spec_function): Support new option.
30465         (SANITIZER_SPEC): Remove now redundant check.
30466         * opts.c (common_handle_option): Support new option.
30467         (finish_options): Check for incompatibilities.
30468         * toplev.c (process_options): Split userspace-specific checks.
30470 2014-07-31  Richard Biener  <rguenther@suse.de>
30472         * lto-streamer.h (struct output_block): Remove global.
30473         (struct data_in): Remove labels, num_named_labels and
30474         num_unnamed_labels.
30475         * lto-streamer-in.c (lto_data_in_delete): Do not free labels.
30476         * lto-streamer-out.c (produce_asm_for_decls): Do not set global.
30478 2014-07-31  Marc Glisse  <marc.glisse@inria.fr>
30480         PR c++/60517
30481         * common.opt (-Wreturn-local-addr): Moved from c.opt.
30482         * gimple-ssa-isolate-paths.c: Include diagnostic-core.h and intl.h.
30483         (isolate_path): New argument to avoid inserting a trap.
30484         (find_implicit_erroneous_behaviour): Handle returning the address
30485         of a local variable.
30486         (find_explicit_erroneous_behaviour): Likewise.
30488 2014-07-31  Bingfeng Mei <bmei@broadcom.com>
30490         PR lto/61868
30491         * toplev.c (init_random_seed): Move piece of code never called to
30492         set_random_seed.
30493         (set_random_seed): see above.
30495 2014-07-31  Tom de Vries  <tom@codesourcery.com>
30497         * tree-ssa-loop.c (pass_tree_loop_init::execute): Remove dead code.
30499 2014-07-31  Richard Sandiford  <rdsandiford@googlemail.com>
30501         * ira.c (insn_contains_asm_1, insn_contains_asm): Delete.
30502         (compute_regs_asm_clobbered): Use extract_asm_operands instead.
30504 2014-07-31  Richard Biener  <rguenther@suse.de>
30506         * data-streamer.h (streamer_write_data_stream): Declare here,
30507         renamed from ...
30508         * lto-streamer.h (lto_output_data_stream): ... this.  Remove.
30509         * lto-cgraph.c (lto_output_node): Adjust.
30510         (lto_output_varpool_node): Likewise.
30511         * data-streamer-out.c (streamer_string_index): Likewise.
30512         (streamer_write_data_stream, lto_append_block): Move from ...
30513         * lto-section-out.c (lto_output_data_stream,
30514         lto_append_block): ... here.
30516 2014-07-30  Mike Stump  <mikestump@comcast.net>
30518         * configure.ac: Also check for popen.
30519         * tree-loop-distribution.c (dot_rdg): Autoconfize popen use.
30520         * configure: Regenerate.
30521         * config.in:  Regenerate.
30523 2014-07-30  Martin Jambor  <mjambor@suse.cz>
30525         * tree-sra.c (sra_ipa_modify_assign): Change type of the first
30526         parameter to gimple.
30528 2014-07-30  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
30530         * config/s390/s390.c (s390_emit_tpf_eh_return): Pass original return
30531         address as second parameter to __tpf_eh_return routine.
30533 2014-07-30  Jiong Wang  <jiong.wang@arm.com>
30535         * config/arm/arm.c (arm_get_frame_offsets): Adjust condition for
30536         Thumb2.
30538 2014-07-30  Tom Tromey  <tromey@redhat.com>
30540         PR c/59855
30541         * doc/invoke.texi (Warning Options): Document -Wdesignated-init.
30542         * doc/extend.texi (Type Attributes): Document designated_init
30543         attribute.
30545 2014-07-30  Roman Gareev  <gareevroman@gmail.com>
30547         * graphite-isl-ast-to-gimple.c:
30548         (gcc_expression_from_isl_ast_expr_id): Add calling of fold_convert.
30549         (gcc_expression_from_isl_expression): Pass type to
30550         gcc_expression_from_isl_ast_expr_id.
30552 2014-07-30  Richard Biener  <rguenther@suse.de>
30554         * lto-streamer.h (lto_write_data): New function.
30555         * langhooks.c (lhd_append_data): Do not free block.
30556         * lto-section-out.c (lto_write_data): New function writing
30557         raw data to the current section.
30558         (lto_write_stream): Adjust for langhook semantic change.
30559         (lto_destroy_simple_output_block): Write header directly.
30560         * lto-opts.c (lto_write_options): Write options directly.
30561         * lto-streamer-out.c (produce_asm): Write heaeder directly.
30562         (lto_output_toplevel_asms): Likewise.
30563         (copy_function_or_variable): Copy data directly.
30564         (write_global_references): Output index table directly.
30565         (lto_output_decl_state_refs): Likewise.
30566         (write_symbol): Write data directly.
30567         (produce_symtab): Adjust.
30568         (produce_asm_for_decls): Output header and refs directly.
30570 2014-07-29  Jan Hubicka  <hubicka@ucw.cz>
30572         * ipa-devirt.c (polymorphic_call_target_d): Rename
30573         nonconstruction_targets to speculative_targets
30574         (get_class_context): Fix handling of contextes without outer type;
30575         avoid matching non-polymorphic types in LTO.
30576         (possible_polymorphic_call_targets): Trun nonconstruction_targetsp
30577         parameter to speculative_targetsp; handle speculation.
30578         (dump_possible_polymorphic_call_targets): Update dumping.
30580 2014-07-29  Jan Hubicka  <hubicka@ucw.cz>
30582         * common.opt (Wodr): Enable by default.
30584 2014-07-29  Olivier Hainque  <hainque@adacore.com>
30586         * config/vxworksae.h (VXWORKS_OVERRIDE_OPTIONS): Define.
30588 2014-07-29  H.J. Lu  <hongjiu.lu@intel.com>
30590         PR bootstrap/61914
30591         * gengtype.c (strtoken): New function.
30592         (create_user_defined_type): Replace strtok with strtoken.
30594 2014-07-29  Nathan Sidwell  <nathan@acm.org>
30596         * gcov-io.c (gcov_var): Make hidden.
30597         * gcov-tool.c (gcov_list, gcov_exit): Remove declarations.
30598         (gcov_do_dump): Declare.
30599         (gcov_output_files): Call gcov_do_dump, not gcov_exit).
30601 2014-07-29  Martin Jambor  <mjambor@suse.cz>
30603         * tree-sra.c (sra_modify_constructor_assign): Change type of stmt
30604         parameter to gimple.
30605         (sra_modify_assign): Likewise.
30607 2014-07-29  Richard Biener  <rguenther@suse.de>
30609         PR middle-end/52478
30610         * expr.c (expand_expr_real_2): Revert last change.
30612 2014-07-28  Jan Hubicka  <hubicka@ucw.cz>
30614         * cgraph.c (cgraph_node::create_indirect_edge): Copy speculative data.
30615         * cgraph.h (cgraph_indirect_call_info): Add speculative data.
30616         * gimple-fold.c (fold_gimple_assign): Fix check for virtual
30617         call.
30618         * ipa-devirt.c (ipa_dummy_polymorphic_call_context): Update
30619         (contains_type_p): Forward declare.
30620         (polymorphic_call_target_hasher::hash): Hash speculative info.
30621         (polymorphic_call_target_hasher::equal): Compare speculative info.
30622         (get_class_context): Handle speuclation.
30623         (contains_type_p): Update.
30624         (get_polymorphic_call_info_for_decl): Update.
30625         (walk_ssa_copies): Break out from ...
30626         (get_polymorphic_call_info): ... here; set speculative context
30627         before giving up.
30628         * ipa-prop.c (ipa_write_indirect_edge_info,
30629         ipa_read_indirect_edge_info): Stream speculative context.
30630         * ipa-utils.h (ipa_polymorphic_call_context): Add speculative info
30631         (SPECULATIVE_OFFSET, SPECULATIVE_OUTER_TYPE,
30632         SPECULATIVE_MAYBE_DERIVED_TYPE).
30633         (possible_polymorphic_call_targets overriders): Update.
30634         (dump_possible_polymorphic_call_targets overriders): Update.
30635         (dump_possible_polymorphic_call_target_p overriders): Update.
30637 2014-07-28  Jan Hubicka  <hubicka@ucw.cz>
30639         * gimple-fold.c (fold_gimple_assign): Fix condition guarding
30640         ipa-devirt path; fix thinko there.
30642 2014-07-28  Trevor Saunders  <tsaunders@mozilla.com>
30644         * config/i386/i386.c (ix86_return_in_memory): Replace one
30645         ATTRIBUTE_UNUSED where the attribute can actually sometimes be unused.
30647 2014-07-28  Marek Polacek  <polacek@redhat.com>
30649         * doc/invoke.texi (-Wno-odr): Fix @item entry.  Tweak wording.
30651 2014-07-28  Peter Bergner  <bergner@vnet.ibm.com>
30653         * config.gcc (powerpc*-*-linux*): Include gnu-user.h in tm_file.
30654         * config/rs6000/sysv4.h (CC1_SPEC): Undefine it before defining it.
30655         * config/rs6000/linux.h (CPLUSPLUS_CPP_SPEC): Delete define.
30656         (LINK_GCC_C_SEQUENCE_SPEC): Likewise.
30657         (USE_LD_AS_NEEDED): Likewise.
30658         (ASM_APP_ON): Likewise.
30659         (ASM_APP_OFF): Likewise.
30660         (TARGET_POSIX_IO): Likewise.
30661         * config/rs6000/linux64.h (CPLUSPLUS_CPP_SPEC): Likewise.
30662         (LINK_GCC_C_SEQUENCE_SPEC): Likewise.
30663         (USE_LD_AS_NEEDED): Likewise.
30664         (ASM_APP_ON): Likewise.
30665         (ASM_APP_OFF): Likewise.
30666         (TARGET_POSIX_IO): Likewise.
30668 2014-07-28  Eric Botcazou  <ebotcazou@adacore.com>
30670         PR middle-end/61734
30671         * fold-const.c (fold_comparison): Disable X - Y CMP 0 to X CMP Y for
30672         operators other than the equality operators.
30674 2014-07-28  Richard Biener  <rguenther@suse.de>
30676         PR middle-end/52478
30677         * optabs.c (gen_int_libfunc): For -ftrapv libfuncs make
30678         sure to register SImode ones, not only >= word_mode ones.
30679         * expr.c (expand_expr_real_2): When expanding -ftrapv
30680         binops do not use OPTAB_LIB_WIDEN.
30682 2014-07-28  Richard Sandiford  <rdsandiford@googlemail.com>
30684         PR middle-end/61919
30685         * tree-outof-ssa.c (insert_partition_copy_on_edge)
30686         (insert_value_copy_on_edge, insert_rtx_to_part_on_edge)
30687         (insert_part_to_rtx_on_edge): Copy partition_to_pseudo rtxes before
30688         inserting them in the insn stream.
30690 2014-07-28  Marek Polacek  <polacek@redhat.com>
30692         PR middle-end/61913
30693         * common.opt (Wodr): Add Var.
30695 2014-07-28  Richard Biener  <rguenther@suse.de>
30697         PR tree-optimization/61921
30698         * tree-ssa-structalias.c (create_variable_info_for_1): Check
30699         if there is a varpool node before dereferencing it.
30701 2014-07-28  Roman Gareev  <gareevroman@gmail.com>
30703         * graphite-sese-to-poly.c:
30704         (new_pbb_from_pbb): Set a new id of pbb1->domain (instead of using the
30705         id of the pbb), which contains pointer to the pbb1.
30707         * gcc.dg/graphite/isl-ast-gen-if-2.c: New testcase.
30709 2014-07-28  Roman Gareev  <gareevroman@gmail.com>
30711         * graphite-isl-ast-to-gimple.c:
30712         (graphite_create_new_guard): New function.
30713         (translate_isl_ast_node_if): New function.
30714         (translate_isl_ast): Add calling of translate_isl_ast_node_if.
30716         * gcc.dg/graphite/isl-ast-gen-if-1.c: New testcase.
30718 2014-07-27  Anthony Green  <green@moxielogic.com>
30720         * config.gcc: Add moxie-*-moxiebox* configuration.
30721         * config/moxie/moxiebox.h: New file.
30723 2014-07-26  Andrew Pinski  <apinski@cavium.com>
30725         * config/aarch64/aarch64.md (*extr_insv_lower_reg<mode>): Remove +
30726         from the read only register.
30728 2014-07-26  Richard Sandiford  <rdsandiford@googlemail.com>
30730         * ira-costs.c (find_costs_and_classes): For -O0, use the best class
30731         as the allocation class if it isn't likely to be spilled.
30733 2014-07-26  Richard Sandiford  <rdsandiford@googlemail.com>
30735         * rtl.h (tls_referenced_p): Declare.
30736         * rtlanal.c (tls_referenced_p_1, tls_referenced_p): New functions.
30737         * config/mips/mips.c (mips_tls_symbol_ref_1): Delete.
30738         (mips_cannot_force_const_mem): Use tls_referenced_p.
30739         * config/pa/pa-protos.h (pa_tls_referenced_p): Delete.
30740         * config/pa/pa.h (CONSTANT_ADDRESS_P): Use tls_referenced_p
30741         instead of pa_tls_referenced_p.
30742         * config/pa/pa.c (hppa_legitimize_address, pa_cannot_force_const_mem)
30743         (pa_emit_move_sequence, pa_emit_move_sequence): Likewise.
30744         (pa_legitimate_constant_p): Likewise.
30745         (pa_tls_symbol_ref_1, pa_tls_referenced_p): Delete.
30746         * config/rs6000/rs6000.c (rs6000_tls_referenced_p): Delete.
30747         (rs6000_cannot_force_const_mem, rs6000_emit_move)
30748         (rs6000_address_for_altivec): Use tls_referenced_p instead of
30749         rs6000_tls_referenced_p.
30750         (rs6000_tls_symbol_ref_1): Delete.
30752 2014-07-26  Marc Glisse  <marc.glisse@inria.fr>
30754         PR target/44551
30755         * simplify-rtx.c (simplify_binary_operation_1) <VEC_SELECT>:
30756         Optimize inverse of a VEC_CONCAT.
30758 2014-07-25  Xinliang David Li  <davidxl@google.com>
30760         * params.def: New parameter.
30761         * coverage.c (get_coverage_counts): Check new flag.
30762         (coverage_compute_profile_id): Check new flag.
30763         (coverage_begin_function): Check new flag.
30764         (coverage_end_function): Check new flag.
30765         * value-prof.c (coverage_node_map_initialized_p): New function.
30766         (init_node_map): Populate map with all functions.
30767         * doc/invoke.texi: Document new parameter.
30769 2014-07-25  Jan Hubicka  <hubicka@ucw.cz>
30770             Richard Biener <rguenther@suse.de>
30772         * lto-streamer-out.c (struct sccs): Turn to ...
30773         (class DFS): ... this one; refactor the DFS walk so it can
30774         be re-done on per-SCC basis.
30775         (DFS::DFS): New constructor.
30776         (DFS::~DFS): New destructor.
30777         (hash_tree): Add new MAP argument holding in-SCC hash values;
30778         remove POINTER_TYPE hashing hack.
30779         (scc_entry_compare): Rename to ...
30780         (DFS::scc_entry_compare): ... this one.
30781         (hash_scc): Rename to ...
30782         (DFS::hash_scc): ... this one; pass output_block instead
30783         of streamer_cache; work harder to get unique and stable SCC
30784         hashes.
30785         (DFS_write_tree): Rename to ...
30786         (DFS::DFS_write_tree): ... this one; add SINGLE_P parameter.
30787         (lto_output_tree): Update.
30789 2014-07-25  Andi Kleen  <ak@linux.intel.com>
30791         * lto-streamer-out.c (hash_tree): Convert to inchash.
30793 2014-07-25  Andi Kleen  <ak@linux.intel.com>
30795         * tree.c (build_type_attribute_qual_variant): Use inchash.
30796         (type_hash_list): Dito.
30797         (attribute_hash_list): Dito
30798         (iterative_hstate_expr): Dito.
30799         (iterative_hash_expr): Dito.
30800         (build_range_type_1): Dito.
30801         (build_array_type_1): Dito.
30802         (build_function_type): Dito.
30803         (build_method_type_directly): Dito.
30804         (build_offset_type): Dito.
30805         (build_complex_type): Dito.
30806         (make_vector_type): Dito.
30807         * tree.h (iterative_hash_expr): Add compat wrapper.
30808         (iterative_hstate_expr): Add.
30810 2014-07-25  Andi Kleen  <ak@linux.intel.com>
30812         * Makefile.in (OBJS): Add inchash.o.
30813         (PLUGIN_HEADERS): Add inchash.h.
30814         * ipa-devirt.c: Include inchash.h.
30815         * lto-streamer-out.c: Dito.
30816         * tree-ssa-dom.c: Dito.
30817         * tree-ssa-pre.c: Dito.
30818         * tree-ssa-sccvn.c: Dito.
30819         * tree-ssa-tail-merge.c: Dito.
30820         * asan.c: Dito.
30821         * tree.c (iterative_hash_hashval_t): Move to ...
30822         (iterative_hash_host_wide_int): Move to ...
30823         * inchash.c: Here. New file.
30824         * tree.h (iterative_hash_hashval_t): Move to ...
30825         (iterative_hash_host_wide_int): Move to ...
30826         * inchash.h: Here. New file.
30828 2014-07-25  Richard Biener  <rguenther@suse.de>
30830         PR middle-end/61762
30831         PR middle-end/61894
30832         * fold-const.c (native_encode_int): Add and handle offset
30833         parameter to do partial encodings of expr.
30834         (native_encode_fixed): Likewise.
30835         (native_encode_real): Likewise.
30836         (native_encode_complex): Likewise.
30837         (native_encode_vector): Likewise.
30838         (native_encode_string): Likewise.
30839         (native_encode_expr): Likewise.
30840         * fold-const.c (native_encode_expr): Add offset parameter
30841         defaulting to -1.
30842         * gimple-fold.c (fold_string_cst_ctor_reference): Remove.
30843         (fold_ctor_reference): Handle all reads from tcc_constant
30844         ctors.
30846 2014-07-25  Richard Biener  <rguenther@suse.de>
30848         * tree-inline.c (estimate_move_cost): Mark speed_p argument
30849         as possibly unused.
30851 2014-07-23  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
30853         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Add __AVR_DEVICE_NAME__.
30855 2014-07-24  Kyle McMartin  <kyle@redhat.com>
30857         * config/aarch64/aarch64-linux.h (TARGET_ASM_FILE_END): Define.
30859 2014-07-24  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
30861         * config/rs6000/rs6000-protos.h (rs6000_special_adjust_field_align_p):
30862         Add prototype.
30863         * config/rs6000/rs6000.c (rs6000_special_adjust_field_align_p): New
30864         function.
30865         * config/rs6000/sysv4.h (ADJUST_FIELD_ALIGN): Call it.
30866         * config/rs6000/linux64.h (ADJUST_FIELD_ALIGN): Likewise.
30867         * config/rs6000/freebsd64.h (ADJUST_FIELD_ALIGN): Likewise.
30869 2014-07-24  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
30871         * config/rs6000/rs6000.c (rs6000_function_arg_boundary): In the AIX
30872         and ELFv2 ABI, do not use the "mode == BLKmode" check to test for
30873         aggregate types.  Instead, *all* aggregate types, except for single-
30874         element or homogeneous float/vector aggregates, are quadword-aligned
30875         if required by their type alignment.  Issue -Wpsabi note when a type
30876         is now treated differently than before.
30878 2014-07-24  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
30880         * config/rs6000/rs6000.c (rs6000_function_arg): If a float argument
30881         does not fit fully into floating-point registers, and there is still
30882         space in the register parameter area, use GPRs to pass those parts
30883         of the argument.  Issue -Wpsabi note if any parameter is now treated
30884         differently than before.
30885         (rs6000_arg_partial_bytes): Update.
30887 2014-07-24  Uros Bizjak  <ubizjak@gmail.com>
30889         * config/alpha/elf.h: Define TARGET_UNWIND_TABLES_DEFAULT.
30891 2014-07-24  Richard Sandiford  <rdsandiford@googlemail.com>
30893         * rtl.h (target_rtl): Remove lang_dependent_initialized.
30894         * toplev.c (initialize_rtl): Don't use it.  Move previously
30895         "language-dependent" calls to...
30896         (backend_init): ...here.
30897         (lang_dependent_init_target): Don't set lang_dependent_initialized.
30898         Assert that RTL initialization hasn't happend yet.
30900 2014-07-24  Richard Sandiford  <rdsandiford@googlemail.com>
30902         PR rtl-optimization/61629
30903         * reginfo.c (reinit_regs): Only call ira_init and recog_init if
30904         they have already been initialized.
30906 2014-07-24  Richard Sandiford  <rdsandiford@googlemail.com>
30908         PR middle-end/61268
30909         * function.c (assign_parm_setup_reg): Prevent invalid sharing of
30910         DECL_INCOMING_RTL and entry_parm.
30911         (get_arg_pointer_save_area): Likewise arg_pointer_save_area.
30912         * calls.c (load_register_parameters): Likewise argument values.
30913         (emit_library_call_value_1, store_one_arg): Likewise argument
30914         save areas.
30915         * config/i386/i386.c (assign_386_stack_local): Likewise the local
30916         stack slot.
30917         * explow.c (validize_mem): Modify the argument in-place.
30919 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
30921         * config/aarch64/aarch64.c (aarch64_popwb_single_reg): New function.
30922         (aarch64_expand_epilogue): Optimize epilogue when !frame_pointer_needed.
30924 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
30926         * config/aarch64/aarch64.c (aarch64_pushwb_single_reg): New function.
30927         (aarch64_expand_prologue): Optimize prologue when !frame_pointer_needed.
30929 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
30931         * config/aarch64/aarch64.c (aarch64_restore_callee_saves)
30932         (aarch64_save_callee_saves): New parameter "skip_wb".
30933         (aarch64_expand_prologue, aarch64_expand_epilogue): Update call site.
30935 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
30937         * config/aarch64/aarch64.h (frame): New fields "wb_candidate1" and
30938         "wb_candidate2".
30939         * config/aarch64/aarch64.c (aarch64_layout_frame): Initialize above.
30941 2014-07-24  Roman Gareev  <gareevroman@gmail.com>
30943         * graphite-isl-ast-to-gimple.c:
30944         (graphite_create_new_loop): Add calling of isl_id_free to properly
30945         decrement reference counts.
30947         * gcc.dg/graphite/isl-ast-gen-blocks-4.c: New testcase.
30949 2014-07-24  Martin Liska  <mliska@suse.cz>
30950         * config/mips/mips.c (mips_start_unique_function): Correct cgraph_node
30951         function used.
30952         * config/rs6000/rs6000.c (call_ABI_of_interest): Likewise.
30953         (rs6000_code_end): Likewise.
30955 2014-07-24  Martin Liska  <mliska@suse.cz>
30957         * config/rs6000/rs6000.c (rs6000_xcoff_declare_function_name): Correct
30958         symtab_node funtion used.
30959         (rs6000_xcoff_declare_object_name): Likewise.
30961 2014-07-24  Martin Liska  <mliska@suse.cz>
30963         * cgraphunit.c (compile): Correct function used.
30965 2014-07-24  Jan Hubicka  <hubicka@ucw.cz>
30967         * lto-streamer-out.c (tree_is_indexable): Consider IMPORTED_DECL
30968         as non-indexable.
30970 2014-07-24  Jan Hubicka  <hubicka@ucw.cz>
30972         PR lto/61802
30973         * varasm.c (bss_initializer_p): Handle offlined ctors.
30974         (align_variable, get_variable_align): Likewise.
30975         (make_decl_one_only): Likewise.
30976         (default_binds_local_p_1): Likewise.
30977         (decl_binds_to_current_def_p): Likewise.
30978         (get_variable_section): Get constructor if it is offlined.
30979         (assemble_variable_contents): Sanity check that the caller
30980         streamed in the ctor in LTO.
30982 2014-07-24  Roman Gareev  <gareevroman@gmail.com>
30984         * graphite-isl-ast-to-gimple.c:
30985         (binary_op_to_tree): Add calling of translate_isl_ast_node_block.
30986         (gcc_expression_from_isl_expr_op): Move isl_ast_op_pdiv_q,
30987         isl_ast_op_pdiv_r to the different case.
30989         * gcc.dg/graphite/isl-ast-gen-blocks-3.c: New testcase.
30991 2014-07-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30993         PR middle-end/61876
30994         * convert.c (convert_to_integer): Do not convert BUILT_IN_ROUND and cast
30995         when flag_errno_math is on.
30997 2014-07-24  Martin Liska  <mliska@suse.cz>
30999         * cgraph.h (varpool_node):
31000         (availability get_availability (void)):
31001         created from cgraph_variable_initializer_availability
31002         (inline varpool_node *ultimate_alias_target (availability *availability = NULL)
31003         created from: cgraph_variable_initializer_availability
31004         (inline varpool_node *get_alias_target (void)): created from varpool_alias_target
31005         (void finalize_named_section_flags (void)):
31006         created from varpool_finalize_named_section_flags
31007         (bool assemble_decl (void)): created from varpool_assemble_decl
31008         (void analyze (void)): created from varpool_analyze_node
31009         (bool call_for_node_and_aliases (bool (*callback) (varpool_node *, void *),
31010         void *data, bool include_overwritable)): created fromvarpool_for_node_and_aliases
31011         (void remove_initializer (void)): created from varpool_remove_initializer
31012         (tree get_constructor (void)): created from varpool_get_constructor
31013         (bool externally_visible_p (void)): created from varpool_externally_visible_p
31014         (bool ctor_useable_for_folding_p (void)): created from varpool_ctor_useable_for_folding_p
31015         (inline bool all_refs_explicit_p ()): created from varpool_all_refs_explicit_p
31016         (inline bool can_remove_if_no_refs_p (void)): created from varpool_can_remove_if_no_refs
31017         (static inline varpool_node *get (const_tree decl)): created from varpool_get_node
31018         (static void finalize_decl (tree decl)): created from varpool_finalize_decl
31019         (static bool output_variables (void)): created from varpool_output_variables
31020         (static varpool_node * create_extra_name_alias (tree alias, tree decl)):
31021         created from varpool_extra_name_alias
31022         (static varpool_node * create_alias (tree, tree)): created from varpool_create_variable_alias
31023         (static void dump_varpool (FILE *f)): created from dump_varpool
31024         (static void DEBUG_FUNCTION debug_varpool (void)): created from debug_varpool
31025         (static varpool_node *create_empty (void)): created from varpool_create_empty_node
31026         (static varpool_node *get_create (tree decl)): created from varpool_node_for_decl
31027         (static varpool_node *get_for_asmname (tree asmname)): created from varpool_node_for_asm
31028         (void assemble_aliases (void)): created from assemble_aliases
31030 2014-07-24  Martin Liska  <mliska@suse.cz>
31032         * cgraph.h (symtab_node):
31033         (void register_symbol (void)): created from symtab_register_node
31034         (void remove (void)): created from symtab_remove_node
31035         (void dump (FILE *f)): created from dump_symtab_node
31036         (void DEBUG_FUNCTION debug (void)): created from debug_symtab_node
31037         (void DEBUG_FUNCTION verify (void)): created from verify_symtab_node
31038         (struct ipa_ref *add_reference (symtab_node *referred_node,
31039         enum ipa_ref_use use_type)): created from add_reference
31040         (struct ipa_ref *add_reference (symtab_node *referred_node,
31041         enum ipa_ref_use use_type, gimple stmt)): created from add_reference
31042         (struct ipa_ref *maybe_add_reference (tree val, enum ipa_ref_use use_type,
31043         gimple stmt)): created from maybe_add_reference
31044         (bool semantically_equivalent_p (symtab_node *target)): created from
31045         symtab_semantically_equivalent_p
31046         (void remove_from_same_comdat_group (void)): created from
31047         remove_from_same_comdat_group
31048         (void add_to_same_comdat_group (symtab_node *old_node)): created from
31049         symtab_add_to_same_comdat_group
31050         (void dissolve_same_comdat_group_list (void)): created from
31051         symtab_dissolve_same_comdat_group_list
31052         (bool used_from_object_file_p (void)): created from symtab_used_from_object_file_p
31053         (symtab_node *ultimate_alias_target (enum availability *avail = NULL)):
31054         created from symtab_alias_ultimate_target
31055         (inline symtab_node *next_defined_symbol (void)): created from
31056         symtab_next_defined_symbol
31057         (bool resolve_alias (symtab_node *target)): created from
31058         symtab_resolve_alias
31059         (bool call_for_symbol_and_aliases (bool (*callback) (symtab_node *, void *),
31060         void *data, bool include_overwrite)): created from symtab_for_node_and_aliases
31061         (symtab_node *noninterposable_alias (void)): created from symtab_nonoverwritable_alias
31062         (inline symtab_node *get_alias_target (void)): created from symtab_alias_target
31063         (void set_section (const char *section)): created from set_section_1
31064         (enum availability get_availability (void)): created from symtab_node_availability
31065         (void make_decl_local (void)): created from symtab_make_decl_local
31066         (bool real_symbol_p (void)): created from symtab_read_node
31067         (can_be_discarded_p (void)): created from symtab_can_be_discarded
31068         (inline bool comdat_local_p (void)): created from symtab_comdat_local_p
31069         (inline bool in_same_comdat_group_p (symtab_node *target)): created from
31070         symtab_in_same_comdat_p;
31071         (bool address_taken_from_non_vtable_p (void)): created from
31072         address_taken_from_non_vtable_p
31073         (static inline symtab_node *get (const_tree decl)): created from symtab_get_node
31074         (static void dump_table (FILE *)): created from dump_symtab
31075         (static inline DEBUG_FUNCTION void debug_symtab (void)): created from debug_symtab
31076         (static DEBUG_FUNCTION void verify_symtab_nodes (void)): created from verify_symtab
31077         (static bool used_from_object_file_p_worker (symtab_node *node)): created from
31078         symtab_used_from_object_file_p
31079         (void dump_base (FILE *)): created from dump_symtab_base
31080         (bool DEBUG_FUNCTION verify_base (void)): created from verify_symtab_base
31081         (void unregister (void)): created from symtab_unregister_node
31082         (struct symbol_priority_map *priority_info (void)): created from symtab_priority_info
31083         (static bool set_implicit_section (symtab_node *n, void *)): created from set_implicit_section
31084         (static bool noninterposable_alias (symtab_node *node, void *data)): created from
31085         symtab_nonoverwritable_alias_1
31086         * cgraph.h (cgraph_node):
31087         (bool remove_symbol_and_inline_clones (cgraph_node *forbidden_node = NULL)):
31088         created from cgraph_remove_node_and_inline_clones
31089         (void record_stmt_references (gimple stmt)): created from ipa_record_stmt_references
31090         (void set_call_stmt_including_clones (gimple old_stmt, gimple new_stmt,
31091         bool update_speculative = true)): created from cgraph_set_call_stmt_including_clones
31092         (cgraph_node *function_symbol (enum availability *avail = NULL)):
31093         created from cgraph_function_node
31094         (cgraph_node *create_clone (tree decl, gcov_type count, int freq, bool update_original,
31095         vec<cgraph_edge *> redirect_callers, bool call_duplication_hook,
31096         struct cgraph_node *new_inlined_to, bitmap args_to_skip)):
31097         created from cgraph_create_clone
31098         (cgraph_node *create_virtual_clone (vec<cgraph_edge *> redirect_callers,
31099         vec<ipa_replace_map *, va_gc> *tree_map, bitmap args_to_skip, const char * suffix)):
31100         created from cgraph_create_virtual_clone
31101         (cgraph_node *find_replacement (void)): created from cgraph_find_replacement_node
31102         (cgraph_node *create_version_clone (tree new_decl, vec<cgraph_edge *> redirect_callers,
31103         bitmap bbs_to_copy)): created from cgraph_copy_node_for_versioning
31104         (cgraph_node *create_version_clone_with_body (vec<cgraph_edge *> redirect_callers,
31105         vec<ipa_replace_map *, va_gc> *tree_map, bitmap args_to_skip, bool skip_return,
31106         bitmap bbs_to_copy, basic_block new_entry_block, const char *clone_name)):
31107         created from cgraph_function_version_info
31108         (struct cgraph_function_version_info *insert_new_function_version (void)):
31109         created from insert_new_cgraph_node_version
31110         (struct cgraph_function_version_info *function_version (void)): created from
31111         get_cgraph_node_version
31112         (void analyze (void)): created from analyze_function
31113         (cgraph_node * create_thunk (tree alias, tree, bool this_adjusting,
31114         HOST_WIDE_INT fixed_offset, HOST_WIDE_INT virtual_value, tree virtual_offset,
31115         tree real_alias) cgraph_add_thunk
31116         (inline cgraph_node *get_alias_target (void)): created from cgraph_alias_target
31117         (cgraph_node *ultimate_alias_target (availability *availability = NULL)):
31118         created from cgraph_function_or_thunk_node
31119         (bool expand_thunk (bool output_asm_thunks, bool force_gimple_thunk)):
31120         created from expand_thunk
31121         (void reset (void)): created from cgraph_reset_node
31122         (void create_wrapper (cgraph_node *target)): created from cgraph_make_wrapper
31123         (void DEBUG_FUNCTION verify_node (void)): created from verify_cgraph_node
31124         (void remove (void)): created from cgraph_remove_node
31125         (void dump (FILE *f)): created from dump_cgraph_node
31126         (void DEBUG_FUNCTION debug (void)): created from debug_cgraph_node
31127         (bool get_body (void)): created from cgraph_get_body
31128         (void release_body (void)): created from cgraph_release_function_body
31129         (void unnest (void)): created from cgraph_unnest_node
31130         (void make_local (void)): created from cgraph_make_node_local
31131         (void mark_address_taken (void)): created from cgraph_mark_address_taken_node
31132         (struct cgraph_edge *create_edge (cgraph_node *callee, gimple call_stmt,
31133         gcov_type count, int freq)): created from cgraph_create_edge
31134         (struct cgraph_edge *create_indirect_edge (gimple call_stmt, int ecf_flags,
31135         gcov_type count, int freq)): created from cgraph_create_indirect_edge
31136         (void create_edge_including_clones (struct cgraph_node *callee, gimple old_stmt,
31137         gimple stmt, gcov_type count, int freq, cgraph_inline_failed_t reason)):
31138         created from cgraph_create_edge_including_clones
31139         (cgraph_edge *get_edge (gimple call_stmt)): created from cgraph_edge
31140         (vec<cgraph_edge *> collect_callers (void)): created from collect_callers_of_node
31141         (void remove_callers (void)): created from cgraph_node_remove_callers
31142         (void remove_callees (void)): created from cgraph_node_remove_callees
31143         (enum availability get_availability (void)): created from cgraph_function_body_availability
31144         (void set_nothrow_flag (bool nothrow)): created from cgraph_set_nothrow_flag
31145         (void set_const_flag (bool readonly, bool looping)): created from cgraph_set_const_flag
31146         (void set_pure_flag (bool pure, bool looping)): created from cgraph_set_pure_flag
31147         (void call_duplication_hooks (cgraph_node *node2)): created from
31148         cgraph_call_node_duplication_hooks
31149         (bool call_for_symbol_and_aliases (bool (*callback) (cgraph_node *, void *),
31150         void *data, bool include_overwritable)): created from cgraph_for_node_and_aliases
31151         (bool call_for_symbol_thunks_and_aliases (bool (*callback) (cgraph_node *node, void *data),
31152         void *data, bool include_overwritable)): created from cgraph_for_node_thunks_and_aliases
31153         (void call_function_insertion_hooks (void)):
31154         created from cgraph_call_function_insertion_hooks
31155         (inline void mark_force_output (void)): created from cgraph_mark_force_output_node
31156         (bool local_p (void)): created from cgraph_local_node
31157         (bool can_be_local_p (void)): created from cgraph_node_can_be_local_p
31158         (bool cannot_return_p (void)): created from cgraph_node_cannot_return
31159         (bool only_called_directly_p (void)): created from cgraph_only_called_directly_p
31160         (inline bool only_called_directly_or_aliased_p (void)):
31161         created from cgraph_only_called_directly_or_aliased_p
31162         (bool will_be_removed_from_program_if_no_direct_calls_p (void)):
31163         created from cgraph_will_be_removed_from_program_if_no_direct_calls
31164         (bool can_remove_if_no_direct_calls_and_refs_p (void)):
31165         created from cgraph_can_remove_if_no_direct_calls_and_refs_p
31166         (bool can_remove_if_no_direct_calls_p (void)):
31167         created from cgraph_can_remove_if_no_direct_calls_p
31168         (inline bool has_gimple_body_p (void)):
31169         created from cgraph_function_with_gimple_body_p
31170         (bool optimize_for_size_p (void)): created from cgraph_optimize_for_size_p
31171         (static void dump_cgraph (FILE *f)): created from dump_cgraph
31172         (static inline void debug_cgraph (void)): created from debug_cgraph
31173         (static void record_function_versions (tree decl1, tree decl2)):
31174         created from record_function_versions
31175         (static void delete_function_version (tree decl)):
31176         created from delete_function_version
31177         (static void add_new_function (tree fndecl, bool lowered)):
31178         created from cgraph_add_new_function
31179         (static inline cgraph_node *get (const_tree decl)): created from cgraph_get_node
31180         (static cgraph_node * create (tree decl)): created from cgraph_create_node
31181         (static cgraph_node * create_empty (void)): created from cgraph_create_empty_node
31182         (static cgraph_node * get_create (tree)): created from cgraph_get_create_node
31183         (static cgraph_node *get_for_asmname (tree asmname)):
31184         created from cgraph_node_for_asm
31185         (static cgraph_node * create_same_body_alias (tree alias, tree decl)):
31186         created from cgraph_same_body_alias
31187         (static bool used_from_object_file_p_worker (cgraph_node *node,
31188         void *): new function
31189         (static bool non_local_p (cgraph_node *node, void *)):
31190         created from cgraph_non_local_node_p_1
31191         (static void DEBUG_FUNCTION verify_cgraph_nodes (void)):
31192         created from verify_cgraph
31193         (static bool make_local (cgraph_node *node, void *)):
31194         created from cgraph_make_node_local
31195         (static cgraph_node *create_alias (tree alias, tree target)):
31196         created from cgraph_create_function_alias
31197         (static cgraph_edge * create_edge (cgraph_node *caller, cgraph_node *callee,
31198         gimple call_stmt, gcov_type count, int freq, bool indir_unknown_callee)):
31199         created from cgraph_create_edge_1
31200         * cgraph.h (varpool_node):
31201         (void remove (void)): created from varpool_remove_node
31202         (void dump (FILE *f)): created from dump_varpool_node
31204 2014-07-24  Richard Biener  <rguenther@suse.de>
31206         PR ipa/61823
31207         * tree-ssa-structalias.c (create_variable_info_for_1):
31208         Use varpool_get_constructor.
31209         (create_variable_info_for): Likewise.
31211 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
31213         * config/aarch64/aarch64.c (aarch64_expand_epilogue): Don't
31214         subtract outgoing area size when restoring stack_pointer_rtx.
31216 2014-07-24  Nick Clifton  <nickc@redhat.com>
31218         * config/rx/rx.md (stack_push): Adjust RTL to account for the fact
31219         that operations are taking place in parallel.
31220         * config/rx.h (FRAME_POINTER_CFA_OFFSET): Delete.
31222 2014-07-24  Thomas Schwinge  <thomas@codesourcery.com>
31224         * omp-low.c (extract_omp_for_data): Add missing break statement.
31226 2014-07-24  Richard Biener  <rguenther@suse.de>
31228         * tree-inline.h (estimate_move_cost): Add speed_p parameter.
31229         * tree-inline.c (estimate_move_cost): Add speed_p parameter
31230         and adjust MOVE_RATIO query accordingly.
31231         (estimate_num_insns): Adjust callers.
31232         * ipa-prop.c (ipa_populate_param_decls): Likewise.
31233         * ipa-cp.c (gather_context_independent_values,
31234         estimate_local_effects): Likewise.
31235         * ipa-split.c (consider_split): Likewise.
31237 2014-07-24  Trevor Saunders  <tsaunders@mozilla.com>
31239         * config/i386/driver-i386.c: Remove names of unused arguments and
31240         unnecessary unused attributes.
31241         * config/i386/host-mingw32.c: Likewise.
31242         * config/i386/i386.c: Likewise.
31243         * config/i386/winnt-stubs.c: Likewise.
31244         * config/i386/winnt.c: Likewise.
31246 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31248         * config/aarch64/aarch64.c (aarch64_popwb_pair_reg)
31249         (aarch64_gen_loadwb_pair): New helper function.
31250         (aarch64_expand_epilogue): Simplify code using new helper functions.
31251         * config/aarch64/aarch64.md (loadwb_pair<GPF:mode>_<P:mode>): Define.
31253 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31255         * config/aarch64/aarch64.c (aarch64_pushwb_pair_reg)
31256         (aarch64_gen_storewb_pair): New helper function.
31257         (aarch64_expand_prologue): Simplify code using new helper functions.
31258         * config/aarch64/aarch64.md (storewb_pair<GPF:mode>_<P:mode>): Define.
31260 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31262         * config/aarch64/aarch64.md: (aarch64_save_or_restore_callee_saves):
31263         Rename to aarch64_save_callee_saves, remove restore code.
31264         (aarch64_restore_callee_saves): New function.
31266 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31268         * config/aarch64/aarch64.c (aarch64_save_or_restore_fprs): Deleted.
31269         (aarch64_save_callee_saves): New function to handle reg save
31270         for both core and vectore regs.
31272 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31274         * config/aarch64/aarch64.c (aarch64_gen_load_pair)
31275         (aarch64_gen_store_pair): New helper function.
31276         (aarch64_save_or_restore_callee_save_registers)
31277         (aarch64_save_or_restore_fprs): Use new helper functions.
31279 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31281         * config/aarch64/aarch64.c (aarch64_next_callee_save): New function.
31282         (aarch64_save_or_restore_callee_save_registers)
31283         (aarch64_save_or_restore_fprs): Use aarch64_next_callee_save.
31285 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31287         * config/aarch64/aarch64.c
31288         (aarch64_save_or_restore_callee_save_registers)
31289         (aarch64_save_or_restore_fprs): Hoist calculation of register rtx.
31291 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31293         * config/aarch64/aarch64.c
31294         (aarch64_save_or_restore_callee_save_registers)
31295         (aarch64_save_or_restore_fprs): Remove 'increment'.
31297 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31299         * config/aarch64/aarch64.c
31300         (aarch64_save_or_restore_callee_save_registers)
31301         (aarch64_save_or_restore_fprs): Use register offset in
31302         cfun->machine->frame.reg_offset.
31304 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31306         * config/aarch64/aarch64.c
31307         (aarch64_save_or_restore_callee_save_registers)
31308         (aarch64_save_or_restore_fprs): Remove base_rtx.
31310 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31312         * config/aarch64/aarch64.c
31313         (aarch64_save_or_restore_callee_save_registers): Rename 'offset'
31314         to 'start_offset'.  Remove local variable 'start_offset'.
31316 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31318         * config/aarch64/aarch64.c (aarch64_save_or_restore_fprs): Change
31319         type to HOST_WIDE_INT.
31321 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31323         * config/aarch64/aarch64.c (aarch64_expand_prologue)
31324         (aarch64_save_or_restore_fprs)
31325         (aarch64_save_or_restore_callee_save_registers): GNU-Stylize code.
31327 2014-07-23  Sebastian Huber  <sebastian.huber@embedded-brains.de>
31329         * config/arm/t-rtems-eabi: Add
31330         mthumb/march=armv7-r/mfpu=vfpv3-d16/mfloat-abi=hard,
31331         mthumb/march=armv7-m/mfpu=fpv4-sp-d16/mfloat-abi=hard,
31332         mbig-endian/mthumb/march=armv7-r, and
31333         mbig-endian/mthumb/march=armv7-r/mfpu=vfpv3-d16/mfloat-abi=hard
31334         multilibs.
31336 2014-07-23  Sebastian Huber  <sebastian.huber@embedded-brains.de>
31337             Chris Johns <chrisj@rtems.org>
31338             Joel Sherrill <joel.sherrill@oarcorp.com>
31340         * config.gcc: Add nios2-*-rtems*.
31341         * config/nios2/rtems.h: New file.
31342         * gcc/config/nios2/t-rtems: New file.
31344 2014-07-23  Segher Boessenkool  <segher@kernel.crashing.org>
31346         PR target/61396
31347         * config/rs6000/rs6000.c (paired_expand_vector_init): Only allow
31348         constant numbers, not general constants.
31349         (rs6000_expand_vector_init): Ditto.
31351 2014-07-23  Nathan Sidwell  <nathan@acm.org>
31353         * gcov-tool.c (gcov_list): Declare here.
31354         (set_gcov_list): Remove.
31355         (gcov_output_files): Set gcov_list directly.
31357 2014-07-23  Host Schirmeier  <horst@schirmeier.com>
31359         * doc/invoke.texi: -O3 enables -ftree-loop-distribute-patterns.
31361 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31363         * config/arm/arm.c (arm_get_frame_offsets): If both r3 and other
31364         callee-saved registers are available for padding purpose
31365         and r3 is not mandatory, then prefer use those callee-saved
31366         instead of r3.
31368 2014-07-23  Richard Biener  <rguenther@suse.de>
31370         * params.def (PARAM_MAX_COMBINE_INSNS): New.
31371         * combine.c: Include statistics.h and params.h.
31372         (combine_instructions): Guard three and four insn combines
31373         with max-combine-insns value.  Record statistics for combines
31374         performed.
31375         * doc/invoke.texi (max-combine-insns): Document new param.
31377 2014-07-23  Roman Gareev  <gareevroman@gmail.com>
31379         * graphite-isl-ast-to-gimple.c:
31380         (translate_isl_ast_node_block): New function.
31381         (translate_isl_ast): Add calling of translate_isl_ast_node_block.
31383         * gcc.dg/graphite/isl-ast-gen-blocks-1.c: New testcase.
31384         * gcc.dg/graphite/isl-ast-gen-blocks-2.c: New testcase.
31386 2014-07-23  Roman Gareev  <gareevroman@gmail.com>
31388         * graphite-isl-ast-to-gimple.c:
31389         (get_max_schedule_dimensions): New function.
31390         (extend_schedule): Likewise.
31391         (generate_isl_schedule): Add calling of extend_schedule and
31392         get_max_schedule_dimensions.
31394 2014-07-22  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31396         * config/aarch64/aarch64.c (aarch64_rtx_costs): Handle CLRSB, CLZ.
31397         (case UNSPEC): Handle UNSPEC_RBIT.
31399 2014-07-22  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31401         * config/aarch64/aarch64.md: Delete UNSPEC_CLS.
31402         (clrsb<mode>2): Use clrsb RTL code instead of UNSPEC_CLS.
31404 2014-07-22  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31406         * config/aarch64/arm_neon.h (vbsl_f64): New intrinsic.
31408 2014-07-22  Roman Gareev  <gareevroman@gmail.com>
31410         * graphite-isl-ast-to-gimple.c:
31411         Add inclusion of gimple-ssa.h, tree-into-ssa.h.
31412         (ivs_params_clear):
31413         (build_iv_mapping): New function.
31414         (translate_isl_ast_node_user): Likewise.
31415         (translate_isl_ast): Add calling of translate_isl_ast_node_user.
31417         * gcc.dg/graphite/isl-ast-gen-single-loop-1.c: New testcase.
31418         * gcc.dg/graphite/isl-ast-gen-single-loop-2.c: New testcase.
31419         * gcc.dg/graphite/isl-ast-gen-single-loop-3.c: New testcase.
31421 2014-07-21  Bin Cheng  <bin.cheng@arm.com>
31423         PR target/55701
31424         * config/arm/arm.md (setmem): New pattern.
31425         * config/arm/arm-protos.h (struct tune_params): New fields.
31426         (arm_gen_setmem): New prototype.
31427         * config/arm/arm.c (arm_slowmul_tune): Initialize new fields.
31428         (arm_fastmul_tune, arm_strongarm_tune, arm_xscale_tune): Ditto.
31429         (arm_9e_tune, arm_v6t2_tune, arm_cortex_tune): Ditto.
31430         (arm_cortex_a8_tune, arm_cortex_a7_tune): Ditto.
31431         (arm_cortex_a15_tune, arm_cortex_a53_tune): Ditto.
31432         (arm_cortex_a57_tune, arm_cortex_a5_tune): Ditto.
31433         (arm_cortex_a9_tune, arm_cortex_a12_tune): Ditto.
31434         (arm_v7m_tune, arm_v6m_tune, arm_fa726te_tune): Ditto.
31435         (arm_const_inline_cost): New function.
31436         (arm_block_set_max_insns): New function.
31437         (arm_block_set_non_vect_profit_p): New function.
31438         (arm_block_set_vect_profit_p): New function.
31439         (arm_block_set_unaligned_vect): New function.
31440         (arm_block_set_aligned_vect): New function.
31441         (arm_block_set_unaligned_non_vect): New function.
31442         (arm_block_set_aligned_non_vect): New function.
31443         (arm_block_set_vect, arm_gen_setmem): New functions.
31445 2014-07-21  Bin Cheng  <bin.cheng@arm.com>
31447         * config/arm/arm.c (output_move_neon): Handle REG explicitly.
31449 2014-07-21  Uros Bizjak  <ubizjak@gmail.com>
31451         PR target/61855
31452         * config/i386/avx512fintrin.h: Move constants for mantissa extraction
31453         out of #ifdef __OPTIMIZE__.
31455 2014-07-20  Eric Botcazou  <ebotcazou@adacore.com>
31457         * cse.c (exp_equiv_p) <MEM>: For GCSE, return 0 for expressions with
31458         different trapping status if -fnon-call-exceptions is enabled.
31460 2014-07-20  Eric Botcazou  <ebotcazou@adacore.com>
31462         * expr.c (store_field): Handle VOIDmode for calls that return values
31463         in multiple locations.
31465 2014-07-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
31467         * config/rs6000/altivec.md (unspec enum):  Fix typo in UNSPEC_VSLDOI.
31468         (altivec_vsldoi_<mode>): Likewise.
31470 2014-07-20  Roman Gareev  <gareevroman@gmail.com>
31472         * graphite-isl-ast-to-gimple.c: Fixes a formatting issue related
31473         to the number of characters in the line.
31475 2014-07-20  Roman Gareev  <gareevroman@gmail.com>
31477         * graphite-isl-ast-to-gimple.c: Add using of
31478         build_nonstandard_integer_type instead of int128_integer_type_node.
31480 2014-07-19  Eric Botcazou  <ebotcazou@adacore.com>
31482         * toplev.c (output_stack_usage): Adjust the location of the warning.
31484 2014-07-19  Daniel Cederman  <cederman@gaisler.com>
31486         * config/sparc/sync.md (*membar_storeload_leon3): New insn.
31487         (*membar_storeload): Disable for LEON3.
31489 2014-07-18  Bernd Edlinger  <bernd.edlinger@hotmail.de>
31491         PR rtl-optimization/61461
31492         * sched-vis.c (print_pattern) <ADDR_VEC, ADDR_DIFF_VEC>: Fixed.
31494 2014-07-18  Uros Bizjak  <ubizjak@gmail.com>
31496         PR target/61794
31497         * config/i386/sse.md (avx512f_vextract<shuffletype>32x4_1_maskm):
31498         Fix instruction constraint.
31499         (<mask_codefor>avx512f_vextract<shuffletype>32x4_1<mask_name>): Ditto.
31501 2014-07-18  Jonathan Wakely  <jwakely@redhat.com>
31503         * doc/extend.texi (Template Instantiation): Remove stray parenthesis.
31505 2014-07-18  Chung-Ju Wu  <jasonwucj@gmail.com>
31507         * config/nds32/nds32.c (nds32_can_eliminate): Follow the
31508         GNU coding standards.
31509         (nds32_register_move_cost): Likewise.
31510         (nds32_memory_move_cost): Likewise.
31511         (nds32_address_cost): Likewise.
31513 2014-07-18  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
31515         * config/mmix/mmix.c (mmix_intval): Drop unused automatic variable.
31517 2014-07-17  John David Anglin  <danglin@gcc.gnu.org>
31519         * config/pa/pa-linux.h (TARGET_OS_CPP_BUILTINS): Remove defines for
31520         __GCC_HAVE_SYNC_COMPARE_AND_SWAP_1, __GCC_HAVE_SYNC_COMPARE_AND_SWAP_2
31521         and __GCC_HAVE_SYNC_COMPARE_AND_SWAP_4.
31522         (HAVE_sync_compare_and_swapqi): Define.
31523         (HAVE_sync_compare_and_swaphi): Likewise.
31524         (HAVE_sync_compare_and_swapsi): Likewise.
31526 2014-07-17  Richard Sandiford  <rdsandiford@googlemail.com>
31528         * config/mips/p5600.md: Add missing cpu tests.
31530 2014-07-17  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31532         * config/aarch64/arm_neon.h (vfma_f64): New intrinsic.
31533         (vmla_f64): Likewise.
31534         (vfms_f64): Likewise.
31535         (vmls_f64): Likewise.
31537 2014-07-17  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31539         * config/aarch64/aarch64.c (aarch64_frint_unspec_p): New function.
31540         (aarch64_rtx_costs): Handle FIX, UNSIGNED_FIX, UNSPEC.
31542 2014-07-17  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31544         * config/aarch64/arm_neon.h (vmlal_high_lane_s16): Fix type.
31545         (vmlal_high_lane_s32): Likewise.
31546         (vmlal_high_lane_u16): Likewise.
31547         (vmlal_high_lane_u32): Likewise.
31548         (vmlsl_high_lane_s16): Likewise.
31549         (vmlsl_high_lane_s32): Likewise.
31550         (vmlsl_high_lane_u16): Likewise.
31551         (vmlsl_high_lane_u32): Likewise.
31553 2014-07-17  Terry Guo  <terry.guo@arm.com>
31555         * config/arm/types.md (alu_reg): Replaced by alu_sreg and alu_dsp_reg.
31556         (alus_reg): Renamed to alus_sreg.
31557         * config/arm/arm-fixed.md: Change type of non-dsp instructions
31558         from alu_reg to alu_sreg.  Change type of dsp instructions from
31559         alu_reg to alu_dsp_reg.
31560         * config/arm/thumb1.md: Likewise.
31561         * config/arm/thumb2.md: Likewise.
31562         * config/arm/arm.c (cortexa7_older_only): Use new ALU type names.
31563         * config/arm/arm1020e.md (1020alu_op): Replace alu_reg and alus_reg
31564         with alu_sreg and alus_sreg.
31565         * config/arm/arm1026ejs.md (alu_op): Likewise.
31566         * config/arm/arm1136jfs.md (11_alu_op): Likewise.
31567         * config/arm/arm926ejs.md (9_alu_op): Likewise.
31568         * config/arm/fa526.md (526_alu_op): Likewise.
31569         * config/arm/fa606te.md (606te_alu_op): Likewise.
31570         * config/arm/fa626te.md (626te_alu_op): Likewise.
31571         * config/arm/fa726te.md (726te_alu_op): Likewise.
31572         * config/arm/fmp626.md (mp626_alu_op): Likewise.
31573         * config/arm/arm.md (core_cycles): Replace alu_reg and alus_reg with
31574         alu_sreg, alu_dsp_reg and alus_sreg.
31575         * config/arm/cortex-a15.md (cortex_a15_alu): Likewise.
31576         * config/arm/cortex-a5.md (cortex_a5_alu): Likewise.
31577         * config/arm/cortex-a53.md (cortex_a53_alu): Likewise.
31578         * config/arm/cortex-a7.md (cortex_a7_alu_sreg): Likewise.
31579         * config/arm/cortex-a8.md (cortex_a8_alu): Likewise.
31580         * config/arm/cortex-a9.md (cortex_a9_dp): Likewise.
31581         * config/arm/cortex-m4.md (cortex_m4_alu): Likewise.
31582         * config/arm/cortex-r4.md (cortex_r4_alu): Likewise.
31583         * config/arm/marvell-pj4.md (pj4_alu, pj4_alu_conds): Likewise.
31584         * config/aarch64/aarch64.md (*addsi3_aarch64, *addsi3_aarch64_uxtw,
31585         subsi3, *adddi3_aarch64, *subsi3_uxtw, subdi3, absdi2, neg<mode>2,
31586         *negsi2_uxtw, tlsle_small_<mode>): Rename type alu_reg to alu_sreg.
31587         (add<mode>3_compare0, *addsi3_compare0_uxtw, *add<mode>3nr_compare0,
31588         sub<mode>3_compare0, *compare_neg<mode>, *neg<mode>2_compare0,
31589         subsi3_compare0_uxtw, *negsi2_compare0_uxtw, *cmp<mode>): Rename type
31590         alus_reg to alus_sreg.
31592 2014-07-17  Andreas Schwab  <schwab@linux-m68k.org>
31594         * real.c (encode_ieee_extended_motorola): Clear integer bit in the
31595         infinity format.
31597 2014-07-17  Richard Biener  <rguenther@suse.de>
31599         PR rtl-optimization/61801
31600         * sched-deps.c (sched_analyze_2): For ASM_OPERANDS and ASM_INPUT
31601         don't set reg_pending_barrier if it appears in a debug-insn.
31603 2014-07-16  DJ Delorie  <dj@redhat.com>
31605         * config/rx/rx.c (rx_option_override): Fix alignment values.
31606         (rx_align_for_label): Likewise.
31608 2014-07-17  Hans-Peter Nilsson  <hp@axis.com>
31610         PR target/61737.
31611         * config/cris/cris.c (TARGET_LEGITIMATE_CONSTANT_P)
31612         (TARGET_CANNOT_FORCE_CONST_MEM): Define.
31613         (cris_cannot_force_const_mem, cris_legitimate_constant_p): New
31614         functions.
31615         (cris_print_index, cris_print_operand, cris_constant_index_p)
31616         (cris_side_effect_mode_ok): Replace CONSTANT_P with CRIS_CONSTANT_P.
31617         (cris_address_cost): Ditto last CONSTANT_P.
31618         (cris_symbol_type_of): Rename from cris_pic_symbol_type_of.  All
31619         callers changed.  Yield cris_offsettable_symbol for non-PIC
31620         constant symbolic expressions including labels.  Yield cris_unspec
31621         for all unspecs.
31622         (cris_expand_pic_call_address): New parameter MARKERP.  Set its
31623         target to pic_offset_table_rtx for calls that will likely go
31624         through PLT, const0_rtx when they can't.  All callers changed.
31625         Assert flag_pic.  Use CONSTANT_P, not CONSTANT_ADDRESS_P, for
31626         symbolic expressions to be PICified.  Remove second, redundant,
31627         assert on can_create_pseudo_p returning non-zero.  Use
31628         replace_equiv_address_nv, not replace_equiv_address, for final
31629         operand update.
31630         * config/cris/cris.md ("movsi"): Move variable t to pattern
31631         toplevel. Adjust assert for new cris_symbol_type member.  Use
31632         CONSTANT_P instead of CONSTANT_ADDRESS_P.
31633         ("*movsi_internal") <case 9>: Make check for valid unspec operands
31634         for lapc stricter.
31635         <case CRIS_UNSPEC_PCREL, CRIS_UNSPEC_PLT_PCREL>: Clear condition codes.
31636         ("call", "call_value"): Use second incoming operand as a marker
31637         for pic-offset-table-register being used.
31638         ("*expanded_call_non_v32", "*expanded_call_v32")
31639         ("*expanded_call_value_non_v32", "*expanded_call_value_v32"): For
31640         second incoming operand to CALL, match cris_call_type_marker.
31641         ("*expanded_call_value_side"): Ditto.  Disable before reload_completed.
31642         ("*expanded_call_side"): Ditto.  Fix typo in comment.
31643         (moverside, movemside peepholes): Check for CRIS_CONSTANT_P, not
31644         CONSTANT_P.
31645         * config/cris/predicates.md ("cris_call_type_marker"): New predicate.
31646         * config/cris/cris.h (CRIS_CONSTANT_P): New macro.
31647         (enum cris_symbol_type): Rename from cris_pic_symbol_type.  All
31648         users changed.  Add members cris_offsettable_symbol and cris_unspec.
31649         (cris_symbol_type): Rename from cris_pic_symbol_type.
31650         * config/cris/constraints.md ("T"): Use CRIS_CONSTANT_P, not
31651         just CONSTANT_P.
31652         * config/cris/cris-protos.h (cris_symbol_type_of,
31653         cris_expand_pic_call_address): Adjust prototypes.
31654         (cris_legitimate_constant_p): New prototype.
31656         * config.gcc (crisv32-*-linux* | cris-*-linux*): Do not override
31657         an existing tmake_file.  Don't add t-slibgcc and t-linux.
31659 2014-07-17  Jason Merrill  <jason@redhat.com>
31661         PR c++/61623
31662         * symtab.c (symtab_remove_from_same_comdat_group): Also
31663         set_comdat_group to NULL_TREE.
31664         (verify_symtab): Fix diagnostic.
31666 2014-07-16  David Wohlferd  <dw@LimeGreenSocks.com>
31668         PR target/61662
31669         * config/i386/ia32intrin.h: Use __LP64__ to determine size of long.
31671 2014-07-16  Dodji Seketeli  <dodji@redhat.com>
31673         Support location tracking for built-in macro tokens
31674         * input.h (is_location_from_builtin_token): New function declaration.
31675         * input.c (is_location_from_builtin_token): New function definition.
31676         * toplev.c (general_init): Tell libcpp what the pre-defined
31677         spelling location for built-in tokens is.
31679 2014-07-16  Jakub Jelinek  <jakub@redhat.com>
31681         * omp-low.c (create_omp_child_function): Don't set DECL_NAMELESS
31682         on the FUNCTION_DECL.
31684 2014-07-16  Richard Biener  <rguenther@suse.de>
31686         PR other/61782
31687         * doc/extend.texi (always_inline): Clarify.
31689 2014-07-15  Eric Christopher  <echristo@gmail.com>
31691         * doc/invoke.texi (Link Options): Document -z option.
31693 2014-07-15  Uros Bizjak  <ubizjak@gmail.com>
31695         * config/alpha/alpha.c (alpha_atomic_assign_expand_fenv): New.
31696         (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): New define.
31698 2014-07-15  Jan Hubicka  <hubicka@ucw.cz>
31700         * fold-const.c (fold_checksum_tree): Fix typo in previous patch.
31702 2014-07-15  Bernd Schmidt  <bernds@codesourcery.com>
31704         * asan.c (asan_finish_file): Use varpool_finalize_decl instead of
31705         varpool_assemble_decl.
31706         * varpool.c (varpool_assemble_decl): Assert that node->definition is
31707         true.
31709 2014-07-15  Michael Matz  <matz@suse.de>
31711         PR rtl-optimization/61772
31712         * ifcvt.c (dead_or_predicable): Check jump to be free of side effects.
31714 2014-07-15  Richard Biener  <rguenther@suse.de>
31716         * opts.c (default_options_table): Disable bit-ccp at -Og.
31718 2014-07-14  Jan Hubicka  <hubicka@ucw.cz>
31720         * fold-const.c (fold_checksum_tree): Move checking of DECL_RESULT.
31722 2014-07-14  Jan Hubicka  <hubicka@ucw.cz>
31724         * tree.c (tree_code_size): Add TRANSLATION_UNIT_DECL,
31725         NAMESPACE_DECL, IMPORTED_DECL and NAMELIST_DECL;
31726         call langhook for unknown declaration.
31727         (find_decls_types_r): Do not walk DECL_ARGUMENT_FLD.
31728         * tree.h (DECL_ARGUMENTS): Update.
31729         * print-tree.c (print_node): Update.
31730         * tree-core.h (tree_decl_non_common): Remove arguments.
31731         (tree_function_decl): Add arguments.
31733 2014-07-14  Richard Earnshaw  <rearnsha@arm.com>
31735         * aarch64.md (add_losym_<mode>): Set type to alu_imm.
31737 2014-07-14  Richard Biener  <rguenther@suse.de>
31739         PR tree-optimization/61779
31740         * tree-ssa-copy.c (copy_prop_visit_cond_stmt): Always try
31741         simplifying a condition.
31743 2014-07-14  Richard Biener  <rguenther@suse.de>
31745         * builtins.c (c_strlen): Make only_value == 2 really only
31746         affect warning generation.
31748 2014-07-14  Richard Biener  <rguenther@suse.de>
31750         PR tree-optimization/61757
31751         PR tree-optimization/61783
31752         PR tree-optimization/61787
31753         * tree-ssa-dom.c (record_equality): Revert canonicalization
31754         change and add comment.
31755         (propagate_rhs_into_lhs): Revert previous fix, removing
31756         loop depth restriction again.
31758 2014-07-14  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31760         * config/arm/cortex-a15.md (cortex_a15_alu): Handle clz, rbit.
31761         * config/arm/cortex-a5.md (cortex_a5_alu): Likewise.
31762         * config/arm/cortex-a53.md (cortex_a53_alu): Likewise.
31763         * config/arm/cortex-a7.md (cortex_a7_alu_reg): Likewise.
31764         * config/arm/cortex-a9.md (cortex_a9_dp): Likewise.
31765         * config/arm/cortex-m4.md (cortex_m4_alu): Likewise.
31766         * config/arm/cortex-r4.md (cortex_r4_alu): Likewise.
31768 2014-07-14  Richard Biener  <rguenther@suse.de>
31770         * cgraph.h (decl_in_symtab_p): Make inline.
31772 2014-07-14  Jakub Jelinek  <jakub@redhat.com>
31774         PR middle-end/61294
31775         * doc/invoke.texi (-Wmemset-transposed-args): Document.
31777         PR target/61656
31778         * config/i386/i386.c (classify_argument): Don't merge classes above
31779         number of words.
31781 2014-07-13  Jan Hubicka  <hubicka@ucw.cz>
31783         * cgraph.h (symtab_node): Add nonzero_address.
31784         (decl_in_symtab_p): Break out from ...
31785         (symtab_get_node): ... here.
31786         * fold-const.c: Include cgraph.h
31787         (tree_single_nonzero_warnv_p): Use symtab to determine
31788         if symbol is non-zero.
31789         * symtab.c (symtab_node::nonzero_address): New method.
31791 2014-07-12  Jan Hubicka  <hubicka@ucw.cz>
31793         * ipa-devirt.c (odr_subtypes_equivalent_p): Disable temporary hack
31794         forgotten in previous commit.
31796 2014-07-12  Jan Hubicka  <hubicka@ucw.cz>
31798         * tree.c (type_in_anonymous_namespace_p): Ignore TREE_PUBLIC
31799         on builtin types.
31800         * ipa-devirt.c: Include stor-layout.h and intl.h
31801         (odr_subtypes_equivalent_p): New function.
31802         (warn_odr): New function.
31803         (warn_type_mismatch): New function.
31804         (odr_types_equivalent_p): New function.
31805         (add_type_duplicate): Use it.
31806         * common.opt (Wodr): New flag.
31807         * doc/invoke.texi (Wodr): Document new warning.
31809 2014-07-12  Jan Hubicka  <hubicka@ucw.cz>
31811         * timevar.def (TV_IPA_LTO_DECL_INIT_IO): Remove.
31812         (TV_IPA_LTO_CTORS_IN, TV_IPA_LTO_CTORS_OUT): New timevar.
31813         * cgraph.c (cgraph_get_body): Push GIMPLE_IN timevar.
31814         (varpool_get_constructor): Push CTORS_IN timevar.
31815         * lto-streamer-out.c (lto_output): Push TV_IPA_LTO_CTORS_OUT timevar.
31817 2014-07-12  Uros Bizjak  <ubizjak@gmail.com>
31819         * config/i386/i386-builtin-types.def: Add USHORT_FTYPE_VOID.
31820         Remove VOID_FTYPE_PUSHORT.
31821         * config/i386/i386.c (bdesc_special_args) <__builtin_ia32_fnstsw>:
31822         Change code to USHORT_FTYPE_VOID.
31823         (ix86_expand_special_args_builtin): Handle USHORT_FTYPE_VOID.
31824         (ix86_expand_builtin): Remove IX86_BUILTIN_FNSTSW handling.
31825         (ix86_atomic_assign_expand_fenv): Update for
31826         __builtin_ia32_fnstsw changes.
31827         * config/i386/i386.md (x86_fnstsw_1): Set length unconditionally to 2.
31828         (fnstsw): Change operand 0 to nonimmediate operand.
31830 2014-07-11  Jan Hubicka  <hubicka@ucw.cz>
31832         * vapool.c: Include tree-ssa-alias.h, gimple.h and lto-streamer.h
31833         (varpool_get_constructor): New function.
31834         (varpool_ctor_useable_for_folding_p): Break out from ...
31835         (ctor_for_folding): ... here; use varpool_get_constructor.
31836         (varpool_assemble_decl): Likewise.
31837         * lto-streamer.h (struct output_block): Turn cgraph_node
31838         to symbol filed.
31839         (lto_input_variable_constructor): Declare.
31840         * ipa-visibility.c (function_and_variable_visibility): Use
31841         varpool_get_constructor.
31842         * cgraph.h (varpool_get_constructor): Declare.
31843         (varpool_ctor_useable_for_folding_p): New function.
31844         * lto-streamer-out.c (get_symbol_initial_value): Take encoder
31845         parameter; return error_mark_node for non-trivial constructors.
31846         (lto_write_tree_1, DFS_write_tree): Update use of
31847         get_symbol_initial_value.
31848         (output_function): Update initialization of symbol.
31849         (output_constructor): New function.
31850         (copy_function): Rename to ..
31851         (copy_function_or_variable): ... this one; handle vars too.
31852         (lto_output): Output variable sections.
31853         * lto-streamer-in.c (input_constructor): New function.
31854         (lto_read_body): Rename from ...
31855         (lto_read_body_or_constructor): ... this one; handle vars too.
31856         (lto_input_variable_constructor): New function.
31857         * ipa-prop.c (ipa_prop_write_jump_functions,
31858         ipa_prop_write_all_agg_replacement): Update.
31859         * lto-cgraph.c (compute_ltrans_boundary): Use it.
31860         (output_cgraph_opt_summary): Set symbol to NULL.
31862 2014-07-11  Jan Hubicka  <hubicka@ucw.cz>
31864         * ipa-prop.c (ipa_binfo_from_known_type_jfunc): In LTO do not walk
31865         non-polymorphic types.
31866         * ipa-cp.c (ipa_get_jf_ancestor_result): Likewise.
31867         * ipa-devirt.c (types_same_for_odr): Do not explode when one
31868         of types is not polymorphic.
31870 2014-07-11  Vladimir Makarov  <vmakarov@redhat.com>
31872         * lra-constraints.c (remove_inheritance_pseudos): Process
31873         destination pseudo too.
31875 2014-07-11  Rong Xu  <xur@google.com>
31877         * gcov-tool.c (gcov_output_files): Fix build error introduced in
31878         commit r212448.
31880 2014-07-11  Pitchumani Sivanupandi  <pitchumani.s@atmel.com>
31882         * config/avr/avr-arch.h (avr_mcu_t): Add text section start attribute.
31883         * config/avr/avr-devices.c (AVR_MCU): Same.
31884         (avr_mcu_types): add text start value to end of device list.
31885         * config/avr/avr-mcus.def: Add text section start for all devices.
31886         (ata5782): Add new avr5 device.
31887         (ata5831): Same.
31888         * config/avr/avr-tables.opt: Regenerate.
31889         * config/avr/avr.h: Add declaration for text section start handler.
31890         (EXTRA_SPEC_FUNCTIONS): Add text section start handler to
31891         SPEC functions.
31892         (LINK_SPEC): Include text section start handler to linker spec.
31893         * config/avr/driver-avr.c (avr_device_to_text_start): New function to
31894         pass -Ttext option to linker if the text section start for the device
31895         is not zero.
31896         * config/avr/t-multilib: Regenerate.
31897         * doc/avr-mmcu.texi: Regenerate.
31899 2014-07-11  David Edelsohn  <dje.gcc@gmail.com>
31901         * config/rs6000/aix51.h (LINK_SPEC): Remove -bnodelcsect.
31902         * config/rs6000/aix52.h (LINK_SPEC): Same.
31903         * config/rs6000/aix53.h (LINK_SPEC): Same.
31904         * config/rs6000/aix61.h (LINK_SPEC): Same.
31905         * config/rs6000/xcoff.h (MAKE_DECL_ONE_ONLY): Define.
31907 2014-07-11  Roman Gareev  <gareevroman@gmail.com>
31909         * graphite-isl-ast-to-gimple.c (gmp_cst_to_tree): New function.
31910         (graphite_verify): New function.
31911         (ivs_params_clear): New function.
31912         (gcc_expression_from_isl_ast_expr_id): New function.
31913         (gcc_expression_from_isl_expr_int): New function.
31914         (binary_op_to_tree): New function.
31915         (ternary_op_to_tree): New function.
31916         (unary_op_to_tree): New function.
31917         (nary_op_to_tree): New function.
31918         (gcc_expression_from_isl_expr_op): New function.
31919         (gcc_expression_from_isl_expression): New function.
31920         (graphite_create_new_loop): New function.
31921         (translate_isl_ast_for_loop): New function.
31922         (get_upper_bound): New function.
31923         (graphite_create_new_loop_guard): New function.
31924         (translate_isl_ast_node_for): New function.
31925         (translate_isl_ast): New function.
31926         (add_parameters_to_ivs_params): New function.
31927         (scop_to_isl_ast): New parameter ip.
31928         (graphite_regenerate_ast_isl): Add generation of GIMPLE code.
31930 2014-07-11  Jan Hubicka  <hubicka@ucw.cz>
31932         * config/xtensa/predicates.md (call expander): Update for
31933         DECL_SECTION_NAME being string.
31935 2014-07-11  Richard Biener  <rguenther@suse.de>
31937         PR middle-end/61473
31938         * builtins.c (fold_builtin_memory_op): Inline memory moves that
31939         can be implemented with a single load followed by a single store.
31940         (c_strlen): Only warn when only_value is not 2.
31942 2014-07-11  Evgeny Stupachenko  <evstupac@gmail.com>
31944         * config/i386/i386.c (expand_vec_perm_pblendv): Disable for AVX.
31946 2014-07-11  Marat Zakirov  <m.zakirov@samsung.com>
31948         PR target/61561
31949         * config/arm/arm.md (*movhi_insn_arch4): Handle stack pointer.
31950         (*movhi_bytes): Likewise.
31951         (*arm_movqi_insn): Likewise.
31953 2014-07-11  Uros Bizjak  <ubizjak@gmail.com>
31955         PR target/56858
31956         * config/alpha/alpha.c: Include tree-pass.h, context.h
31957         and pass_manager.h.
31958         (pass_data_handle_trap_shadows): New pass.
31959         (pass_handle_trap_shadows::gate): New pass gate function.
31960         (make_pass_handle_trap_shadows): New function.
31961         (rest_of_handle_trap_shadows): Ditto.
31963         (alpha_align_insns_1): Rename from alpha_align_insns.
31964         (pass_data_align_insns): New pass.
31965         (pass_align_insns::gate): New pass gate function.
31966         (make_pass_aling_insns): New function.
31967         (rest_of_align_insns): Ditto.
31968         (alpha_align_insns): Ditto.
31970         (alpha_option_override): Declare handle_trap_shadows info
31971         and align_insns_info.  Register handle_trap_shadows and align_insns
31972         passes here.
31973         (alpha_reorg): Do not call alpha_trap_shadows and
31974         alpha_align_insn from here.
31976         (alpha_pad_function_end): Do not skip BARRIERs.
31978 2014-07-10  Rong Xu  <xur@google.com>
31980         Add gcov-tool: an offline gcda profile processing tool support.
31981         * gcov-io.c (gcov_position): Make avaialble to gcov-tool.
31982         (gcov_is_error): Ditto.
31983         (gcov_read_string): Ditto.
31984         (gcov_read_sync): Ditto.
31985         * gcov-io.h: Move counter defines to gcov-counter.def.
31986         * gcov-dump.c (tag_counters): Use gcov-counter.def.
31987         * coverage.c: Ditto.
31988         * gcov-tool.c: Offline gcda profile processing tool.
31989         (unlink_gcda_file): Remove one gcda file.
31990         (unlink_profile_dir): Remove gcda files from the profile path.
31991         (gcov_output_files): Output gcda files to an output dir.
31992         (profile_merge): Merge two profiles in directory.
31993         (print_merge_usage_message): Print merge usage.
31994         (merge_usage): Print merge usage and exit.
31995         (do_merge): Driver for profile merge sub-command.
31996         (profile_rewrite): Rewrite profile.
31997         (print_rewrite_usage_message): Print rewrite usage.
31998         (rewrite_usage): Print rewrite usage and exit.
31999         (do_rewrite): Driver for profile rewrite sub-command.
32000         (print_usage): Print gcov-info usage and exit.
32001         (print_version): Print gcov-info version.
32002         (process_args): Process arguments.
32003         (main): Main routine for gcov-tool.
32004         * Makefile.in: Build and install gcov-tool.
32005         * gcov-counter.def: New file split from gcov-io.h.
32006         * doc/gcc.texi: Include gcov-tool.texi.
32007         * doc/gcov-tool.texi: Document for gcov-tool.
32009 2014-07-10  Richard Biener  <rguenther@suse.de>
32011         PR tree-optimization/61757
32012         * tree-ssa-dom.c (loop_depth_of_name): Restore.
32013         (propagate_rhs_into_lhs): Revert part of last change.
32015 2014-07-10  Thomas Schwinge  <thomas@codesourcery.com>
32017         * fold-const.c (fold_checksum_tree): Look at DECL_VINDEX only for
32018         FUNCTION_DECLs.
32020 2014-07-10  Eric Botcazou  <ebotcazou@adacore.com>
32022         PR middle-end/53590
32023         * function.c (allocate_struct_function): Revert r188667 change.
32025         * gimple-low.c (lower_builtin_setjmp): Use properly-typed constant.
32027 2014-07-10  Tom G. Christensen  <tgc@jupiterrise.com>
32029         * doc/install.texi: Remove links to defunct package providers for
32030         Solaris.
32032 2014-07-09  Tom de Vries  <tom@codesourcery.com>
32034         * final.c (get_call_fndecl): Declare.
32035         (self_recursive_call_p): New function.
32036         (collect_fn_hard_reg_usage): Handle self-recursive function calls.
32038 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32040         * ipa-devirt.c (record_node): Walk through aliases.
32042 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32044         * lto-streamer-out.c (hash_scc): Avoid quadratic hashing loop.
32046 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32048         Revert:
32049         * stor-layout.c (finish_builtin_struct): Copy fields into the variants.
32051 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32053         * ipa-visibility.c (function_and_variable_visibility): Remove
32054         temporary hack disabling local aliases on AIX.
32056 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32058         * ipa-cp.c (devirtualization_time_bonus): Walk through aliases.
32059         * ipa-inline-analysis.c (estimate_edge_devirt_benefit): Likewise.
32061 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32063         * rs6000/rs6000-protos.h (rs6000_xcoff_declare_object_name): Declare.
32064         * rs6000/rs6000.c: Inline output of .set instruction.
32065         (declare_alias_data): New struct.
32066         (rs6000_declare_alias): New function.
32067         (rs6000_xcoff_declare_function_name): Use it.
32068         (rs6000_xcoff_declare_object_name): New function.
32069         * config/rs6000/xcoff.h: Define ASM_DECLARE_OBJECT_NAME.
32070         (ASM_OUTPUT_DEF): Turn to empty definition.
32072 2014-07-08  Trevor Saunders  <tsaunders@mozilla.com>
32074         PR bootstrap/61679
32075         * hash-table.h: use hash_table::value_type instead of
32076         Descriptor::value_type in the return types of several methods.
32078 2014-07-08  Trevor Saunders  <tsaunders@mozilla.com>
32080         * tree-pass.h (pass_data): Remove has_execute member.
32081         * passes.c (execute_one_pass): Don't check pass->has_execute.
32082         * asan.c, auto-inc-dec.c, bb-reorder.c, bt-load.c, cfgcleanup.c,
32083         cfgexpand.c, cfgrtl.c, cgraphbuild.c, combine-stack-adj.c, combine.c,
32084         compare-elim.c, config/arc/arc.c, config/epiphany/mode-switch-use.c,
32085         config/epiphany/resolve-sw-modes.c, config/i386/i386.c,
32086         config/mips/mips.c, config/rl78/rl78.c, config/s390/s390.c,
32087         config/sh/sh_optimize_sett_clrt.cc, config/sh/sh_treg_combine.cc,
32088         config/sparc/sparc.c, cprop.c, cse.c, dce.c, df-core.c, dse.c,
32089         dwarf2cfi.c, except.c, final.c, function.c, fwprop.c, gcse.c,
32090         gimple-low.c, gimple-ssa-isolate-paths.c,
32091         gimple-ssa-strength-reduction.c, graphite.c, ifcvt.c, init-regs.c,
32092         ipa-comdats.c, ipa-cp.c, ipa-devirt.c, ipa-inline-analysis.c,
32093         ipa-inline.c, ipa-profile.c, ipa-pure-const.c, ipa-reference.c,
32094         ipa-split.c, ipa-visibility.c, ipa.c, ira.c, jump.c, loop-init.c,
32095         lower-subreg.c, mode-switching.c, modulo-sched.c, omp-low.c, passes.c,
32096         postreload-gcse.c, postreload.c, predict.c, recog.c, ree.c,
32097         reg-stack.c, regcprop.c, reginfo.c, regrename.c, reorg.c, sched-rgn.c,
32098         stack-ptr-mod.c, store-motion.c, tracer.c, trans-mem.c,
32099         tree-call-cdce.c, tree-cfg.c, tree-cfgcleanup.c, tree-complex.c,
32100         tree-eh.c, tree-emutls.c, tree-if-conv.c, tree-into-ssa.c,
32101         tree-loop-distribution.c, tree-nrv.c, tree-object-size.c,
32102         tree-parloops.c, tree-pass.h, tree-predcom.c, tree-profile.c,
32103         tree-sra.c, tree-ssa-ccp.c, tree-ssa-copy.c, tree-ssa-copyrename.c,
32104         tree-ssa-dce.c, tree-ssa-dom.c, tree-ssa-dse.c, tree-ssa-forwprop.c,
32105         tree-ssa-ifcombine.c, tree-ssa-loop-ch.c, tree-ssa-loop-im.c,
32106         tree-ssa-loop-ivcanon.c, tree-ssa-loop-prefetch.c,
32107         tree-ssa-loop-unswitch.c, tree-ssa-loop.c, tree-ssa-math-opts.c,
32108         tree-ssa-phiopt.c, tree-ssa-phiprop.c, tree-ssa-pre.c,
32109         tree-ssa-reassoc.c, tree-ssa-sink.c, tree-ssa-strlen.c,
32110         tree-ssa-structalias.c, tree-ssa-uncprop.c, tree-ssa-uninit.c,
32111         tree-ssa.c, tree-ssanames.c, tree-stdarg.c, tree-switch-conversion.c,
32112         tree-tailcall.c, tree-vect-generic.c, tree-vectorizer.c, tree-vrp.c,
32113         tree.c, tsan.c, ubsan.c, var-tracking.c, vtable-verify.c,
32114         web.c: Remove initializer for pass_data::has_execute.
32116 2014-07-08  Trevor Saunders  <tsaunders@mozilla.com>
32118         * graphite-htab.h: Use hash_map instead of hash_table.
32119         * graphite-clast-to-gimple.c: Adjust.
32120         * passes.c: Use hash_map instead of hash_table.
32121         * sese.c: Likewise.
32122         * sese.h: Remove now unused code.
32124 2014-07-08  Sriraman Tallam  <tmsriram@google.com>
32126         PR target/61599
32127         * config/i386/i386.c (ix86_in_large_data_p): Check for size less
32128         than zero.
32130 2014-07-08  Jakub Jelinek  <jakub@redhat.com>
32132         PR rtl-optimization/61673
32133         * combine.c (simplify_comparison): Test just mode's sign bit
32134         in tmode rather than the sign bit and any bits above it.
32136 2014-07-08  Roman Gareev  <gareevroman@gmail.com>
32138         * graphite-isl-ast-to-gimple.c (generate_isl_context):
32139         Add __isl_give to the declaration.
32140         (generate_isl_schedule): Likewise.
32141         (scop_to_isl_ast): Likewise.
32143 2014-07-08  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
32145         * config/arm/arm.c (cortexa5_extra_costs): New table.
32146         (arm_cortex_a5_tune): Use cortexa5_extra_costs.
32148 2014-07-08  Jakub Jelinek  <jakub@redhat.com>
32150         PR tree-optimization/61725
32151         * tree-vrp.c (extract_range_basic): Don't assume vr0 is unsigned
32152         range, use range_includes_zerop_p instead of integer_zerop on
32153         vr0->min, only use log2 of max if min is not negative.
32155 2014-07-08  Richard Biener  <rguenther@suse.de>
32157         * tree-ssa-dom.h (loop_depth_of_name): Remove.
32158         * tree-ssa-dom.c (record_equivalences_from_phis): Remove
32159         restriction on loop depth difference.
32160         (record_equality): Likewise.
32161         (propagate_rhs_into_lhs): Likewise.  Simplify condition.
32162         (loop_depth_of_name): Remove.
32163         * tree-ssa-copy.c (copy_prop_visit_phi_node): Remove
32164         restriction on loop depth difference.
32165         (init_copy_prop): Likewise.
32167 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32169         * tree-ssa-alias.c (walk_aliased_vdefs_1): Add FUNCTION_ENTRY_REACHED
32170         parameter.
32171         (walk_aliased_vdefs): Likewise.
32172         * tree-ssa-alias.h (walk_aliased_vdefs): Likewise.
32173         * ipa-prop.c (stmt_may_be_vtbl_ptr_store): Skip clobbers
32174         (detect_type_change_from_memory_writes): Check if entry was reached.
32176 2014-07-08  Richard Biener  <rguenther@suse.de>
32178         PR tree-optimization/61681
32179         * tree-ssa-structalias.c (find_what_var_points_to): Expand
32180         NONLOCAL inside ESCAPED.
32182 2014-07-08  Richard Biener  <rguenther@suse.de>
32184         PR tree-optimization/61680
32185         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence):
32186         Handle properly all read-write dependences with group accesses.
32188 2014-07-08  Yuri Rumyantsev  <ysrumyan@gmail.com>
32190         PR tree-optimization/61576
32191         * tree-if-conv.c (is_cond_scalar_reduction): Add check that basic
32192         block containing reduction statement is predecessor of phi basi block.
32194 2014-07-08  Marek Polacek  <polacek@redhat.com>
32196         PR c/60226
32197         * fold-const.c (round_up_loc): Change the parameter type.
32198         Remove assert.
32199         * fold-const.h (round_up_loc): Adjust declaration.
32200         * stor-layout.c (finalize_record_size): Check for too large types.
32202 2014-07-07  Jan Hubicka  <hubicka@ucw.cz>
32204         * symtab.c: Include calls.h.
32205         (symtab_nonoverwritable_alias_1): Check sanity of the local alias.
32207 2014-07-07  Maciej W. Rozycki  <macro@codesourcery.com>
32209         * config/rs6000/rs6000.c (output_vec_const_move): Handle
32210         little-endian code generation.
32211         * config/rs6000/spe.md (spe_evmergehi): Rename to...
32212         (vec_perm00_v2si): ... this.  Handle little-endian code generation.
32213         (spe_evmergehilo): Rename to...
32214         (vec_perm01_v2si): ... this.  Handle little-endian code generation.
32215         (spe_evmergelo): Rename to...
32216         (vec_perm11_v2si): ... this.  Handle little-endian code generation.
32217         (spe_evmergelohi): Rename to...
32218         (vec_perm10_v2si): ... this.  Handle little-endian code generation.
32219         (spe_evmergehi, spe_evmergehilo): New expanders.
32220         (spe_evmergelo, spe_evmergelohi): Likewise.
32221         (*frob_<SPE64:mode>_<DITI:mode>): Handle little-endian code generation.
32222         (*frob_tf_ti): Likewise.
32223         (*frob_<mode>_di_2): Likewise.
32224         (*frob_tf_di_8_2): Likewise.
32225         (*frob_di_<mode>): Likewise.
32226         (*frob_ti_tf): Likewise.
32227         (*frob_<DITI:mode>_<SPE64:mode>_2): Likewise.
32228         (*frob_ti_<mode>_8_2): Likewise.
32229         (*frob_ti_tf_2): Likewise.
32230         (mov_si<mode>_e500_subreg0): Rename to...
32231         (mov_si<mode>_e500_subreg0_be): ... this.  Restrict to the big
32232         endianness only.
32233         (*mov_si<mode>_e500_subreg0_le): New instruction pattern.
32234         (*mov_si<mode>_e500_subreg0_elf_low): Rename to...
32235         (*mov_si<mode>_e500_subreg0_elf_low_be): ... this.  Restrict to
32236         the big endianness only.
32237         (*mov_si<mode>_e500_subreg0_elf_low_le): New instruction pattern.
32238         (*mov_si<mode>_e500_subreg0_2): Rename to...
32239         (*mov_si<mode>_e500_subreg0_2_be): ... this.  Restrict to the
32240         big big endianness only.
32241         (*mov_si<mode>_e500_subreg0_2_le): New instruction pattern.
32242         (*mov_si<mode>_e500_subreg4): Rename to...
32243         (*mov_si<mode>_e500_subreg4_be): ... this.  Restrict to the big
32244         endianness only.
32245         (mov_si<mode>_e500_subreg4_le): New instruction pattern.
32246         (*mov_si<mode>_e500_subreg4_elf_low): Rename to...
32247         (*mov_si<mode>_e500_subreg4_elf_low_be): ... this.  Restrict to
32248         the big endianness only.
32249         (*mov_si<mode>_e500_subreg4_elf_low_le): New instruction/splitter
32250         pattern.
32251         (*mov_si<mode>_e500_subreg4_2): Rename to...
32252         (*mov_si<mode>_e500_subreg4_2_be): ... this.  Restrict to the big
32253         endianness only.
32254         (*mov_si<mode>_e500_subreg4_2_le): New instruction pattern.
32255         (*mov_sitf_e500_subreg8): Rename to...
32256         (*mov_sitf_e500_subreg8_be): ... this.  Restrict to the big
32257         endianness only.
32258         (*mov_sitf_e500_subreg8_le): New instruction pattern.
32259         (*mov_sitf_e500_subreg8_2): Rename to...
32260         (*mov_sitf_e500_subreg8_2_be): ... this.  Restrict to the big
32261         endianness only.
32262         (*mov_sitf_e500_subreg8_2_le): New instruction pattern.
32263         (*mov_sitf_e500_subreg12): Rename to...
32264         (*mov_sitf_e500_subreg12_be): ... this.  Restrict to the big
32265         endianness only.
32266         (*mov_sitf_e500_subreg12_le): New instruction pattern.
32267         (*mov_sitf_e500_subreg12_2): Rename to...
32268         (*mov_sitf_e500_subreg12_2_be): ... this.  Restrict to the big
32269         endianness only.
32270         (*mov_sitf_e500_subreg12_2_le): New instruction pattern.
32272 2014-07-07  Max Ostapenko  <m.ostapenko@partner.samsung.com>
32274         * asan.c (instrument_strlen_call): Do not instrument first byte
32275         in strlen if already instrumented.
32277 2014-07-07  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
32279         * config/arm/arm.opt (mwords-little-endian): Delete.
32280         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Remove handling
32281         of TARGET_LITTLE_WORDS.
32282         (WORDS_BIG_ENDIAN): Define to BYTES_BIG_ENDIAN.
32283         * config/arm/arm.c (arm_option_override): Remove TARGET_LITTLE_WORDS
32284         warning.
32285         * doc/invoke.texi: Remove references to -mwords-little-endian.
32287 2014-07-07  Jakub Jelinek  <jakub@redhat.com>
32289         * expmed.c (struct init_expmed_rtl): Change all fields but
32290         pow2 and cint from struct rtx_def to rtx.
32291         (init_expmed_one_conv, init_expmed_one_mode): Adjust for that change.
32292         (init_expmed): Likewise.  Allocate all the 18 rtxes and ggc_free them
32293         at the end again.
32295 2014-07-06  Marek Polacek  <polacek@redhat.com>
32297         PR c/6940
32298         * doc/invoke.texi: Document -Wsizeof-array-argument.
32300 2014-07-05  Gerald Pfeifer  <gerald@pfeifer.com>
32302         * wide-int.h (wide_int_storage): Change declaration from struct
32303         to class.
32305 2014-07-05  Jan Hubicka  <hubicka@ucw.cz>
32307         * cgraph.c (cgraph_create_indirect_edge): Update call of
32308         get_polymorphic_call_info.
32309         * ipa-utils.h (get_polymorphic_call_info): Add parameter CALL.
32310         (possible_polymorphic_call_targets): Add parameter call.
32311         (decl_maybe_in_construction_p): New predicate.
32312         (get_polymorphic_call_info): Add parameter call;
32313         use decl_maybe_in_construction_p.
32314         * gimple-fold.c (fold_gimple_assign): Update use of
32315         possible_polymorphic_call_targets.
32316         (gimple_fold_call): Likewise.
32317         * ipa-prop.c: Inlcude calls.h
32318         (ipa_binfo_from_known_type_jfunc): Check that known type is record.
32319         (param_type_may_change_p): New predicate.
32320         (detect_type_change_from_memory_writes): Break out from ...
32321         (detect_type_change): ... this one; use param_type_may_change_p.
32322         (detect_type_change_ssa): Use param_type_may_change_p.
32323         (compute_known_type_jump_func): Use decl_maybe_in_construction_p.
32325 2014-07-05  Charles Baylis  <charles.baylis@linaro.org>
32327         PR target/49423
32328         * config/arm/arm-protos.h (arm_legitimate_address_p,
32329         arm_is_constant_pool_ref): Add prototypes.
32330         * config/arm/arm.c (arm_legitimate_address_p): Remove static.
32331         (arm_is_constant_pool_ref) New function.
32332         * config/arm/arm.md (unaligned_loadhis, arm_zero_extendhisi2_v6,
32333         arm_zero_extendqisi2_v6): Use Uh constraint for memory operand.
32334         (arm_extendhisi2, arm_extendhisi2_v6): Use Uh constraint for memory
32335         operand. Remove pool_range and neg_pool_range attributes.
32336         (arm_extendqihi_insn, arm_extendqisi, arm_extendqisi_v6): Remove
32337         pool_range and neg_pool_range attributes.
32338         * config/arm/constraints.md (Uh): New constraint.
32339         (Uq): Don't allow constant pool references.
32341 2014-07-04  James Greenhalgh  <james.greenhalgh@arm.com>
32343         * config/aarch64/aarch64-simd.md (move_lo_quad_internal_<mode>): New.
32344         (move_lo_quad_internal_be_<mode>): Likewise.
32345         (move_lo_quad_<mode>): Convert to define_expand.
32346         (aarch64_simd_move_hi_quad_<mode>): Gate on BYTES_BIG_ENDIAN.
32347         (aarch64_simd_move_hi_quad_be_<mode>): New.
32348         (move_hi_quad_<mode>): Use appropriate insn for BYTES_BIG_ENDIAN.
32349         (aarch64_combinez<mode>): Gate on BYTES_BIG_ENDIAN.
32350         (aarch64_combinez_be<mode>): New.
32351         (aarch64_combine<mode>): Convert to define_expand.
32352         (aarch64_combine_internal<mode>): New.
32353         (aarch64_simd_combine<mode>): Remove bogus RTL description.
32355 2014-07-04  Tom de Vries  <tom@codesourcery.com>
32357         * doc/md.texi (@subsection Constraint Modifier Characters): Clarify
32358         combination of earlyclobber and read/write modifiers.
32360 2014-07-04  Tom de Vries  <tom@codesourcery.com>
32362         * config/aarch64/aarch64-simd.md
32363         (define_insn "vec_unpack_trunc_<mode>"): Fix constraint.
32365 2014-07-04  Richard Earnshaw  <rearnsha@arm.com>
32367         PR target/61714
32368         * config/aarch64/aarch64.h (OPTION_DEFAULT_SPECS): Define.
32370 2014-07-04  Jakub Jelinek  <jakub@redhat.com>
32372         PR middle-end/61654
32373         * cgraphunit.c (expand_thunk): Call free_dominance_info.
32375         PR tree-optimization/61684
32376         * tree-ssa-ifcombine.c (recognize_single_bit_test): Make sure
32377         rhs1 of conversion is a SSA_NAME before using SSA_NAME_DEF_STMT on it.
32379 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32380             Kito Cheng  <kito@0xlab.org>
32381             Monk Chiang  <sh.chiang04@gmail.com>
32383         * config/nds32/nds32.c (nds32_have_prologue_p): Move to ...
32384         (nds32_symbol_load_store_p): Move to ...
32385         (nds32_fp_as_gp_check_available): Move to ...
32386         * config/nds32/nds32-fp-as-gp.c: ... here.
32387         * config/nds32/nds32-protos.h (nds32_symbol_load_store_p): Remove
32388         extern declaration.
32390 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32391             Kito Cheng  <kito@0xlab.org>
32392             Monk Chiang  <sh.chiang04@gmail.com>
32394         * config/nds32/nds32.c (nds32_expand_load_multiple): Move to ...
32395         (nds32_expand_store_multiple): Move to ...
32396         (nds32_expand_movmemqi): Move to ...
32397         * config/nds32/nds32-memory-manipulation.c: ... here.
32399 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32400             Kito Cheng  <kito@0xlab.org>
32401             Monk Chiang  <sh.chiang04@gmail.com>
32403         * config/nds32/nds32.c (nds32_byte_to_size): Move to ...
32404         (nds32_output_casesi_pc_relative): Move to ...
32405         (nds32_output_casesi): Move to ...
32406         (nds32_mem_format): Move to ...
32407         (nds32_output_16bit_store): Move to ...
32408         (nds32_output_16bit_load): Move to ...
32409         (nds32_output_32bit_store): Move to ...
32410         (nds32_output_32bit_load): Move to ...
32411         (nds32_output_32bit_load_s): Move to ...
32412         (nds32_output_stack_push): Move to ...
32413         (nds32_output_stack_pop): Move to ...
32414         * config/nds32/nds32-md-auxiliary.c: ... here.
32416 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32417             Ling-Hua Tseng  <uranus@tinlans.org>
32419         * config/nds32/nds32-pipelines-auxiliary.c: Add comment to describe
32420         the purpose of this file.
32422 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32423             Kito Cheng  <kito@0xlab.org>
32424             Monk Chiang  <sh.chiang04@gmail.com>
32426         * config/nds32/nds32.c (nds32_rtx_costs): Move implementation to ...
32427         (nds32_address_cost): Move implementation to ...
32428         * config/nds32/nds32-cost.c: ... here.
32429         * config/nds32/nds32-protos.h (nds32_rtx_costs_impl): Declare.
32430         (nds32_address_cost_impl): Declare.
32432 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32433             Kito Cheng  <kito@0xlab.org>
32434             Monk Chiang  <sh.chiang04@gmail.com>
32436         * config/nds32/nds32.c
32437         (nds32_consecutive_registers_load_store_p): Move to ...
32438         (nds32_valid_multiple_load_store): Move to ...
32439         (nds32_valid_stack_push_pop): Move to ...
32440         (nds32_can_use_bclr_p): Move to ...
32441         (nds32_can_use_bset_p): Move to ...
32442         (nds32_can_use_btgl_p): Move to ...
32443         (nds32_can_use_bitci_p): Move to ...
32444         * config/nds32/nds32-predicates.c: ... here.
32446 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32447             Kito Cheng  <kito@0xlab.org>
32448             Monk Chiang  <sh.chiang04@gmail.com>
32450         * config/nds32/nds32.c
32451         (nds32_expand_builtin_null_ftype_reg): Move to ...
32452         (nds32_expand_builtin_reg_ftype_imm): Move to ...
32453         (nds32_expand_builtin_null_ftype_reg_imm): Move to ...
32454         (nds32_init_builtins): Move implementation to ...
32455         (nds32_expand_builtin): Move implementation to ...
32456         * config/nds32/nds32-intrinsic.c: ... here.
32457         * config/nds32/nds32-protos.h (nds32_init_builtins_impl): Declare.
32458         (nds32_expand_builtin_impl): Declare.
32460 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32461             Kito Cheng  <kito@0xlab.org>
32462             Monk Chiang  <sh.chiang04@gmail.com>
32464         * config/nds32/nds32.c (nds32_emit_section_head_template): Move to ...
32465         (nds32_emit_section_tail_template): Move to ...
32466         (nds32_emit_isr_jmptbl_section): Move to ...
32467         (nds32_emit_isr_vector_section): Move to ...
32468         (nds32_emit_isr_reset_conten): Move to ...
32469         (nds32_check_isr_attrs_conflict): Move to ...
32470         (nds32_construct_isr_vectors_information): Move to ...
32471         (nds32_asm_file_start): Move implementation to ...
32472         (nds32_asm_file_end): Move implementation to ...
32473         * config/nds32/nds32-isr.c: ... here.
32474         * config/nds32/nds32-protos.h
32475         (nds32_check_isr_attrs_conflict): Declare.
32476         (nds32_construct_isr_vectors_information): Declare.
32477         (nds32_asm_file_start_for_isr): Declare.
32478         (nds32_asm_file_end_for_isr): Declare.
32480 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32481             Kito Cheng  <kito@0xlab.org>
32482             Monk Chiang  <sh.chiang04@gmail.com>
32484         * config.gcc (nds32*): Add new modules to extra_objs.
32485         (nds32le-*-*): Use t-nds32 makefile fragment for new modules.
32486         (nds32be-*-*): Likewise.
32487         * config/nds32/nds32-cost.c: New file.
32488         * config/nds32/nds32-fp-as-gp.c: New file.
32489         * config/nds32/nds32-intrinsic.c: New file.
32490         * config/nds32/nds32-isr.c: New file.
32491         * config/nds32/nds32-md-auxiliary.c: New file.
32492         * config/nds32/nds32-memory-manipulation.c: New file.
32493         * config/nds32/nds32-pipelines-auxiliary.c: New file.
32494         * config/nds32/nds32-predicates.c: New file.
32495         * config/nds32/t-nds32: New file.
32497 2014-07-03  Jakub Jelinek  <jakub@redhat.com>
32499         PR tree-optimization/61682
32500         * wide-int.cc (wi::mul_internal): Handle high correctly for umul_ppmm
32501         using cases and when one of the operands is equal to 1.
32503 2014-07-03  Segher Boessenkool  <segher@kernel.crashing.org>
32505         * config/rs6000/rs6000.md (rotl<mode>3, ashl<mode>3, lshr<mode>3,
32506         ashr<mode>3): Correct mode of operands[2].
32507         (rotl<mode>3_dot, rotl<mode>3_dot2, ashl<mode>3_dot, ashl<mode>3_dot2,
32508         lshr<mode>3_dot, lshr<mode>3_dot2, ashr<mode>3_dot, ashr<mode>3_dot2):
32509         Correct mode of operands[2].  Fix split condition.
32511 2014-07-03  Richard Earnshaw  <rearnsha@arm.com>
32513         * arm.md (arch): Add armv6_or_vfpv3.
32514         (arch_enabled): Add test for the above.
32515         * vfp.md (divsf_vfp, divdf_vfp): Add earlyclobber when code can run
32516         on VFP9.
32517         (sqrtsf_vfp, sqrtdf_vfp): Likewise.
32519 2014-07-03  Jakub Jelinek  <jakub@redhat.com>
32521         * gcov-io.c (gcov_read_words): Don't call memmove if excess is 0.
32522         * data-streamer-in.c (streamer_read_hwi): Shift UHWI 1 instead of
32523         HWI 1 and negate the unsigned value.
32524         * expmed.c (expand_sdiv_pow2): For modes wider than word always
32525         use AND instead of shift.
32526         * wide-int-print.cc (print_decs): Negate UHWI instead of HWI.
32528 2014-07-03  Marek Polacek  <polacek@redhat.com>
32530         * doc/invoke.texi (-fsanitize=bounds): Tweak wording.
32531         (-fsanitize=float-divide-by-zero): Move to the table with
32532         -fsanitize=undefined suboptions.
32533         (-fsanitize=float-cast-overflow): Likewise.
32535 2014-07-03  Maciej W. Rozycki  <macro@codesourcery.com>
32537         * config/rs6000/rs6000.c (rs6000_adjust_atomic_subword): Use
32538         BYTES_BIG_ENDIAN rather than WORDS_BIG_ENDIAN to check for byte
32539         endianness.
32541 2014-07-03  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
32543         * loop-invariant.c (struct invariant): Add a new member: eqno;
32544         (find_identical_invariants): Update eqno;
32545         (create_new_invariant): Init eqno;
32546         (get_inv_cost): Compute comp_cost with eqno;
32548 2014-07-02  Segher Boessenkool  <segher@kernel.crashing.org>
32550         * genconfig.c (have_rotate_flag, have_rotatert_flag): New variables.
32551         (walk_insn_part) <ROTATE, ROTATERT>: New cases.
32552         (main): Conditionally write HAVE_rotate resp. HAVE_rotatert.
32553         * simplify-rtx.c (simplify_binary_operation_1) <ROTATE, ROTATERT>:
32554         Only do the transformation if both HAVE_rotate and HAVE_rotatert.
32556 2014-07-02  Christian Bruel  <christian.bruel@st.com>
32558         PR target/29349
32559         PR target/53513
32560         * mode-switching.c (struct bb_info): Add mode_out, mode_in caches.
32561         (make_preds_opaque): Delete.
32562         (clear_mode_bit, mode_bit_p, set_mode_bit): New macros.
32563         (commit_mode_sets): New function.
32564         (optimize_mode_switching): Handle current_mode to mode_switching_emit.
32565         Process all modes at once.
32566         * basic-block.h (pre_edge_lcm_avs): Declare.
32567         * lcm.c (pre_edge_lcm_avs): Renamed from pre_edge_lcm.
32568         Call clear_aux_for_edges. Fix comments.
32569         (pre_edge_lcm): New wrapper function to call pre_edge_lcm_avs.
32570         (pre_edge_rev_lcm): Idem.
32571         * config/epiphany/epiphany.c (emit_set_fp_mode): Add prev_mode
32572         parameter.
32573         * config/epiphany/epiphany-protos.h (emit_set_fp_mode): Idem.
32574         * config/epiphany/resolve-sw-modes.c (pass_resolve_sw_modes::execute):
32575         Idem.
32576         * config/i386/i386.c (x96_emit_mode_set): Idem.
32577         * config/sh/sh.c (sh_emit_mode_set): Likewise. Handle PR toggle.
32578         * config/sh/sh.md (toggle_pr):  Defined if TARGET_FPU_SINGLE.
32579         (fpscr_toggle) Disallow from delay slot.
32580         * target.def (emit_mode_set): Add prev_mode parameter.
32581         * doc/tm.texi: Regenerate.
32583 2014-07-02  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
32585         * config/aarch64/aarch64.c (aarch64_expand_vec_perm): Delete unused
32586         variable i.
32588 2014-07-01  Jan Hubicka  <hubicka@ucw.cz>
32590         * ipa-utils.h (method_class_type, vtable_pointer_value_to_binfo,
32591         vtable_pointer_value_to_vtable): Constify.
32592         (contains_polymorphic_type_p): Declare.
32593         * ipa-devirt.c (method_class_type, vtable_pointer_value_to_binfo,
32594         vtable_pointer_value_to_vtable): Constify.
32595         (contains_polymorphic_type_p): New predicate.
32596         * ipa-prop.c (ipa_set_jf_known_type): Allow types containing
32597         polymorphic types.
32598         (ipa_set_ancestor_jf): Likewise.
32599         (detect_type_change): Return false in easy cases.
32600         (compute_complex_assign_jump_func): Require type to contain
32601         polymorphic type.
32602         (compute_known_type_jump_func): Likewise.
32604 2014-07-01  Jan Hubicka  <hubicka@ucw.cz>
32606         * tree.c (decls_same_for_odr, decls_same_for_odr, types_same_for_odr):
32607         Remove.
32608         (type_in_anonymous_namespace_p): Constify argument.
32609         * tree.h (types_same_for_odr, type_in_anonymous_namespace_p): Constify.
32610         * ipa-devirt.c (odr_type_d): Add ODR_VIOLATED field.
32611         (main_odr_variant): New function.
32612         (hash_type_name): Make static; update assert; do not ICE on
32613         non-records.
32614         (types_same_for_odr): Bring here from tree.c; simplify and remove
32615         old structural comparing code that doesn't work for templates.
32616         (odr_hasher::equal): Update assert.
32617         (add_type_duplicate): Return true when bases should be computed;
32618         replace incomplete loader by complete; do not output duplicated
32619         warnings; do not ICE on non-records; set odr_violated flag.
32620         (get_odr_type): Be ready to replace incomplete type by complete
32621         one; work on ODR variants instead of main variants; reorder item
32622         in array so bases have still smaller indexes.
32623         (dump_type_inheritance_graph): Be ready for holdes in odr_types array.
32624         (possible_polymorphic_call_targets): Do not ICE when BINFO is NULL.
32626 2014-07-01  Cary Coutant  <ccoutant@google.com>
32628         * dwarf2out.c (remove_addr_table_entry): Remove unnecessary hash table
32629         lookup.
32630         (resolve_addr_in_expr): When replacing the rtx in a location list
32631         entry, get a new address table entry.
32632         (dwarf2out_finish): Call index_location_lists even if there are no
32633         addr_index_table entries yet.
32635 2014-07-01  Trevor Saunders  <tsaunders@mozilla.com>
32637         * config/i386/winnt.c (i386_pe_section_type_flags): Revert previous
32638         change for not being obvious.
32640 2014-07-01  Trevor Saunders  <tsaunders@mozilla.com>
32642         * config/i386/winnt.c (i386_pe_section_type_flags): Remove name of
32643         unused argument.
32645 2014-07-01  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
32647         * config/aarch64/arm_neon.h (vcage_f64): New intrinsic.
32648         (vcagt_f64): Likewise.
32649         (vcale_f64): Likewise.
32650         (vcaled_f64): Likewise.
32651         (vcales_f32): Likewise.
32652         (vcalt_f64): Likewise.
32653         (vcaltd_f64): Likewise.
32654         (vcalts_f32): Likewise.
32656 2014-07-01  Marek Polacek  <polacek@redhat.com>
32658         * doc/invoke.texi: Document -Wint-conversion.
32660 2014-07-01  Marek Polacek  <polacek@redhat.com>
32662         PR c/58286
32663         * doc/invoke.texi: Document -Wincompatible-pointer-types.
32665 2014-07-01  Martin Liska  <mliska@suse.cz>
32667         IPA REF alias refactoring
32668         * cgraph.h (iterate_direct_aliases): New function.
32669         (FOR_EACH_ALIAS): New macro iterates all direct aliases for a node.
32670         * cgraph.c (cgraph_for_node_thunks_and_aliases): Usage of
32671         FOR_EACH_ALIAS added.
32672         (cgraph_for_node_and_aliases): Likewise.
32673         * cgraphunit.c (assemble_thunks_and_aliases): Likewise.
32674         * ipa-inline.c (reset_edge_caches): Likewise.
32675         (update_caller_keys): Likewise.
32676         * trans-mem.c (ipa_tm_execute): Likewise.
32677         *varpool.c (varpool_analyze_node): Likewise.
32678         (varpool_for_node_and_aliases): Likewise.
32679         * ipa-ref.h (first_alias): New function.
32680         (last_alias): Likewise.
32681         (has_aliases_p): Likewise.
32682         * ipa-ref.c (ipa_ref::remove_reference): Removal function
32683         is sensitive to IPA_REF_ALIASes.
32684         * symtab.c (symtab_node::add_reference): Node of IPA_REF_ALIAS type
32685         are put at the beginning of the list.
32686         (symtab_node::iterate_direct_aliases): New function.
32688 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32690         Revert:
32691         * tree-streamer-out.c (pack_ts_type_common_value_fields): Stream if
32692         type is complete.
32693         (write_ts_type_common_tree_pointers): Do not stream fields not set
32694         for incomplete types; do not stream duplicated fields for variants;
32695         sanity check that variant and type match.
32696         (write_ts_type_non_common_tree_pointers): Likewise.
32697         * tree-streamer-in.c (unpack_ts_type_common_value_fields): Mark in
32698         TYPE_SIZE whether type is complete.
32699         (lto_input_ts_type_common_tree_pointers): Do same changes as in
32700         write_ts_type_common_tree_pointers
32701         (lto_input_ts_type_non_common_tree_pointers): Likewise.
32703 2014-06-30  Joseph Myers  <joseph@codesourcery.com>
32705         * var-tracking.c (add_stores): Return instead of asserting if old
32706         and new values for conditional store are the same.
32708 2014-06-30  Richard Henderson  <rth@redhat.com>
32710         PR rtl-opt/61608
32711         PR target/39284
32712         * bb-reorder.c (pass_duplicate_computed_gotos::execute): Cleanup
32713         the cfg if there were any changes.
32714         * passes.def: Revert move of peephole2 after reorder_blocks;
32715         move duplicate_computed_gotos before peephole2.
32717 2014-06-30  Uros Bizjak  <ubizjak@gmail.com>
32719         * except.c (emit_note_eh_region_end): New helper function.
32720         (convert_to_eh_region_ranges): Use emit_note_eh_region_end to
32721         emit EH_REGION_END note.
32722         * jump.c (cleanup_barriers): Do not split a call and its
32723         corresponding CALL_ARG_LOCATION note.
32725 2014-06-30  Jeff Law  <law@redhat.com>
32727         PR tree-optimization/61607
32728         * tree-ssa-threadedge.c (simplify_control_stmt_condition): Look
32729         deeper into the SSA_NAME_VALUE chain.
32731 2014-06-30  Marek Polacek  <polacek@redhat.com>
32733         * convert.c (convert_to_integer): Don't instrument conversions if the
32734         function has no_sanitize_undefined attribute.
32735         * ubsan.c: Don't run the ubsan pass if the function has
32736         no_sanitize_undefined attribute.
32738 2014-06-30  Jakub Jelinek  <jakub@redhat.com>
32740         * doc/invoke.texi (-fsanitize=bounds): Move to the table with
32741         -fsanitize=undefined suboptions.
32743 2014-06-30  Alan Lawrence  <alan.lawrence@arm.com>
32745         * config/aarch64/aarch64-simd.md (vec_perm): Enable for bigendian.
32746         * config/aarch64/aarch64.c (aarch64_expand_vec_perm): Remove assert
32747         against bigendian and adjust indices.
32749 2014-06-30  Gerald Pfeifer  <gerald@pfeifer.com>
32751         * doc/install.texi (Specific, aarch64*-*-*): Fix markup.  Reword a bit.
32753 2014-06-30  Marcus Shawcroft  <marcus.shawcroft@arm.com>
32755         PR target/61633
32756         * config/aarch64/aarch64.md (*aarch64_ashr_sisd_or_int_<mode>3):
32757         Add alternative; make early clobber.  Adjust both split patterns
32758         to use operand 0 as the working register.
32760 2014-06-30  Jakub Jelinek  <jakub@redhat.com>
32762         * ira-build.c (sort_conflict_id_map): Don't call qsort if num is 0,
32763         as ira_object_id_map might be NULL, or 1.
32765 2014-06-30  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
32767         * loop-invariant.c (get_inv_cost): Handle register class.
32768         (gain_for_invariant): Check the register pressure of the inv
32769         and its overlapped register class, other than all.
32771 2014-06-30  Gerald Pfeifer  <gerald@pfeifer.com>
32773         * doc/invoke.texi (Optimize Options): Fix descriptions of
32774         ipa-cp-loop-hint-bonus and ipa-cp-array-index-hint-bonus.
32776 2014-06-29  David Wohlferd <dw@LimeGreenSocks.com>
32778         * doc/extend.texi (Function Attributes): Update 'naked' attribute
32779         documentation.
32781 2014-06-29  Tobias Grosser <tobias@grosser.es>
32783         PR bootstrap/61650
32784         * graphite-isl-ast-to-gimple.c: Add missing guards.
32786 2014-06-29  Roman Gareev  <gareevroman@gmail.com>
32788         * Makefile.in: Add the compilation of graphite-isl-ast-to-gimple.o.
32789         * common.opt: Add new switch fgraphite-code-generator=[isl|cloog].
32790         * flag-types.h: Add new enum fgraphite_generator.
32791         * graphite-isl-ast-to-gimple.c: New.
32792         * graphite-isl-ast-to-gimple.h: New.
32793         * graphite.c (graphite_transform_loops): Add choice of Graphite
32794         code generator, which depends on flag_graphite_code_gen.
32796 2014-06-29  Roman Gareev  <gareevroman@gmail.com>
32798         * graphite-dependences.c (subtract_commutative_associative_deps):
32799         Add NULL checking of the following variables: must_raw_no_source,
32800         may_raw_no_source, must_war_no_source, may_war_no_source,
32801         must_waw_no_source, may_waw_no_source, must_raw, may_raw,
32802         must_war, may_war, must_waw, may_waw.
32804 2014-06-29  Roman Gareev  <gareevroman@gmail.com>
32806         * graphite-clast-to-gimple.c: gloog is renamed to
32807         graphite_regenerate_ast_cloog.  gloog_error is renamed to
32808         graphite_regenerate_error.
32809         * graphite-clast-to-gimple.h: The definition of the struct
32810         bb_pbb_def is moved to graphite-htab.h.
32811         Add inclusion of the hash-table.h.
32812         * graphite-htab.h: The declaration of the function gloog is moved
32813         to graphite-clast-to-gimple.h and renamed to
32814         graphite_regenerate_ast_cloog.
32815         * graphite.c (graphite_transform_loops): gloog is renamed
32816         to graphite_regenerate_ast_cloog.
32818 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32820         * tree-streamer-out.c (pack_ts_type_common_value_fields): Stream if
32821         type is complete.
32822         (write_ts_type_common_tree_pointers): Do not stream fields not set
32823         for incomplete types; do not stream duplicated fields for variants;
32824         sanity check that variant and type match.
32825         (write_ts_type_non_common_tree_pointers): Likewise.
32826         * tree-streamer-in.c (unpack_ts_type_common_value_fields): Mark in
32827         TYPE_SIZE whether type is complete.
32828         (lto_input_ts_type_common_tree_pointers): Do same changes as in
32829         write_ts_type_common_tree_pointers
32830         (lto_input_ts_type_non_common_tree_pointers): Likewise.
32832 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32834         * cgraph.c (dump_cgraph_node): Dump init&fini priorities.
32836 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32838         * tree-inline.c (remap_type_1): Do not duplicate fields
32839         that are shared in between type and its main variant.
32841 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32843         * ipa-prop.c (ipa_set_jf_known_type): Record always the main variant
32844         of the type.
32845         (ipa_set_ancestor_jf) Likewise.
32846         (check_stmt_for_type_change): Check that we work on main variant.
32847         (detect_type_change): Look into main variant.
32848         (compute_known_type_jump_func): Check that main variant has BINFO.
32850 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32852         * ipa-devirt.c (set_type_binfo): New function.
32853         (add_type_duplicate): Use it.
32854         (get_odr_type): Sanity check that binfos points to main variants.
32855         (get_class_context): Be sure the context's outer_type is main variant.
32856         (contains_type_p): Walk main variant.
32857         (get_polymorphic_call_info_for_decl): Set outer_type to be
32858         main variant.
32859         (get_polymorphic_call_info): Likewise.
32860         (possible_polymorphic_call_targets): Sanity check that we operate
32861         on main variant.
32863 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32865         * stor-layout.c (finish_builtin_struct): Copy fields into the variants.
32867 2014-06-28  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
32869         * config/rs6000/rs6000.c (rs6000_aggregate_candidate): Revert
32870         accidental change due to wide-int branch merge.
32872 2014-06-27  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
32874         * configure.ac (gcc_cv_as_compress_debug): Check for assembler
32875         compressed debug support.
32876         (gcc_cv_ld_compress_debug): Check for linker compressed debug support.
32877         * configure: Regenerate.
32878         * config.in: Regenerate.
32879         * common.opt (compressed_debug_sections): New enum.
32880         (gz, gz=): New options.
32881         * gcc.c (LINK_COMPRESS_DEBUG_SPEC, ASM_COMPRESS_DEBUG_SPEC): Define.
32882         (LINK_COMMAND_SPEC): Invoke LINK_COMPRESS_DEBUG_SPEC.
32883         (asm_options): Invoke ASM_COMPRESS_DEBUG_SPEC.
32884         * config/darwin.h (LINK_COMMAND_SPEC_A): Invoke
32885         LINK_COMPRESS_DEBUG_SPEC.
32886         * config/i386/djgpp.h (LINK_COMMAND_SPEC): Likewise.
32887         * opts.c (common_handle_option): Handle OPT_gz, OPT_gz_.
32888         * doc/invoke.texi (Option Summary, Debugging Options): Add -gz[=type].
32889         (Debugging Options): Document -gz[=type].
32891 2014-06-27  Martin Jambor  <mjambor@suse.cz>
32893         PR ipa/61160
32894         * cgraphclones.c (duplicate_thunk_for_node): Removed parameter
32895         args_to_skip, use those from node instead.  Copy args_to_skip and
32896         combined_args_to_skip from node to the new thunk.
32897         (redirect_edge_duplicating_thunks): Removed parameter args_to_skip.
32898         (cgraph_create_virtual_clone): Moved computation of
32899         combined_args_to_skip...
32900         (cgraph_clone_node): ...here, simplify it to bitmap_ior..
32902 2014-06-27  trevor Saunders  <tsaunders@mozilla.com>
32904         * config/i386/winnt.c (i386_pe_section_type_flags): Remove
32905         redundant diagnostic machinary.
32907 2014-06-27  Richard Biener  <rguenther@suse.de>
32909         * tree-ssa-math-opts.c (bswap_replace): Fix
32910         SLOW_UNALIGNED_ACCESS test to only apply to unaligned object.
32912 2014-06-27  Martin Liska  <mliska@suse.cz>
32914         * gimple.h (gimple_location_safe): New function introduced.
32915         * cgraphunit.c (walk_polymorphic_call_targets): Usage
32916         of gimple_location_safe replaces gimple_location.
32917         (gimple_fold_call): Likewise.
32918         * ipa-devirt.c (ipa_devirt): Likewise.
32919         * ipa-prop.c (ipa_make_edge_direct_to_target): Likewise.
32920         * ipa.c (walk_polymorphic_call_targets): Likewise.
32921         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children): Likewise.
32923 2014-06-27  Jakub Jelinek  <jakub@redhat.com>
32925         PR tree-optimization/57233
32926         PR tree-optimization/61299
32927         * tree-vect-generic.c (get_compute_type, count_type_subparts): New
32928         functions.
32929         (expand_vector_operations_1): Use them.  If {L,R}ROTATE_EXPR
32930         would be lowered to scalar shifts, check if corresponding
32931         shifts and vector BIT_IOR_EXPR are supported and don't lower
32932         or lower just to narrower vector type in that case.
32933         * expmed.c (expand_shift_1): Fix up handling of vector
32934         shifts and rotates.
32936 2014-06-26  Uros Bizjak  <ubizjak@gmail.com>
32938         PR target/61586
32939         * config/alpha/alpha.c (alpha_handle_trap_shadows): Handle BARRIER RTX.
32941 2014-06-26  Jan Hubicka  <hubicka@ucw.cz>
32943         * doc/invoke.texi (-fsemantic-interposition): Document.
32944         * common.opt (fsemantic-interposition): New flag.
32945         * varasm.c (decl_replaceable_p): Use it.
32947 2014-06-26  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
32949         PR target/61542
32950         * config/rs6000/vsx.md (vsx_extract_v4sf): Fix bug with element
32951         extraction other than index 3.
32953 2014-06-26  Teresa Johnson  <tejohnson@google.com>
32955         * doc/invoke.texi: Fix typo.
32956         * dumpfile.c: Add support for documented -fdump-* options
32957         optimized/missed/note/optall.
32959 2014-06-26  Martin Jambor  <mjambor@suse.cz>
32961         * params.def (PARAM_ALLOW_LOAD_DATA_RACES)
32962         (PARAM_ALLOW_PACKED_LOAD_DATA_RACES)
32963         (PARAM_ALLOW_PACKED_STORE_DATA_RACES): Removed.
32964         (PARAM_ALLOW_STORE_DATA_RACES): Set default to zero.
32965         * opts.c (default_options_optimization): Set
32966         PARAM_ALLOW_STORE_DATA_RACES to one at -Ofast.
32967         * doc/invoke.texi (allow-load-data-races)
32968         (allow-packed-load-data-races, allow-packed-store-data-races): Removed.
32969         (allow-store-data-races): Document the new default.
32971 2014-06-26  Martin Jambor  <mjambor@suse.cz>
32973         * ipa-prop.c (ipa_impossible_devirt_target): No longer static,
32974         renamed to ipa_impossible_devirt_target.  Fix typo.
32975         * ipa-prop.h (ipa_impossible_devirt_target): Declare.
32976         * ipa-cp.c (ipa_get_indirect_edge_target_1): Use
32977         ipa_impossible_devirt_target.
32979 2014-06-26  Richard Biener  <rguenther@suse.de>
32981         PR tree-optimization/61607
32982         * tree-ssa-copy.c (copy_prop_visit_phi_node): Adjust comment
32983         explaining why we restrict copies on loop depth.
32984         * tree-ssa-dom.c (cprop_operand): Remove restriction on
32985         on loop depth.
32986         (record_equivalences_from_phis): Instead add it here.
32988 2014-06-26  Bernd Schmidt  <bernds@codesourcery.com>
32990         * Makefile.in (COLLECT2_OBJS): Add collect-utils.o.
32991         (LTO_WRAPPER_OBJS): New variable.
32992         (lto-wrapper$(exeext)): Use it.
32993         * collect2.c: Include "collect-utils.h".
32994         (verbose, debug): Remove variables.
32995         (at_file_supplied): No longer static.
32996         (tool_name): New variable.
32997         (do_wait, fork_execute, maybe_unlink): Don't declare.
32998         (tool_cleanup): No longer static.
32999         (notice): Remove function.
33000         (maybe_run_lto_and_relink, main, do_dsymutil): Add new arg to
33001         fork_execute calls.
33002         (collect_wait, do_wait, collect_execute): Remove functions.
33003         (maybe_unlink): No longer static.
33004         * collect2.h (verbose, debug): Don't declare.
33005         (at_file_supplied): Declare.
33006         * collect-utils.c (utils_cleanup): New arg from_signal.  All callers
33007         changed.
33008         (collect_execute): Replace with implementation from collect2, plus a
33009         new arg use_atfile.  All callers changed.
33010         (collect_wait): Replace with implementation from collect2.
33011         (maybe_unlink_file): Remove function.
33012         (fork_execute): Replace with implementation from collect2, plus a
33013         new arg use_atfile.  All callers changed.
33014         (do_wait): Add call to utils_cleanup to the error path.
33015         * collect-utils.h (collect_execute, fork_execute, utils_cleanup)
33016         (tool_cleanup): Adjust declarations.
33017         * lto-wrapper.c (tool_cleanup): Add unused bool argument.
33018         * tlink.c: Include "collect-utils.h".
33019         (tlink_execute): New arg use_atfile.  All callers changed.
33020         (tlink_init, tlink_execute): Remove declarations.
33022         * collect-utils.c (save_temps): New variable.
33023         (do_wait): Use it instead of debug.  Use fatal_error.
33024         * collect-utils.h (save_temps): Declare.
33025         * collect2.c (verbose): Rename from vflag.  All uses changed.
33026         (tool_cleanup): New function, copied from collect_atexit.
33027         (collect_atexit, handler): Just call it.
33028         * collect2.h (verbose): Declaration renamed from vflag.
33029         * lto-wrapper.c (maybe_unlink, run_gcc): Use save_temps instead of
33030         debug.
33032         * Makefile.in (ALL_HOST_BACKEND_OBJS): Add collect-utils.o.
33033         (lto-wrapper$(exeext)): Link with collect-utils.o.
33034         * collect-utils.c: New file.
33035         * collect-utils.h: New file.
33036         * lto-wrapper.c: Include "collect-utils.h".
33037         (args_name): Delete variable.
33038         (tool_name): New variable.
33039         (tool_cleanup): New function.
33040         (maybe_unlink): Renamed from maybe_unlink_file.  All callers changed.
33041         (lto_wrapper_cleanup, fatal_signal, collect_execute, collect_wait)
33042         (fork_execute): Remove functions.
33044 2014-06-26  Nick Clifton  <nickc@redhat.com>
33046         * config/frv/frv.c (frv_in_small_data_p): Remove redundant assert.
33048         * doc/extend.texi (Function Attributes): Fix typo in description
33049         of RX vector attribute.
33051 2014-06-26  James Greenhalgh  <james.greenhalgh@arm.com>
33053         * config.gcc (supported_defaults): Error when passing either
33054         --with-tune or --with-arch in conjunction with --with-cpu for ARM.
33056 2014-06-26  Richard Biener  <rguenther@suse.de>
33058         * tree-ssa-dom.c (cprop_operand): Remove restriction on
33059         propagating volatile pointers.
33061 2014-06-26  Richard Biener  <rguenther@suse.de>
33063         PR tree-optimization/61607
33064         * tree-ssa-threadupdate.c (ssa_redirect_edges): Cancel the
33065         loop if we redirected its latch edge.
33066         (thread_block_1): Do not cancel loops prematurely.
33068 2014-06-25  Jan Hubicka  <hubicka@ucw.cz>
33070         * toplev.c (backend_init_target): Move init_emit_regs and
33071         init_regs to...
33072         (backend_init) ... here; skip ira_init_once and backend_init_target.
33073         (target_reinit) ... and here; clear
33074         this_target_rtl->lang_dependent_initialized.
33075         (lang_dependent_init_target): Clear
33076         this_target_rtl->lang_dependent_initialized;
33077         break out rtl initialization to ...
33078         (initialize_rtl): ... here; call also backend_init_target
33079         and ira_init_once.
33080         * toplev.h (initialize_rtl): New function.
33081         * function.c: Include toplev.h
33082         (init_function_start): Call initialize_rtl.
33083         * rtl.h (target_rtl): Add target_specific_initialized,
33084         lang_dependent_initialized.
33086 2014-06-25  Paul Gortmaker  <paul.gortmaker@windriver.com>
33087             Jakub Jelinek  <jakub@redhat.com>
33089         * gcc.c (set_multilib_dir): Malloc "." pointer as well.
33091 2014-06-25  Tom de Vries  <tom@codesourcery.com>
33093         * config/arm/arm.c (arm_emit_call_insn): Remove clobber of CC_REGNUM.
33095 2014-06-25  Bernd Edlinger  <bernd.edlinger@hotmail.de>
33097         * tree-ssa-forwprop.c (associate_plusminus): For widening conversions
33098         check for undefined overflow in (T)(P + A) - (T)P -> (T)A.
33099         Issue a strict overflow warning if appropriate.
33101 2014-06-25  Martin Liska  <mliska@suse.cz>
33103         IPA REF refactoring
33104         * Makefile.in: Removed header file (ipa-ref-inline.h).
33105         * cgraph.c (cgraph_turn_edge_to_speculative): New IPA REF function
33106         called.
33107         (cgraph_speculative_call_info): Likewise.
33108         (cgraph_for_node_thunks_and_aliases): Likewise.
33109         (cgraph_for_node_and_aliases): Likewise.
33110         (verify_cgraph_node): Likewise.
33111         * cgraph.h: Batch of IPA REF functions become member functions of
33112         symtab_node: add_reference, maybe_add_reference, clone_references,
33113         clone_referring, clone_reference, find_reference,
33114         remove_stmt_references, remove_all_references,
33115         remove_all_referring, dump_references, dump_referring,
33116         has_alias_p, iterate_reference, iterate_referring.
33117         * cgraphbuild.c (record_reference): New IPA REF function used.
33118         (record_type_list): Likewise.
33119         (record_eh_tables): Likewise.
33120         (mark_address): Likewise.
33121         (mark_load): Likewise.
33122         (mark_store): Likewise.
33123         (pass_build_cgraph_edges): Likewise.
33124         (rebuild_cgraph_edge): Likewise.
33125         (cgraph_rebuild_references): Likewise.
33126         (pass_remove_cgraph_callee_edges): Likewise.
33127         * cgraphclones.c (cgraph_clone_node): Likewise.
33128         (cgraph_create_virtual_clone): Likewise.
33129         (cgraph_materialize_clone): Likewise.
33130         (cgraph_materialize_all_clones): Likewise.
33131         * cgraphunit.c (cgraph_reset_node): Likewise.
33132         (cgraph_reset_node): Likewise.
33133         (analyze_function): Likewise.
33134         (assemble_thunks_and_aliases): Likewise.
33135         (expand_function): Likewise.
33136         * ipa-comdats.c (propagate_comdat_group): Likewise.
33137         (enqueue_references): Likewise.
33138         * ipa-cp.c (ipcp_discover_new_direct_edges): Likewise.
33139         (create_specialized_node): Likewise.
33140         * ipa-devirt.c (referenced_from_vtable_p): Likewise.
33141         * ipa-inline-transform.c (can_remove_node_now_p_1): Likewise.
33142         * ipa-inline.c (reset_edge_caches): Likewise.
33143         (update_caller_keys): Likewise.
33144         (execute): Likewise.
33145         * ipa-prop.c (remove_described_reference): Likewise.
33146         (propagate_controlled_uses): Likewise.
33147         (ipa_edge_duplication_hook): Likewise.
33148         (ipa_modify_call_arguments): Likewise.
33149         * ipa-pure-const.c (propagate_pure_const): Likewise.
33150         * ipa-ref-inline.h: Header file removed, functions moved
33151         to symtab_node class.
33152         * ipa-ref.c (remove_reference): New class member function.
33153         (cannot_lead_to_return): New class member function.
33154         (referring_ref_list): Likewise.
33155         (referred_ref_list): Likewise.
33156         Rest of functions moved to symtab_node class.
33157         * ipa-ref.h: New member functions remove_reference,
33158         cannot_lead_to_return, referring_ref_list, referred_ref_list added
33159         to ipa_ref class.
33160         ipa_ref_list class has new member functions: first_reference,
33161         first_referring, clear, nreferences.
33162         * ipa-reference.c (analyze_function): New IPA REF function used.
33163         (write_node_summary_p): Likewise.
33164         (ipa_reference_write_optimization_summary): Likewise.
33165         * ipa-split.c (split_function): Likewise.
33166         * ipa-utils.c (ipa_reverse_postorder): Likewise.
33167         * ipa-visibility.c (cgraph_non_local_node_p_1): Likewise.
33168         (function_and_variable_visibility): Likewise.
33169         * ipa.c (has_addr_references_p): Likewise.
33170         (process_references): Argument type changed.
33171         (symtab_remove_unreachable_nodes): New IPA REF function used.
33172         (process_references): Likewise.
33173         (set_writeonly_bit): Likewise.
33174         * lto-cgraph.c: Implementation of new symtab_node member functions
33175         that uses new IPA REF functions.
33176         * lto-streamer-in.c (fixup_call_stmt_edges_1): New IPA REF
33177         function used.
33178         * lto-streamer-out.c (output_symbol_p): Likewise.
33179         * lto-streamer.h (referenced_from_this_partition_p): Argument type
33180         changed.
33181         * symtab.c: Implementation of new IPA REF API.
33182         * trans-mem.c (ipa_tm_create_version_alias): New IPA REF function used.
33183         (ipa_tm_create_version): Likewise.
33184         (ipa_tm_execute): Likewise.
33185         * tree-emutls.c (gen_emutls_addr): Likewise.
33186         * tree-inline.c (copy_bb): Likewise.
33187         (delete_unreachable_blocks_update_callgraph): Likewise.
33188         * varpool.c (varpool_remove_unreferenced_decls): Likewise.
33189         (varpool_for_node_and_aliases): Likewise.
33191 2014-06-25  Trevor Saunders  <tsaunders@mozilla.com>
33193         * config/i386/winnt.c (i386_find_on_wrapper_list): Fix typo.
33195 2014-06-25  Trevor Saunders  <tsaunders@mozilla.com>
33197         PR bootstrap/61598
33198         * fold-const.c (fold_checksum_tree): Use a hash_table of const
33199         tree_node * instead of tree_node *.
33200         (fold): Adjust.
33201         (print_fold_checksum): Likewise.
33202         (fold_check_failed): Likewise.
33203         (debug_fold_checksum): Likewise.
33204         (fold_build1_stat_loc): Likewise.
33205         (fold_build2_stat_loc): Likewise.
33206         (fold_build3_stat_loc): Likewise.
33207         (fold_build_call_array_loc): Likewise.
33209 2014-06-25  David Edelsohn  <dje.gcc@gmail.com>
33211         * config/rs6000/xcoff.h (ASM_DECLARE_FUNCTION_NAME): Replace
33212         implementation with call to...
33213         * config/rs6000/rs6000.c (rs6000_xcoff_declare_function_name): New
33214         function.
33215         * config/rs6000/rs6000-protos.h (rs6000_xcoff_declare_function_name):
33216         Declare.
33218 2014-06-25  Marc Glisse  <marc.glisse@inria.fr>
33220         PR tree-optimization/57742
33221         * tree-ssa-strlen.c (handle_builtin_memset): Update strinfo
33222         after replacing the statement.
33224 2014-06-25  Nick Clifton  <nickc@redhat.com>
33226         * config/v850/v850.c (GHS_default_section_names): Change to const
33227         char * type.
33228         (GHS_current_section_names): Likewise.
33229         (v850_insert_attributes): Do not build strings, just assign the
33230         names directly.  Change the type of 'chosen_section' to const
33231         char*.
33232         * config/v850/v850-c.c (ghs_pragma_section): Assign the alias
33233         directly to the array entry.
33234         * config/v850/v850.h (GHS_default_section_names): Change to const
33235         char * type.
33236         (GHS_current_section_names): Likewise.
33238 2014-06-25  Jakub Jelinek  <jakub@redhat.com>
33240         * langhooks-def.h (LANG_HOOKS_OMP_CLAUSE_LINEAR_CTOR): Define.
33241         (LANG_HOOKS_DECLS): Add it.
33242         * gimplify.c (gimplify_omp_for): Make sure OMP_CLAUSE_LINEAR_STEP
33243         has correct type.
33244         * tree.h (OMP_CLAUSE_LINEAR_ARRAY): Define.
33245         * langhooks.h (struct lang_hooks_for_decls): Add
33246         omp_clause_linear_ctor hook.
33247         * omp-low.c (lower_rec_input_clauses): Set max_vf even if
33248         OMP_CLAUSE_LINEAR_ARRAY is set.  Don't fold_convert
33249         OMP_CLAUSE_LINEAR_STEP.  For OMP_CLAUSE_LINEAR_ARRAY in
33250         combined simd loop use omp_clause_linear_ctor hook.
33252 2014-06-24  Cong Hou  <congh@google.com>
33254         * tree-vect-patterns.c (vect_recog_sad_pattern): New function for SAD
33255         pattern recognition.
33256         (type_conversion_p): PROMOTION is true if it's a type promotion
33257         conversion, and false otherwise.  Return true if the given expression
33258         is a type conversion one.
33259         * tree-vectorizer.h: Adjust the number of patterns.
33260         * tree.def: Add SAD_EXPR.
33261         * optabs.def: Add sad_optab.
33262         * cfgexpand.c (expand_debug_expr): Add SAD_EXPR case.
33263         * expr.c (expand_expr_real_2): Likewise.
33264         * gimple-pretty-print.c (dump_ternary_rhs): Likewise.
33265         * gimple.c (get_gimple_rhs_num_ops): Likewise.
33266         * optabs.c (optab_for_tree_code): Likewise.
33267         * tree-cfg.c (estimate_operator_cost): Likewise.
33268         * tree-ssa-operands.c (get_expr_operands): Likewise.
33269         * tree-vect-loop.c (get_initial_def_for_reduction): Likewise.
33270         * config/i386/sse.md: Add SSE2 and AVX2 expand for SAD.
33271         * doc/generic.texi: Add document for SAD_EXPR.
33272         * doc/md.texi: Add document for ssad and usad.
33274 2014-06-24  Trevor Saunders  <tsaunders@mozilla.com>
33276         * config/i386/winnt.c (i386_pe_section_type_flags): Fix const
33277         qualification in cast.
33279 2014-06-24  Jan Hubicka  <hubicka@ucw.cz>
33281         * tree.c (find_decls_types_r): Do not check DECL_VINDEX for TYPE_DECL.
33282         * tree.h (DECL_VINDEX, DECL_SAVED_TREE): Restrict to DECL_FUNCTION.
33283         * tree-core.h (tree_decl_non_common): Move saved_tree and vindex...
33284         (tree_function_decl): ... here.
33285         * tree-streamer-out.c (write_ts_decl_non_common_tree_pointers): Move
33286         streaming of vindex to ...
33287         (write_ts_function_decl_tree_pointers): ... here.
33288         * tree-streamer-in.c (lto_input_ts_decl_non_common_tree_pointers):
33289         Do not stream DECL_VINDEX.
33290         (lto_input_ts_function_decl_tree_pointers): Stream it here.
33292 2014-06-24  Catherine Moore  <clm@codesourcery.com>
33293             Sandra Loosemore  <sandra@codesourcery.com>
33295         * config/mips/mips.c (mips_order_regs_for_local_alloc): Delete.
33296         * config/mips/mips.h (ADJUST_REG_ALLOC_ORDER): Delete.
33297         * config/mips/mips-protos.h (mips_order_regs_for_local_alloc): Delete.
33299 2014-06-24  Marc Glisse  <marc.glisse@inria.fr>
33301         * doc/invoke.texi (Warning Options): Remove duplicated
33302         -Wmaybe-uninitialized.
33304 2014-06-24  Marc Glisse  <marc.glisse@inria.fr>
33306         PR tree-optimization/57742
33307         * tree-ssa-strlen.c (get_string_length): Ignore malloc.
33308         (handle_builtin_malloc, handle_builtin_memset): New functions.
33309         (strlen_optimize_stmt): Call them.
33310         * passes.def: Move strlen after loop+dom but before vrp.
33312 2014-06-24  Jakub Jelinek  <jakub@redhat.com>
33314         PR target/61570
33315         * config/i386/driver-i386.c (host_detect_local_cpu): For unknown
33316         model family 6 CPU with has_longmode never use a CPU without
33317         64-bit support.
33319 2014-06-24  H.J. Lu  <hongjiu.lu@intel.com>
33321         PR target/61570
33322         * config/i386/driver-i386.c (host_detect_local_cpu): Revert
33323         the last change.
33325 2014-06-24  Trevor Saunders  <tsaunders@mozilla.com>
33327         * alloc-pool.c (alloc_pool_hash): Use hash_map instead of hash_table.
33328         * dominance.c (iterate_fix_dominators): Use hash_map instead of
33329         pointer_map.
33330         * hash-map.h: New file.
33331         * ipa-comdats.c: Use hash_map instead of pointer_map.
33332         * ipa.c: Likewise.
33333         * lto-section-out.c: Adjust.
33334         * lto-streamer.h: Replace pointer_map with hash_map.
33335         * symtab.c (verify_symtab): Likewise.
33336         * tree-ssa-strlen.c (decl_to_stridxlist_htab): Likewise.
33337         * tree-ssa-uncprop.c (val_ssa_equiv): Likewise.
33338         * tree-streamer.h: Likewise.
33339         * tree-streamer.c: Adjust.
33340         * pointer-set.h: Remove pointer_map.
33342 2014-06-24  Trevor Saunders  <tsaunders@mozilla.com>
33344         * hash-table.h: Add a template arg to choose between storing values
33345         and storing pointers to values, and then provide partial
33346         specializations for both.
33347         * tree-browser.c (tree_upper_hasher): Provide the type the hash table
33348         should store, not the type values should point to.
33349         * tree-into-ssa.c (var_info_hasher): Likewise.
33350         * tree-ssa-dom.c (expr_elt_hasher): Likewise.
33351         * tree-complex.c: Adjust.
33352         * tree-hasher.h (int_tree_hasher): store int_tree_map in the hash
33353         table instead of int_tree_map *.
33354         * tree-parloops.c: Adjust.
33355         * tree-ssa-reassoc.c (ocount_hasher): Don't lie to hash_map about what
33356         type is being stored.
33357         * tree-vectorizer.c: Adjust.
33359 2014-06-24  Trevor Saunders  <tsaunders@mozilla.com>
33361         * hash-table.h: Remove a layer of indirection from hash_table so that
33362         it contains the hash table's data instead of a pointer to the data.
33363         * alloc-pool.c, asan.c, attribs.c, bitmap.c, cfg.c,
33364         config/arm/arm.c, config/i386/winnt.c, config/ia64/ia64.c,
33365         config/mips/mips.c, config/sol2.c, coverage.c, cselib.c,
33366         data-streamer-out.c, dse.c, dwarf2cfi.c, dwarf2out.c, except.c,
33367         fold-const.c, gcse.c, ggc-common.c,
33368         gimple-ssa-strength-reduction.c, gimplify.c,
33369         graphite-clast-to-gimple.c, graphite-dependences.c,
33370         graphite-htab.h, graphite.c, haifa-sched.c, ipa-devirt.c,
33371         ipa-profile.c, ira-color.c, ira-costs.c, loop-invariant.c,
33372         loop-iv.c, loop-unroll.c, lto-streamer-in.c, lto-streamer-out.c,
33373         lto-streamer.c, lto-streamer.h, passes.c, plugin.c,
33374         postreload-gcse.c, sese.c, statistics.c, store-motion.c,
33375         trans-mem.c, tree-browser.c, tree-cfg.c, tree-complex.c,
33376         tree-eh.c, tree-into-ssa.c, tree-parloops.c, tree-sra.c,
33377         tree-ssa-ccp.c, tree-ssa-coalesce.c, tree-ssa-dom.c,
33378         tree-ssa-live.c, tree-ssa-loop-im.c,
33379         tree-ssa-loop-ivopts.c, tree-ssa-phiopt.c, tree-ssa-pre.c,
33380         tree-ssa-reassoc.c, tree-ssa-sccvn.c, tree-ssa-strlen.c,
33381         tree-ssa-structalias.c, tree-ssa-tail-merge.c,
33382         tree-ssa-threadupdate.c, tree-ssa-uncprop.c,
33383         tree-vect-data-refs.c, tree-vect-loop.c, tree-vectorizer.c,
33384         tree-vectorizer.h, valtrack.c, valtrack.h, var-tracking.c,
33385         vtable-verify.c, vtable-verify.h: Adjust.
33387 2014-06-24  Richard Biener  <rguenther@suse.de>
33389         PR tree-optimization/61572
33390         * tree-ssa-sink.c (statement_sink_location): Do not sink
33391         loads from hard registers.
33393 2014-06-24  Jakub Jelinek  <jakub@redhat.com>
33395         * gimplify.c (gimplify_omp_for): For #pragma omp for simd iterator
33396         not mentioned in clauses use private clause if the iterator is
33397         declared in #pragma omp for simd, and when adding lastprivate
33398         instead, add it to the outer #pragma omp for too.  Diagnose
33399         if the variable is private in outer context.  For simd collapse > 1
33400         loops, replace all iterators with temporaries.
33401         * omp-low.c (lower_rec_input_clauses): Handle LINEAR clause the
33402         same even in collapse > 1 loops.
33404         * gimplify.c (gimplify_scan_omp_clauses) <case OMP_CLAUSE_MAP,
33405         OMP_CLAUSE_TO, OMP_CLAUSE_FROM): Make sure OMP_CLAUSE_SIZE is
33406         non-NULL.
33407         <case OMP_CLAUSE_ALIGNED>: Gimplify OMP_CLAUSE_ALIGNED_ALIGNMENT.
33408         (gimplify_adjust_omp_clauses_1): Make sure OMP_CLAUSE_SIZE is
33409         non-NULL.
33410         (gimplify_adjust_omp_clauses): Likewise.
33411         * omp-low.c (lower_rec_simd_input_clauses,
33412         lower_rec_input_clauses, expand_omp_simd): Handle non-constant
33413         safelen the same as safelen(1).
33414         * tree-nested.c (convert_nonlocal_omp_clauses,
33415         convert_local_omp_clauses): Handle OMP_CLAUSE_ALIGNED.  For
33416         OMP_CLAUSE_{MAP,TO,FROM} if not decl use walk_tree.
33417         (convert_nonlocal_reference_stmt, convert_local_reference_stmt):
33418         Fixup handling of GIMPLE_OMP_TARGET.
33419         (convert_tramp_reference_stmt, convert_gimple_call): Handle
33420         GIMPLE_OMP_TARGET.
33422 2014-06-24  Chung-Lin Tang  <cltang@codesourcery.com>
33424         PR tree-optimization/61554
33425         * tree-ssa-propagate.c: Include "bitmap.h".
33426         (substitute_and_fold_dom_walker): Add 'bitmap need_eh_cleanup' member,
33427         properly update constructor/destructor.
33428         (substitute_and_fold_dom_walker::before_dom_children):
33429         Remove call to gimple_purge_dead_eh_edges, add bb->index to
33430         need_eh_cleaup instead.
33431         (substitute_and_fold): Call gimple_purge_all_dead_eh_edges on
33432         need_eh_cleanup.
33434 2014-06-23  Jan Hubicka  <hubicka@ucw.cz>
33436         * varpool.c (dump_varpool_node): Dump used_by_single_function.
33437         * tree-pass.h (make_pass_ipa_single_use): New pass.
33438         * cgraph.h (used_by_single_function): New flag.
33439         * lto-cgraph.c (lto_output_varpool_node, input_varpool_node):
33440         Stream it.
33441         * passes.def (pass_ipa_single_use): Scedule.
33442         * ipa.c (BOTTOM): New macro.
33443         (meet): New function
33444         (propagate_single_user): New function.
33445         (ipa_single_use): New function.
33446         (pass_data_ipa_single_use): New pass.
33447         (pass_ipa_single_use): New pass.
33448         (pass_ipa_single_use::gate): New gate.
33449         (make_pass_ipa_single_use): New function.
33451 2014-06-23  Kai Tietz  <ktietz@redhat.com>
33453         PR target/39284
33454         * passes.def (peephole2): Move peephole2 pass before sched2 pass.
33455         * config/i386/i386.md (peehole2): Combine memories and indirect jumps.
33457 2014-06-23  Richard Biener  <rguenther@suse.de>
33459         * tree-ssa-loop.c (gate_loop): New function.
33460         (pass_tree_loop::gate): Call it.
33461         (pass_data_tree_no_loop, pass_tree_no_loop,
33462         make_pass_tree_no_loop): New.
33463         * tree-vectorizer.c: Include tree-scalar-evolution.c
33464         (pass_slp_vectorize::execute): Initialize loops and SCEV if
33465         required.
33466         (pass_slp_vectorize::clone): New method.
33467         * timevar.def (TV_TREE_NOLOOP): New.
33468         * tree-pass.h (make_pass_tree_no_loop): Declare.
33469         * passes.def (pass_tree_no_loop): New pass group with
33470         SLP vectorizer.
33472 2014-06-23  H.J. Lu  <hongjiu.lu@intel.com>
33474         PR target/61570
33475         * config/i386/driver-i386.c (host_detect_local_cpu): Set arch
33476         to x86-64 if a 32-bit processor supports SSE2 and 64-bit.
33478 2014-06-23  James Greenhalgh  <james.greenhalgh@arm.com>
33480         * config/aarch64/aarch64.md (addsi3_aarch64): Set "simd" attr to
33481         "yes" where needed.
33483 2014-06-23  Alan Modra  <amodra@gmail.com>
33485         PR bootstrap/61583
33486         * tree-vrp.c (remove_range_assertions): Do not set is_unreachable
33487         to zero on debug statements.
33489 2014-06-23  Alan Lawrence  <alan.lawrence@arm.com>
33491         PR target/60825
33492         * config/aarch64/aarch64-builtins.c (aarch64_types_unop_qualifiers):
33493         Ignore third operand if present by marking qualifier_internal.
33495         * config/aarch64/aarch64-simd-builtins.def (abs): Comment.
33497         * config/aarch64/arm_neon.h (int64x1_t, uint64x1_t): Typedef to GCC
33498         vector extension.
33499         (aarch64_vget_lane_s64, aarch64_vdup_lane_s64,
33500         arch64_vdupq_lane_s64, aarch64_vdupq_lane_u64): Remove macro.
33501         (vqadd_s64, vqadd_u64, vqsub_s64, vqsub_u64, vqneg_s64, vqabs_s64,
33502         vcreate_s64, vcreate_u64, vreinterpret_s64_f64, vreinterpret_u64_f64,
33503         vcombine_u64, vbsl_s64, vbsl_u64, vceq_s64, vceq_u64, vceqz_s64,
33504         vceqz_u64, vcge_s64, vcge_u64, vcgez_s64, vcgt_s64, vcgt_u64,
33505         vcgtz_s64, vcle_s64, vcle_u64, vclez_s64, vclt_s64, vclt_u64,
33506         vcltz_s64, vdup_n_s64, vdup_n_u64, vld1_s64, vld1_u64, vmov_n_s64,
33507         vmov_n_u64, vqdmlals_lane_s32, vqdmlsls_lane_s32,
33508         vqdmulls_lane_s32, vqrshl_s64, vqrshl_u64, vqrshl_u64, vqshl_s64,
33509         vqshl_u64, vqshl_n_s64, vqshl_n_u64, vqshl_n_s64, vqshl_n_u64,
33510         vqshlu_n_s64, vrshl_s64, vrshl_u64, vrshr_n_s64, vrshr_n_u64,
33511         vrsra_n_s64, vrsra_n_u64, vshl_n_s64, vshl_n_u64, vshl_s64,
33512         vshl_u64, vshr_n_s64, vshr_n_u64, vsli_n_s64, vsli_n_u64,
33513         vsqadd_u64, vsra_n_s64, vsra_n_u64, vsri_n_s64, vsri_n_u64,
33514         vst1_s64, vst1_u64, vtst_s64, vtst_u64, vuqadd_s64): Wrap existing
33515         logic in GCC vector extensions
33517         (vpaddd_s64, vaddd_s64, vaddd_u64, vceqd_s64, vceqd_u64, vceqzd_s64
33518         vceqzd_u64, vcged_s64, vcged_u64, vcgezd_s64, vcgtd_s64, vcgtd_u64,
33519         vcgtzd_s64, vcled_s64, vcled_u64, vclezd_s64, vcltd_s64, vcltd_u64,
33520         vcltzd_s64, vqdmlals_s32, vqdmlsls_s32, vqmovnd_s64, vqmovnd_u64
33521         vqmovund_s64, vqrshld_s64, vqrshld_u64, vqrshrnd_n_s64,
33522         vqrshrnd_n_u64, vqrshrund_n_s64, vqshld_s64, vqshld_u64,
33523         vqshld_n_u64, vqshrnd_n_s64, vqshrnd_n_u64, vqshrund_n_s64,
33524         vrshld_u64, vrshrd_n_u64, vrsrad_n_u64, vshld_n_u64, vshld_s64,
33525         vshld_u64, vslid_n_u64, vsqaddd_u64, vsrad_n_u64, vsrid_n_u64,
33526         vsubd_s64, vsubd_u64, vtstd_s64, vtstd_u64): Fix type signature.
33528         (vabs_s64): Use GCC vector extensions; call __builtin_aarch64_absdi.
33530         (vget_high_s64, vget_high_u64): Reimplement with GCC vector
33531         extensions.
33533         (__GET_LOW, vget_low_u64): Wrap result using vcreate_u64.
33534         (vget_low_s64): Use __GET_LOW macro.
33535         (vget_lane_s64, vget_lane_u64, vdupq_lane_s64, vdupq_lane_u64): Use
33536         gcc vector extensions, add call to __builtin_aarch64_lane_boundsi.
33537         (vdup_lane_s64, vdup_lane_u64,): Add __builtin_aarch64_lane_bound_si.
33538         (vdupd_lane_s64, vdupd_lane_u64): Fix type signature, add
33539         __builtin_aarch64_lane_boundsi, use GCC vector extensions.
33541         (vcombine_s64): Use GCC vector extensions; remove cast.
33542         (vqaddd_s64, vqaddd_u64, vqdmulls_s32, vqshld_n_s64, vqshlud_n_s64,
33543         vqsubd_s64, vqsubd_u64, vrshld_s64, vrshrd_n_s64, vrsrad_n_s64,
33544         vshld_n_s64, vshrd_n_s64, vslid_n_s64, vsrad_n_s64, vsrid_n_s64):
33545         Fix type signature; remove cast.
33547 2014-06-23  Alan Lawrence  <alan.lawrence@arm.com>
33549         PR target/60825
33550         * config/aarch64/aarch64.c (aarch64_simd_mangle_map): Add entry for
33551         V1DFmode.
33552         * config/aarch64/aarch64-builtins.c (aarch64_simd_builtin_type_mode):
33553         add V1DFmode
33554         (BUILTIN_VD1): New.
33555         (BUILTIN_VD_RE): Remove.
33556         (aarch64_init_simd_builtins): Add V1DF to modes/modenames.
33557         (aarch64_fold_builtin): Update reinterpret patterns, df becomes v1df.
33558         * config/aarch64/aarch64-simd-builtins.def (create): Make a v1df
33559         variant but not df.
33560         (vreinterpretv1df*, vreinterpret*v1df): New.
33561         (vreinterpretdf*, vreinterpret*df): Remove.
33562         * config/aarch64/aarch64-simd.md (aarch64_create,
33563         aarch64_reinterpret*): Generate V1DFmode pattern not DFmode.
33564         * config/aarch64/iterators.md (VD_RE): Include V1DF, remove DF.
33565         (VD1): New.
33566         * config/aarch64/arm_neon.h (float64x1_t): typedef with gcc extensions.
33567         (vcreate_f64): Remove cast, use v1df builtin.
33568         (vcombine_f64): Remove cast, get elements with gcc vector extensions.
33569         (vget_low_f64, vabs_f64, vceq_f64, vceqz_f64, vcge_f64, vgfez_f64,
33570         vcgt_f64, vcgtz_f64, vcle_f64, vclez_f64, vclt_f64, vcltz_f64,
33571         vdup_n_f64, vdupq_lane_f64, vld1_f64, vld2_f64, vld3_f64, vld4_f64,
33572         vmov_n_f64, vst1_f64): Use gcc vector extensions.
33573         (vget_lane_f64, vdupd_lane_f64, vmulq_lane_f64, ): Use gcc extensions,
33574         add range check using __builtin_aarch64_im_lane_boundsi.
33575         (vfma_lane_f64, vfmad_lane_f64, vfma_laneq_f64, vfmaq_lane_f64,
33576         vfms_lane_f64, vfmsd_lane_f64, vfms_laneq_f64, vfmsq_lane_f64): Fix
33577         type signature, use gcc vector extensions.
33578         (vreinterpret_p8_f64, vreinterpret_p16_f64, vreinterpret_f32_f64,
33579         vreinterpret_f64_f32, vreinterpret_f64_p8, vreinterpret_f64_p16,
33580         vreinterpret_f64_s8, vreinterpret_f64_s16, vreinterpret_f64_s32,
33581         vreinterpret_f64_s64, vreinterpret_f64_u8, vreinterpret_f64_u16,
33582         vreinterpret_f64_u32, vreinterpret_f64_u64, vreinterpret_s8_f64,
33583         vreinterpret_s16_f64, vreinterpret_s32_f64, vreinterpret_s64_f64,
33584         vreinterpret_u8_f64, vreinterpret_u16_f64, vreinterpret_u32_f64,
33585         vreinterpret_u64_f64): Use v1df builtin not df.
33587 2014-06-23  James Greenhalgh  <james.greenhalgh@arm.com>
33589         * config/aarch64/aarch64.md (*addsi3_aarch64): Add alternative in
33590         vector registers.
33592 2014-06-23  Jan Hubicka  <hubicka@ucw.cz>
33594         * lto-cgraph.c (lto_output_node, input_node): Set/get init/fini
33595         priority directly.
33597 2014-06-23  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
33599         * loop-invariant.c (pre_check_invariant_p): New function.
33600         (find_invariant_insn): Call pre_check_invariant_p.
33602 2014-06-22  Richard Henderson  <rth@redhat.com>
33604         PR target/61565
33605         * compare-elim.c (struct comparison): Add eh_note.
33606         (find_comparison_dom_walker::before_dom_children): Don't eliminate
33607         a redundant comparison in a different EH region.  Purge EH edges if
33608         necessary.
33610 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33612         * config/rs6000/rs6000.md (maybe_var_shift): New define_attr.
33613         (var_shift): Use it.
33614         (rotl<mode>3, *rotlsi3_64, *rotl<mode>3_dot, *rotl<mode>3_dot2,
33615         *rotlsi3_internal4, *rotlsi3_internal5, *rotlsi3_internal6,
33616         *rotlsi3_internal8le, *rotlsi3_internal8be, *rotlsi3_internal9le,
33617         *rotlsi3_internal9be, *rotlsi3_internal10le, *rotlsi3_internal10be,
33618         *rotlsi3_internal11le, *rotlsi3_internal11be, *rotlsi3_internal12le,
33619         *rotlsi3_internal12be, ashl<mode>3, *ashlsi3_64, *ashl<mode>3_dot,
33620         *ashl<mode>3_dot2, lshr<mode>3, *lshrsi3_64, *lshr<mode>3_dot,
33621         *lshr<mode>3_dot2, *ashr<mode>3, *ashrsi3_64, *ashr<mode>3_dot,
33622         *ashr<mode>3_dot2, *rotldi3_internal4, *rotldi3_internal5,
33623         *rotldi3_internal6, *rotldi3_internal7le, *rotldi3_internal7be,
33624         *rotldi3_internal8le, *rotldi3_internal8be, *rotldi3_internal9le,
33625         *rotldi3_internal9be, *rotldi3_internal10le, *rotldi3_internal10be,
33626         *rotldi3_internal11le, *rotldi3_internal11be, *rotldi3_internal12le,
33627         *rotldi3_internal12be, *rotldi3_internal13le, *rotldi3_internal13be,
33628         *rotldi3_internal14le, *rotldi3_internal14be, *rotldi3_internal15le,
33629         *rotldi3_internal15be): Use the new attribute.  Merge register and
33630         integer alternatives.
33632 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33634         * config/rs6000/rs6000.md (ashrsi3, two anonymous define_insns and
33635         define_splits, ashrdi3, *ashrdi3_internal1, *ashrdi3_internal2 and
33636         split, *ashrdi3_internal3 and split): Delete, merge into...
33637         (ashr<mode>3): New expander.
33638         (*ashr<mode>3, ashr<mode>3_dot, ashr<mode>3_dot2): New.
33639         (*ashrsi3_64): Fix formatting.  Replace "i" by "n".
33641 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33643         * config/rs6000/rs6000.md (rotlsi3, *rotlsi3_internal2 and split,
33644         *rotlsi3_internal3 and split, rotldi3, *rotldi3_internal2 and split,
33645         *rotldi3_internal3 and split): Delete, merge into...
33646         (rotl<mode>3, rotl<mode>3_dot, rotl<mode>3_dot2): New.
33647         (*rotlsi3_64): Fix formatting.  Fix condition.  Replace "i" by "n".
33648         Use "rotlw" extended mnemonic.
33650 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33652         * config/rs6000/rs6000.md (ashlsi3, two anonymous define_insns
33653         and define_splits, ashldi3, *ashldi3_internal1, *ashldi3_internal2
33654         and split, *ashldi3_internal3 and split): Delete, merge into...
33655         (ashl<mode>3, ashl<mode>3_dot, ashl<mode>3_dot2): New.
33656         (*ashlsi3_64): Fix formatting.  Replace "i" by "n".
33658 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33660         * config/rs6000/rs6000.md ("hH"): New define_mode_attr.
33661         (lshrsi3, two anonymous define_insns and define_splits,
33662         lshrdi3, *lshrdi3_internal1, *lshrdi3_internal2 and split,
33663         *lshrdi3_internal3 and split): Delete, merge into...
33664         (lshr<mode>3, lshr<mode>3_dot, lshr<mode>3_dot2): New.
33665         (*lshrsi3_64): Fix formatting.  Replace "i" by "n".
33667 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33669         * config/rs6000/rs6000.md (lshrsi3, and its two dot patterns):
33670         Remove "O" alternative.
33672 2014-06-22  Richard Sandiford  <rdsandiford@googlemail.com>
33674         * config/mips/mips.c (mips_move_to_gpr_cost): Remove mode argument.
33675         (mips_move_from_gpr_cost): Likewise.
33676         (mips_register_move_cost): Update accordingly.
33677         (mips_secondary_reload_class): Remove name of in_p.
33679 2014-06-22  Marc Glisse  <marc.glisse@inria.fr>
33681         PR target/61503
33682         * config/i386/i386.md (x86_64_shrd, x86_shrd,
33683         ix86_rotr<dwi>3_doubleword): Replace ashiftrt with lshiftrt.
33685 2014-06-21  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
33687         * config/nios2/nios2.c: Include "builtins.h".
33689 2014-06-20  Jan Hubicka  <hubicka@ucw.cz>
33691         * cgraph.h (tls_model_names): New variable.
33692         * print-tree.c (print_node): Simplify.
33693         * varpool.c (tls_model_names): New variable.
33694         (dump_varpool_node): Output tls model.
33696 2014-06-20  Jan Hubicka  <hubicka@ucw.cz>
33698         * ipa-visibility.c (function_and_variable_visibility): Disable
33699         temporarily local aliases for some targets.
33701 2014-06-20  Marek Polacek  <polacek@redhat.com>
33703         * asan.c (pass_sanopt::execute): Handle IFN_UBSAN_BOUNDS.
33704         * flag-types.h (enum sanitize_code): Add SANITIZE_BOUNDS and or it
33705         into SANITIZE_UNDEFINED.
33706         * doc/invoke.texi: Describe -fsanitize=bounds.
33707         * gimplify.c (gimplify_call_expr): Add gimplification of internal
33708         functions created in the FEs.
33709         * internal-fn.c: Move "internal-fn.h" after "tree.h".
33710         (expand_UBSAN_BOUNDS): New function.
33711         * internal-fn.def (UBSAN_BOUNDS): New internal function.
33712         * internal-fn.h: Don't define internal functions here.
33713         * opts.c (common_handle_option): Add -fsanitize=bounds.
33714         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_OUT_OF_BOUNDS,
33715         BUILT_IN_UBSAN_HANDLE_OUT_OF_BOUNDS_ABORT): Add.
33716         * tree-core.h: Define internal functions here.
33717         (struct tree_base): Add ifn field.
33718         * tree-pretty-print.c: Include "internal-fn.h".
33719         (dump_generic_node): Handle functions without CALL_EXPR_FN.
33720         * tree.c (get_callee_fndecl): Likewise.
33721         (build_call_expr_internal_loc): New function.
33722         * tree.def (CALL_EXPR): Update description.
33723         * tree.h (CALL_EXPR_IFN): Define.
33724         (build_call_expr_internal_loc): Declare.
33725         * ubsan.c (get_ubsan_type_info_for_type): Return 0 for non-arithmetic
33726         types.
33727         (ubsan_type_descriptor): Change bool parameter to enum
33728         ubsan_print_style.  Adjust the code.  Add handling of
33729         UBSAN_PRINT_ARRAY.
33730         (ubsan_expand_bounds_ifn): New function.
33731         (ubsan_expand_null_ifn): Adjust ubsan_type_descriptor call.
33732         (ubsan_build_overflow_builtin): Likewise.
33733         (instrument_bool_enum_load): Likewise.
33734         (ubsan_instrument_float_cast): Likewise.
33735         * ubsan.h (enum ubsan_print_style): New enum.
33736         (ubsan_expand_bounds_ifn): Declare.
33737         (ubsan_type_descriptor): Adjust declaration.  Use a default parameter.
33739 2014-06-20  Maciej W. Rozycki  <macro@codesourcery.com>
33741         * config/rs6000/rs6000.md: Append `DONE' to preparation
33742         statements of `bswap' pattern splitters.
33744 2014-06-20  Tom de Vries  <tom@codesourcery.com>
33746         * target.def (call_fusage_contains_non_callee_clobbers): Update
33747         definition.
33748         * doc/tm.texi: Regenerate.
33750 2014-06-20  Yury Gribov  <y.gribov@samsung.com>
33751             Max Ostapenko  <m.ostapenko@partner.samsung.com>
33753         PR sanitizer/61547
33754         * asan.c (instrument_strlen_call): Fixed instrumentation of
33755         trailing byte.
33757 2014-06-20  Martin Jambor  <mjambor@suse.cz>
33759         PR ipa/61540
33760         * ipa-prop.c (impossible_devirt_target): New function.
33761         (try_make_edge_direct_virtual_call): Use it, also instead of
33762         asserting.
33764 2014-06-20  Yury Gribov  <y.gribov@samsung.com>
33765             Max Ostapenko  <m.ostapenko@partner.samsung.com>
33767         PR sanitizer/61530
33768         * asan.c (build_check_stmt): Add condition.
33770 2014-06-20  Martin Jambor  <mjambor@suse.cz>
33772         PR ipa/61211
33773         * cgraph.c (clone_of_p): Allow skipped_branch to deal with
33774         expanded clones.
33776 2014-06-20  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
33778         * config/aarch64/iterators.md (VCOND): Handle SI and HI modes.
33779         Update comments.
33780         (VCONQ): Make comment more helpful.
33781         (VCON): Delete.
33782         * config/aarch64/aarch64-simd.md
33783         (aarch64_sqdmulh_lane<mode>):
33784         Use VCOND for operands 2.  Update lane checking and flipping logic.
33785         (aarch64_sqrdmulh_lane<mode>): Likewise.
33786         (aarch64_sq<r>dmulh_lane<mode>_internal): Likewise.
33787         (aarch64_sqdmull2<mode>): Remove VCON, use VQ_HSI mode iterator.
33788         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal, VD_HSI): Change mode
33789         attribute of operand 3 to VCOND.
33790         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal, SD_HSI): Likewise.
33791         (aarch64_sqdml<SBINQOPS:as>l2_lane<mode>_internal): Likewise.
33792         (aarch64_sqdmull_lane<mode>_internal, VD_HSI): Likewise.
33793         (aarch64_sqdmull_lane<mode>_internal, SD_HSI): Likewise.
33794         (aarch64_sqdmull2_lane<mode>_internal): Likewise.
33795         (aarch64_sqdml<SBINQOPS:as>l_laneq<mode>_internal, VD_HSI: New
33796         define_insn.
33797         (aarch64_sqdml<SBINQOPS:as>l_laneq<mode>_internal, SD_HSI): Likewise.
33798         (aarch64_sqdml<SBINQOPS:as>l2_laneq<mode>_internal): Likewise.
33799         (aarch64_sqdmull_laneq<mode>_internal, VD_HSI): Likewise.
33800         (aarch64_sqdmull_laneq<mode>_internal, SD_HSI): Likewise.
33801         (aarch64_sqdmull2_laneq<mode>_internal): Likewise.
33802         (aarch64_sqdmlal_lane<mode>): Change mode attribute of penultimate
33803         operand to VCOND.  Update lane flipping and bounds checking logic.
33804         (aarch64_sqdmlal2_lane<mode>): Likewise.
33805         (aarch64_sqdmlsl_lane<mode>): Likewise.
33806         (aarch64_sqdmull_lane<mode>): Likewise.
33807         (aarch64_sqdmull2_lane<mode>): Likewise.
33808         (aarch64_sqdmlal_laneq<mode>):
33809         Replace VCON usage with VCONQ.
33810         Emit aarch64_sqdmlal_laneq<mode>_internal insn.
33811         (aarch64_sqdmlal2_laneq<mode>): Emit
33812         aarch64_sqdmlal2_laneq<mode>_internal insn.
33813         Replace VCON with VCONQ.
33814         (aarch64_sqdmlsl2_lane<mode>): Replace VCON with VCONQ.
33815         (aarch64_sqdmlsl2_laneq<mode>): Likewise.
33816         (aarch64_sqdmull_laneq<mode>): Emit
33817         aarch64_sqdmull_laneq<mode>_internal insn.
33818         Replace VCON with VCONQ.
33819         (aarch64_sqdmull2_laneq<mode>): Emit
33820         aarch64_sqdmull2_laneq<mode>_internal insn.
33821         (aarch64_sqdmlsl_laneq<mode>): Replace VCON usage with VCONQ.
33822         * config/aarch64/arm_neon.h (vqdmlal_high_lane_s16): Change type
33823         of 3rd argument to int16x4_t.
33824         (vqdmlalh_lane_s16): Likewise.
33825         (vqdmlslh_lane_s16): Likewise.
33826         (vqdmull_high_lane_s16): Likewise.
33827         (vqdmullh_lane_s16): Change type of 2nd argument to int16x4_t.
33828         (vqdmlal_lane_s16): Don't create temporary int16x8_t value.
33829         (vqdmlsl_lane_s16): Likewise.
33830         (vqdmull_lane_s16): Don't create temporary int16x8_t value.
33831         (vqdmlal_high_lane_s32): Change type 3rd argument to int32x2_t.
33832         (vqdmlals_lane_s32): Likewise.
33833         (vqdmlsls_lane_s32): Likewise.
33834         (vqdmull_high_lane_s32): Change type 2nd argument to int32x2_t.
33835         (vqdmulls_lane_s32): Likewise.
33836         (vqdmlal_lane_s32): Don't create temporary int32x4_t value.
33837         (vqdmlsl_lane_s32): Likewise.
33838         (vqdmull_lane_s32): Don't create temporary int32x4_t value.
33839         (vqdmulhh_lane_s16): Change type of second argument to int16x4_t.
33840         (vqrdmulhh_lane_s16): Likewise.
33841         (vqdmlsl_high_lane_s16): Likewise.
33842         (vqdmulhs_lane_s32): Change type of second argument to int32x2_t.
33843         (vqdmlsl_high_lane_s32): Likewise.
33844         (vqrdmulhs_lane_s32): Likewise.
33846 2014-06-20  Tom de Vries  <tom@codesourcery.com>
33848         * final.c (collect_fn_hard_reg_usage): Add separate IOR_HARD_REG_SET for
33849         get_call_reg_set_usage.
33851 2014-06-20  Tom de Vries  <tom@codesourcery.com>
33853         * final.c (collect_fn_hard_reg_usage): Don't save function_used_regs if
33854         it contains all call_used_regs.
33856 2014-06-20  Tom de Vries  <tom@codesourcery.com>
33858         * final.c (collect_fn_hard_reg_usage): Add and use variable
33859         function_used_regs.
33861 2014-06-20  Jan Hubicka  <hubicka@ucw.cz>
33863         * cgraph.h (struct symtab_node): Add field in_init_priority_hash
33864         (set_init_priority, get_init_priority, set_fini_priority,
33865         get_fini_priority): New methods.
33866         * tree.c (init_priority_for_decl): Remove.
33867         (init_ttree): Do not initialize init priority.
33868         (decl_init_priority_lookup, decl_fini_priority_lookup): Rewrite.
33869         (decl_priority_info): Remove.
33870         (decl_init_priority_insert): Rewrite.
33871         (decl_fini_priority_insert): Rewrite.
33872         * tree.h (tree_priority_map_eq, tree_priority_map_hash,
33873         tree_priority_map_marked_p): Remove.
33874         * lto-cgraph.c (lto_output_node, input_node): Stream init priorities.
33875         * lto-streamer-out.c (hash_tree): Do not hash priorities.
33876         * tree-streamer-out.c (pack_ts_decl_with_vis_value_fields): Do
33877         not output priorities.
33878         (pack_ts_function_decl_value_fields): Likewise.
33879         * tree-streamer-in.c (unpack_ts_decl_with_vis_value_fields): Do
33880         not input priorities.
33881         (unpack_ts_function_decl_value_fields): Likewise.
33882         * symtab.c (symbol_priority_map): Declare.
33883         (init_priority_hash): Declare.
33884         (symtab_unregister_node): Unregister from priority hash, too.
33885         (symtab_node::get_init_priority, cgraph_node::get_fini_priority):
33886         New methods.
33887         (symbol_priority_map_eq, symbol_priority_map_hash): New functions.
33888         (symbol_priority_info): New function.
33889         (symtab_node::set_init_priority, cgraph_node::set_fini_priority):
33890         New methods.
33891         * tree-core.h (tree_priority_map): Remove.
33893 2014-06-20  Jakub Jelinek  <jakub@redhat.com>
33895         * tree-ssa-math-opts.c (do_shift_rotate, find_bswap_or_nop_1): Cast
33896         0xff to uint64_t before shifting it up.
33898 2014-06-20  Julian Brown  <julian@codesourcery.com>
33899             Chung-Lin Tang  <cltang@codesourcery.com>
33901         * config/arm/arm.c (arm_output_mi_thunk): Fix offset for
33902         TARGET_THUMB1_ONLY. Add comments.
33904 2014-06-19  Tom de Vries  <tom@codesourcery.com>
33906         * config/aarch64/aarch64-protos.h (aarch64_emit_call_insn): Change
33907         return type to void.
33908         * config/aarch64/aarch64.c (aarch64_emit_call_insn): Same.
33910 2014-06-19  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
33912         * loop-invariant.c (get_inv_cost): Skip invariants, which are marked
33913         as "move", from depends_on.
33915 2014-06-19  Terry Guo  <terry.guo@arm.com>
33917         * config/arm/thumb1.md (define_split): Split 64bit constant in earlier
33918         stage.
33920 2014-06-18  Segher Boessenkool  <segher@kernel.crashing.org>
33922         * config/rs6000/rs6000.h (FIXED_REGISTERS): Update comment.
33923         Remove cr5.
33924         (REG_ALLOC_ORDER): Update comment.  Move cr5 earlier.
33926 2014-06-18  Kaz Kojima  <kkojima@gcc.gnu.org>
33928         PR target/61550
33929         * config/sh/sh.c (prepare_move_operands): Don't process TLS
33930         addresses here if reload in progress or completed.
33932 2014-06-18  Robert Suchanek  <robert.suchanek@imgtec.com>
33934         * config/mips/constraints.md ("d"): BASE_REG_CLASS replaced by
33935         "TARGET_MIPS16 ? M16_REGS : GR_REGS".
33936         * config/mips/mips.c (mips_regno_to_class): Update for M16_SP_REGS.
33937         (mips_regno_mode_ok_for_base_p): Remove use of !strict_p for MIPS16.
33938         (mips_register_priority): New function that implements the target
33939         hook TARGET_REGISTER_PRIORITY.
33940         (mips_spill_class): Likewise for TARGET_SPILL_CLASS.
33941         (mips_lra_p): Likewise for TARGET_LRA_P.
33942         (TARGET_REGISTER_PRIORITY): Define macro.
33943         (TARGET_SPILL_CLASS): Likewise.
33944         (TARGET_LRA_P): Likewise.
33945         * config/mips/mips.h (reg_class): Add M16_SP_REGS and SPILL_REGS
33946         classes.
33947         (REG_CLASS_NAMES): Likewise.
33948         (REG_CLASS_CONTENTS): Likewise.
33949         (BASE_REG_CLASS): Use M16_SP_REGS.
33950         * config/mips/mips.md (*mul_acc_si): Add alternative tuned for LRA.
33951         New set attribute to enable alternatives depending on the register
33952         allocator used.
33953         (*mul_acc_si_r3900, *mul_sub_si): Likewise.
33954         (*lea64): Disable pattern for MIPS16.
33955         * config/mips/mips.opt (mlra): New option.
33957 2014-06-18  Robert Suchanek  <robert.suchanek@imgtec.com>
33959         * lra-constraints.c (base_to_reg): New function.
33960         (process_address): Use new function.
33962 2014-06-18  Tom de Vries  <tom@codesourcery.com>
33964         * config/aarch64/aarch64-protos.h (aarch64_emit_call_insn): Declare.
33965         * config/aarch64/aarch64.c
33966         (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS): Redefine as true.
33967         (aarch64_emit_call_insn): New function.
33968         (aarch64_load_symref_appropriately): Use aarch64_emit_call_insn instead
33969         of emit_call_insn.
33970         * config/aarch64/aarch64.md (define_expand "call_internal")
33971         (define_expand "call_value_internal", define_expand "sibcall_internal")
33972         (define_expand "sibcall_value_internal"): New.
33973         (define_expand "call", define_expand "call_value")
33974         (define_expand "sibcall", define_expand "sibcall_value"): Use internal
33975         expand variant and aarch64_emit_call_insn.
33977 2014-06-18  Radovan Obradovic  <robradovic@mips.com>
33978             Tom de Vries  <tom@codesourcery.com>
33980         * config/arm/arm-protos.h (arm_emit_call_insn): Add bool parameter.
33981         * config/arm/arm.c (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS):
33982         Redefine to true.
33983         (arm_emit_call_insn): Add and use sibcall parameter.  Add IP and CC
33984         clobbers to CALL_INSN_FUNCTION_USAGE.
33985         (define_expand "sibcall_internal")
33986         (define_expand "sibcall_value_internal"): New.
33987         (define_expand "call", define_expand "call_value"): Add argument to
33988         arm_emit_call_insn.
33989         (define_expand "sibcall"): Use sibcall_internal and arm_emit_call_insn.
33990         (define_expand "sibcall_value"): Use sibcall_value_internal and
33991         arm_emit_call_insn.
33993 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
33995         * config/arm/bpabi.c (__gnu_uldivmod_helper): Remove.
33997 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
33999         * config/arm/bpabi-v6m.S (__aeabi_uldivmod): Perform division using
34000         __udivmoddi4.
34002 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34004         * config/arm/bpabi.S (__aeabi_ldivmod, __aeabi_uldivmod,
34005         push_for_divide, pop_for_divide): Use .cfi_* directives for DWARF
34006         annotations. Fix DWARF information.
34008 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34010         * config/arm/bpabi.S (__aeabi_ldivmod): Perform division using
34011         __udivmoddi4, and fixups for negative operands.
34013 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34015         * config/arm/bpabi.S (__aeabi_ldivmod): Optimise stack manipulation.
34017 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34019         * config/arm/bpabi.S (__aeabi_uldivmod): Perform division using call
34020         to __udivmoddi4.
34022 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34024         * config/arm/bpabi.S (__aeabi_uldivmod): Optimise stack pointer
34025         manipulation.
34027 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34029         * config/arm/bpabi.S (__aeabi_uldivmod, __aeabi_ldivmod): Add comment
34030         describing register usage on function entry and exit.
34032 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34034         * config/arm/bpabi.S (__aeabi_uldivmod): Fix whitespace.
34035         (__aeabi_ldivmod): Fix whitespace.
34037 2014-06-18  Andreas Schwab  <schwab@suse.de>
34039         * doc/md.texi (Standard Names): Use @itemx for grouped items.
34040         Remove blank line after @item.
34042 2014-06-18  Richard Henderson  <rth@redhat.com>
34044         PR target/61545
34045         * config/aarch64/aarch64.md (tlsdesc_small_<PTR>): Clobber CC_REGNUM.
34047 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34049         * config/arm/arm.c (neon_vector_mem_operand): Allow register
34050         POST_MODIFY for neon loads and stores.
34051         (arm_print_operand): Output post-index register for neon loads and
34052         stores.
34054 2014-06-18  Richard Biener  <rguenther@suse.de>
34056         * tree-ssa-dce.c (perform_tree_ssa_dce): Fixup bogus commit.
34058 2014-06-18  Richard Biener  <rguenther@suse.de>
34060         * tree-pass.h (make_pass_dce_loop): Remove.
34061         * passes.def: Replace pass_dce_loop with pass_dce.
34062         * tree-ssa-dce.c (perform_tree_ssa_dce): If something
34063         changed free niter estimates and reset the scev cache.
34064         (tree_ssa_dce_loop, pass_data_dce_loop, pass_dce_loop,
34065         make_pass_dce_loop): Remove.
34066         * tree-ssa-copy.c: Include tree-ssa-loop-niter.h.
34067         (fini_copy_prop): Return whether something changed.  Always
34068         let substitute_and_fold perform DCE and free niter estimates
34069         and reset the scev cache if so.
34070         (execute_copy_prop): If sth changed schedule cleanup-cfg.
34071         (pass_data_copy_prop): Do not unconditionally schedule
34072         cleanup-cfg or update-ssa.
34074 2014-06-18  Yuri Rumyantsev  <ysrumyan@gmail.com>
34076         PR tree-optimization/61518
34077         * tree-if-conv.c (is_cond_scalar_reduction): Add missed check that
34078         reduction var is used in reduction stmt or phi-function only.
34080 2014-06-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
34082         * config/arm/arm_neon.h (vadd_f32): Change #ifdef to __FAST_MATH.
34084 2014-06-18  Thomas Preud'homme  <thomas.preudhomme@arm.com>
34086         PR tree-optimization/61517
34087         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Adapt to return a stmt
34088         whose rhs's first tree is the source expression instead of the
34089         expression itself.
34090         (find_bswap_or_nop): Likewise.
34091         (bsap_replace): Rename stmt in cur_stmt. Pass gsi by value and src as a
34092         gimple stmt whose rhs's first tree is the source. In the memory source
34093         case, move the stmt to be replaced close to one of the original load to
34094         avoid the problem of a store between the load and the stmt's original
34095         location.
34096         (pass_optimize_bswap::execute): Adapt to change in bswap_replace's
34097         signature.
34099 2014-06-18  Andreas Schwab  <schwab@suse.de>
34101         PR rtl-optimization/54555
34102         * postreload.c (move2add_use_add2_insn): Substitute
34103         STRICT_LOW_PART only if it is cheaper.
34105 2014-06-18  Uros Bizjak  <ubizjak@gmail.com>
34107         * config/i386/i386.md (*sibcall_memory): Rename from *sibcall_intern.
34108         Do not use unspec as call operand.  Use memory_operand instead of
34109         memory_nox32_operand and add "m" operand constraint.  Disable
34110         pattern for TARGET_X32.
34111         (*sibcall_pop_memory): Ditto.
34112         (*sibcall_value_memory): Ditto.
34113         (*sibcall_value_pop_memory): Ditto.
34114         (sibcall peepholes): Merge SImode and DImode patterns using
34115         W mode iterator.  Use memory_operand instead of memory_nox32_operand.
34116         Disable pattern for TARGET_X32.  Check if eliminated register is
34117         really dead after call insn.  Generate call RTX without unspec operand.
34118         (sibcall_value peepholes): Ditto.
34119         (sibcall_pop peepholes): Fix call insn RTXes.  Use memory_operand
34120         instead of memory_nox32_operand.  Check if eliminated register is
34121         really dead after call insn. Generate call RTX without unspec operand.
34122         (sibcall_value_pop peepholes): Ditto.
34123         * config/i386/predicates.md (memory_nox32_operand): Remove predicate.
34125 2014-06-18  Terry Guo  <terry.guo@arm.com>
34127         PR target/61544
34128         * config/arm/arm.c (thumb1_reorg): Move to next basic block if we
34129         reach the head.
34131 2014-06-18  Olivier Hainque  <hainque@adacore.com>
34133         * tree-core.h (tree_block): Add an "end_locus" field, allowing
34134         memorization of the end of block source location.
34135         * tree.h (BLOCK_SOURCE_END_LOCATION): New accessor.
34136         * gimplify.c (gimplify_bind_expr): Propagate the block start and
34137         end source location info we have on the block entry/exit code we
34138         generate.
34140 2014-06-18  Richard Biener  <rguenther@suse.de>
34142         * common.opt (fssa-phiopt): New option.
34143         * opts.c (default_options_table): Enable -fssa-phiopt with -O1+
34144         but not with -Og.
34145         * tree-ssa-phiopt.c (pass_phiopt): Add gate method.
34146         * doc/invoke.texi (-fssa-phiopt): Document.
34148 2014-06-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
34150         * genattrtab.c (n_bypassed): New variable.
34151         (process_bypasses): Initialise n_bypassed.
34152         Count number of bypassed reservations.
34153         (make_automaton_attrs): Allocate space for bypassed reservations
34154         rather than number of bypasses.
34156 2014-06-18  Richard Biener  <rguenther@suse.de>
34158         * tree-ssa-propagate.c (replace_phi_args_in): Return whether
34159         we propagated anything.
34160         (substitute_and_fold_dom_walker::before_dom_children): Something
34161         changed if we propagated into PHI arguments.
34162         * tree-ssa-pre.c (eliminate): Always schedule cfg-cleanup if
34163         we removed a stmt.
34165 2014-06-18  Evgeny Stupachenko  <evstupac@gmail.com>
34167         * config/i386/i386.c (ix86_reassociation_width): Add alternative for
34168         vector case.
34169         * config/i386/i386.h (TARGET_VECTOR_PARALLEL_EXECUTION): New.
34170         * config/i386/x86-tune.def (X86_TUNE_VECTOR_PARALLEL_EXECUTION): New.
34171         * tree-vect-data-refs.c (vect_shift_permute_load_chain): New.
34172         Introduces alternative way of loads group permutaions.
34173         (vect_transform_grouped_load): Try alternative way of permutations.
34175 2014-06-18  Jakub Jelinek  <jakub@redhat.com>
34177         * gimplify.c (omp_notice_variable): If n is non-NULL and no flags
34178         changed in ORT_TARGET region, don't jump to do_outer.
34179         (struct gimplify_adjust_omp_clauses_data): New type.
34180         (gimplify_adjust_omp_clauses_1): Adjust for data being
34181         a struct gimplify_adjust_omp_clauses_data pointer instead
34182         of tree *.  Pass pre_p as a new argument to
34183         lang_hooks.decls.omp_finish_clause hook.
34184         (gimplify_adjust_omp_clauses): Add pre_p argument, adjust
34185         splay_tree_foreach to pass both list_p and pre_p.
34186         (gimplify_omp_parallel, gimplify_omp_task, gimplify_omp_for,
34187         gimplify_omp_workshare, gimplify_omp_target_update): Adjust
34188         gimplify_adjust_omp_clauses callers.
34189         * langhooks.c (lhd_omp_finish_clause): New function.
34190         * langhooks-def.h (lhd_omp_finish_clause): New prototype.
34191         (LANG_HOOKS_OMP_FINISH_CLAUSE): Define to lhd_omp_finish_clause.
34192         * langhooks.h (struct lang_hooks_for_decls): Add a new
34193         gimple_seq * argument to omp_finish_clause hook.
34194         * omp-low.c (scan_sharing_clauses): Call scan_omp_op on
34195         non-DECL_P OMP_CLAUSE_DECL if ctx->outer.
34196         (scan_omp_parallel, lower_omp_for): When adding
34197         _LOOPTEMP_ clause var, add it to outer ctx's decl_map as identity.
34198         * tree-core.h (OMP_CLAUSE_MAP_TO_PSET): New map kind.
34199         * tree-nested.c (convert_nonlocal_omp_clauses,
34200         convert_local_omp_clauses): Handle various OpenMP 4.0 clauses.
34201         * tree-pretty-print.c (dump_omp_clause): Handle OMP_CLAUSE_MAP_TO_PSET.
34203 2014-06-17  Andrew MacLeod  <amacleod@redhat.com>
34205         * tree-dfa.h (get_addr_base_and_unit_offset_1): Move from here.
34206         * tree-dfa.c (get_addr_base_and_unit_offset_1): To here.
34208 2014-06-17  Xinliang David Li  <davidxl@google.com>
34210         * tree-pretty-print.c (dump_function_header): Print cgraph uid.
34211         * passes.c (pass_init_dump_file): Do not set initialize
34212         flag to false unconditionally.
34214 2014-06-17  Richard Biener  <rguenther@suse.de>
34216         * genopinit.c (main): Use vec<>::qsort method.
34217         * tree-ssa-loop-niter.c (discover_iteration_bound_by_body_walk):
34218         Likewise.
34219         * tree-vect-data-refs.c (vect_analyze_data_ref_accesses): Likewise.
34221 2014-06-17  Matthew Fortune  <matthew.fortune@imgtec.com>
34223         * config/mips/mips-protos.h (mips_expand_fcc_reload): Remove.
34224         * config/mips/mips.c (mips_expand_fcc_reload): Remove.
34225         (mips_move_to_gpr_cost): Remove ST_REGS case.
34226         (mips_move_from_gpr_cost): Likewise.
34227         (mips_register_move_cost): Likewise.
34228         (mips_secondary_reload_class): Likewise.
34230 2014-06-17  Richard Biener  <rguenther@suse.de>
34232         * passes.def (pass_all_early_optimizations): Remove copy-prop pass.
34233         (pass_all_optimizations): Move 3rd copy-prop pass from after
34234         fre to before ifcombine/phiopt.
34236 2014-06-17  Richard Biener  <rguenther@suse.de>
34238         * tree-switch-conversion.c (collect_switch_conv_info): Simplify
34239         and allow all blocks to be forwarders.
34241 2014-06-17  Yufeng Zhang  <yufeng.zhang@arm.com>
34243         PR target/61483
34244         * config/aarch64/aarch64.c (aarch64_layout_arg): Add new local
34245         variable 'size'; calculate 'size' right in the front; use
34246         'size' to compute 'nregs' (when 'allocate_ncrn != 0') and
34247         pcum->aapcs_stack_words.
34249 2014-06-17  Nick Clifton  <nickc@redhat.com>
34251         * config/msp430/msp430.md (mulhisi3): Add a NOP after the DINT.
34252         (umulhi3, mulsidi3, umulsidi3): Likewise.
34254 2014-06-17  Thomas Schwinge  <thomas@codesourcery.com>
34256         PR middle-end/61508
34257         * fold-const.c (fold_checksum_tree) <TS_DECL_WITH_VIS>: Remove
34258         check for section name.
34260 2014-06-17  Richard Biener  <rguenther@suse.de>
34262         * tree-ssa-propagate.c: Include domwalk.h.
34263         (substitute_and_fold): Outline main worker into a domwalker ...
34264         (substitute_and_fold_dom_walker::before_dom_children): ... here.
34265         Schedule stmts we can fully propagate for removal.  Remove
34266         poor-mans DCE.
34267         (substitute_and_fold): Apply a dominator walk to perform
34268         substitution.  Process stmts scheduled for removal here.
34270 2014-06-17  Richard Biener  <rguenther@suse.de>
34272         * tree-ssa-loop-im.c (determine_max_movement): Adjust cost
34273         of PHI node moving.
34275 2014-06-17  Kugan Vivekanandarajah  <kuganv@linaro.org>
34277         * config/arm/arm.c (arm_atomic_assign_expand_fenv): call
34278         default_atomic_assign_expand_fenv for !TARGET_HARD_FLOAT.
34279         (arm_init_builtins) : Initialize builtins __builtins_arm_set_fpscr and
34280         __builtins_arm_get_fpscr only when TARGET_HARD_FLOAT.
34281         * config/arm/vfp.md (set_fpscr): Make pattern conditional on
34282         TARGET_HARD_FLOAT.
34283         (get_fpscr) : Likewise.
34285 2014-06-16  Vladimir Makarov  <vmakarov@redhat.com>
34287         PR rtl-optimization/61325
34288         * lra-constraints.c (valid_address_p): Add forward declaration.
34289         (simplify_operand_subreg): Check address validity before and after
34290         alter_reg of memory subreg.
34292 2014-06-16  Uros Bizjak  <ubizjak@gmail.com>
34294         * config/i386/i386.c (decide_alg): Correctly handle
34295         maximum size of stringop algorithm.
34297 2014-06-16  Yury Gribov  <y.gribov@samsung.com>
34299         * asan.c (build_check_stmt): Fix maybe-uninitialized warning.
34301 2014-06-16  Vladimir Makarov  <vmakarov@redhat.com>
34303         PR rtl-optimization/61522
34304         * lra-assigns.c (assign_by_spills): Check null targetm.spill_class.
34306 2014-06-16  Jan Hubicka  <hubicka@ucw.cz>
34308         Revert:
34309         * symtab.c (symtab_node::reset_section): New method.
34310         * cgraph.c (cgraph_node_cannot_be_local_p_1): Accept non-local
34311         for localization.
34312         * cgraph.h (reset_section): Declare.
34313         * ipa-inline-analysis.c (do_estimate_growth): Check for comdat groups;
34314         do not consider comdat locals.
34315         * cgraphclones.c (set_new_clone_decl_and_node_flags): Get section
34316         for new symbol.
34317         * ipa-visiblity.c (cgraph_externally_visible_p): Cleanup.
34318         (update_visibility_by_resolution_info): Consider UNDEF; fix checking;
34319         reset sections of symbols dragged out of the comdats.
34320         (function_and_variable_visibility): Reset sections of
34321         localized symbols.
34323 2014-06-16  Richard Biener  <rguenther@suse.de>
34325         PR tree-optimization/61482
34326         * tree-vrp.c (adjust_range_with_scev): Avoid setting of
34327         [-INF(OVF), +INF(OVF)] range.
34329 2014-06-16  Ganesh Gopalasubramanian <Ganesh.Gopalasubramanian@amd.com>
34331         * config/i386/i386.c (ix86_expand_sse2_mulvxdi3): Issue
34332         instructions "vpmuludq" and "vpaddq" instead of "vpmacsdql" for
34333         handling 32-bit multiplication.
34335 2014-06-16  Chung-Lin Tang  <cltang@codesourcery.com>
34337         PR middle-end/61430
34338         * lra-lives.c (process_bb_lives): Skip creating copy during
34339         insn scan when src/dest has constrained to same regno.
34341 2014-06-15  Jan Hubicka  <hubicka@ucw.cz>
34343         * tree-vect-data-refs.c (vect_can_force_dr_alignment_p): Check again
34344         DECL_IN_CONSTANT_POOL and TREE_ASM_WRITTEN.
34346 2014-06-16  Yury Gribov  <y.gribov@samsung.com>
34348         * asan.c (check_func): New function.
34349         (maybe_create_ssa_name): Likewise.
34350         (build_check_stmt_with_calls): Likewise.
34351         (use_calls_p): Likewise.
34352         (report_error_func): Change interface.
34353         (build_check_stmt): Allow non-integer lengths; add support
34354         for new parameter.
34355         (asan_instrument): Likewise.
34356         (instrument_mem_region_access): Moved code to build_check_stmt.
34357         (instrument_derefs): Likewise.
34358         (instrument_strlen_call): Likewise.
34359         * cfgcleanup.c (old_insns_match_p): Add support for new functions.
34360         * doc/invoke.texi: Describe new parameter.
34361         * params.def: Define new parameter.
34362         * params.h: Likewise.
34363         * sanitizer.def: Describe new builtins.
34365 2014-06-16  Richard Biener  <rguenther@suse.de>
34367         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children):
34368         Make all defs available at the end.
34369         (eliminate): If we remove a PHI node schedule cfg-cleanup.
34371 2014-06-18  Jakub Jelinek  <jakub@redhat.com>
34373         PR plugins/45078
34374         * config.gcc (arm*-*-linux-*): Include vxworks-dummy.h in tm_file.
34376 2014-06-16  Richard Sandiford  <rdsandiford@googlemail.com>
34378         PR bootstrap/61516
34379         * auto-inc-dec.c (merge_in_block): Fix location of insn_info
34380         initialization.  Replace remaining use of uid.
34382 2014-06-15  Jan Hubicka  <hubicka@ucw.cz>
34384         * c-family/c-common.c (handle_tls_model_attribute): Use
34385         set_decl_tls_model.
34386         * c-family/c-common.c (handle_tls_model_attribute): Use
34387         set_decl_tls_model.
34388         * cgraph.h (struct varpool_node): Add tls_model.
34389         * tree.c (decl_tls_model, set_decl_tls_model): New functions.
34390         * tree.h (DECL_TLS_MODEL): Update.
34391         (DECL_THREAD_LOCAL_P): Check that variable is static.
34392         (decl_tls_model): Declare.
34393         (set_decl_tls_model): Declare.
34394         * tree-emutls.c (get_emutls_init_templ_addr): First build decl and then
34395         set symbol prorperties.
34396         (get_emutls_init_templ_addr): Cleanup.
34397         (new_emutls_decl): Update.
34398         * lto-cgraph.c (lto_output_varpool_node): Stream TLS model
34399         (lto_input_varpool_node): Likewise.
34400         * lto-streamer-out.c (hash_tree): Likewise.
34401         * tree-streamer-in.c (unpack_ts_decl_with_vis_value_fields): Do
34402         not stream DECL_TLS_MODEL.
34403         * tree-profile.c (init_ic_make_global_vars): Use set_decl_tls_model.
34404         * tree-core.h (tree_decl_with_vis): Remove tls_model; update comments.
34406 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34408         * df.h (DF_REF_REG_USE_P, DF_MWS_REG_USE_P): Remove null checks.
34410 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34412         * df.h (df_mw_hardreg, df_base_ref): Add a link pointer.
34413         (df_insn_info): Turn defs, uses, eq_uses and mw_hardregs into linked
34414         lists.
34415         (df_scan_bb_info): Likewise artificial_defs and artificial_uses.
34416         (DF_REF_NEXT_LOC, DF_MWS_NEXT): New macros.
34417         (FOR_EACH_INSN_INFO_DEF, FOR_EACH_INSN_INFO_USE)
34418         (FOR_EACH_INSN_INFO_EQ_USE, FOR_EACH_INSN_INFO_MW)
34419         (FOR_EACH_ARTIFICIAL_USE, FOR_EACH_ARTIFICIAL_DEF)
34420         (df_get_artificial_defs, df_get_artificial_uses)
34421         (df_single_def, df_single_use): Update accordingly.
34422         (df_refs_chain_dump): Take the first element in a linked list as
34423         parameter, rather than a pointer to an array of pointers.
34424         * df-core.c (df_refs_chain_dump, df_mws_dump): Likewise.
34425         * df-problems.c (df_rd_bb_local_compute_process_def): Likewise.
34426         (df_chain_create_bb_process_use): Likewise.
34427         (df_md_bb_local_compute_process_def): Likewise.
34428         * fwprop.c (process_defs, process_uses): Likewise.
34429         (register_active_defs, update_uses): Likewise.
34430         (forward_propagate_asm): Update for new df_ref linking.
34431         * df-scan.c (df_scan_free_ref_vec, df_scan_free_mws_vec): Delete.
34432         (df_null_ref_rec, df_null_mw_rec): Likewise.
34433         (df_scan_free_internal): Don't free df_ref and df_mw_hardreg lists
34434         explicitly.
34435         (df_scan_free_bb_info): Remove check for null artificial_defs.
34436         (df_install_ref_incremental): Adjust for new df_ref linking.
34437         Use a single-element insertion rather than a full sort.
34438         (df_ref_chain_delete_du_chain): Take the first element
34439         in a linked list as parameter, rather than a pointer to an array of
34440         pointers.
34441         (df_ref_chain_delete, df_mw_hardreg_chain_delete): Likewise.
34442         (df_add_refs_to_table, df_refs_verify, df_mws_verify): Likewise.
34443         (df_insn_info_delete): Remove check for null defs and call to
34444         df_scan_free_mws_vec.
34445         (df_insn_rescan): Initialize df_ref and df_mw_hardreg lists to
34446         null rather than df_null_*_rec.
34447         (df_insn_rescan_debug_internal): Likewise, and update null
34448         checks in the same way.  Remove check for null defs.
34449         (df_ref_change_reg_with_loc_1): Fix choice of list for defs.
34450         Move a single element rather doing a full sort.
34451         (df_mw_hardreg_chain_delete_eq_uses): Adjust for new df_mw_hardreg
34452         linking.
34453         (df_notes_rescan): Likewise.  Use a merge rather than a full sort.
34454         Initialize df_ref and df_mw_hardreg lists to null rather than
34455         df_null_*_rec.
34456         (df_ref_compare): Take df_refs as parameter, transferring the
34457         old interface to...
34458         (df_ref_ptr_compare): ...this new function.
34459         (df_sort_and_compress_refs): Update accordingly.
34460         (df_mw_compare): Take df_mw_hardregs as parameter, transferring the
34461         old interface to...
34462         (df_mw_ptr_compare): ...this new function.
34463         (df_sort_and_compress_mws): Update accordingly.
34464         (df_install_refs, df_install_mws): Return a linked list rather than
34465         an array of pointers.
34466         (df_refs_add_to_chains): Assert that old lists are empty rather
34467         than freeing them.
34468         (df_insn_refs_verify): Don't handle null defs speciailly.
34469         * web.c (union_match_dups): Update for new df_ref linking.
34471 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34473         * df.h (df_ref_create, df_ref_remove): Delete.
34474         * df-scan.c (df_ref_create, df_ref_compress_rec): Likewise.
34475         (df_ref_remove): Likewise.
34477 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34479         * df.h (df_single_def, df_single_use): New functions.
34480         * ira.c (find_moveable_pseudos): Use them.
34482 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34484         * df.h (FOR_EACH_INSN_INFO_MW): New macro.
34485         * df-problems.c (df_note_bb_compute): Use it.
34486         * regstat.c (regstat_bb_compute_ri): Likewise.
34488 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34490         * df.h (FOR_EACH_ARTIFICIAL_USE, FOR_EACH_ARTIFICIAL_DEF): New macros.
34491         * cse.c (cse_extended_basic_block): Use them.
34492         * dce.c (mark_artificial_use): Likewise.
34493         * df-problems.c (df_rd_simulate_artificial_defs_at_top): Likewise.
34494         (df_lr_bb_local_compute, df_live_bb_local_compute): Likewise.
34495         (df_chain_remove_problem, df_chain_bb_dump): Likewise.
34496         (df_word_lr_bb_local_compute, df_note_bb_compute): Likewise.
34497         (df_simulate_initialize_backwards): Likewise.
34498         (df_simulate_finalize_backwards): Likewise.
34499         (df_simulate_initialize_forwards): Likewise.
34500         (df_md_simulate_artificial_defs_at_top): Likewise.
34501         * df-scan.c (df_reorganize_refs_by_reg_by_insn): Likewise.
34502         * regrename.c (init_rename_info): Likewise.
34503         * regstat.c (regstat_bb_compute_ri): Likewise.
34504         (regstat_bb_compute_calls_crossed): Likewise.
34506 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34508         * df.h (DF_INSN_INFO_MWS, FOR_EACH_INSN_INFO_DEF): New macros.
34509         (FOR_EACH_INSN_INFO_USE, FOR_EACH_INSN_INFO_EQ_USE): Likewise.
34510         (FOR_EACH_INSN_DEF, FOR_EACH_INSN_USE, FOR_EACH_INSN_EQ_USE): Likewise.
34511         * auto-inc-dec.c (find_inc, merge_in_block): Use them.
34512         * combine.c (create_log_links): Likewise.
34513         * compare-elim.c (find_flags_uses_in_insn): Likewise.
34514         (try_eliminate_compare): Likewise.
34515         * cprop.c (make_set_regs_unavailable, mark_oprs_set): Likewise.
34516         * dce.c (deletable_insn_p, find_call_stack_args): Likewise.
34517         (remove_reg_equal_equiv_notes_for_defs): Likewise.
34518         (reset_unmarked_insns_debug_uses, mark_reg_dependencies): Likewise.
34519         (word_dce_process_block, dce_process_block): Likewise.
34520         * ddg.c (def_has_ccmode_p): Likewise.
34521         * df-core.c (df_bb_regno_first_def_find): Likewise.
34522         (df_bb_regno_last_def_find, df_find_def, df_find_use): Likewise.
34523         * df-problems.c (df_rd_simulate_one_insn): Likewise.
34524         (df_lr_bb_local_compute, df_live_bb_local_compute): Likewise.
34525         (df_chain_remove_problem, df_chain_insn_top_dump): Likewise.
34526         (df_chain_insn_bottom_dump, df_word_lr_bb_local_compute): Likewise.
34527         (df_word_lr_simulate_defs, df_word_lr_simulate_uses): Likewise.
34528         (df_remove_dead_eq_notes, df_note_bb_compute): Likewise.
34529         (df_simulate_find_defs, df_simulate_find_uses): Likewise.
34530         (df_simulate_find_noclobber_defs, df_simulate_defs): Likewise.
34531         (df_simulate_uses, df_md_simulate_one_insn): Likewise.
34532         * df-scan.c (df_reorganize_refs_by_reg_by_insn): Likewise.
34533         * fwprop.c (local_ref_killed_between_p): Likewise.
34534         (all_uses_available_at, free_load_extend): Likewise.
34535         * gcse.c (update_bb_reg_pressure, calculate_bb_reg_pressure): Likewise.
34536         * hw-doloop.c (scan_loop): Likewise.
34537         * ifcvt.c (dead_or_predicable): Likewise.
34538         * init-regs.c (initialize_uninitialized_regs): Likewise.
34539         * ira-lives.c (mark_hard_reg_early_clobbers): Likewise.
34540         (process_bb_node_lives): Likewise.
34541         * ira.c (compute_regs_asm_clobbered, build_insn_chain): Likewise.
34542         (find_moveable_pseudos): Likewise.
34543         * loop-invariant.c (check_dependencies, record_uses): Likewise.
34544         * recog.c (peep2_find_free_register): Likewise.
34545         * ree.c (get_defs): Likewise.
34546         * regstat.c (regstat_bb_compute_ri): Likewise.
34547         (regstat_bb_compute_calls_crossed): Likewise.
34548         * sched-deps.c (find_inc, find_mem): Likewise.
34549         * sel-sched-ir.c (maybe_downgrade_id_to_use): Likewise.
34550         (maybe_downgrade_id_to_use, setup_id_reg_sets): Likewise.
34551         * shrink-wrap.c (requires_stack_frame_p): Likewise.
34552         (prepare_shrink_wrap): Likewise.
34553         * store-motion.c (compute_store_table, build_store_vectors): Likewise.
34554         * web.c (union_defs, pass_web::execute): Likewise.
34555         * config/i386/i386.c (increase_distance, insn_defines_reg): Likewise.
34556         (insn_uses_reg_mem, ix86_ok_to_clobber_flags): Likewise.
34558 2014-06-13  Vladimir Makarov  <vmakarov@redhat.com>
34560         * lra-assign.c (assign_by_spills): Add code to assign vector regs
34561         to inheritance pseudos.
34562         * config/i386/i386.c (ix86_spill_class): Add check on NO_REGS.
34564 2014-06-13  Peter Bergner  <bergner@vnet.ibm.com>
34566         PR target/61415
34567         * config/rs6000/rs6000-builtin.def (BU_MISC_1): Delete.
34568         (BU_MISC_2): Rename to ...
34569         (BU_LDBL128_2): ... this.
34570         * config/rs6000/rs6000.h (RS6000_BTM_LDBL128): New define.
34571         (RS6000_BTM_COMMON): Add RS6000_BTM_LDBL128.
34572         * config/rs6000/rs6000.c (rs6000_builtin_mask_calculate): Handle
34573         RS6000_BTM_LDBL128.
34574         (rs6000_invalid_builtin): Add long double 128-bit builtin support.
34575         (rs6000_builtin_mask_names): Add RS6000_BTM_LDBL128.
34576         * config/rs6000/rs6000.md (unpacktf_0): Remove define)expand.
34577         (unpacktf_1): Likewise.
34578         * doc/extend.texi (__builtin_longdouble_dw0): Remove documentation.
34579         (__builtin_longdouble_dw1): Likewise.
34580         * doc/sourcebuild.texi (longdouble128): Document.
34582 2014-06-13  Jeff Law  <law@redhat.com>
34584         PR rtl-optimization/61094
34585         PR rtl-optimization/61446
34586         * ree.c (combine_reaching_defs): Get the mode for the copy from
34587         the extension insn rather than the defining insn.
34589 2014-06-13  Dehao Chen  <dehao@google.com>
34591         * dwarf2out.c (add_linkage_name): Emit more linkage name.
34593 2014-06-13  Thomas Schwinge  <thomas@codesourcery.com>
34595         * doc/install.texi (--enable-linker-plugin-configure-flags)
34596         (--enable-linker-plugin-flags): Document new flags.
34598 2014-06-13  Martin Jambor  <mjambor@suse.cz>
34600         PR ipa/61186
34601         * ipa-devirt.c (possible_polymorphic_call_targets): Store NULL to
34602         cache_token if returning early.
34604 2014-06-13  Nick Clifton  <nickc@redhat.com>
34606         * config/rx/rx.h (JUMP_ALIGN): Return the log value if user
34607         requested alignment is active.
34608         (LABEL_ALIGN): Likewise.
34609         (LOOP_ALIGN): Likewise.
34611 2014-06-13  Richard Biener  <rguenther@suse.de>
34613         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children):
34614         Rewrite to propagate the VN result into all uses where
34615         possible and to remove stmts becoming dead because of that.
34616         (eliminate): Generalize stmt removal handling, remove in
34617         reverse dominator order to support proper debug stmt
34618         generation.  Update stmts before removing stmts.
34619         * tree-ssa-propagate.c (propagate_tree_value): Remove bogus assert.
34621 2014-06-13  Thomas Preud'homme  <thomas.preudhomme@arm.com>
34623         PR tree-optimization/61375
34624         * tree-ssa-math-opts.c (init_symbolic_number): Cancel optimization if
34625         symbolic number cannot be represented in an uint64_t.
34626         (find_bswap_or_nop_1): Likewise.
34628 2014-06-12  Jan Hubicka  <hubicka@ucw.cz>
34630         * symtab.c (symtab_node::reset_section): New method.
34631         * cgraph.c (cgraph_node_cannot_be_local_p_1): Accept non-local
34632         for localization.
34633         * cgraph.h (reset_section): Declare.
34634         * ipa-inline-analysis.c (do_estimate_growth): Check for comdat groups;
34635         do not consider comdat locals.
34636         * cgraphclones.c (set_new_clone_decl_and_node_flags): Get section
34637         for new symbol.
34638         * ipa-visiblity.c (cgraph_externally_visible_p): Cleanup.
34639         (update_visibility_by_resolution_info): Consider UNDEF; fix checking;
34640         reset sections of symbols dragged out of the comdats.
34641         (function_and_variable_visibility): Reset sections of
34642         localized symbols.
34644 2014-06-12  Jan Hubicka  <hubicka@ucw.cz>
34646         * tree-vect-data-refs.c (vect_can_force_dr_alignment_p): Reorg
34647         to use symtab and decl_binds_to_current_def_p
34648         * tree-vectorizer.c (increase_alignment): Increase alignment
34649         of alias target, too.
34651 2014-06-12  Jakub Jelinek  <jakub@redhat.com>
34653         PR middle-end/61486
34654         * gimplify.c (struct gimplify_omp_ctx): Add distribute field.
34655         (gimplify_adjust_omp_clauses): Don't or in GOVD_LASTPRIVATE
34656         if outer combined construct is distribute.
34657         (gimplify_omp_for): For OMP_DISTRIBUTE set
34658         gimplify_omp_ctxp->distribute.
34659         * omp-low.c (scan_sharing_clauses) <case OMP_CLAUSE_SHARED>: For
34660         GIMPLE_OMP_TEAMS, if decl isn't global in outer context, record
34661         mapping into decl map.
34663 2014-06-12  Jason Merrill  <jason@redhat.com>
34665         * common.opt (fabi-version): Change default to 0.
34667 2014-06-12  Jason Merrill  <jason@redhat.com>
34669         * toplev.c (process_options): Reject -fabi-version=1.
34671 2014-06-12  Jeff Law  <law@redhat.com>
34673         PR tree-optimization/61009
34674         * tree-ssa-threadedge.c (thread_through_normal_block): Correct return
34675         value when we stop processing a block due to problematic PHIs.
34677 2014-06-12  Alan Lawrence  <alan.lawrence@arm.com>
34679         * config/aarch64/arm_neon.h (vmlaq_n_f64, vmlsq_n_f64, vrsrtsq_f64,
34680         vcge_p8, vcgeq_p8, vcgez_p8, vcgez_u8, vcgez_u16, vcgez_u32, vcgez_u64,
34681         vcgezq_p8, vcgezq_u8, vcgezq_u16, vcgezq_u32, vcgezq_u64, vcgezd_u64,
34682         vcgt_p8, vcgtq_p8, vcgtz_p8, vcgtz_u8, vcgtz_u16, vcgtz_u32, vcgtz_u64,
34683         vcgtzq_p8, vcgtzq_u8, vcgtzq_u16, vcgtzq_u32, vcgtzq_u64, vcgtzd_u64,
34684         vcle_p8, vcleq_p8, vclez_p8, vclez_u64, vclezq_p8, vclezd_u64, vclt_p8,
34685         vcltq_p8, vcltz_p8, vcltzq_p8, vcltzd_u64): Remove functions as they
34686         are not in the spec.
34688 2014-06-10  Alan Lawrence  <alan.lawrence@arm.com>
34690         PR target/59843
34691         * config/aarch64/aarch64-modes.def: Add V1DFmode.
34692         * config/aarch64/aarch64.c (aarch64_vector_mode_supported_p):
34693         Support V1DFmode.
34695 2014-06-12  Eric Botcazou  <ebotcazou@adacore.com>
34697         * tree-core.h (DECL_NONALIASED): Use proper spelling in comment.
34699 2014-06-12  Georg-Johann Lay  <avr@gjlay.de>
34701         PR target/61443
34702         * config/avr/avr.md (push<mode>1): Avoid (subreg(mem)) when
34703         loading from address spaces.
34705 2014-06-12  Martin Liska  <mliska@suse.cz>
34707         PR ipa/61462
34708         * ipa-prop.c (ipa_make_edge_direct_to_target): Check that gimple call
34709         statement is reachable.
34711 2014-06-11  Jan Hubicka  <hubicka@ucw.cz>
34713         * symtab.c (section_hash): New hash.
34714         (symtab_unregister_node): Clear section before freeing.
34715         (hash_section_hash_entry): New haser.
34716         (eq_sections): New function.
34717         (symtab_node::set_section_for_node): New method.
34718         (set_section_1): Update.
34719         (symtab_node::set_section): Take string instead of tree as parameter.
34720         (symtab_resolve_alias): Update.
34721         * cgraph.h (section_hash_entry_d): New structure.
34722         (section_hash_entry): New typedef.
34723         (cgraph_node): Change comdat_group_ to x_comdat_group,
34724         change section_ to x_section and turn into section_hash_entry;
34725         update accestors; put set_section_for_node offline.
34726         * tree.c (decl_section_name): Turn into string.
34727         (set_decl_section_name): Change parameter to be string.
34728         * tree.h (decl_section_name, set_decl_section_name): Update prototypes.
34729         * sdbout.c (sdbout_one_type): Update.
34730         * tree-vect-data-refs.c (vect_can_force_dr_alignment_p): Update.
34731         * varasm.c (IN_NAMED_SECTION, get_named_section,
34732         resolve_unique_section, hot_function_section, get_named_text_section,
34733         USE_SELECT_SECTION_FOR_FUNCTIONS, default_function_rodata_section,
34734         make_decl_rtl, default_unique_section): Update.
34735         * config/c6x/c6x.c (c6x_in_small_data_p): Update.
34736         (c6x_elf_unique_section): Update.
34737         * config/nios2/nios2.c (nios2_in_small_data_p): Update.
34738         * config/pa/pa.c (pa_function_section): Update.
34739         * config/pa/pa.h (IN_NAMED_SECTION_P): Update.
34740         * config/ia64/ia64.c (ia64_in_small_data_p): Update.
34741         * config/arc/arc.c (arc_in_small_data_p): Update.
34742         * config/arm/unknown-elf.h (IN_NAMED_SECTION_P): Update.
34743         * config/mcore/mcore.c (mcore_unique_section): Update.
34744         * config/mips/mips.c (mips16_build_function_stub): Update.
34745         (mips16_build_call_stub): Update.
34746         (mips_function_rodata_section): Update.
34747         (mips_in_small_data_p): Update.
34748         * config/score/score.c (score_in_small_data_p): Update.
34749         * config/rx/rx.c (rx_in_small_data): Update.
34750         * config/rs6000/rs6000.c (rs6000_elf_in_small_data_p): Update.
34751         (rs6000_xcoff_asm_named_section): Update.
34752         (rs6000_xcoff_unique_section): Update.
34753         * config/frv/frv.c (frv_string_begins_with): Update.
34754         (frv_in_small_data_p): Update.
34755         * config/v850/v850.c (v850_encode_data_area): Update.
34756         * config/bfin/bfin.c (DECL_SECTION_NAME): Update.
34757         (bfin_handle_l1_data_attribute): Update.
34758         (bfin_handle_l2_attribute): Update.
34759         * config/mep/mep.c (mep_unique_section): Update.
34760         * config/microblaze/microblaze.c (microblaze_elf_in_small_data_p):
34761         Update.
34762         * config/h8300/h8300.c (h8300_handle_eightbit_data_attribute): Update.
34763         (h8300_handle_tiny_data_attribute): Update.
34764         * config/m32r/m32r.c (m32r_in_small_data_p): Update.
34765         (m32r_in_small_data_p): Update.
34766         * config/alpha/alpha.c (alpha_in_small_data_p): Update.
34767         * config/i386/i386.c (ix86_in_large_data_p): Update.
34768         * config/i386/winnt.c (i386_pe_unique_section): Update.
34769         * config/darwin.c (darwin_function_section): Update.
34770         * config/lm32/lm32.c (lm32_in_small_data_p): Update.
34771         * tree-emutls.c (get_emutls_init_templ_addr): Update.
34772         (new_emutls_decl): Update.
34773         * lto-cgraph.c (lto_output_node, input_node, input_varpool_node,
34774         input_varpool_node): Update.
34775         (ead_string_cst): Turn to ...
34776         (read_string): ... this one.
34777         * dwarf2out.c (secname_for_decl): Update.
34778         * asan.c (asan_protect_global): Update.
34780 2014-06-11  DJ Delorie  <dj@redhat.com>
34782         * config/rx/rx.h (FUNCTION_BOUNDARY): Adjust for RX100/200 4-byte
34783         cache lines.
34784         * config/rx/rx.c (rx_option_override): Likewise.
34785         (rx_align_for_label): Likewise.
34787         * config/rx/rx.c (rx_max_skip_for_label): Don't skip anything if -Os.
34789 2014-06-11  Maciej W. Rozycki  <macro@codesourcery.com>
34791         * config/mmix/mmix-protos.h (mmix_asm_output_source_line): Remove
34792         prototype.
34794 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34796         * common.md: New file.
34797         * doc/md.texi: Update description of generic, machine-independent
34798         constraints.
34799         * config/s390/constraints.md (e): Delete.
34800         * Makefile.in (md_file): Include common.md.
34801         * config/m32c/t-m32c (md_file): Likewise.
34802         * genpreds.c (general_mem): New array.
34803         (generic_constraint_letters): Remove constraints now defined by
34804         common.md.
34805         (add_constraint): Map TARGET_MEM_CONSTRAINT to general_mem.
34806         Allow the first character to be '<' or '>' as well.
34807         * genoutput.c (general_mem): New array.
34808         (indep_constraints): Remove constraints now defined by common.md.
34809         (note_constraint): Map TARGET_MEM_CONSTRAINT to general_mem.
34810         Remove special handling of 'm'.
34811         * ira-costs.c (record_reg_classes): Remove special handling of
34812         constraints now defined by common.md.
34813         * ira.c (ira_setup_alts, ira_get_dup_out_num): Likewise.
34814         * ira-lives.c (single_reg_class): Likewise.
34815         (ira_implicitly_set_insn_hard_regs): Likewise.
34816         * lra-constraints.c (reg_class_from_constraints): Likewise.
34817         (process_alt_operands, process_address, curr_insn_transform): Likewise.
34818         * postreload.c (reload_cse_simplify_operands): Likewise.
34819         * reload.c (push_secondary_reload, scratch_reload_class)
34820         (find_reloads, alternative_allows_const_pool_ref): Likewise.
34821         * reload1.c (maybe_fix_stack_asms): Likewise.
34822         * targhooks.c (default_secondary_reload): Likewise.
34823         * stmt.c (parse_output_constraint): Likewise.
34824         * recog.c (preprocess_constraints): Likewise.
34825         (constrain_operands, peep2_find_free_register): Likewise.
34826         (asm_operand_ok): Likewise, but add a comment saying why 'o'
34827         must be handled specially.
34829 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34831         * system.h (CONST_DOUBLE_OK_FOR_CONSTRAINT_P): Poison.
34832         * genpreds.c (have_const_dbl_constraints): Delete.
34833         (add_constraint): Don't set it.
34834         (write_tm_preds_h): Don't call CONST_DOUBLE_OK_FOR_CONSTRAINT_P.
34835         * ira-costs.c (record_reg_classes): Handle CONST_INT and CONST_DOUBLE
34836         constraints using the lookup_constraint logic.
34837         * ira-lives.c (single_reg_class): Likewise.
34838         * ira.c (ira_setup_alts): Likewise.
34839         * lra-constraints.c (process_alt_operands): Likewise.
34840         * recog.c (asm_operand_ok, constrain_operands): Likewise.
34841         * reload.c (find_reloads): Likewise.
34843 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34845         * genpreds.c (const_int_start, const_int_end): New variables.
34846         (choose_enum_order): Output CONST_INT constraints before memory
34847         constraints.
34848         (write_tm_preds_h): Always define insn_const_int_ok_for_constraint.
34849         Add CT_CONST_INT.
34850         * ira-costs.c (record_reg_classes): Handle CT_CONST_INT.
34851         * ira.c (ira_setup_alts): Likewise.
34852         * lra-constraints.c (process_alt_operands): Likewise.
34853         * recog.c (asm_operand_ok, preprocess_constraints): Likewise.
34854         * reload.c (find_reloads): Likewise.
34856 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34858         * recog.h (operand_alternative): Remove offmem_ok, nonffmem_ok,
34859         decmem_ok and incmem_ok.  Reformat other bitfields for consistency.
34860         * recog.c (preprocess_constraints): Update accordingly.
34862 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34864         * system.h (REG_CLASS_FROM_CONSTRAINT): Poison.
34865         (REG_CLASS_FOR_CONSTRAINT, EXTRA_CONSTRAINT_STR): Likewise.
34866         (EXTRA_MEMORY_CONSTRAINT, EXTRA_ADDRESS_CONSTRAINT): Likewise.
34867         * genpreds.c (print_type_tree): New function.
34868         (write_tm_preds_h): Remove REG_CLASS_FROM_CONSTRAINT,
34869         REG_CLASS_FOR_CONSTRAINT, EXTRA_MEMORY_CONSTRAINT,
34870         EXTRA_ADDRESS_CONSTRAINT and EXTRA_CONSTRAINT_STR.
34871         Write out enum constraint_type and get_constraint_type.
34872         * lra-constraints.c (satisfies_memory_constraint_p): Take a
34873         constraint_num rather than a constraint string.
34874         (satisfies_address_constraint_p): Likewise.
34875         (reg_class_from_constraints): Avoid old constraint macros.
34876         (process_alt_operands, process_address_1): Likewise.
34877         (curr_insn_transform): Likewise.
34878         * ira-costs.c (record_reg_classes): Likewise.
34879         (record_operand_costs): Likewise.
34880         * ira-lives.c (single_reg_class): Likewise.
34881         (ira_implicitly_set_insn_hard_regs): Likewise.
34882         * ira.c (ira_setup_alts, ira_get_dup_out_num): Likewise.
34883         * postreload.c (reload_cse_simplify_operands): Likewise.
34884         * recog.c (asm_operand_ok, preprocess_constraints): Likewise.
34885         (constrain_operands, peep2_find_free_register): Likewise.
34886         * reload.c (push_secondary_reload, scratch_reload_class): Likewise.
34887         (find_reloads, alternative_allows_const_pool_ref): Likewise.
34888         * reload1.c (maybe_fix_stack_asms): Likewise.
34889         * stmt.c (parse_output_constraint, parse_input_constraint): Likewise.
34890         * targhooks.c (default_secondary_reload): Likewise.
34891         * config/m32c/m32c.c (m32c_matches_constraint_p): Avoid reference
34892         to EXTRA_CONSTRAINT_STR.
34893         * config/sparc/constraints.md (U): Likewise REG_CLASS_FROM_CONSTRAINT.
34895 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34897         * genpreds.c (write_constraint_satisfied_p_1): Replace with...
34898         (write_constraint_satisfied_p_array): ...this new function.
34899         (write_tm_preds_h): Replace write_constraint_satisfied_p_1 with
34900         an array.
34901         (write_insn_preds_c): Update accordingly.
34903 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34905         * genpreds.c (write_lookup_constraint): Rename to...
34906         (write_lookup_constraint_1): ...this.
34907         (write_lookup_constraint_array): New function.
34908         (write_tm_preds_h): Define lookup_constraint as an inline function
34909         that uses write_lookup_constraint_array where possible.
34910         (write_insn_preds_c): Update for the changes above.
34912 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34914         * doc/md.texi (regclass_for_constraint): Rename to...
34915         (reg_class_for_constraint): ...this.
34916         * genpreds.c (num_constraints, enum_order, register_start)
34917         (register_end, satisfied_start, memory_start, memory_end)
34918         (address_start, address_end): New variables.
34919         (add_constraint): Count the number of constraints.
34920         (choose_enum_order): New function.
34921         (write_enum_constraint_num): Iterate over enum_order.
34922         (write_regclass_for_constraint): Rename to...
34923         (write_reg_class_for_constraint_1): ...this and update output
34924         accordingly.
34925         (write_constraint_satisfied_p): Rename to...
34926         (write_constraint_satisfied_p_1): ...this and update output
34927         accordingly.  Do nothing if all extra constraints are register
34928         constraints.
34929         (write_insn_extra_memory_constraint): Delete.
34930         (write_insn_extra_address_constraint): Delete.
34931         (write_range_function): New function.
34932         (write_tm_preds_h): Define constraint_satisfied_p and
34933         reg_class_for_constraint as inline functions that do a range check
34934         before calling the out-of-line function.  Use write_range_function
34935         to implement insn_extra_{register,memory,address}_constraint,
34936         the first of which is new.
34937         (write_insn_preds_c): Update after above changes to write_* functions.
34938         (main): Call choose_enum_order.
34940 2014-06-11  Thomas Preud'homme  <thomas.preudhomme@arm.com>
34942         PR tree-optimization/61306
34943         * tree-ssa-math-opts.c (struct symbolic_number): Store type of
34944         expression instead of its size.
34945         (do_shift_rotate): Adapt to change in struct symbolic_number. Return
34946         false to prevent optimization when the result is unpredictable due to
34947         arithmetic right shift of signed type with highest byte is set.
34948         (verify_symbolic_number_p): Adapt to change in struct symbolic_number.
34949         (init_symbolic_number): Likewise.
34950         (find_bswap_or_nop_1): Likewise. Return NULL to prevent optimization
34951         when the result is unpredictable due to sign extension.
34953 2014-06-11  Terry Guo  <terry.guo@arm.com>
34955         * config/arm/arm.md (*thumb1_adddi3): Move into new file thumb1.md.
34956         (*thumb1_addsi3): Ditto.
34957         (*thumb_subdi3): Ditto.
34958         (thumb1_subsi3_insn): Ditto.
34959         (*thumb_mulsi3): Ditto.
34960         (*thumb_mulsi3_v6): Ditto.
34961         (*thumb1_andsi3_insn): Ditto.
34962         (thumb1_bicsi3): Ditto.
34963         (*thumb1_iorsi3_insn): Ditto.
34964         (*thumb1_xorsi3_insn): Ditto.
34965         (*thumb1_ashlsi3): Ditto.
34966         (*thumb1_ashrsi3): Ditto.
34967         (*thumb1_lshrsi3): Ditto.
34968         (*thumb1_rotrsi3): Ditto.
34969         (*thumb1_negdi2): Ditto.
34970         (*thumb1_negsi2): Ditto.
34971         (*thumb1_abssi2): Ditto.
34972         (*thumb1_neg_abssi2): Ditto.
34973         (*thumb1_one_cmplsi2): Ditto.
34974         (*thumb1_zero_extendhisi2): Ditto.
34975         (*thumb1_zero_extendqisi2): Ditto.
34976         (*thumb1_zero_extendqisi2_v6): Ditto.
34977         (thumb1_extendhisi2): Ditto.
34978         (thumb1_extendqisi2): Ditto.
34979         (*thumb1_movdi_insn): Ditto.
34980         (*thumb1_movsi_insn): Ditto.
34981         (*thumb1_movhi_insn): Ditto.
34982         (thumb_movhi_clobber): Ditto.
34983         (*thumb1_movqi_insn): Ditto.
34984         (*thumb1_movhf): Ditto.
34985         (*thumb1_movsf_insn): Ditto.
34986         (*thumb_movdf_insn): Ditto.
34987         (movmem12b): Ditto.
34988         (movmem8b): Ditto.
34989         (cbranchqi4): Ditto.
34990         (cbranchsi4_insn): Ditto.
34991         (cbranchsi4_scratch): Ditto.
34992         (*negated_cbranchsi4): Ditto.
34993         (*tbit_cbranch): Ditto.
34994         (*tlobits_cbranch): Ditto.
34995         (*tstsi3_cbranch): Ditto.
34996         (*cbranchne_decr1): Ditto.
34997         (*addsi3_cbranch): Ditto.
34998         (*addsi3_cbranch_scratch): Ditto.
34999         (*thumb_cmpdi_zero): Ditto.
35000         (cstoresi_eq0_thumb1): Ditto.
35001         (cstoresi_ne0_thumb1): Ditto.
35002         (*cstoresi_eq0_thumb1_insn): Ditto.
35003         (*cstoresi_ne0_thumb1_insn): Ditto.
35004         (cstoresi_nltu_thumb1): Ditto.
35005         (cstoresi_ltu_thumb1): Ditto.
35006         (thumb1_addsi3_addgeu): Ditto.
35007         (*thumb_jump): Ditto.
35008         (*call_reg_thumb1_v5): Ditto.
35009         (*call_reg_thumb1): Ditto.
35010         (*call_value_reg_thumb1_v5): Ditto.
35011         (*call_value_reg_thumb1): Ditto.
35012         (*call_insn): Ditto.
35013         (*call_value_insn): Ditto.
35014         (thumb1_casesi_internal_pic): Ditto.
35015         (thumb1_casesi_dispatch): Ditto.
35016         (*thumb1_indirect_jump): Ditto.
35017         (prologue_thumb1_interwork): Ditto.
35018         (*epilogue_insns): Ditto.
35019         (consttable_1): Ditto.
35020         (consttable_2): Ditto.
35021         (tablejump): Ditto.
35022         (*thumb1_tablejump): Ditto.
35023         (thumb_eh_return): Ditto.
35024         (define_peephole2): Two of them are thumb1 only and got moved into
35025         new file thumb1.md.
35026         (define_split): Six of them are thumb1 only and got moved into new
35027         file thumb1.md.
35028         * config/arm/thumb1.md: New file comprised of above thumb1 only
35029         patterns.
35031 2014-06-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
35033         * config.gcc (aarch64*-*-*): Add arm_acle.h to extra headers.
35034         * Makefile.in (TEXI_GCC_FILES): Add aarch64-acle-intrinsics.texi to
35035         dependencies.
35036         * config/aarch64/aarch64-builtins.c (AARCH64_CRC32_BUILTINS): Define.
35037         (aarch64_crc_builtin_datum): New struct.
35038         (aarch64_crc_builtin_data): New.
35039         (aarch64_init_crc32_builtins): New function.
35040         (aarch64_init_builtins): Initialise CRC32 builtins when appropriate.
35041         (aarch64_crc32_expand_builtin): New.
35042         (aarch64_expand_builtin): Add CRC32 builtin expansion case.
35043         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Define
35044         __ARM_FEATURE_CRC32 when appropriate.
35045         (TARGET_CRC32): Define.
35046         * config/aarch64/aarch64.md (UNSPEC_CRC32B, UNSPEC_CRC32H,
35047         UNSPEC_CRC32W, UNSPEC_CRC32X, UNSPEC_CRC32CB, UNSPEC_CRC32CH,
35048         UNSPEC_CRC32CW, UNSPEC_CRC32CX): New unspec values.
35049         (aarch64_<crc_variant>): New pattern.
35050         * config/aarch64/arm_acle.h: New file.
35051         * config/aarch64/iterators.md (CRC): New int iterator.
35052         (crc_variant, crc_mode): New int attributes.
35053         * doc/aarch64-acle-intrinsics.texi: New file.
35054         * doc/extend.texi (aarch64): Document aarch64 ACLE intrinsics.
35055         Include aarch64-acle-intrinsics.texi.
35057 2014-06-11  Evgeny Stupachenko  <evstupac@gmail.com>
35059         * tree-vect-data-refs.c (vect_grouped_store_supported): New
35060         check for stores group of length 3.
35061         (vect_permute_store_chain): New permutations for stores group of
35062         length 3.
35063         * tree-vect-stmts.c (vect_model_store_cost): Change cost
35064         of vec_perm_shuffle for the new permutations.
35066 2014-06-11  Jan Hubicka  <hubicka@ucw.cz>
35068         * ipa-visibility.c (function_and_variable_visibility): Disable virtual
35069         table rewriting temporarily on targets not supporting ONE_ONLY.
35071 2014-06-11  Richard Biener  <rguenther@suse.de>
35073         PR middle-end/61437
35074         Revert
35075         2014-06-04  Richard Biener  <rguenther@suse.de>
35077         * tree.h (may_be_aliased): Trust TREE_ADDRESSABLE from
35078         TREE_PUBLIC and DECL_EXTERNAL decls.
35080 2014-06-10  Jan Hubicka  <hubicka@ucw.cz>
35082         * varasm.c (set_implicit_section): New function.
35083         (resolve_unique_section): Use it to set implicit section
35084         for aliases, too.
35085         (get_named_text_section): Use symtab_get_node (decl)->implicit_section
35086         (default_function_section): Likewise.
35087         (decl_binds_to_current_def_p): Constify argument.
35088         * varasm.h (decl_binds_to_current_def_p): Update prototype.
35089         * asan.c (asan_protect_global): Use
35090         symtab_get_node (decl)->implicit_section.
35091         * symtab.c (dump_symtab_base): Dump implicit sections.
35092         (verify_symtab_base): Verify sanity of sectoins and comdats.
35093         (symtab_resolve_alias): Alias share the section of its target.
35094         (set_section_1): New function.
35095         (symtab_node::set_section): Move here, recurse to aliases.
35096         (verify_symtab): Check for duplicated symtab lists.
35097         * tree-core.h (implicit_section_name_p): Remove.
35098         * tree-vect-data-refs.c: Include varasm.h.
35099         (vect_can_force_dr_alignment_p): Fix conditional on when
35100         decl bints to current definition; use
35101         symtab_get_node (decl)->implicit_section.
35102         * cgraph.c (cgraph_make_node_local_1): Fix section set.
35103         * cgraph.h (struct symtab_node): Add implicit_section.
35104         (set_section): Rename to ...
35105         (set_section_for_node): ... this one.
35106         (set_section): Declare.
35107         * tree.h (DECL_HAS_IMPLICIT_SECTION_NAME_P): Remove.
35108         * lto-cgraph.c (lto_output_node, lto_output_varpool_node,
35109         input_overwrite_node, input_varpool_node): Stream implicit_section.
35110         * ipa.c (symtab_remove_unreachable_nodes): Do not check symtab before
35111         removal; it will fail in LTO.
35113 2014-06-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
35115         * config/aarch64/aarch64-simd.md (move_lo_quad_<mode>):
35116         Change second alternative type to f_mcr.
35117         * config/aarch64/aarch64.md (*movsi_aarch64): Change 11th
35118         and 12th alternatives' types to f_mcr and f_mrc.
35119         (*movdi_aarch64): Same for 12th and 13th alternatives.
35120         (*movsf_aarch64): Change 9th alternatives' type to mov_reg.
35121         (aarch64_movtilow_tilow): Change type to fmov.
35123 2014-06-10  Jiong Wang  <jiong.wang@arm.com>
35125         * config/aarch64/aarch64.c (aarch64_save_or_restore_fprs)
35126         (aarch64_save_or_restore_callee_save_registers): Fix layout.
35128 2014-06-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
35130         * config/aarch64/aarch64-simd.md (aarch64_sqdmulh_lane<mode>):
35131         New expander.
35132         (aarch64_sqrdmulh_lane<mode>): Likewise.
35133         (aarch64_sq<r>dmulh_lane<mode>): Rename to...
35134         (aarch64_sq<r>dmulh_lane<mode>_internal): ...this.
35135         (aarch64_sqdmulh_laneq<mode>): New expander.
35136         (aarch64_sqrdmulh_laneq<mode>): Likewise.
35137         (aarch64_sq<r>dmulh_laneq<mode>): Rename to...
35138         (aarch64_sq<r>dmulh_laneq<mode>_internal): ...this.
35139         (aarch64_sqdmulh_lane<mode>): New expander.
35140         (aarch64_sqrdmulh_lane<mode>): Likewise.
35141         (aarch64_sq<r>dmulh_lane<mode>): Rename to...
35142         (aarch64_sq<r>dmulh_lane<mode>_internal): ...this.
35143         (aarch64_sqdmlal_lane<mode>): Add lane flip for big-endian.
35144         (aarch64_sqdmlal_laneq<mode>): Likewise.
35145         (aarch64_sqdmlsl_lane<mode>): Likewise.
35146         (aarch64_sqdmlsl_laneq<mode>): Likewise.
35147         (aarch64_sqdmlal2_lane<mode>): Likewise.
35148         (aarch64_sqdmlal2_laneq<mode>): Likewise.
35149         (aarch64_sqdmlsl2_lane<mode>): Likewise.
35150         (aarch64_sqdmlsl2_laneq<mode>): Likewise.
35151         (aarch64_sqdmull_lane<mode>): Likewise.
35152         (aarch64_sqdmull_laneq<mode>): Likewise.
35153         (aarch64_sqdmull2_lane<mode>): Likewise.
35154         (aarch64_sqdmull2_laneq<mode>): Likewise.
35156 2014-06-10  Richard Biener  <rguenther@suse.de>
35158         PR tree-optimization/61438
35159         * tree-ssa-pre.c (eliminate_dom_walker): Add do_pre member.
35160         (eliminate_dom_walker::before_dom_children): Only try to inhibit
35161         insertion of IVs if running PRE.
35162         (eliminate): Adjust.
35163         (pass_pre::execute): Likewise.
35164         (pass_fre::execute): Likewise.
35166 2014-06-10  Richard Biener  <rguenther@suse.de>
35168         PR middle-end/61456
35169         * tree-ssa-alias.c (nonoverlapping_component_refs_of_decl_p):
35170         Do not use the main variant for the type comparison.
35171         (ncr_compar): Likewise.
35172         (nonoverlapping_component_refs_p): Likewise.
35174 2014-06-10  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35176         * config/aarch64/aarch64.c (aarch64_save_or_restore_fprs): Fix
35177         REG_CFA_RESTORE mode.
35179 2014-06-10  Evgeny Stupachenko  <evstupac@gmail.com>
35181         * config/i386/i386.c (expand_vec_perm_pblendv): New.
35182         * config/i386/i386.c (ix86_expand_vec_perm_const_1): Use
35183         expand_vec_perm_pblendv.
35185 2014-06-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
35187         * doc/arm-acle-intrinsics.texi: Specify when CRC32 intrinsics are
35188         available.
35189         Simplify description of __crc32d and __crc32cd intrinsics.
35190         * doc/extend.texi (ARM ACLE Intrinsics): Remove comment about CRC32
35191         availability.
35193 2014-06-10  Thomas Schwinge  <thomas@codesourcery.com>
35195         PR lto/61334
35196         * configure.ac: Use gcc_AC_CHECK_DECLS to check for strnlen prototype.
35197         * config.in: Regenerate.
35198         * configure: Likewise.
35200 2014-06-10  Jan Hubicka  <hubicka@ucw.cz>
35202         * ipa-reference.c (is_proper_for_analysis): Exclude addressable
35203         and public vars.
35204         (intersect_static_var_sets): Remove.
35205         (propagate): Do not prune local statics.
35207 2014-06-10  Jakub Jelinek  <jakub@redhat.com>
35209         PR fortran/60928
35210         * omp-low.c (lower_rec_input_clauses) <case OMP_CLAUSE_LASTPRIVATE>:
35211         Set lastprivate_firstprivate even if omp_private_outer_ref
35212         langhook returns true.
35213         <case OMP_CLAUSE_REDUCTION>: When calling omp_clause_default_ctor
35214         langhook, call unshare_expr on new_var and call
35215         build_outer_var_ref to get the last argument.
35217 2014-06-10  Marek Polacek  <polacek@redhat.com>
35219         PR c/60988
35220         * doc/extend.texi: Add cindex for transparent_union.
35222 2014-06-09  Thomas Preud'homme  <thomas.preudhomme@arm.com>
35224         * tree-ssa-math-opts.c (find_bswap_or_nop_load): Check return value of
35225         init_symbolic_number ().
35227 2014-05-18  John David Anglin  <danglin@gcc.gnu.org>
35229         PR middle-end/61141
35230         * emit-rtl.c (reset_all_used_flags): In a sequence, check that
35231         XVECEXP (pat, 0, i) is an INSN before calling reset_insn_used_flags.
35232         (verify_rtl_sharing): Likewise.
35234 2014-06-09  Marc Glisse  <marc.glisse@inria.fr>
35236         PR c++/54442
35237         * tree.c (build_qualified_type): Use a canonical type for
35238         TYPE_CANONICAL.
35240 2014-06-09  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
35242         * config/arm/arm-modes.def: Remove XFmode.
35244 2014-06-09  Alan Lawrence  <alan.lawrence@arm.com>
35246         PR target/61062
35247         * config/arm/arm_neon.h (vtrn_s8, vtrn_s16, vtrn_u8, vtrn_u16, vtrn_p8,
35248         vtrn_p16, vtrn_s32, vtrn_f32, vtrn_u32, vtrnq_s8, vtrnq_s16, vtrnq_s32,
35249         vtrnq_f32, vtrnq_u8, vtrnq_u16, vtrnq_u32, vtrnq_p8, vtrnq_p16,
35250         vzip_s8, vzip_s16, vzip_u8, vzip_u16, vzip_p8, vzip_p16, vzip_s32,
35251         vzip_f32, vzip_u32, vzipq_s8, vzipq_s16, vzipq_s32, vzipq_f32,
35252         vzipq_u8, vzipq_u16, vzipq_u32, vzipq_p8, vzipq_p16, vuzp_s8, vuzp_s16,
35253         vuzp_s32, vuzp_f32, vuzp_u8, vuzp_u16, vuzp_u32, vuzp_p8, vuzp_p16,
35254         vuzpq_s8, vuzpq_s16, vuzpq_s32, vuzpq_f32, vuzpq_u8, vuzpq_u16,
35255         vuzpq_u32, vuzpq_p8, vuzpq_p16): Correct mask for bigendian.
35257 2014-06-09  Jan Hubicka  <hubicka@ucw.cz>
35259         * tree-core.h (tree_decl_with_vis): Remove section_name.
35261 2014-06-09  Kito Cheng  <kito@0xlab.org>
35263         * ira.c (ira): Don't call init_caller_save if LRA enabled
35264         since LRA use its own infrastructure to handle that.
35266 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35268         * symtab.c (dump_symtab_base): Update dumping.
35269         (symtab_make_decl_local): Clear only DECL_COMDAT.
35270         * tree-vect-data-refs.c (Check that variable is static before
35271         tampering with sections.
35272         * cgraphclones.c (duplicate_thunk_for_node): Do not clear section name.
35273         (cgraph_create_virtual_clone): Likewise.
35274         * tree.c (decl_comdat_group, decl_comdat_group_id): Constify argument.
35275         (decl_section_name, set_decl_section_name): New accessors.
35276         (find_decls_types_r): Do not walk section name
35277         * tree.h (DECL_SECTION_NAME): Implement using decl_section_name.
35278         (decl_comdat_group, decl_comdat_group_id): Constify.
35279         (decl_section_name, set_decl_section_name): Update.
35280         * varpool.c (varpool_finalize_named_section_flags): Use get_section.
35281         * cgraph.c (cgraph_add_thunk): Reset node instead of rebuilding.
35282         (cgraph_make_node_local_1): Clear section and comdat group.
35283         * cgraph.h (set_comdat_group): Sanity check.
35284         (get_section, set_section): New.
35285         * ipa-comdats.c (ipa_comdats): Use get_section.
35286         * ipa.c (ipa_discover_readonly_nonaddressable_var): Likewise.
35287         * lto-streamer-out.c: Do not follow section names.
35288         * c-family/c-common.c (handle_section_attribute): Update.
35289         * lto-cgraph.c (lto_output_node): Output section.
35290         (lto_output_varpool_node): Likewise.
35291         (read_comdat_group): Rename to ...
35292         (read_identifier): ... this one.
35293         (read_string_cst): New function.
35294         (input_node, input_varpool_node): Input section names.
35295         * tree-emutls.c (get_emutls_init_templ_addr): Update.
35296         (new_emutls_decl): Update.
35297         (secname_for_decl): Check section names only of static vars.
35298         * config/mep/mep.c (mep_unique_section): Use set_decl_section_name.
35299         * config/i386/winnt.c (i386_pe_unique_section): Likewise.
35300         * config/i386/i386.c (x86_64_elf_unique_section): Likewise.
35301         * config/c6x/c6x.c (c6x_elf_unique_section): Likewise.
35302         * config/rs6000/rs6000.c (rs6000_xcoff_unique_section): Likewise.
35303         * config/mcore/mcore.c (mcore_unique_section): Likewise.
35304         * config/mips/mips.c (mips16_build_function_stub): Likewise.
35305         * config/v850/v850.c (v850_insert_attributes): Likewise.
35306         * config/h8300/h8300.c (h8300_handle_eightbit_data_attribute):
35307         Likewise.
35308         (h8300_handle_tiny_data_attribute): Likewise.
35309         * config/bfin/bfin.c (bfin_handle_l1_text_attribute): Likewise.
35310         (bfin_handle_l2_attribute): Likewise.
35312 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35314         * symtab.c (symtab_nonoverwritable_alias): Copy VIRTUAL flag;
35315         remove static initializer.
35317 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35319         * varasm.c (use_blocks_for_decl_p): Check symbol table
35320         instead of alias attribute.
35321         (place_block_symbol): Recurse on aliases.
35323 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35325         * ipa-visibility.c: Include varasm.h
35326         (can_replace_by_local_alias): Ceck decl_binds_to_current_def_p.
35328 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35330         * cgraphunit.c (assemble_thunks_and_aliases): Expand thunks before
35331         outputting aliases.
35333 2014-06-07  Steven Bosscher  <steven@gcc.gnu.org>
35335         * gcse.c (can_assign_to_reg_without_clobbers_p): Do not let pointers
35336         from test_insn into GGC space escape via SET_SRC.
35338 2014-06-07  Eric Botcazou  <ebotcazou@adacore.com>
35340         * tree-ssa-tail-merge.c (same_succ_hash): Hash the static chain of a
35341         call statement, if any.
35342         (gimple_equal_p) <GIMPLE_CALL>: Compare the static chain of the call
35343         statements, if any.  Tidy up.
35345 2014-06-06  Michael Meissner  <meissner@linux.vnet.ibm.com>
35347         PR target/61431
35348         * config/rs6000/vsx.md (VSX_LE): Split VSX_D into 2 separate
35349         iterators, VSX_D that handles 64-bit types, and VSX_LE that
35350         handles swapping the two 64-bit double words on little endian
35351         systems.  Include V1TImode and optionally TImode in VSX_LE so that
35352         these types are properly swapped.  Change all of the insns and
35353         splits that do the 64-bit swaps to use VSX_LE.
35354         (vsx_le_perm_load_<mode>): Likewise.
35355         (vsx_le_perm_store_<mode>): Likewise.
35356         (splitters for little endian memory operations): Likewise.
35357         (vsx_xxpermdi2_le_<mode>): Likewise.
35358         (vsx_lxvd2x2_le_<mode>): Likewise.
35359         (vsx_stxvd2x2_le_<mode>): Likewise.
35361 2014-06-06  Uros Bizjak  <ubizjak@gmail.com>
35363         PR target/61423
35364         * config/i386/i386.md (*floatunssi<mode>2_i387_with_xmm): New
35365         define_insn_and_split pattern, merged from *floatunssi<mode>2_1
35366         and corresponding splitters.  Zero extend general register
35367         or memory input operand to XMM temporary.  Enable for
35368         TARGET_SSE2 and TARGET_INTER_UNIT_MOVES_TO_VEC only.
35369         (floatunssi<mode>2): Update expander predicate.
35371 2014-06-06  Vladimir Makarov  <vmakarov@redhat.com>
35373         PR rtl-optimization/61325
35374         * lra-constraints.c (process_address_1): Check scale equal to one
35375         to prevent transformation: base + scale * index => base + new_reg.
35377 2014-06-06  Richard Biener  <rguenther@suse.de>
35379         PR tree-optimization/59299
35380         * tree-ssa-sink.c (all_immediate_uses_same_place): Work on
35381         a def operand.
35382         (nearest_common_dominator_of_uses): Likewise.
35383         (statement_sink_location): Adjust.  Support sinking loads.
35385 2014-06-06  Martin Jambor  <mjambor@suse.cz>
35387         * ipa-prop.c (get_place_in_agg_contents_list): New function.
35388         (build_agg_jump_func_from_list): Likewise.
35389         (determine_known_aggregate_parts): Renamed to
35390         determine_locally_known_aggregate_parts.  Moved some functionality
35391         to the two functions above, removed bound checks.
35393 2014-06-06  James Greenhalgh  <james.greenhalgh@arm.com>
35395         * config/aarch64/aarch64-protos.h (aarch64_expand_movmem): New.
35396         * config/aarch64/aarch64.c (aarch64_move_pointer): New.
35397         (aarch64_progress_pointer): Likewise.
35398         (aarch64_copy_one_part_and_move_pointers): Likewise.
35399         (aarch64_expand_movmen): Likewise.
35400         * config/aarch64/aarch64.h (MOVE_RATIO): Set low.
35401         * config/aarch64/aarch64.md (movmem<mode>): New.
35403 2014-06-06  Bingfeng Mei  <bmei@broadcom.com>
35405         * targhooks.c (default_add_stmt_cost): Call target specific
35406         hook instead of default one.
35408 2014-06-06  Thomas Preud'homme  <thomas.preudhomme@arm.com>
35410         * ChangeLog (2014-05-23): Fix ChangeLog entry to refer to target
35411         endianness instead of host endianness.
35412         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Likewise in dumps and
35413         comments.
35415 2014-06-06  Eric Botcazou  <ebotcazou@adacore.com>
35417         PR debug/53927
35418         * function.c (instantiate_decls): Process the saved static chain.
35419         (expand_function_start): If not optimizing, save the static chain
35420         onto the stack.
35421         * tree-nested.c (convert_all_function_calls): Always create the static
35422         chain for nested functions if not optimizing.
35424 2014-06-06  Eric Botcazou  <ebotcazou@adacore.com>
35426         * tree-cfg.c (make_edges) <GIMPLE_RETURN>: Put a location on the edge.
35428 2014-06-06  Richard Biener  <rguenther@suse.de>
35430         * cfgexpand.c (expand_gimple_cond): Remove check for current_loops.
35431         (construct_init_block): Likewise.
35432         (construct_exit_block): Likewise.
35433         (pass_expand::execute): Likewise.
35434         * graphite.c (graphite_transforms): Replace check for current_loops
35435         with a check for > 1 loops.
35436         (pass_graphite_transforms::execute): Adjust.
35437         * ipa-split.c (split_function): Remove check for current_loops.
35438         * omp-low.c (expand_parallel_call): Likewise.
35439         (expand_omp_for_init_counts): Likewise.
35440         (extract_omp_for_update_vars): Likewise.
35441         (expand_omp_for_generic): Likewise.
35442         (expand_omp_sections): Likewise.
35443         (expand_omp_target): Likewise.
35444         * tracer.c (tail_duplicate): Likewise.
35445         (pass_tracer::execute): Likewise.
35446         * trans-mem.c (expand_transaction): Likewise.
35447         * tree-complex.c (expand_complex_div_wide): Likewise.
35448         * tree-eh.c (lower_resx): Likewise.
35449         (cleanup_empty_eh_merge_phis): Likewise.
35450         * tree-predcom.c (run_tree_predictive_commoning): Replace check for
35451         current_loops with a check for > 1 loops.
35452         (pass_predcom::execute): Adjust.
35453         * tree-scalar-evolution.c (scev_reset): Remove check for current_loops.
35454         * tree-ssa-copy.c (copy_prop_visit_phi_node): Likewise.
35455         * tree-ssa-dom.c (pass_phi_only_cprop::execute): Likewise.
35456         * tree-ssa-tail-merge.c (tail_merge_optimize): Likewise.
35457         * tree-ssa-threadupdate.c (thread_through_all_blocks): Likewise.
35458         * tree-switch-conversion.c (process_switch): Likewise.
35459         * tree-tailcall.c (tree_optimize_tail_calls_1): Likewise.
35460         * tree-vrp.c (vrp_visit_phi_node): Likewise.
35461         (execute_vrp): Likewise.
35462         * ubsan.c (ubsan_expand_null_ifn): Likewise.
35464 2014-06-06  Eric Botcazou  <ebotcazou@adacore.com>
35466         * rtl.h (insn_location): Declare.
35467         * cfgcleanup.c (try_forward_edges): Compare the locus of locations
35468         with UNKNOWN_LOCATION.
35469         * emit-rtl.c (insn_location): New function.
35470         * final.c (notice_source_line): Check that the instruction has a
35471         location before retrieving it and use insn_location.
35472         * modulo-sched.c (loop_single_full_bb_p): Likewise.
35473         * print-rtl.c (print_rtx): Likewise.
35475 2014-06-06  Richard Biener  <rguenther@suse.de>
35477         * passes.def: Move 2nd VRP pass before phi-only-cprop.
35479 2014-06-06  Christian Bruel  <christian.bruel@st.com>
35481         PR tree-optimization/43934
35482         * tree-ssa-loop-im.c (determine_max_movement): Add PHI def constant
35483         cost.
35485 2014-06-06  Richard Sandiford  <rdsandiford@googlemail.com>
35487         * ira-lives.c (single_reg_class): Add missing break.  Explicitly
35488         return NO_REGS for extra address and memory constraints.  Handle
35489         operands that match (or are equivalent to something that matches)
35490         extra constant constraints.  Ignore other non-register operands.
35492 2014-06-06  Alan Modra  <amodra@gmail.com>
35494         PR target/61300
35495         * doc/tm.texi.in (INCOMING_REG_PARM_STACK_SPACE): Document.
35496         * doc/tm.texi: Regenerate.
35497         * function.c (INCOMING_REG_PARM_STACK_SPACE): Provide default.
35498         Use throughout in place of REG_PARM_STACK_SPACE.
35499         * config/rs6000/rs6000.c (rs6000_reg_parm_stack_space): Add
35500         "incoming" param.  Pass to rs6000_function_parms_need_stack.
35501         (rs6000_function_parms_need_stack): Add "incoming" param, ignore
35502         prototype_p when incoming.  Use function decl when incoming
35503         to handle K&R style functions.
35504         * config/rs6000/rs6000.h (REG_PARM_STACK_SPACE): Adjust.
35505         (INCOMING_REG_PARM_STACK_SPACE): Define.
35507 2014-06-05  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
35509         PR target/52472
35510         * cfgexpand.c (expand_debug_expr): Use address space of nested
35511         TREE_TYPE for ADDR_EXPR and MEM_REF.
35513 2014-06-05  Jeff Law  <law@redhat.com>
35515         PR tree-optimization/61289
35516         * tree-ssa-threadedge.c (invalidate_equivalences): Remove SRC_MAP and
35517         DST_MAP parameters.   Invalidate by walking all the SSA_NAME_VALUES
35518         looking for those which match LHS.  All callers changed.
35519         (record_temporary_equivalences_from_phis): Remove SRC_MAP and DST_MAP
35520         parameters and code which manipulated them.  All callers changed.
35521         (record_temporary_equivalences_from_stmts_at_dest): Remove SRC_MAP
35522         and DST_MAP parameters.  Simplify invalidation code by just calling
35523         invalidate_equivalences.  All callers changed.
35524         (thread_across_edge): Simplify now that we don't need to maintain
35525         the map of equivalences to invalidate.
35527 2014-06-05  Kai Tietz  <ktietz@redhat.com>
35528             Richard Henderson  <rth@redhat.com>
35530         PR target/46219
35531         * config/i386/predicates.md (memory_nox32_operand): Add memory_operand
35532         checking for !TARGET_X32.
35533         * config/i386/i386.md (UNSPEC_PEEPSIB): New unspec constant.
35534         (sibcall_intern): New define_insn, plus required peepholes.
35535         (sibcall_pop_intern): Likewise.
35536         (sibcall_value_intern): Likewise.
35537         (sibcall_value_pop_intern): Likewise.
35539 2014-06-05  Ilya Enkovich  <ilya.enkovich@intel.com>
35541         * tree-inline.c (tree_function_versioning): Check DF info existence
35542         before accessing it.
35544 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35546         * config/aarch64/aarch64.h (aarch64_frame): Add hard_fp_offset and
35547         frame_size.
35548         * config/aarch64/aarch64.c (aarch64_layout_frame): Initialize
35549         aarch64_frame hard_fp_offset and frame_size.
35550         (aarch64_expand_prologue): Use aarch64_frame hard_fp_offset and
35551         frame_size; remove original_frame_size.
35552         (aarch64_expand_epilogue, aarch64_final_eh_return_addr): Likewise.
35553         (aarch64_initial_elimination_offset): Remove frame_size and
35554         offset.  Use aarch64_frame frame_size.
35556 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35557             Jiong Wang  <jiong.wang@arm.com>
35558             Renlin  <renlin.li@arm.com>
35560         * config/aarch64/aarch64.c (aarch64_layout_frame): Correct
35561         initialization of R30 offset.  Update offset.  Iterate core
35562         regisers upto X30.  Remove X29, X30 specific code.
35564 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35565             Jiong Wang  <jiong.wang@arm.com>
35567         * config/aarch64/aarch64.c (SLOT_NOT_REQUIRED, SLOT_REQUIRED): Define.
35568         (aarch64_layout_frame): Use SLOT_NOT_REQUIRED and SLOT_REQUIRED.
35569         (aarch64_register_saved_on_entry): Adjust test.
35571 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35573         * config/aarch64/aarch64.h (machine_function): Move
35574         saved_varargs_size from here...
35575         (aarch64_frame): ... to here.
35577         * config/aarch64/aarch64.c (aarch64_expand_prologue)
35578         (aarch64_expand_epilogue, aarch64_final_eh_return_addr)
35579         (aarch64_initial_elimination_offset)
35580         (aarch64_setup_incoming_varargs): Adjust location of
35581         saved_varargs_size.
35583 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35585         * config/aarch64/aarch64.c (aarch64_expand_prologue): Update stack
35586         layout comment.
35588 2014-06-05  Jaydeep Patil  <Jaydeep.Patil@imgtec.com>
35589             Prachi Godbole  <Prachi.Godbole@imgtec.com>
35591         * config/mips/mips-cpus.def: Add definition for p5600.  Updated
35592         mips32r5 entry to use PROCESSOR_P5600.
35593         * config/mips/mips-tables.opt: Regenerate.
35594         * config/mips/mips-protos.h (mips_fmadd_bypass): Add prototype.
35595         * config/mips/mips.c (mips_fmadd_bypass): New function.
35596         (mips_rtx_cost_data): Add costs for p5600.
35597         (mips_issue_rate): Add support for p5600.
35598         (mips_multipass_dfa_lookahead): Likewise.
35599         * config/mips/mips.h (TUNE_P5600): New define.
35600         (TUNE_MACC_CHAINS): Add TUNE_P5600.
35601         (MIPS_ISA_LEVEL_SPEC): Map -march=p5600 to -mips32r5.
35602         * config/mips/mips.md: Include p5600.md.
35603         (processor): Add p5600.
35604         * config/mips/p5600.md: New file.
35606 2014-06-05  Evgeny Stupachenko  <evstupac@gmail.com>
35608         * config/i386/sse.md (*ssse3_palignr<mode>_perm): New.
35609         * config/i386/predicates.md (palignr_operand): New.
35610         Indicates if permutation is suitable for palignr instruction.
35612 2014-06-05  Yuri Rumyantsev  <ysrumyan@gmail.com>
35614         PR tree-optimization/61319
35615         * tree-if-conv.c (is_cond_scalar_reduction): Add missed check that
35616         stmt belongs to loop.
35618 2014-06-05  Richard Biener  <rguenther@suse.de>
35620         * gimplify.c (create_tmp_from_val): Remove is_formal parameter
35621         and set DECL_GIMPLE_REG_P unconditionally if appropriate.
35622         (lookup_tmp_var): Adjust.
35623         (prepare_gimple_addressable): Unset DECL_GIMPLE_REG_P here.
35625 2014-06-05  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
35627         * config/arm/arm.md (enabled): Disable opt_enabled attribute.
35629 2014-06-05  Marek Polacek  <polacek@redhat.com>
35631         PR c/49706
35632         * doc/invoke.texi: Document -Wlogical-not-parentheses.
35634 2014-06-04  Tom de Vries  <tom@codesourcery.com>
35636         * config/s390/s390.md ("addptrdi3", "addptrsi3"): Use INTVAL only on
35637         CONST_INT.
35639 2014-06-04  Marc Glisse  <marc.glisse@inria.fr>
35641         PR tree-optimization/61385
35642         * tree-ssa-phiopt.c (value_replacement): Punt if there are PHI nodes.
35644 2014-06-04  Bernd Schmidt  <bernds@codesourcery.com>
35646         * lto-wrapper.c (fatal, fatal_perror): Remove functions.  All callers
35647         changed to use fatal_error.
35648         (main): Ensure lto_wrapper_cleanup is run atexit.
35650 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35652         * lra-constraints.c (valid_address_p): Move earlier in file.
35653         (address_eliminator): New structure.
35654         (satisfies_memory_constraint_p): New function.
35655         (satisfies_address_constraint_p): Likewise.
35656         (process_alt_operands, process_address, curr_insn_transform): Use them.
35658 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35660         * lra-int.h (lra_static_insn_data): Make operand_alternative a
35661         const pointer.
35662         (target_lra_int, default_target_lra_int, this_target_lra_int)
35663         (op_alt_data): Delete.
35664         * lra.h (lra_init): Delete.
35665         * lra.c (default_target_lra_int, this_target_lra_int): Delete.
35666         (init_insn_code_data_once): Remove op_alt_data handling.
35667         (finish_insn_code_data_once): Likewise.
35668         (init_op_alt_data): Delete.
35669         (get_static_insn_data): Initialize operand_alternative to null.
35670         (free_insn_recog_data): Cast operand_alternative before freeing it.
35671         (setup_operand_alternative): Take the operand_alternative as
35672         parameter and assume it isn't already cached in the static
35673         insn data.
35674         (lra_set_insn_recog_data): Update accordingly.
35675         (lra_init): Delete.
35676         * ira.c (ira_init): Don't call lra_init.
35677         * target-globals.h (this_target_lra_int): Declare.
35678         (target_globals): Remove lra_int.
35679         (restore_target_globals): Update accordingly.
35680         * target-globals.c: Don't include lra-int.h.
35681         (default_target_globals, save_target_globals): Remove lra_int.
35683 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35685         * recog.h (operand_alternative): Convert reg_class, reject,
35686         matched and matches into bitfields.
35687         (preprocess_constraints): New overload.
35688         (preprocess_insn_constraints): New function.
35689         (preprocess_constraints): Take the insn as parameter.
35690         (recog_op_alt): Change into a pointer.
35691         (target_recog): Add x_op_alt.
35692         * recog.c (asm_op_alt): New variable.
35693         (recog_op_alt): Change into a pointer.
35694         (preprocess_constraints): New overload, replacing the old function
35695         definition with one that doesn't use global state.
35696         (preprocess_insn_constraints): New function.
35697         (preprocess_constraints): Use them.  Take the insn as parameter.
35698         Use asm_op_alt for asms.
35699         (recog_init): Free existing x_op_alt entries.
35700         * ira-lives.c (check_and_make_def_conflict): Make operand_alternative
35701         pointer const.
35702         (make_early_clobber_and_input_conflicts): Likewise.
35703         (process_bb_node_lives): Pass the insn to process_constraints.
35704         * reg-stack.c (check_asm_stack_operands): Likewise.
35705         (subst_asm_stack_regs): Likewise.
35706         * regcprop.c (copyprop_hardreg_forward_1): Likewise.
35707         * regrename.c (build_def_use): Likewise.
35708         * sched-deps.c (sched_analyze_insn): Likewise.
35709         * sel-sched.c (get_reg_class, implicit_clobber_conflict_p): Likewise.
35710         * config/arm/arm.c (xscale_sched_adjust_cost): Likewise.
35711         (note_invalid_constants): Likewise.
35712         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
35713         (ix86_legitimate_combined_insn): Make operand_alternative pointer
35714         const.
35716 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35718         * recog.c (preprocess_constraints): Don't skip disabled alternatives.
35719         * ira-lives.c (check_and_make_def_conflict): Check for disabled
35720         alternatives.
35721         (make_early_clobber_and_input_conflicts): Likewise.
35722         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
35724 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35726         * recog.h (alternative_class): New function.
35727         (which_op_alt): Return a const recog_op_alt.
35728         * reg-stack.c (check_asm_stack_operands): Update type accordingly.
35729         (subst_asm_stack_regs): Likewise.
35730         * config/arm/arm.c (note_invalid_constants): Likewise.
35731         * regcprop.c (copyprop_hardreg_forward_1): Likewise.  Don't modify
35732         the operand_alternative; use alternative class instead.
35733         * sel-sched.c (get_reg_class): Likewise.
35734         * regrename.c (build_def_use): Likewise.
35735         (hide_operands, restore_operands, record_out_operands): Update type
35736         accordingly.
35738 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35740         * recog.h (recog_op_alt): Convert to a flat array.
35741         (which_op_alt): New function.
35742         * recog.c (recog_op_alt): Convert to a flat array.
35743         (preprocess_constraints): Update accordingly, grouping all
35744         operands of the same alternative together, rather than the
35745         other way around.
35746         * ira-lives.c (check_and_make_def_conflict): Likewise.
35747         (make_early_clobber_and_input_conflicts): Likewise.
35748         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
35749         * reg-stack.c (check_asm_stack_operands): Use which_op_alt.
35750         (subst_asm_stack_regs): Likewise.
35751         * regcprop.c (copyprop_hardreg_forward_1): Likewise.
35752         * regrename.c (hide_operands, record_out_operands): Likewise.
35753         (build_def_use): Likewise.
35754         * sel-sched.c (get_reg_class): Likewise.
35755         * config/arm/arm.c (note_invalid_constants): Likewise.
35757 2014-06-04  Jason Merrill  <jason@redhat.com>
35759         PR c++/51253
35760         PR c++/61382
35761         * gimplify.c (gimplify_arg): Non-static.
35762         * gimplify.h: Declare it.
35764 2014-06-04  Richard Biener  <rguenther@suse.de>
35766         * tree.h (may_be_aliased): Trust TREE_ADDRESSABLE from
35767         TREE_PUBLIC and DECL_EXTERNAL decls.
35769 2014-06-04  Matthew Fortune  <matthew.fortune@imgtec.com>
35771         * regcprop.c (copyprop_hardreg_forward_1): Account for
35772         HARD_REGNO_CALL_PART_CLOBBERED.
35774 2014-06-04  Richard Biener  <rguenther@suse.de>
35776         * configure.ac: Check whether the underlying type of int64_t
35777         is long or long long.
35778         * configure: Regenerate.
35779         * config.in: Likewise.
35780         * hwint.h (HOST_WIDE_INT): Match the underlying type of int64_t.
35781         (HOST_WIDE_INT_PRINT_*): Define in terms of PRI*64.
35783 2014-06-04  Richard Biener  <rguenther@suse.de>
35785         PR tree-optimization/60098
35786         * tree-ssa-dse.c (dse_possible_dead_store_p): Walk until
35787         we hit a kill.
35788         (dse_optimize_stmt): Simplify, now that we found a kill
35789         earlier.
35791 2014-06-04  Richard Biener  <rguenther@suse.de>
35793         * tree-ssa-alias.c (stmt_may_clobber_ref_p): Improve handling
35794         of accesses with non-invariant address.
35796 2014-06-04  Martin Liska  <mliska@suse.cz>
35798         * cgraph.h (cgraph_make_wrapper): New function introduced.
35799         * cgraphunit.c (cgraph_make_wrapper): The function implementation.
35800         * ipa-inline.h (inline_analyze_function): The function is global.
35801         * ipa-inline-analysis.c (inline_analyze_function): Likewise.
35803 2014-06-04  Martin Liska  <mliska@suse.cz>
35805         * tree.h (private_lookup_attribute_starting): New function.
35806         (lookup_attribute_starting): Likewise.
35807         * tree.c (private_lookup_attribute_starting): Likewise.
35809 2014-06-04  Martin Liska  <mliska@suse.cz>
35811         * cgraph.h (expand_thunk): New argument added.
35812         (address_taken_from_non_vtable_p): New global function.
35813         * ipa-visibility.c (address_taken_from_non_vtable_p): Likewise.
35814         * cgraphclones.c (duplicate_thunk_for_node): Argument added to call.
35815         * cgraphunit.c (analyze_function): Likewise.
35816         (assemble_thunks_and_aliases): Argument added to call.
35817         (expand_thunk): New argument forces to produce GIMPLE thunk.
35819 2014-06-04  Martin Liska  <mliska@suse.cz>
35821         * coverage.h (coverage_compute_cfg_checksum): Argument added.
35822         * coverage.c (coverage_compute_cfg_checksum): Likewise.
35823         * profile.c (branch_prob): Likewise.
35825 2014-06-04  Martin Jambor  <mjambor@suse.cz>
35827         PR ipa/61340
35828         * ipa-pure-const.c (propagate_pure_const): Add unreachable default
35829         handler for switch on an ipa_ref_use enum.
35830         * ipa-reference.c (analyze_function): Likewise.
35832 2014-06-04  Kai Tietz  <ktietz@redhat.com>
35834         * recog.c (peep2_attempt): Copy SIBLING_CALL_P flag
35835         from old call-instruction.
35837 2014-06-04  Bin Cheng  <bin.cheng@arm.com>
35839         * config/aarch64/aarch64.c (aarch64_classify_address)
35840         (aarch64_legitimize_reload_address): Support full addressing modes
35841         for vector modes.
35842         * config/aarch64/aarch64.md (mov<mode>, movmisalign<mode>)
35843         (*aarch64_simd_mov<mode>, *aarch64_simd_mov<mode>): Relax predicates.
35845 2014-06-03  Andrew Pinski  <apinski@cavium.com>
35847         * config/aarch64/aarch64.c (aarch64_if_then_else_costs): Allow non comparisons
35848         for OP0.
35850 2014-06-03  Andrew Pinski  <apinski@cavium.com>
35852         * config/aarch64/aarch64.c (aarch64_if_then_else_costs): New function.
35853         (aarch64_rtx_costs): Use aarch64_if_then_else_costs.
35855 2014-06-03  Kai Tietz  <ktietz@redhat.com>
35857         * config/i386/i386.c (ix86_function_value_regno_p): Disallow DX_REG
35858         for 64-bit ms-abi.
35860 2014-06-03  Dehao Chen  <dehao@google.com>
35862         * tree-cfg.c (gimple_merge_blocks): Only reset count when BBs are in
35863         the same loop.
35865 2014-06-03  Marek Polacek  <polacek@redhat.com>
35867         PR c/60439
35868         * doc/invoke.texi: Document -Wswitch-bool.
35869         * function.c (stack_protect_epilogue): Cast controlling expression of
35870         the switch to int.
35871         * gengtype.c (walk_type): Generate switch expression with its
35872         controlling expression cast to int.
35874 2014-06-03  Vishnu K S  <Vishnu.k_s@atmel.com>
35876         * config/avr/avr-mcus.def: Add new avr25 devices attiny441, attiny828
35877         and attiny841.
35878         * config/avr/avr-tables.opt: Regenerate.
35879         * config/avr/t-multilib: Regenerate.
35880         * doc/avr-mmcu.texi: Regenerate.
35882 2014-06-03  Vishnu K S  <vishnu.k_s@atmel.com>
35883             Pitchumani Sivanupandi  <pitchumani.s@atmel.com>
35885         * config/avr/avr-mcus.def (ata6616c): Add new avr25 device.
35886         (ata6617c, ata664251): Add new avr35 devices.
35887         (ata6612c): Add new avr4 device.
35888         (ata6613c, ata6614q): Add new avr5 devices.
35889         * config/avr/avr-tables.opt: Regenerate.
35890         * config/avr/t-multilib: Regenerate.
35891         * doc/avr-mmcu.texi: Regenerate.
35893 2014-06-03  Alan Lawrence  <alan.lawrence@arm.com>
35895         * gcc/config/aarch64/aarch64-builtins.c
35896         (aarch64_types_binop_ssu_qualifiers): New static data.
35897         (TYPES_BINOP_SSU): Define.
35898         * gcc/config/aarch64/aarch64-simd-builtins.def (suqadd, ushl, urshl,
35899         urshr_n, ushll_n): Use appropriate unsigned qualifiers.
35900         * gcc/config/aarch64/arm_neon.h (vrshl_u8, vrshl_u16, vrshl_u32,
35901         vrshl_u64, vrshlq_u8, vrshlq_u16, vrshlq_u32, vrshlq_u64, vrshld_u64,
35902         vrshr_n_u8, vrshr_n_u16, vrshr_n_u32, vrshr_n_u64, vrshrq_n_u8,
35903         vrshrq_n_u16, vrshrq_n_u32, vrshrq_n_u64, vrshrd_n_u64, vshll_n_u8,
35904         vshll_n_u16, vshll_n_u32, vuqadd_s8, vuqadd_s16, vuqadd_s32,
35905         vuqadd_s64, vuqaddq_s8, vuqaddq_s16, vuqaddq_s32, vuqaddq_s64,
35906         vuqaddb_s8, vuqaddh_s16, vuqadds_s32, vuqaddd_s64): Add signedness
35907         suffix to builtin function name, remove cast.
35908         (vshl_s8, vshl_s16, vshl_s32, vshl_s64, vshl_u8, vshl_u16, vshl_u32,
35909         vshl_u64, vshlq_s8, vshlq_s16, vshlq_s32, vshlq_s64, vshlq_u8,
35910         vshlq_u16, vshlq_u32, vshlq_u64, vshld_s64, vshld_u64): Remove cast.
35912 2014-06-03  Alan Lawrence  <alan.lawrence@arm.com>
35914         * gcc/config/aarch64/aarch64-builtins.c
35915         (aarch64_types_binop_uus_qualifiers,
35916         aarch64_types_shift_to_unsigned_qualifiers,
35917         aarch64_types_unsigned_shiftacc_qualifiers): Define.
35918         * gcc/config/aarch64/aarch64-simd-builtins.def (uqshl, uqrshl, uqadd,
35919         uqsub, usqadd, usra_n, ursra_n, uqshrn_n, uqrshrn_n, usri_n, usli_n,
35920         sqshlu_n, uqshl_n): Update qualifiers.
35921         * gcc/config/aarch64/arm_neon.h (vqadd_u8, vqadd_u16, vqadd_u32,
35922         vqadd_u64, vqaddq_u8, vqaddq_u16, vqaddq_u32, vqaddq_u64, vqsub_u8,
35923         vqsub_u16, vqsub_u32, vqsub_u64, vqsubq_u8, vqsubq_u16, vqsubq_u32,
35924         vqsubq_u64, vqaddb_u8, vqaddh_u16, vqadds_u32, vqaddd_u64, vqrshl_u8,
35925         vqrshl_u16, vqrshl_u32, vqrshl_u64, vqrshlq_u8, vqrshlq_u16,
35926         vqrshlq_u32, vqrshlq_u64, vqrshlb_u8, vqrshlh_u16, vqrshls_u32,
35927         vqrshld_u64, vqrshrn_n_u16, vqrshrn_n_u32, vqrshrn_n_u64,
35928         vqrshrnh_n_u16, vqrshrns_n_u32, vqrshrnd_n_u64, vqshl_u8, vqshl_u16,
35929         vqshl_u32, vqshl_u64, vqshlq_u8, vqshlq_u16, vqshlq_u32, vqshlq_u64,
35930         vqshlb_u8, vqshlh_u16, vqshls_u32, vqshld_u64, vqshl_n_u8, vqshl_n_u16,
35931         vqshl_n_u32, vqshl_n_u64, vqshlq_n_u8, vqshlq_n_u16, vqshlq_n_u32,
35932         vqshlq_n_u64, vqshlb_n_u8, vqshlh_n_u16, vqshls_n_u32, vqshld_n_u64,
35933         vqshlu_n_s8, vqshlu_n_s16, vqshlu_n_s32, vqshlu_n_s64, vqshluq_n_s8,
35934         vqshluq_n_s16, vqshluq_n_s32, vqshluq_n_s64, vqshlub_n_s8,
35935         vqshluh_n_s16, vqshlus_n_s32, vqshlud_n_s64, vqshrn_n_u16,
35936         vqshrn_n_u32, vqshrn_n_u64, vqshrnh_n_u16, vqshrns_n_u32,
35937         vqshrnd_n_u64, vqsubb_u8, vqsubh_u16, vqsubs_u32, vqsubd_u64,
35938         vrsra_n_u8, vrsra_n_u16, vrsra_n_u32, vrsra_n_u64, vrsraq_n_u8,
35939         vrsraq_n_u16, vrsraq_n_u32, vrsraq_n_u64, vrsrad_n_u64, vsli_n_u8,
35940         vsli_n_u16, vsli_n_u32,vsli_n_u64, vsliq_n_u8, vsliq_n_u16,
35941         vsliq_n_u32, vsliq_n_u64, vslid_n_u64, vsqadd_u8, vsqadd_u16,
35942         vsqadd_u32, vsqadd_u64, vsqaddq_u8, vsqaddq_u16, vsqaddq_u32,
35943         vsqaddq_u64, vsqaddb_u8, vsqaddh_u16, vsqadds_u32, vsqaddd_u64,
35944         vsra_n_u8, vsra_n_u16, vsra_n_u32, vsra_n_u64, vsraq_n_u8,
35945         vsraq_n_u16, vsraq_n_u32, vsraq_n_u64, vsrad_n_u64, vsri_n_u8,
35946         vsri_n_u16, vsri_n_u32, vsri_n_u64, vsriq_n_u8, vsriq_n_u16,
35947         vsriq_n_u32, vsriq_n_u64, vsrid_n_u64): Remove casts.
35949 2014-06-03  Teresa Johnson  <tejohnson@google.com>
35951         * tree-sra.c (modify_function): Record caller nodes after rebuild.
35953 2014-06-02  Jason Merrill  <jason@redhat.com>
35955         PR c++/61020
35956         * varpool.c (ctor_for_folding): Handle uninitialized vtables.
35958 2014-06-03  Alan Lawrence  <alan.lawrence@arm.com>
35960         * config/aarch64/aarch64.c (aarch64_evpc_ext): allow and handle
35961         location == 0.
35963 2014-06-03  Alan Lawrence  <alan.lawrence@arm.com>
35965         * config/aarch64/aarch64-simd.md (aarch64_rev<REVERSE:rev-op><mode>):
35966         New pattern.
35967         * config/aarch64/aarch64.c (aarch64_evpc_rev): New function.
35968         (aarch64_expand_vec_perm_const_1): Add call to aarch64_evpc_rev.
35969         * config/aarch64/iterators.md (REVERSE): New iterator.
35970         (UNSPEC_REV64, UNSPEC_REV32, UNSPEC_REV16): New enum elements.
35971         (rev_op): New int_attribute.
35972         * config/aarch64/arm_neon.h (vrev16_p8, vrev16_s8, vrev16_u8,
35973         vrev16q_p8, vrev16q_s8, vrev16q_u8, vrev32_p8, vrev32_p16, vrev32_s8,
35974         vrev32_s16, vrev32_u8, vrev32_u16, vrev32q_p8, vrev32q_p16, vrev32q_s8,
35975         vrev32q_s16, vrev32q_u8, vrev32q_u16, vrev64_f32, vrev64_p8,
35976         vrev64_p16, vrev64_s8, vrev64_s16, vrev64_s32, vrev64_u8, vrev64_u16,
35977         vrev64_u32, vrev64q_f32, vrev64q_p8, vrev64q_p16, vrev64q_s8,
35978         vrev64q_s16, vrev64q_s32, vrev64q_u8, vrev64q_u16, vrev64q_u32):
35979         Replace temporary __asm__ with __builtin_shuffle.
35981 2014-06-03  Andrew Bennett  <andrew.bennett@imgtec.com>
35983         * config/mips/mips-cpus.def: Add mips32r3, mips32r5, mips64r3 and
35984         mips64r5.
35985         * config/mips/mips-tables.opt: Regenerate.
35986         * config/mips/mips.c (mips_compute_frame_info): Changed if statement
35987         to use mips_isa_rev rather than ISA_MIPS32R2.
35988         * config/mips/mips.h (ISA_MIPS32R3): New define.
35989         (ISA_MIPS32R5): New define.
35990         (ISA_MIPS64R3): New define.
35991         (ISA_MIPS64R5): New define.
35992         (TARGET_CPU_CPP_BUILTINS): Added support for ISA_MIPS32R3,
35993         ISA_MIPS32R5, ISA_MIPS64R3 and ISA_MIPS64R5.
35994         (MIPS_ISA_LEVEL_SPEC): Added support for mips32r3, mips32r5, mips64r3
35995         and mips64r5.
35996         (MIPS_ISA_SYNCI_SPEC): Likewise.
35997         (ISA_HAS_64BIT_REGS): Added ISA_MIPS64R3 and ISA_MIPS64R5.
35998         (LINK_SPEC): Added mips32r3 and mips32r5.
35999         * config/mips/t-isa3264 (MULTILIB_MATCHES): Map mips32r3 and mips32r5
36000         to mips32r2; and mips64r3 and mips64r5 to mips64r2.
36001         * config/mips/t-mti-elf (MULTILIB_MATCHES): Likewise.
36002         * config/mips/t-mti-linux (MULTILIB_MATCHES): Likewise.
36003         * config/mips/t-sde (MULTILIB_MATCHES): Likewise.
36004         * config/mips/t-sdemtk (MULTILIB_MATCHES): New define.
36005         * doc/invoke.texi: Document mips32r3, mips32r5, mips64r3 and mips64r5.
36007 2014-06-03  Andrew Bennett  <andrew.bennett@imgtec.com>
36009         * doc/invoke.texi: Document -mxpa and -mno-xpa MIPS command line
36010         options.
36011         * config/mips/mips.opt (mxpa): New option.
36012         * config/mips/mips.h (ASM_SPEC): Pass mxpa and mno-xpa to the
36013         assembler.
36015 2014-06-03  Martin Jambor  <mjambor@suse.cz>
36017         PR ipa/61160
36018         * ipa-cp.c (cgraph_edge_brings_value_p): Handle edges leading to
36019         thunks.
36021 2014-06-03  Thomas Preud'homme  <thomas.preudhomme@arm.com>
36023         PR tree-optimization/61328
36024         * tree-ssa-math-opts.c (init_symbolic_number): Extract symbolic number
36025         initialization from find_bswap_or_nop_1.
36026         (find_bswap_or_nop_1): Test return value of find_bswap_or_nop_1 stored
36027         in source_expr2 before using the size value the function sets. Also
36028         make use of init_symbolic_number () in both the old place and
36029         find_bswap_or_nop_load () to avoid reading uninitialized memory when
36030         doing recursion in the GIMPLE_BINARY_RHS case.
36032 2014-06-03  Richard Biener  <rguenther@suse.de>
36034         PR tree-optimization/61383
36035         * tree-ssa-ifcombine.c (bb_no_side_effects_p): Make sure
36036         stmts can't trap.
36038 2014-06-03  Richard Sandiford  <rdsandiford@googlemail.com>
36040         * defaults.h (USE_MD_CONSTRAINTS, EXTRA_MEMORY_CONSTRAINT)
36041         (EXTRA_ADDRESS_CONSTRAINT, DEFAULT_CONSTRAINT_LEN, CONSTRAINT_LEN)
36042         (CONST_OK_FOR_CONSTRAINT_P, CONST_DOUBLE_OK_FOR_LETTER_P)
36043         (REG_CLASS_FROM_CONSTRAINT, EXTRA_CONSTRAINT_STR): Delete definitions
36044         in this file.
36045         (REG_CLASS_FROM_LETTER, CONST_OK_FOR_LETTER_P)
36046         (CONST_DOUBLE_OK_FOR_LETTER_P, EXTRA_CONSTRAINT): Move poising to...
36047         * system.h: ...here and make it unconditional.
36048         * target.def (conditional_register_usage): Mention
36049         define_register_constraint instead of old-style constraint macros.
36050         * doc/tm.texi.in: Remove documentation for old-style constraint macros.
36051         * doc/tm.texi: Regenerate.
36052         * genoutput.c: Remove USE_MD_CONSTRAINTS conditions and all code
36053         protected by !USE_MD_CONSTRAINTS.
36054         * config/frv/frv.md: Remove quote from old version of documentation.
36055         * config/frv/frv.c (frv_conditional_register_usage): Likewise.
36056         * config/m32r/m32r.c (easy_di_const, easy_df_const): Avoid mentioning
36057         CONST_DOUBLE_OK_FOR_LETTER.
36058         * config/sh/constraints.md: Likewise EXTRA_CONSTRAINT.
36060 2014-06-02  Andrew Pinski  <apinski@cavium.com>
36062         * config/aarch64/aarch64-linux.h (GLIBC_DYNAMIC_LINKER):
36063         /lib/ld-linux32-aarch64.so.1 is used for ILP32.
36064         (LINUX_TARGET_LINK_SPEC): Update linker script for ILP32.
36065         file whose name depends on -mabi= and -mbig-endian.
36066         * config/aarch64/t-aarch64-linux (MULTILIB_OSDIRNAMES):
36067         Handle LP64 better and handle ilp32 too.
36068         (MULTILIB_OPTIONS): Delete.
36069         (MULTILIB_DIRNAMES): Delete.
36071 2014-06-02  Andrew MacLeod  <amacleod@redhat.com>
36073         * expr.h: Remove prototypes of functions defined in builtins.c.
36074         * tree.h: (build_call_expr_*, build_string_literal): Add prototypes.
36075         Remove prototypes of functions defined in builtins.c.
36076         * builtins.h: Update prototype list to include all exported functions.
36077         * builtins.c: (default_libc_has_function, gnu_libc_has_function,
36078         no_c99_libc_has_function): Move to targhooks.c
36079         (build_string_literal, build_call_expr_loc_array,
36080         build_call_expr_loc_vec, build_call_expr_loc, build_call_expr): Move
36081         to tree.c.
36082         (expand_builtin_object_size, fold_builtin_object_size): Make static.
36083         * targhooks.c (default_libc_has_function, gnu_libc_has_function,
36084         no_c99_libc_has_function): Relocate from builtins.c.
36085         * tree.c: Include builtins.h.
36086         (build_call_expr_loc_array, build_call_expr_loc_vec,
36087         build_call_expr_loc, build_call_expr, build_string_literal): Relocate
36088         from builtins.c.
36089         * fold-const.h (fold_fma): Move prototype to builtins.h.
36090         * realmpfr.h (do_mpc_arg2): Move prototype to builtins.h.
36091         * asan.c: Include builtins.h.
36092         * cfgexpand.c: Likewise.
36093         * convert.c: Likewise.
36094         * emit-rtl.c: Likewise.
36095         * except.c: Likewise.
36096         * expr.c: Likewise.
36097         * fold-const.c: Likewise.
36098         * gimple-fold.c: Likewise.
36099         * gimple-ssa-strength-reduction.c: Likewise.
36100         * gimplify.c: Likewise.
36101         * ipa-inline.c: Likewise.
36102         * ipa-prop.c: Likewise.
36103         * lto-streamer-out.c: Likewise.
36104         * stmt.c: Likewise.
36105         * tree-inline.c: Likewise.
36106         * tree-object-size.c: Likewise.
36107         * tree-sra.c: Likewise.
36108         * tree-ssa-ccp.c: Likewise.
36109         * tree-ssa-forwprop.c: Likewise.
36110         * tree-ssa-loop-ivcanon.c: Likewise.
36111         * tree-ssa-loop-ivopts.c: Likewise.
36112         * tree-ssa-math-opts.c: Likewise.
36113         * tree-ssa-reassoc.c: Likewise.
36114         * tree-ssa-threadedge.c: Likewise.
36115         * tree-streamer-in.c: Likewise.
36116         * tree-vect-data-refs.c: Likewise.
36117         * tree-vect-patterns.c: Likewise.
36118         * tree-vect-stmts.c: Likewise.
36119         * config/aarch64/aarch64.c: Likewise.
36120         * config/alpha/alpha.c: Likewise.
36121         * config/arc/arc.c: Likewise.
36122         * config/arm/arm.c: Likewise.
36123         * config/avr/avr.c: Likewise.
36124         * config/bfin/bfin.c: Likewise.
36125         * config/c6x/c6x.c: Likewise.
36126         * config/cr16/cr16.c: Likewise.
36127         * config/cris/cris.c: Likewise.
36128         * config/epiphany/epiphany.c: Likewise.
36129         * config/fr30/fr30.c: Likewise.
36130         * config/frv/frv.c: Likewise.
36131         * config/h8300/h8300.c: Likewise.
36132         * config/i386/i386.c: Likewise.
36133         * config/i386/winnt.c: Likewise.
36134         * config/ia64/ia64.c: Likewise.
36135         * config/iq2000/iq2000.c: Likewise.
36136         * config/lm32/lm32.c: Likewise.
36137         * config/m32c/m32c.c: Likewise.
36138         * config/m32r/m32r.c: Likewise.
36139         * config/m68k/m68k.c: Likewise.
36140         * config/mcore/mcore.c: Likewise.
36141         * config/mep/mep.c: Likewise.
36142         * config/microblaze/microblaze.c: Likewise.
36143         * config/mips/mips.c: Likewise.
36144         * config/mmix/mmix.c: Likewise.
36145         * config/mn10300/mn10300.c: Likewise.
36146         * config/moxie/moxie.c: Likewise.
36147         * config/msp430/msp430.c: Likewise.
36148         * config/nds32/nds32.c: Likewise.
36149         * config/pa/pa.c: Likewise.
36150         * config/pdp11/pdp11.c: Likewise.
36151         * config/picochip/picochip.c: Likewise.
36152         * config/rl78/rl78.c: Likewise.
36153         * config/rs6000/rs6000.c: Likewise.
36154         * config/rx/rx.c: Likewise.
36155         * config/s390/s390.c: Likewise.
36156         * config/score/score.c: Likewise.
36157         * config/sh/sh.c: Likewise.
36158         * config/sparc/sparc.c: Likewise.
36159         * config/spu/spu.c: Likewise.
36160         * config/stormy16/stormy16.c: Likewise.
36161         * config/tilegx/tilegx.c: Likewise.
36162         * config/tilepro/tilepro.c: Likewise.
36163         * config/v850/v850.c: Likewise.
36164         * config/vax/vax.c: Likewise.
36165         * config/xtensa/xtensa.c: Likewise.
36167 2014-06-02  Jeff Law  <law@redhat.com>
36169         PR rtl-optimization/61094
36170         * ree.c (combine_reaching_defs): Do not reextend an insn if it
36171         was marked as do_no_reextend.  If a copy is needed to eliminate
36172         an extension, then mark it as do_not_reextend.
36174 2014-06-02  Marcus Shawcroft  <marcus.shawcroft@arm.com>
36176         * config/aarch64/aarch64.md (set_fpcr): Drop ISB after FPCR write.
36178 2014-06-02  Richard Henderson  <rth@redhat.com>
36180         PR target/61336
36181         * config/alpha/alpha.c (print_operand_address): Allow symbolic
36182         addresses inside asms.  Use output_operand_lossage instead of
36183         gcc_unreachable.
36185 2014-06-02  Uros Bizjak  <ubizjak@gmail.com>
36187         PR target/61239
36188         * config/i386/i386.c (ix86_expand_vec_perm) [case V32QImode]: Use
36189         GEN_INT (-128) instead of GEN_INT (128) to set MSB of QImode constant.
36191 2014-06-02  Tom de Vries  <tom@codesourcery.com>
36193         * config/aarch64/aarch64.c (aarch64_float_const_representable_p): Handle
36194         case that x has VOIDmode.
36196 2014-06-02  Bernd Schmidt  <bernds@codesourcery.com>
36198         * varasm.c (copy_constant): Delete function.
36199         (build_constant_desc): Don't call it.
36201 2014-06-02  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
36203         PR target/61154
36204         * config/arm/arm.h (TARGET_SUPPORTS_WIDE_INT): Define.
36205         * config/arm/arm.md (mov64 splitter): Replace const_double_operand
36206         with immediate_operand.
36208 2014-06-02  Andreas Schwab  <schwab@suse.de>
36210         * config/ia64/ia64.c
36211         (ia64_first_cycle_multipass_dfa_lookahead_guard): Check
36212         pending_data_specs first.
36214 2014-06-02  Richard Biener  <rguenther@suse.de>
36216         PR tree-optimization/61378
36217         * tree-ssa-sccvn.c (vn_reference_lookup_3): Initialize
36218         valueized_anything.
36220 2014-06-01  Uros Bizjak  <ubizjak@gmail.com>
36222         * config/i386/constraints.md (Bw): Rename from 'w'.
36223         (Bz): Rename from 'z'.
36224         * config/i386/i386.md: Change 'w' to 'Bw' and 'z' to 'Bz' globally.
36226 2014-06-01  Kai Tietz  <ktietz@redhat.com>
36228         PR target/61377
36229         * config/i386/constrains.md (define_constrain): New 'Bs' constraint.
36230         * config/i386/i386.md (sibcall_insn_operand): Use Bs
36231         instead of m constraint.
36233 2014-05-31  Andreas Schwab  <schwab@linux-m68k.org>
36235         * config/m68k/m68k.md (beq0_di, bne0_di): Make the "o" constraint
36236         a separate alternative where the scratch operand 2 is marked as
36237         early clobber.
36239 2014-05-31  Kugan Vivekanandarajah  <kuganv@linaro.org>
36241         * config/arm/arm.c (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): New define.
36242         (arm_builtins) : Add ARM_BUILTIN_GET_FPSCR and ARM_BUILTIN_SET_FPSCR.
36243         (bdesc_2arg) : Add description for builtins __builtins_arm_set_fpscr
36244         and __builtins_arm_get_fpscr.
36245         (arm_init_builtins) : Initialize builtins __builtins_arm_set_fpscr and
36246         __builtins_arm_get_fpscr.
36247         (arm_expand_builtin) : Expand builtins __builtins_arm_set_fpscr and
36248         __builtins_arm_ldfpscr.
36249         (arm_atomic_assign_expand_fenv): New function.
36250         * config/arm/vfp.md (set_fpscr): New pattern.
36251         (get_fpscr) : Likewise.
36252         * config/arm/unspecs.md (unspecv): Add VUNSPEC_GET_FPSCR and
36253         VUNSPEC_SET_FPSCR.
36254         * doc/extend.texi (AARCH64 Built-in Functions) : Document
36255         __builtins_arm_set_fpscr, __builtins_arm_get_fpscr.
36257 2014-05-30  Jakub Jelinek  <jakub@redhat.com>
36259         * asan.c (report_error_func): Add SLOW_P argument, use
36260         BUILT_IN_ASAN_*_N if set.
36261         (build_check_stmt): Likewise.
36262         (instrument_derefs): If T has insufficient alignment,
36263         force same handling as for odd sizes.
36265         * sanitizer.def (BUILT_IN_ASAN_REPORT_LOAD_N,
36266         BUILT_IN_ASAN_REPORT_STORE_N): New.
36267         * asan.c (struct asan_mem_ref): Change access_size type to
36268         HOST_WIDE_INT.
36269         (asan_mem_ref_init, asan_mem_ref_new, get_mem_refs_of_builtin_call,
36270         update_mem_ref_hash_table): Likewise.
36271         (asan_mem_ref_hasher::hash): Hash in a HWI.
36272         (report_error_func): Change size_in_bytes argument to HWI.
36273         Use *_N builtins if size_in_bytes is larger than 16 or not power of
36274         two.
36275         (build_shadow_mem_access): New function.
36276         (build_check_stmt): Use it.  Change size_in_bytes argument to HWI.
36277         Handle size_in_bytes not power of two or larger than 16.
36278         (instrument_derefs): Don't give up if size_in_bytes is not
36279         power of two or is larger than 16.
36281 2014-05-30  Kai Tietz  <ktietz@redhat.com>
36283         PR target/60104
36284         * config/i386/i386.c (x86_output_mi_thunk): Add memory case
36285         for sibling-tail-calls.
36286         * config/i386/i386.md (sibcall_insn_operand): Add memory-constrain
36287         to its use.
36288         * config/i386/predicates.md (sibcall_memory_operand): New predicate.
36289         (sibcall_insn_operand): Add check for sibcall_memory_operand.
36291 2014-05-30  Pitchumani Sivanupandi <pitchumani.s@atmel.com>
36293         * config/avr/avr-mcus.def: Change ATA6289 ISA to AVR4
36294         * config/avr/avr-tables.opt: Regenerate.
36295         * config/avr/t-multilib: Regenerate.
36296         * doc/avr-mmcu.texi: Regenerate.
36298 2014-05-30  Ian Lance Taylor  <iant@google.com>
36300         * config/i386/xmmintrin.h (_mm_pause): Move out of scope of pragma
36301         target("sse").
36303 2014-05-30  Tom de Vries  <tom@codesourcery.com>
36305         * config/i386/i386.c (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS):
36306         Redefine as true.
36308 2014-05-30  Tom de Vries  <tom@codesourcery.com>
36310         * lra-int.h (struct lra_reg): Add field actual_call_used_reg_set.
36311         * lra.c (initialize_lra_reg_info_element): Add init of
36312         actual_call_used_reg_set field.
36313         (lra): Call lra_create_live_ranges before lra_inheritance for
36314         -fuse-caller-save.
36315         * lra-assigns.c (lra_assign): Allow call_used_regs to cross calls for
36316         -fuse-caller-save.
36317         * lra-constraints.c (need_for_call_save_p): Use actual_call_used_reg_set
36318         instead of call_used_reg_set for -fuse-caller-save.
36319         * lra-lives.c (process_bb_lives): Calculate actual_call_used_reg_set.
36321 2014-05-30  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
36323         * config/arm/thumb2.md (*thumb2_movhi_insn): Set type of movw
36324         to mov_imm.
36325         * config/arm/vfp.md (*thumb2_movsi_vfp): Likewise.
36327 2014-05-30  Richard Sandiford  <rdsandiford@googlemail.com>
36329         * ira.c (ira_get_dup_out_num): Check for output operands at
36330         the start of the loop.  Handle cases where an included alternative
36331         follows an excluded one.
36333 2014-05-29  Mike Stump  <mikestump@comcast.net>
36335         PR debug/61352
36336         * collect2.c (maybe_run_lto_and_relink): Be sure to always run
36337         post ld passes when lto is used.
36339 2014-05-29  Vladimir Makarov  <vmakarov@redhat.com>
36341         PR rtl-optimization/61325
36342         * lra-constraints.c (process_address): Rename to process_address_1.
36343         (process_address): New function.
36345 2014-05-29  Alan Lawrence  <alan.lawrence@arm.com>
36347         * config/aarch64/aarch64-builtins.c (aarch64_types_binopv_qualifiers,
36348         TYPES_BINOPV): New static data.
36349         * config/aarch64/aarch64-simd-builtins.def (im_lane_bound):
36350         New builtin.
36351         * config/aarch64/aarch64-simd.md (aarch64_ext,
36352         aarch64_im_lane_boundsi): New patterns.
36353         * config/aarch64/aarch64.c (aarch64_expand_vec_perm_const_1): Match
36354         patterns for EXT.
36355         (aarch64_evpc_ext): New function.
36357         * config/aarch64/iterators.md (UNSPEC_EXT): New enum element.
36359         * config/aarch64/arm_neon.h (vext_f32, vext_f64, vext_p8, vext_p16,
36360         vext_s8, vext_s16, vext_s32, vext_s64, vext_u8, vext_u16, vext_u32,
36361         vext_u64, vextq_f32, vextq_f64, vextq_p8, vextq_p16, vextq_s8,
36362         vextq_s16, vextq_s32, vextq_s64, vextq_u8, vextq_u16, vextq_u32,
36363         vextq_u64): Replace __asm with __builtin_shuffle and im_lane_boundsi.
36365 2014-05-29  Tom de Vries  <tom@codesourcery.com>
36367         * rtl.h (BLOCK_SYMBOL_CHECK): Use SYMBOL_REF_FLAGS.
36369 2014-05-29  Richard Earnshaw <rearnsha@arm.com>
36370             Richard Sandiford  <rdsandiford@googlemail.com>
36372         * arm/iterators.md (shiftable_ops): New code iterator.
36373         (t2_binop0, arith_shift_insn): New code attributes.
36374         * arm/predicates.md (shift_nomul_operator): New predicate.
36375         * arm/arm.md (insn_enabled): Delete.
36376         (enabled): Remove insn_enabled test.
36377         (*arith_shiftsi): Delete.  Replace with ...
36378         (*<arith_shift_insn>_multsi): ... new pattern.
36379         (*<arith_shift_insn>_shiftsi): ... new pattern.
36380         * config/arm/arm.c (arm_print_operand): Handle operand format 'b'.
36382 2014-05-29  Radovan Obradovic  <robradovic@mips.com>
36383             Tom de Vries  <tom@codesourcery.com>
36385         * config/mips/mips.h (POST_CALL_TMP_REG): Define.
36386         * config/mips/mips.c (mips_emit_call_insn): Add POST_CALL_TMP_REG
36387         clobber.
36388         (mips_split_call): Use POST_CALL_TMP_REG.
36389         (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS): Redefine to true.
36391 2014-05-29  Tom de Vries  <tom@codesourcery.com>
36393         * final.c (collect_fn_hard_reg_usage): Guard variable declaration
36394         with #ifdef STACK_REGS.
36396 2014-05-28  Jan Hubicka  <hubicka@ucw.cz>
36398         * varasm.c (get_variable_section): Walk aliases.
36399         (place_block_symbol): Walk aliases.
36401 2014-05-28  Tom de Vries  <tom@codesourcery.com>
36403         Revert:
36404         2014-05-28  Tom de Vries  <tom@codesourcery.com>
36406         * lra-int.h (struct lra_reg): Add field actual_call_used_reg_set.
36407         * lra.c (initialize_lra_reg_info_element): Add init of
36408         actual_call_used_reg_set field.
36409         (lra): Call lra_create_live_ranges before lra_inheritance for
36410         -fuse-caller-save.
36411         * lra-assigns.c (lra_assign): Allow call_used_regs to cross calls for
36412         -fuse-caller-save.
36413         * lra-constraints.c (need_for_call_save_p): Use
36414         actual_call_used_reg_set instead of call_used_reg_set for
36415         -fuse-caller-save.
36416         * lra-lives.c (process_bb_lives): Calculate actual_call_used_reg_set.
36418 2014-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
36420         * doc/md.texi: Document that the % constraint character must
36421         be at the beginning of the string.
36422         * genoutput.c (validate_insn_alternatives): Check that '=',
36423         '+' and '%' only appear at the beginning of a constraint.
36424         * ira.c (commutative_constraint_p): Delete.
36425         (ira_get_dup_out_num): Expect the '%' commutativity marker to be
36426         at the start of the string.
36427         * config/alpha/alpha.md (*movmemdi_1, *clrmemdi_1): Remove
36428         duplicate '='s.
36429         * config/arm/neon.md (bicdi3_neon): Likewise.
36430         * config/iq2000/iq2000.md (addsi3_internal, subsi3_internal, sgt_si)
36431         (slt_si, sltu_si): Likewise.
36432         * config/vax/vax.md (sbcdi3): Likewise.
36433         * config/h8300/h8300.md (*cmpstz): Remove duplicate '+'.
36434         * config/arc/arc.md (mulsi_600, mulsidi_600, umulsidi_600)
36435         (mul64): Move '%' to beginning of constraint.
36436         * config/arm/arm.md (*xordi3_insn): Likewise.
36437         * config/nds32/nds32.md (add<mode>3, mulsi3, andsi3, iorsi3)
36438         (xorsi3): Likewise.
36440 2014-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
36442         * doc/md.texi: Document the restrictions on the "enabled" attribute.
36444 2014-05-28  Jason Merrill  <jason@redhat.com>
36446         PR c++/47202
36447         * cgraph.h (symtab_node::get_comdat_group_id): New.
36448         * cgraphunit.c (analyze_functions): Call it.
36449         * symtab.c (dump_symtab_node): Likewise.
36450         * tree.c (decl_comdat_group_id): New.
36451         * tree.h: Declare it.
36452         * lto-streamer-out.c (write_symbol): Use it.
36453         * trans-mem.c (ipa_tm_create_version_alias): Likewise.
36455 2014-05-28  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
36457         PR bootstrap/PR61146
36458         * wide-int.cc: Do not include longlong.h when compiling with clang.
36460 2014-05-28  Richard Biener  <rguenther@suse.de>
36462         * tree-ssa-propagate.c (add_control_edge): Print less vertical space.
36463         * tree-vrp.c (extract_range_from_ssa_name): Also copy VR_UNDEFINED.
36464         (vrp_visit_assignment_or_call): Print less vertical space.
36465         (vrp_visit_stmt): Likewise.
36466         (vrp_visit_phi_node): Likewise.  For a PHI argument with
36467         VR_VARYING range consider recording it as copy.
36469 2014-05-28  Richard Biener  <rguenther@suse.de>
36471         Revert
36472         2014-05-28  Richard Biener  <rguenther@suse.de>
36474         * hwint.h (HOST_WIDE_INT_PRINT_*): Define in terms of PRI*64.
36476 2014-05-28  Bernd Edlinger  <bernd.edlinger@hotmail.de>
36478         * expr.c (expand_assignment): Fold the bitpos in the to_rtx if
36479         sufficiently aligned and an offset is used at the same time.
36480         (expand_expr_real_1): Likewise.
36482 2014-05-28  Richard Biener  <rguenther@suse.de>
36484         PR middle-end/61045
36485         * fold-const.c (fold_comparison): When folding
36486         X +- C1 CMP Y +- C2 to X CMP Y +- C2 +- C1 also ensure
36487         the sign of the remaining constant operand stays the same.
36489 2014-05-28  Kaushik Phatak  <kaushik.phatak@kpit.com>
36491         * config/rl78/rl78.h (TARGET_CPU_CPP_BUILTINS): Define
36492         __RL78_64BIT_DOUBLES__ or __RL78_32BIT_DOUBLES__.
36493         (ASM_SPEC): Pass -m64bit-doubles or -m32bit-doubles on
36494         to the assembler.
36495         (DOUBLE_TYPE_SIZE): Use 64 bit if TARGET_64BIT_DOUBLES is true.
36496         * gcc/config/rl78/rl78.opt (m64bit-doubles): New option.
36497         (m32bit-doubles) Likewise.
36498         * gcc/config/rl78/t-rl78: Add 64-bit-double multilib.
36499         * doc/invoke.texi: Document -m32bit-doubles and -m64bit-doubles
36500         option for RL78.
36502 2014-05-28  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
36504         * configure.ac ($gcc_cv_ld_clearcap): New test.
36505         * configure: Regenerate.
36506         * config.in: Regenerate.
36507         * config/sol2.opt (mclear-hwcap): New option.
36508         * config/sol2.h (LINK_CLEARCAP_SPEC): Define.
36509         * config/sol2-clearcap.map: Moved here from
36510         testsuite/gcc.target/i386/clearcap.map.
36511         * config/sol2-clearcapv2.map: Move here from
36512         gcc.target/i386/clearcapv2.map.
36513         * config/t-sol2 (install): Depend on install-clearcap-map.
36514         (install-clearcap-map): New target.
36515         * doc/invoke.texi (Option Summary, Solaris 2 Options): Document
36516         -mclear-hwcap.
36518 2014-05-28  Richard Biener  <rguenther@suse.de>
36520         * hwint.h (*_HALF_WIDE_INT*): Move to ...
36521         * wide-int.cc (HOST_BITS_PER_HALF_WIDE_INT, HOST_HALF_WIDE_INT):
36522         ... here and remove the rest.
36523         * hwint.h (HOST_WIDE_INT_PRINT_*): Define in terms of PRI*64.
36525 2014-05-28  Richard Biener  <rguenther@suse.de>
36527         PR tree-optimization/61335
36528         * tree-vrp.c (vrp_visit_phi_node): If the compare of old and
36529         new range fails, drop to varying.
36531 2014-05-28  Olivier Hainque  <hainque@adacore.com>
36533         * config/rs6000/vxworks.h (VXCPU_FOR_8548): New. Default to PPC85XX.
36534         (CPP_SPEC): Add entry for -mcpu=8548.
36535         * config/rs6000/vxworksae.h: Reinstate. Override VXCPU_FOR_8548.
36536         * config.gcc (powerpc-wrs-vxworksae, tm_file): Add back vxworksae.h.
36538 2014-05-28  Tom de Vries  <tom@codesourcery.com>
36540         * lra-int.h (struct lra_reg): Add field actual_call_used_reg_set.
36541         * lra.c (initialize_lra_reg_info_element): Add init of
36542         actual_call_used_reg_set field.
36543         (lra): Call lra_create_live_ranges before lra_inheritance for
36544         -fuse-caller-save.
36545         * lra-assigns.c (lra_assign): Allow call_used_regs to cross calls for
36546         -fuse-caller-save.
36547         * lra-constraints.c (need_for_call_save_p): Use
36548         actual_call_used_reg_set instead of call_used_reg_set for
36549         -fuse-caller-save.
36550         * lra-lives.c (process_bb_lives): Calculate actual_call_used_reg_set.
36552 2014-05-28  Radovan Obradovic  <robradovic@mips.com>
36553             Tom de Vries  <tom@codesourcery.com>
36555         * doc/invoke.texi (@item Optimization Options): Add -fuse-caller-save
36556         to gccoptlist.
36557         (@item -fuse-caller-save): New item.
36559 2014-05-28  Radovan Obradovic  <robradovic@mips.com>
36560             Tom de Vries  <tom@codesourcery.com>
36562         * opts.c (default_options_table): Add OPT_LEVELS_2_PLUS entry with
36563         OPT_fuse_caller_save.
36565 2014-05-28  Radovan Obradovic  <robradovic@mips.com>
36566             Tom de Vries  <tom@codesourcery.com>
36568         * df-scan.c (df_get_call_refs): Use get_call_reg_set_usage.
36569         * caller-save.c (setup_save_areas, save_call_clobbered_regs): Use
36570         get_call_reg_set_usage.
36571         * resource.c (mark_set_resources, mark_target_live_regs): Use
36572         get_call_reg_set_usage.
36573         * ira-int.h (struct ira_allocno): Add crossed_calls_clobbered_regs
36574         field.
36575         (ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS): Define.
36576         * ira-lives.c (process_bb_node_lives): Use get_call_reg_set_usage.
36577         Calculate ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS.
36578         * ira-build.c (ira_create_allocno): Init
36579         ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS.
36580         (create_cap_allocno, propagate_allocno_info)
36581         (propagate_some_info_from_allocno)
36582         (copy_info_to_removed_store_destinations): Handle
36583         ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS.
36584         * ira-costs.c (ira_tune_allocno_costs): Use
36585         ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS to adjust costs.
36587 2014-05-28  Radovan Obradovic  <robradovic@mips.com>
36588             Tom de Vries  <tom@codesourcery.com>
36590         * cgraph.h (struct cgraph_rtl_info): Add function_used_regs
36591         and function_used_regs_valid fields.
36592         * final.c: Move include of hard-reg-set.h to before rtl.h to declare
36593         find_all_hard_reg_sets.
36594         (collect_fn_hard_reg_usage, get_call_fndecl, get_call_cgraph_rtl_info)
36595         (get_call_reg_set_usage): New function.
36596         (rest_of_handle_final): Use collect_fn_hard_reg_usage.
36597         * regs.h (get_call_reg_set_usage): Declare.
36599 2014-05-28  Georg-Johann Lay  <avr@gjlay.de>
36601         PR libgcc/61152
36602         * config/dbx.h (License): Add Runtime Library Exception.
36603         * config/newlib-stdint.h (License): Same.
36604         * config/rtems.h (License): Same
36605         * config/initfini-array.h (License): Same
36606         * config/v850/v850.h (License): Same.
36607         * config/v850/v850-opts.h (License): Same
36608         * config/v850/rtems.h (License): Same.
36610 2014-05-28  Georg-Johann Lay  <avr@gjlay.de>
36612         PR target/61044
36613         * doc/extend.texi (Local Labels): Note that label differences are
36614         not supported for AVR.
36616 2014-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
36617             Olivier Hainque  <hainque@adacore.com>
36619         * rtl.h (set_for_reg_notes): Declare.
36620         * emit-rtl.c (set_for_reg_notes): New function.
36621         (set_unique_reg_note): Use it.
36622         * optabs.c (add_equal_note): Likewise
36624 2014-05-27  Andrew Pinski  <apinski@cavium.com>
36626         * config/aarch64/aarch64.md (stack_protect_set_<mode>):
36627         Use <w> for the register in assembly template.
36628         (stack_protect_test): Use the mode of operands[0] for the result.
36629         (stack_protect_test_<mode>): Use <w> for the register
36630         in assembly template.
36632 2014-05-27  DJ Delorie  <dj@redhat.com>
36634         * config/rx/rx.c (add_vector_labels): New.
36635         (rx_output_function_prologue): Call it.
36636         (rx_handle_func_attribute): Don't require empty arguments.
36637         (rx_handle_vector_attribute): New.
36638         (rx_attribute_table): Add "vector" attribute.
36639         * doc/extend.texi (interrupt, vector): Document new/changed
36640         RX-specific attributes.
36642         * config/rx/rx.c (rx_adjust_insn_length): Skip for non-insns.
36644 2014-05-27  Eric Botcazou  <ebotcazou@adacore.com>
36646         * double-int.c (div_and_round_double) <ROUND_DIV_EXPR>: Use the proper
36647         predicate to detect a negative quotient.
36649 2014-05-27  Eric Botcazou  <ebotcazou@adacore.com>
36651         * fold-const.c (fold_comparison): Clean up and extend X +- C1 CMP C2
36652         to X CMP C2 -+ C1 transformation to EQ_EXPR/NE_EXPR.
36653         Add X - Y CMP 0 to X CMP Y transformation.
36654         (fold_binary_loc) <EQ_EXPR/NE_EXPR>: Remove same transformations.
36656 2014-05-27  Segher Boessenkool  <segher@kernel.crashing.org>
36658         * stmt.c (dump_case_nodes): Don't convert values to HOST_WIDE_INT
36659         before printing.
36661 2014-05-27  Steve Ellcey  <sellcey@mips.com>
36663         * config/mips/mips.c: Add include of cgraph.h.
36665 2014-05-27  Richard Biener  <rguenther@suse.de>
36667         * system.h (__STDC_FORMAT_MACROS): Define as very first thing.
36669 2014-05-27  Georg-Johann Lay  <avr@gjlay.de>
36671         PR libgcc/61152
36672         * config/arm/arm.h (License): Add note to COPYING.RUNTIME.
36673         * config/arm/arm-cores.def (License): Same.
36674         * config/arm/arm-opts.h (License): Same.
36675         * config/arm/aout.h (License): Same.
36676         * config/arm/bpabi.h (License): Same.
36677         * config/arm/elf.h (License): Same.
36678         * config/arm/linux-elf.h (License): Same.
36679         * config/arm/linux-gas.h (License): Same.
36680         * config/arm/netbsd-elf.h (License): Same.
36681         * config/arm/uclinux-eabi.h (License): Same.
36682         * config/arm/uclinux-elf.h (License): Same.
36683         * config/arm/vxworks.h (License): Same.
36685 2014-05-27  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
36687         * config/arm/neon.md (neon_bswap<mode>): New pattern.
36688         * config/arm/arm.c (neon_itype): Add NEON_BSWAP.
36689         (arm_init_neon_builtins): Handle NEON_BSWAP.
36690         Define required type nodes.
36691         (arm_expand_neon_builtin): Handle NEON_BSWAP.
36692         (arm_builtin_vectorized_function): Handle BUILTIN_BSWAP builtins.
36693         * config/arm/arm_neon_builtins.def (bswap): Define builtins.
36694         * config/arm/iterators.md (VDQHSD): New mode iterator.
36696 2014-05-27  Richard Biener  <rguenther@suse.de>
36698         * tree-vrp.c (vrp_evaluate_conditional_warnv_with_ops_using_ranges):
36699         Try using literal operands when comparing value-ranges failed.
36701 2014-05-27  Richard Sandiford  <rdsandiford@googlemail.com>
36703         * ira.c (commutative_operand): Adjust for change to recog_data.
36704         [Missing from previous commit.]
36706 2014-05-27  Richard Sandiford  <rdsandiford@googlemail.com>
36708         * system.h (TEST_BIT): New macro.
36709         * recog.h (alternative_mask): New type.
36710         (ALL_ALTERNATIVES, ALTERNATIVE_BIT): New macros.
36711         (recog_data_d): Replace alternative_enabled_p array with
36712         enabled_alternatives.
36713         (target_recog): New structure.
36714         (default_target_recog, this_target_recog): Declare.
36715         (get_enabled_alternatives, recog_init): Likewise.
36716         * recog.c (default_target_recog, this_target_recog): New variables.
36717         (get_enabled_alternatives): New function.
36718         (extract_insn): Use it.
36719         (recog_init): New function.
36720         (preprocess_constraints, constrain_operands): Adjust for change to
36721         recog_data.
36722         * postreload.c (reload_cse_simplify_operands): Likewise.
36723         * reload.c (find_reloads): Likewise.
36724         * ira-costs.c (record_reg_classes): Likewise.
36725         * ira-lives.c (single_reg_class): Likewise.  Fix bug in which
36726         all alternatives after a disabled one would be skipped.
36727         (ira_implicitly_set_insn_hard_regs): Likewise.
36728         * ira.c (ira_setup_alts): Adjust for change to recog_data.
36729         * lra-int.h (lra_insn_recog_data): Replace alternative_enabled_p
36730         with enabled_alternatives.
36731         * lra.c (free_insn_recog_data): Update accordingly.
36732         (lra_update_insn_recog_data): Likewise.
36733         (lra_set_insn_recog_data): Likewise.  Use get_enabled_alternatives.
36734         * lra-constraints.c (process_alt_operands): Likewise.  Handle
36735         only_alternative as part of the enabled mask.
36736         * target-globals.h (this_target_recog): Declare.
36737         (target_globals): Add a recog field.
36738         (restore_target_globals): Restore this_target_recog.
36739         * target-globals.c: Include recog.h.
36740         (default_target_globals): Initialize recog field.
36741         (save_target_globals): Likewise.
36742         * reginfo.c (reinit_regs): Call recog_init.
36743         * toplev.c (backend_init_target): Likewise.
36745 2014-05-27  Richard Sandiford  <rdsandiford@googlemail.com>
36747         * gencodes.c (main): Make LAST_INSN_CODE higher than any insn code,
36748         rather than any named insn's code.
36750 2014-05-27  Georg-Johann Lay  <avr@gjlay.de>
36752         PR libgcc/61152
36753         * config/arm/arm-opts.h (License): Add GCC Runtime Library Exception.
36754         * config/arm/arm-cores.def (License): Same.
36756 2014-05-26  Jan Hubicka  <hubicka@ucw.cz>
36758         * tree.h (decl_comdat_group): Declare.
36759         * cgraph.h (symtab_in_same_comdat_p): Move offline to ...
36760         * tree.c (decl_comdat_group): Here.
36762 2014-05-26  Richard Sandiford  <r.sandiford@uk.ibm.com>
36764         PR rtl-optimization/61222
36765         * combine.c (simplify_shift_const_1): When moving a PLUS outside
36766         the shift, truncate the PLUS operand to the result mode.
36768 2014-05-26  Uros Bizjak  <ubizjak@gmail.com>
36770         PR target/61271
36771         * config/i386/i386.c (ix86_rtx_costs)
36772         <case CONST_INT, case CONST, case LABEL_REF, case SYMBOL_REF>:
36773         Fix condition.
36775 2014-05-26  Martin Jambor  <mjambor@suse.cz>
36777         * ira.c (split_live_ranges_for_shrink_wrap): Remove bailout on
36778         subreg uses.
36780 2014-05-26  Richard Biener  <rguenther@suse.de>
36782         * wide-int.h (wi::int_traits <long>, wi::int_traits <unsigned long>,
36783         wi::int_traits <long long>, wi::int_traits <unsigned long long>):
36784         Provide specializations.
36785         (wi::int_traits <HOST_WIDE_INT>,
36786         wi::int_traits <unsigned HOST_WIDE_INT>): Remove specializations.
36788 2014-05-26  Alan Modra  <amodra@gmail.com>
36790         PR target/61098
36791         * config/rs6000/rs6000.c (rs6000_emit_set_const): Remove unneeded
36792         params and return a bool.  Remove dead code.  Update comment.
36793         Assert we have a const_int source.  Remove bogus code from
36794         32-bit HWI days.  Move !TARGET_POWERPC64 handling, and correct
36795         handling of constants > 2G and reg_equal note, from..
36796         (rs6000_emit_set_long_const): ..here.  Remove unneeded param and
36797         return value.  Update comment.  If we can, use a new pseudo
36798         for intermediate calculations.
36799         * config/rs6000/rs6000-protos.h (rs6000_emit_set_const): Update
36800         prototype.
36801         * config/rs6000/rs6000.md (movsi_internal1_single+1): Update
36802         call to rs6000_emit_set_const in splitter.
36803         (movdi_internal64+2, +3): Likewise.
36805 2014-05-26  Richard Biener  <rguenther@suse.de>
36807         * system.h: Define __STDC_FORMAT_MACROS before
36808         including inttypes.h.
36809         * hwint.h (HOST_WIDEST_INT, HOST_BITS_PER_WIDEST_INT,
36810         HOST_WIDEST_INT_PRINT, HOST_WIDEST_INT_PRINT_DEC,
36811         HOST_WIDEST_INT_PRINT_DEC_C, HOST_WIDEST_INT_PRINT_UNSIGNED,
36812         HOST_WIDEST_INT_PRINT_HEX, HOST_WIDEST_INT_PRINT_DOUBLE_HEX,
36813         HOST_WIDEST_INT_C): Remove.
36814         (PRId64, PRIi64, PRIo64, PRIu64, PRIx64, PRIX64): Define
36815         if C99 inttypes.h is not available.
36816         * coretypes.h (gcov_type, gcov_type_unsigned): Use [u]int64_t.
36817         * gcov-io.h (gcov_type, gcov_type_unsigned): Likewise.
36818         * gcov-io.c (gcov_histo_index): Drop non-64bit hwi case.
36819         * cfgloop.h (struct niter_desc): Use uint64_t for niter field.
36820         * bitmap.c (struct bitmap_descriptor_d): Use uint64_t for counters.
36821         (struct output_info): Likewise.
36822         (print_statistics): Adjust.
36823         (dump_bitmap_statistics): Likewise.
36824         * bt-load.c (migrate_btr_defs): Print with PRId64.
36825         * cfg.c (dump_edge_info, dump_bb_info): Likewise.
36826         (MAX_SAFE_MULTIPLIER): Adjust.
36827         * cfghooks.c (dump_bb_for_graph): Print with PRId64.
36828         * cgraph.c (cgraph_redirect_edge_call_stmt_to_callee,
36829         dump_cgraph_node): Likewise.
36830         * final.c (dump_basic_block_info): Likewise.
36831         * gcov-dump.c (tag_counters, tag_summary, dump_working_sets): Likewise.
36832         * gcov.c (format_gcov): Likewise.
36833         * ipa-cp.c (good_cloning_opportunity_p): Likewise.  Use int64_t
36834         for calculation.
36835         (get_clone_agg_value): Use HOST_WIDE_INT for offset.
36836         * ipa-inline.c (compute_max_insns): Use int64_t for calcuation.
36837         (inline_small_functions, dump_overall_stats, dump_inline_stats):
36838         Use PRId64 for dumping.
36839         * ipa-profile.c (dump_histogram, ipa_profile): Likewise.
36840         * ira-color.c (struct allocno_hard_regs): Use int64_t for cost.
36841         (add_allocno_hard_regs): Adjust.
36842         * loop-doloop.c (doloop_modify): Print using PRId64.
36843         * loop-iv.c (inverse): Compute in uint64_t.
36844         (determine_max_iter, iv_number_of_iterations): Likewise.
36845         * loop-unroll.c (decide_peel_completely, decide_peel_simple):
36846         Print using PRId64.
36847         * lto-streamer-out.c (write_symbol): Use uint64_t.
36848         * mcf.c (CAP_INFINITY): Use int64_t maximum.
36849         (dump_fixup_edge, create_fixup_graph, cancel_negative_cycle,
36850         find_max_flow, adjust_cfg_counts): Use int64_t and dump with PRId64.
36851         * modulo-sched.c (const_iteration_count): Use int64_t.
36852         (sms_schedule): Dump using PRId64.
36853         * predict.c (dump_prediction): Likewise.
36854         * pretty-print.h (pp_widest_integer): Remove.
36855         * profile.c (get_working_sets, is_edge_inconsistent,
36856         is_inconsistent, read_profile_edge_counts): Dump using PRId64.
36857         * tree-pretty-print.c (pp_double_int): Remove case handling
36858         HOST_BITS_PER_DOUBLE_INT == HOST_BITS_PER_WIDEST_INT.
36859         * tree-ssa-math-opts.c (struct symbolic_number): Use uint64_t
36860         and adjust users.
36861         (pass_optimize_bswap::execute): Remove restriction on hosts.
36862         * tree-streamer-in.c (streamer_alloc_tree): Use HOST_WIDE_INT.
36863         * tree-streamer-out.c (streamer_write_tree_header): Likewise.
36864         * tree.c (widest_int_cst_value): Remove.
36865         * tree.h (widest_int_cst_value): Likewise.
36866         * value-prof.c (dump_histogram_value): Print using PRId64.
36867         * gengtype.c (main): Also inject int64_t.
36868         * ggc-page.c (struct max_alignment): Use int64_t.
36869         * alloc-pool.c (struct allocation_object_def): Likewise.
36870         * ira-conflicts.c (build_conflict_bit_table): Use uint64_t
36871         for computation.
36872         * doc/tm.texi.in: Remove reference to HOST_WIDEST_INT.
36873         * doc/tm.texi: Regenerated.
36874         * gengtype-lex.l (IWORD): Handle [u]int64_t.
36875         * config/sh/sh.c (expand_cbranchdi4): Use gcov_type.
36876         * config/mmix/mmix-protos.h (mmix_intval, mmix_shiftable_wyde_value,
36877         mmix_output_register_setting): Use [u]int64_t in prototypes.
36878         * config/mmix/mmix.c (mmix_print_operand, mmix_output_register_setting,
36879         mmix_shiftable_wyde_value, mmix_output_shiftvalue_op_from_str,
36880         mmix_output_octa, mmix_output_shifted_value): Adjust.
36881         (mmix_intval): Adjust.  Remove unreachable case.
36882         * config/mmix/mmix.md (*nonlocal_goto_receiver_expanded): Use int64_t.
36884 2014-05-26  Richard Biener  <rguenther@suse.de>
36886         * configure.ac: Drop __int64 type check.  Insist that we
36887         found uint64_t and int64_t.
36888         * hwint.h (HOST_BITS_PER___INT64): Remove.
36889         (HOST_BITS_PER_WIDE_INT): Define to 64 and remove __int64 case.
36890         (HOST_WIDE_INT_PRINT_*): Remove 32bit case.
36891         (HOST_WIDEST_INT*): Define to HOST_WIDE_INT*.
36892         (HOST_WIDEST_FAST_INT): Remove __int64 case.
36893         * vmsdbg.h (struct _DST_SRC_COMMAND): Use int64_t
36894         for dst_q_src_df_rms_cdt.
36895         * configure: Regenerate.
36896         * config.in: Likewise.
36898 2014-05-26  Michael Tautschnig  <mt@debian.org>
36900         PR target/61249
36901         * doc/extend.texi (X86 Built-in Functions): Fix parameter lists of
36902         __builtin_ia32_vfrczs[sd] and __builtin_ia32_mpsadbw256.
36904 2014-05-26  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
36906         PR rtl-optimization/61278
36907         * shrink-wrap.c (move_insn_for_shrink_wrap): Check df_live.
36909 2014-05-26  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
36911         PR rtl-optimization/61220
36912         Part of PR rtl-optimization/61225
36913         * shrink-wrap.c (move_insn_for_shrink_wrap): Skip SP and FP adjustment
36914         insn; skip split_edge for a block with only one successor.
36916 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
36918         * symtab.c (symtab_nonoverwritable_alias): Copy READONLY flag
36919         for variables.
36921 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
36923         * ipa-visibility.c (can_replace_by_local_alias_in_vtable): New function.
36924         (update_vtable_references): New function.
36925         (function_and_variable_visibility): Rewrite also vtable initializers.
36926         * varpool.c (cgraph_variable_initializer_availability): Remove assert.
36928 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
36930         * ggc.h (ggc_grow): New function.
36931         * ggc-none.c (ggc_grow): New function.
36932         * ggc-page.c (ggc_grow): Likewise.
36934 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
36936         * ipa.c (cgraph_non_local_node_p_1, cgraph_local_node_p,
36937         address_taken_from_non_vtable_p, comdat_can_be_unshared_p_1,
36938         comdat_can_be_unshared_p, cgraph_externally_visible_p,
36939         varpool_externally_visible_p, can_replace_by_local_alias,
36940         update_visibility_by_resolution_info, function_and_variable_visibility,
36941         pass_data_ipa_function_and_variable_visibility,
36942         make_pass_ipa_function_and_variable_visibility,
36943         whole_program_function_and_variable_visibility,
36944         pass_data_ipa_whole_program_visibility,
36945         make_pass_ipa_whole_program_visibility): Move to ipa-visibility.c
36946         * cgraph.h (cgraph_local_node_p): Declare.
36947         * ipa-visibility.c: New file.
36948         * Makefile.in (OBJS): Add ipa-visiblity.o
36950 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
36952         * gimple-fold.c (can_refer_decl_in_current_unit_p): Be sure
36953         that var decl is available.
36955 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
36957         * tree-core.h (tree_decl_with_vis): Replace comdat_group by
36958         symtab_node pointer.
36959         * tree.c (copy_node_stat): Be sure to not copy symtab_node pointer.
36960         (find_decls_types_r): Do not walk COMDAT_GROUP.
36961         * tree.h (DECL_COMDAT_GROUP): Revamp to use decl_comdat_group.
36962         * varasm.c (make_decl_one_only): Use set_comdat_group;
36963         create node if needed.
36964         * ipa-inline-transform.c (save_inline_function_body): Update
36965         way we decl->symtab mapping.
36966         * symtab.c (symtab_hash, hash_node, eq_node
36967         symtab_insert_node_to_hashtable): Remove.
36968         (symtab_register_node): Update.
36969         (symtab_unregister_node): Update.
36970         (symtab_get_node): Reimplement as inline function.
36971         (symtab_add_to_same_comdat_group): Update.
36972         (symtab_dissolve_same_comdat_group_list): Update.
36973         (dump_symtab_base): Update.
36974         (verify_symtab_base): Update.
36975         (symtab_make_decl_local): Update.
36976         (fixup_same_cpp_alias_visibility): Update.
36977         (symtab_nonoverwritable_alias): Update.
36978         * cgraphclones.c (set_new_clone_decl_and_node_flags): Update.
36979         * ipa.c (update_visibility_by_resolution_info): UPdate.
36980         * bb-reorder.c: Include cgraph.h
36981         * lto-streamer-out.c (DFS_write_tree_body, hash_tree): Do not deal
36982         with comdat groups.
36983         * ipa-comdats.c (set_comdat_group, ipa_comdats): Update.
36984         * cgraph.c (cgraph_get_create_node): Update.
36985         * cgraph.h (struct symtab_node): Add get_comdat_group, set_comdat_group
36986         and comdat_group_.
36987         (symtab_get_node): Make inline.
36988         (symtab_insert_node_to_hashtable): Remove.
36989         (symtab_can_be_discarded): Update.
36990         (decl_comdat_group): New function.
36991         * tree-streamer-in.c (lto_input_ts_decl_with_vis_tree_pointers):
36992         Update.
36993         * lto-cgraph.c (lto_output_node, lto_output_varpool_node): Stream out
36994         comdat group name.
36995         (read_comdat_group): New function.
36996         (input_node, input_varpool_node): Use it.
36997         * trans-mem.c (ipa_tm_create_version_alias): Update code creating
36998         comdat groups.
36999         * mips.c (mips_start_unique_function): Likewise.
37000         (ix86_code_end): Likewise.
37001         (rs6000_code_end): Likweise.
37002         * tree-streamer-out.c (DECL_COMDAT_GROUP): Do not stream comdat group.
37004 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37006         * gengtype-state.c (fatal_reading_state): Bring offline.
37007         * optabs.c (widening_optab_handler): Bring offline.
37008         * optabs.h (widening_optab_handler): Likewise.
37009         * final.c (get_attr_length_1): Likewise.
37011 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37013         * sched-int.h (sd_iterator_cond): Manually tail recurse.
37015 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37017         * config/rs6000/440.md (ppc440-integer): Include shift without dot.
37018         (ppc440-compare): Include shift with dot.
37019         * config/rs6000/e300c2c3.md (ppce300c3_iu): Include shift without dot.
37020         * config/rs6000/e5500.md (e5500_sfx2): Include constant shift
37021         without dot.
37022         * config/rs6000/e6500.md (e6500_sfx): Exclude constant shift
37023         without dot.
37024         (e6500_sfx2): Include it.
37025         * config/rs6000/rs6000.md ( *zero_extend<mode>di2_internal1,
37026         *zero_extend<mode>di2_internal2, *zero_extend<mode>di2_internal3,
37027         *zero_extendsidi2_lfiwzx, andsi3_mc, andsi3_nomc,
37028         andsi3_internal0_nomc, extzvsi_internal, extzvdi_internal,
37029         *extzvdi_internal1, *extzvdi_internal2, rotlsi3, *rotlsi3_64,
37030         *rotlsi3_internal4, *rotlsi3_internal7le, *rotlsi3_internal7be,
37031         *rotlsi3_internal10le, *rotlsi3_internal10be, rlwinm,
37032         *lshiftrt_internal1le, *lshiftrt_internal1be,
37033         *lshiftrt_internal4le, *lshiftrt_internal4be, rotldi3,
37034         *rotldi3_internal4, *rotldi3_internal7le, *rotldi3_internal7be,
37035         *rotldi3_internal10le, *rotldi3_internal10be,
37036         *rotldi3_internal13le, *rotldi3_internal13be, *ashldi3_internal4,
37037         ashldi3_internal5, *ashldi3_internal6, *ashldi3_internal7,
37038         ashldi3_internal8, *ashldi3_internal9, anddi3_mc, anddi3_nomc,
37039         *anddi3_internal2_mc, *anddi3_internal3_mc, and 4 anonymous
37040         define_insns): Use type "shift" in the appropriate alternatives.
37042 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37044         * config/rs6000/rs6000.md (type): Add "logical".  Delete
37045         "fast_compare".
37046         (dot): Adjust comment.
37047         (andsi3_mc, *andsi3_internal2_mc, *andsi3_internal3_mc,
37048         *andsi3_internal4, *andsi3_internal5_mc, *boolsi3_internal2,
37049         *boolsi3_internal3, *boolccsi3_internal2, *boolccsi3_internal3,
37050         anddi3_mc, *anddi3_internal2_mc, *anddi3_internal3_mc,
37051         *booldi3_internal2, *booldi3_internal3, *boolcdi3_internal2,
37052         *boolcdi3_internal3, *boolccdi3_internal2, *boolccdi3_internal3,
37053         *mov<mode>_internal2, and 10 anonymous define_insns): Use "logical".
37054         * config/rs6000/rs6000.c (rs6000_adjust_cost): Adjust.
37056         * config/rs6000/40x.md (ppc403-integer, ppc403-compare): Adjust.
37057         * config/rs6000/440.md (ppc440-integer, ppc440-compare): Adjust.
37058         * config/rs6000/476.md (ppc476-simple-integer, ppc476-compare): Adjust.
37059         * config/rs6000/603.md (ppc603-integer, ppc603-compare): Adjust.
37060         * config/rs6000/6xx.md (ppc604-integer, ppc604-compare): Adjust.
37061         * config/rs6000/7450.md (ppc7450-integer, ppc7450-compare): Adjust.
37062         * config/rs6000/7xx.md (ppc750-integer, ppc750-compare): Adjust.
37063         * config/rs6000/8540.md (ppc8540_su): Adjust.
37064         * config/rs6000/cell.md (cell-integer, cell-fast-cmp,
37065         cell-cmp-microcoded): Adjust.
37066         * config/rs6000/e300c2c3.md (ppce300c3_cmp, ppce300c3_iu): Adjust.
37067         * config/rs6000/e500mc.md (e500mc_su): Adjust.
37068         * config/rs6000/e500mc64.md (e500mc64_su, e500mc64_su2): Adjust.
37069         * config/rs6000/e5500.md (e5500_sfx, e5500_sfx2): Adjust.
37070         * config/rs6000/e6500.md (e6500_sfx, e6500_sfx2): Adjust.
37071         * config/rs6000/mpc.md (mpccore-integer, mpccore-compare): Adjust.
37072         * config/rs6000/power4.md (power4-integer, power4-cmp): Adjust.
37073         * config/rs6000/power5.md (power5-integer, power5-cmp): Adjust.
37074         * config/rs6000/power6.md (power6-integer, power6-fast-compare):
37075         Adjust.
37076         * config/rs6000/power7.md (power7-integer, power7-cmp): Adjust.
37077         * config/rs6000/power8.md (power8-1cyc, power8-fast-compare):
37078         Adjust.  Adjust comment.
37079         * config/rs6000/rs64.md (rs64a-integer, rs64a-compare): Adjust.
37080         * config/rs6000/titan.md (titan_fxu_adder, titan_fxu_alu): Adjust.
37082 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37084         * config/rs6000/rs6000.md (type): Add "add".
37085         (*add<mode>3_internal1, addsi3_high, *add<mode>3_internal2,
37086         *add<mode>3_internal3, *neg<mode>2_internal, and 5 anonymous
37087         define_insns): Use it.
37088         * config/rs6000/rs6000.c (rs6000_adjust_cost): Adjust.
37090         * config/rs6000/40x.md (ppc403-integer, ppc403-compare): Adjust.
37091         * config/rs6000/440.md (ppc440-integer, ppc440-compare): Adjust.
37092         * config/rs6000/476.md (ppc476-simple-integer, ppc476-compare): Adjust.
37093         * config/rs6000/601.md (ppc601-integer): Adjust.
37094         * config/rs6000/603.md (ppc603-integer, ppc603-compare): Adjust.
37095         * config/rs6000/6xx.md (ppc604-integer, ppc604-compare): Adjust.
37096         * config/rs6000/7450.md (ppc7450-integer, ppc7450-compare): Adjust.
37097         * config/rs6000/7xx.md (ppc750-integer, ppc750-compare): Adjust.
37098         * config/rs6000/8540.md (ppc8540_su): Adjust.
37099         * config/rs6000/cell.md (cell-integer, cell-fast-cmp,
37100         cell-cmp-microcoded): Adjust.
37101         * config/rs6000/e300c2c3.md (ppce300c3_cmp, ppce300c3_iu): Adjust.
37102         * config/rs6000/e500mc.md (e500mc_su): Adjust.
37103         * config/rs6000/e500mc64.md (e500mc64_su, e500mc64_su2): Adjust.
37104         * config/rs6000/e5500.md (e5500_sfx, e5500_sfx2): Adjust.
37105         * config/rs6000/e6500.md (e6500_sfx, e6500_sfx2): Adjust.
37106         * config/rs6000/mpc.md (mpccore-integer, mpccore-compare): Adjust.
37107         * config/rs6000/power4.md (power4-integer, power4-cmp): Adjust.
37108         * config/rs6000/power5.md (power5-integer, power5-cmp): Adjust.
37109         * config/rs6000/power6.md (power6-integer, power6-fast-compare):
37110         Adjust.
37111         * config/rs6000/power7.md (power7-integer, power7-cmp): Adjust.
37112         * config/rs6000/power8.md (power8-1cyc, power8-fast-compare): Adjust.
37113         * config/rs6000/rs64.md (rs64a-integer, rs64a-compare): Adjust.
37114         * config/rs6000/titan.md (titan_fxu_adder, titan_fxu_alu): Adjust.
37116 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37118         * config/rs6000/rs6000.md (type): Delete "var_shift_rotate",
37119         "delayed_compare", "var_delayed_compare".
37120         (var_shift): New attribute.
37121         (cell_micro): Adjust.
37122         (*andsi3_internal2_mc, *andsi3_internal3_mc, *andsi3_internal4,
37123         *andsi3_internal5_mc, *extzvsi_internal1, *extzvsi_internal2,
37124         rotlsi3, *rotlsi3_64, *rotlsi3_internal2, *rotlsi3_internal3,
37125         *rotlsi3_internal4, *rotlsi3_internal5, *rotlsi3_internal6,
37126         *rotlsi3_internal8le, *rotlsi3_internal8be, *rotlsi3_internal9le,
37127         *rotlsi3_internal9be, *rotlsi3_internal10le, *rotlsi3_internal10be,
37128         *rotlsi3_internal11le, *rotlsi3_internal11be, *rotlsi3_internal12le,
37129         *rotlsi3_internal12be, ashlsi3, *ashlsi3_64, lshrsi3, *lshrsi3_64,
37130         *lshiftrt_internal2le, *lshiftrt_internal2be, *lshiftrt_internal3le,
37131         *lshiftrt_internal3be, *lshiftrt_internal5le, *lshiftrt_internal5be,
37132         *lshiftrt_internal5le, *lshiftrt_internal5be, ashrsi3, *ashrsi3_64,
37133         rotldi3, *rotldi3_internal2, *rotldi3_internal3, *rotldi3_internal4,
37134         *rotldi3_internal5, *rotldi3_internal6, *rotldi3_internal7le,
37135         *rotldi3_internal7be, *rotldi3_internal8le, *rotldi3_internal8be,
37136         *rotldi3_internal9le, *rotldi3_internal9be, *rotldi3_internal10le,
37137         *rotldi3_internal10be, *rotldi3_internal11le, *rotldi3_internal11be,
37138         *rotldi3_internal12le, *rotldi3_internal12be, *rotldi3_internal13le,
37139         *rotldi3_internal13be, *rotldi3_internal14le, *rotldi3_internal14be,
37140         *rotldi3_internal15le, *rotldi3_internal15be, *ashldi3_internal1,
37141         *ashldi3_internal2, *ashldi3_internal3, *lshrdi3_internal1,
37142         *lshrdi3_internal2, *lshrdi3_internal3, *ashrdi3_internal1,
37143         *ashrdi3_internal2, *ashrdi3_internal3, *anddi3_internal2_mc,
37144         *anddi3_internal3_mc, as well as 11 anonymous define_insns): Adjust.
37145         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_cracked_insn,
37146         insn_must_be_first_in_group, insn_must_be_last_in_group): Adjust.
37148         * config/rs6000/40x.md (ppc403-integer, ppc403-compare): Adjust.
37149         * config/rs6000/440.md (ppc440-integer): Adjust.
37150         * config/rs6000/476.md (ppc476-simple-integer, ppc476-compare): Adjust.
37151         * config/rs6000/601.md (ppc601-integer, ppc601-compare): Adjust.
37152         * config/rs6000/603.md (ppc603-integer, ppc603-compare): Adjust.
37153         * config/rs6000/6xx.md (ppc604-integer, ppc604-compare): Adjust.
37154         * config/rs6000/7450.md (ppc7450-integer, ppc7450-compare): Adjust.
37155         * config/rs6000/7xx.md (ppc750-integer, ppc750-compare): Adjust.
37156         * config/rs6000/8540.md (ppc8540_su): Adjust.
37157         * config/rs6000/cell.md (cell-integer, cell-fast-cmp,
37158         cell-cmp-microcoded): Adjust.
37159         * config/rs6000/e300c2c3.md (ppce300c3_cmp): Adjust.
37160         * config/rs6000/e500mc.md (e500mc_su): Adjust.
37161         * config/rs6000/e500mc64.md (e500mc64_su, e500mc64_su2,
37162         e500mc64_delayed): Adjust.
37163         * config/rs6000/e5500.md (e5500_sfx, e5500_delayed): Adjust.
37164         * config/rs6000/e6500.md (e6500_sfx, e6500_delayed): Adjust.
37165         * config/rs6000/mpc.md (mpccore-integer, mpccore-compare): Adjust.
37166         * config/rs6000/power4.md (power4-integer, power4-compare): Adjust.
37167         * config/rs6000/power5.md (power5-integer, power5-compare): Adjust.
37168         * config/rs6000/power6.md (power6-shift, power6-var-rotate,
37169         power6-delayed-compare, power6-var-delayed-compare): Adjust.
37170         * config/rs6000/power7.md (power7-integer, power7-compare): Adjust.
37171         * config/rs6000/power8.md (power8-1cyc, power8-compare): Adjust.
37172         Adjust comment.
37173         * config/rs6000/rs64.md (rs64a-integer, rs64a-compare): Adjust.
37174         * config/rs6000/titan.md (titan_fxu_shift_and_rotate): Adjust.
37176 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37178         * config/rs6000/rs6000.md (type): Delete "idiv", "ldiv".  Add "div".
37179         (bits): New mode_attr.
37180         (idiv_ldiv): Delete mode_attr.
37181         (udiv<mode>3, *div<mode>3, div<div_extend>_<mode>): Adjust.
37182         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_cracked_insn,
37183         rs6000_adjust_priority, is_nonpipeline_insn,
37184         insn_must_be_first_in_group, insn_must_be_last_in_group): Adjust.
37186         * config/rs6000/40x.md (ppc403-idiv): Adjust.
37187         * config/rs6000/440.md (ppc440-idiv): Adjust.
37188         * config/rs6000/476.md (ppc476-idiv): Adjust.
37189         * config/rs6000/601.md (ppc601-idiv): Adjust.
37190         * config/rs6000/603.md (ppc603-idiv): Adjust.
37191         * config/rs6000/6xx.md (ppc604-idiv, ppc620-idiv, ppc630-idiv,
37192         ppc620-ldiv): Adjust.
37193         * config/rs6000/7450.md (ppc7450-idiv): Adjust.
37194         * config/rs6000/7xx.md (ppc750-idiv): Adjust.
37195         * config/rs6000/8540.md (ppc8540_divide): Adjust.
37196         * config/rs6000/a2.md (ppca2-idiv, ppca2-ldiv): Adjust.
37197         * config/rs6000/cell.md (cell-idiv, cell-ldiv): Adjust.
37198         * config/rs6000/e300c2c3.md (ppce300c3_divide): Adjust.
37199         * config/rs6000/e500mc.md (e500mc_divide): Adjust.
37200         * config/rs6000/e500mc64.md (e500mc64_divide): Adjust.
37201         * config/rs6000/e5500.md (e5500_divide, e5500_divide_d): Adjust.
37202         * config/rs6000/e6500.md (e6500_divide, e6500_divide_d): Adjust.
37203         * config/rs6000/mpc.md (mpccore-idiv): Adjust.
37204         * config/rs6000/power4.md (power4-idiv, power4-ldiv): Adjust.
37205         * config/rs6000/power5.md (power5-idiv, power5-ldiv): Adjust.
37206         * config/rs6000/power6.md (power6-idiv, power6-ldiv): Adjust.
37207         * config/rs6000/power7.md (power7-idiv, power7-ldiv): Adjust.
37208         * config/rs6000/power8.md (power8-idiv, power8-ldiv): Adjust.
37209         * config/rs6000/rs64.md (rs64a-idiv, rs64a-ldiv): Adjust.
37210         * config/rs6000/titan.md (titan_fxu_div): Adjust.
37212 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37214         * config/rs6000/rs6000.md (type): Delete "insert_word",
37215         "insert_dword".  Add "insert".
37216         (size): Update comment.
37217         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_cracked_insn,
37218         insn_must_be_first_in_group): Adjust.
37219         (insvsi_internal, *insvsi_internal1, *insvsi_internal2,
37220         *insvsi_internal3, *insvsi_internal4, *insvsi_internal5,
37221         *insvsi_internal6, insvdi_internal): Adjust.
37223         * config/rs6000/40x.md (ppc403-integer): Adjust.
37224         * config/rs6000/440.md (ppc440-integer): Adjust.
37225         * config/rs6000/476.md (ppc476-simple-integer): Adjust.
37226         * config/rs6000/601.md (ppc601-integer): Adjust.
37227         * config/rs6000/603.md (ppc603-integer): Adjust.
37228         * config/rs6000/6xx.md (ppc604-integer): Adjust.
37229         * config/rs6000/7450.md (ppc7450-integer): Adjust.
37230         * config/rs6000/7xx.md (ppc750-integer): Adjust.
37231         * config/rs6000/8540.md (ppc8540_su): Adjust.
37232         * config/rs6000/cell.md (cell-integer, cell-insert): Adjust.
37233         * config/rs6000/e300c2c3.md (ppce300c3_iu): Adjust.
37234         * config/rs6000/e500mc.md (e500mc_su): Adjust.
37235         * config/rs6000/e500mc64.md (e500mc64_su): Adjust.
37236         * config/rs6000/e5500.md (e5500_sfx): Adjust.
37237         * config/rs6000/e6500.md (e6500_sfx): Adjust.
37238         * config/rs6000/mpc.md (mpccore-integer): Adjust.
37239         * config/rs6000/power4.md (power4-integer, power4-insert): Adjust.
37240         * config/rs6000/power5.md (power5-integer, power5-insert): Adjust.
37241         * config/rs6000/power6.md (power6-insert, power6-insert-dword): Adjust.
37242         * config/rs6000/power7.md (power7-integer): Adjust.
37243         * config/rs6000/power8.md (power8-1cyc): Adjust.
37244         * config/rs6000/rs64.md (rs64a-integer): Adjust.
37245         * config/rs6000/titan.md (titan_fxu_shift_and_rotate): Adjust.
37247 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37249         * config/rs6000/rs6000.md (type): Add "mul".  Delete "imul",
37250         "imul2", "imul3", "lmul", "imul_compare", "lmul_compare".
37251         (size): New attribute.
37252         (dot): New attribute.
37253         (cell_micro): Adjust.
37254         (mulsi3, *mulsi3_internal1, *mulsi3_internal2, mulsidi3,
37255         umulsidi3, smulsi3_highpart, umulsi3_highpart, muldi3,
37256         *muldi3_internal1, *muldi3_internal2, smuldi3_highpart,
37257         umuldi3_highpart): Adjust.
37258         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_cracked_insn,
37259         rs6000_adjust_priority, is_nonpipeline_insn,
37260         insn_must_be_first_in_group, insn_must_be_last_in_group): Adjust.
37262         * config/rs6000/40x.md (ppc403-imul, ppc405-imul, ppc405-imul2,
37263         ppc405-imul3): Adjust.
37264         * config/rs6000/440.md (ppc440-imul, ppc440-imul2): Adjust.
37265         * config/rs6000/476.md (ppc476-imul): Adjust.
37266         * config/rs6000/601.md (ppc601-imul): Adjust.
37267         * config/rs6000/603.md (ppc603-imul, ppc603-imul2): Adjust.
37268         * config/rs6000/6xx.md (ppc604-imul, ppc604e-imul, ppc620-imul,
37269         ppc620-imul2, ppc620-imul3, ppc620-lmul): Adjust.
37270         * config/rs6000/7450.md (ppc7450-imul, ppc7450-imul2): Adjust.
37271         * config/rs6000/7xx.md (ppc750-imul, ppc750-imul2, ppc750-imul3):
37272         Adjust.
37273         * config/rs6000/8540.md (ppc8540_multiply): Adjust.
37274         * config/rs6000/a2.md (ppca2-imul, ppca2-lmul): Adjust.
37275         * config/rs6000/cell.md (cell-lmul, cell-lmul-cmp, cell-imul23,
37276         cell-imul): Adjust.
37277         * config/rs6000/e300c2c3.md (ppce300c3_multiply): Adjust.
37278         * config/rs6000/e500mc.md (e500mc_multiply): Adjust.
37279         * config/rs6000/e500mc64.md (e500mc64_multiply): Adjust.
37280         * config/rs6000/e5500.md (e5500_multiply, e5500_multiply_i): Adjust.
37281         * config/rs6000/e6500.md (e6500_multiply, e6500_multiply_i): Adjust.
37282         * config/rs6000/mpc.md (mpccore-imul): Adjust.
37283         * config/rs6000/power4.md (power4-lmul-cmp, power4-imul-cmp,
37284         power4-lmul, power4-imul, power4-imul3): Adjust.
37285         * config/rs6000/power5.md (power5-lmul-cmp, power5-imul-cmp,
37286         power5-lmul, power5-imul, power5-imul3): Adjust.
37287         * config/rs6000/power6.md (power6-lmul-cmp, power6-imul-cmp,
37288         power6-lmul, power6-imul, power6-imul3): Adjust.
37289         * config/rs6000/power7.md (power7-mul, power7-mul-compare): Adjust.
37290         * config/rs6000/power8.md (power8-mul, power8-mul-compare): Adjust.
37292         * config/rs6000/rs64.md (rs64a-imul, rs64a-imul2, rs64a-imul3,
37293         rs64a-lmul): Adjust.
37294         * config/rs6000/titan.md (titan_imul): Adjust.
37296 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37298         * config/rs6000/rs6000.md (type): Add new value "halfmul".
37299         (*macchwc, *macchw, *macchwuc, *macchwu, *machhwc, *machhw,
37300         *machhwuc, *machhwu, *maclhwc, *maclhw, *maclhwuc, *maclhwu,
37301         *nmacchwc, *nmacchw, *nmachhwc, *nmachhw, *nmaclhwc, *nmaclhw,
37302         *mulchwc, *mulchw, *mulchwuc, *mulchwu, *mulhhwc, *mulhhw,
37303         *mulhhwuc, *mulhhwu, *mullhwc, *mullhw, *mullhwuc, *mullhwu): Use it.
37304         * config/rs6000/40x.md (ppc405-imul3): Add type halfmul.
37305         * config/rs6000/440.md (ppc440-imul2): Add type halfmul.
37306         * config/rs6000/476.md (ppc476-imul): Add type halfmul.
37307         * config/rs6000/titan.md: Delete nonsensical comment.
37308         (titan_imul): Add type imul3.
37309         (titan_mulhw): Remove type imul3; add type halfmul.
37311 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37313         * config/rs6000/rs6000.md (type): Reorder, reformat.
37315 2014-05-23  Martin Jambor  <mjambor@suse.cz>
37317         PR tree-optimization/53787
37318         * params.def (PARAM_IPA_MAX_AA_STEPS): New param.
37319         * ipa-prop.h (ipa_node_params): Rename uses_analysis_done to
37320         analysis_done, update all uses.
37321         * ipa-prop.c: Include domwalk.h
37322         (param_analysis_info): Removed.
37323         (param_aa_status): New type.
37324         (ipa_bb_info): Likewise.
37325         (func_body_info): Likewise.
37326         (ipa_get_bb_info): New function.
37327         (aa_overwalked): Likewise.
37328         (find_dominating_aa_status): Likewise.
37329         (parm_bb_aa_status_for_bb): Likewise.
37330         (parm_preserved_before_stmt_p): Changed to use new param AA info.
37331         (load_from_unmodified_param): Accept func_body_info as a parameter
37332         instead of parms_ainfo.
37333         (parm_ref_data_preserved_p): Changed to use new param AA info.
37334         (parm_ref_data_pass_through_p): Likewise.
37335         (ipa_load_from_parm_agg_1): Likewise.  Update callers.
37336         (compute_complex_assign_jump_func): Changed to use new param AA info.
37337         (compute_complex_ancestor_jump_func): Likewise.
37338         (ipa_compute_jump_functions_for_edge): Likewise.
37339         (ipa_compute_jump_functions): Removed.
37340         (ipa_compute_jump_functions_for_bb): New function.
37341         (ipa_analyze_indirect_call_uses): Likewise, moved variable
37342         declarations down.
37343         (ipa_analyze_virtual_call_uses): Accept func_body_info instead of node
37344         and info, moved variable declarations down.
37345         (ipa_analyze_call_uses): Accept and pass on func_body_info instead of
37346         node and info.
37347         (ipa_analyze_stmt_uses): Likewise.
37348         (ipa_analyze_params_uses): Removed.
37349         (ipa_analyze_params_uses_in_bb): New function.
37350         (ipa_analyze_controlled_uses): Likewise.
37351         (free_ipa_bb_info): Likewise.
37352         (analysis_dom_walker): New class.
37353         (ipa_analyze_node): Handle node-specific forbidden analysis,
37354         initialize and free func_body_info, use dominator walker.
37355         (ipcp_modif_dom_walker): New class.
37356         (ipcp_transform_function): Create and free func_body_info, use
37357         ipcp_modif_dom_walker, moved a lot of functionality there.
37359 2014-05-23  Marek Polacek  <polacek@redhat.com>
37360             Jakub Jelinek  <jakub@redhat.com>
37362         * builtins.def: Change SANITIZE_FLOAT_DIVIDE to SANITIZE_NONDEFAULT.
37363         * gcc.c (sanitize_spec_function): Likewise.
37364         * convert.c (convert_to_integer): Include "ubsan.h".  Add
37365         floating-point to integer instrumentation.
37366         * doc/invoke.texi: Document -fsanitize=float-cast-overflow.
37367         * flag-types.h (enum sanitize_code): Add SANITIZE_FLOAT_CAST and
37368         SANITIZE_NONDEFAULT.
37369         * opts.c (common_handle_option): Handle -fsanitize=float-cast-overflow.
37370         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_FLOAT_CAST_OVERFLOW,
37371         BUILT_IN_UBSAN_HANDLE_FLOAT_CAST_OVERFLOW_ABORT): Add.
37372         * ubsan.c: Include "realmpfr.h" and "dfp.h".
37373         (get_ubsan_type_info_for_type): Handle REAL_TYPEs.
37374         (ubsan_type_descriptor): Set tkind to 0xffff for types other than
37375         float/double/long double.
37376         (ubsan_instrument_float_cast): New function.
37377         * ubsan.h (ubsan_instrument_float_cast): Declare.
37379 2014-05-23 Jiong Wang  <jiong.wang@arm.com>
37381         * config/aarch64/predicates.md (aarch64_call_insn_operand): New
37382         predicate.
37383         * config/aarch64/constraints.md ("Ucs", "Usf"):  New constraints.
37384         * config/aarch64/aarch64.md (*sibcall_insn, *sibcall_value_insn):
37385         Adjust for tailcalling through registers.
37386         * config/aarch64/aarch64.h (enum reg_class): New caller save
37387         register class.
37388         (REG_CLASS_NAMES): Likewise.
37389         (REG_CLASS_CONTENTS): Likewise.
37390         * config/aarch64/aarch64.c (aarch64_function_ok_for_sibcall):
37391         Allow tailcalling without decls.
37393 2014-05-23  Thomas Schwinge  <thomas@codesourcery.com>
37395         * gimplify.c (omp_notice_variable) <case OMP_CLAUSE_DEFAULT_NONE>:
37396         Rewrite check for ORT_PARALLEL and ORT_COMBINED_PARALLEL.
37398         * omp-low.c (expand_omp_for_static_chunk): Rename variable si to
37399         gsi, and variables v_* to v*.
37401 2014-05-23  Eric Botcazou  <ebotcazou@adacore.com>
37403         * varasm.c (output_constructor_bitfield): Fix thinkos in latest change.
37405 2014-05-23  Thomas Schwinge  <thomas@codesourcery.com>
37407         * gimple.h (enum gf_mask): Add and use GF_OMP_FOR_SIMD.
37408         * omp-low.c: Update accordingly.
37410         * gimple.h (enum gf_mask): Rewrite "<< 0" shift expressions used
37411         for GF_OMP_FOR_KIND_MASK, GF_OMP_FOR_KIND_FOR,
37412         GF_OMP_FOR_KIND_DISTRIBUTE, GF_OMP_FOR_KIND_SIMD,
37413         GF_OMP_FOR_KIND_CILKSIMD, GF_OMP_TARGET_KIND_MASK,
37414         GF_OMP_TARGET_KIND_REGION, GF_OMP_TARGET_KIND_DATA,
37415         GF_OMP_TARGET_KIND_UPDATE.
37417         * gimplify.c (omp_notice_variable) <case OMP_CLAUSE_DEFAULT_NONE>:
37418         Explicitly enumerate the expected region types.
37420 2014-05-23  Paul Eggert  <eggert@cs.ucla.edu>
37422         PR other/56955
37423         * doc/extend.texi (Function Attributes): Fix  __attribute__ ((malloc))
37424         documentation; the old documentation didn't clearly state the
37425         constraints on the contents of the pointed-to storage.
37427 2014-05-23  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37429         Fix bootstrap error on ia64
37430         * config/ia64/ia64.c (ia64_first_cycle_multipass_dfa_lookahead_guard):
37431         Return default value.
37433 2014-05-23  Thomas Preud'homme  <thomas.preudhomme@arm.com>
37435         PR tree-optimization/54733
37436         * tree-ssa-math-opts.c (nop_stats): New "bswap_stats" structure.
37437         (CMPNOP): Define.
37438         (find_bswap_or_nop_load): New.
37439         (find_bswap_1): Renamed to ...
37440         (find_bswap_or_nop_1): This. Also add support for memory source.
37441         (find_bswap): Renamed to ...
37442         (find_bswap_or_nop): This. Also add support for memory source and
37443         detection of bitwise operations equivalent to load in target
37444         endianness.
37445         (execute_optimize_bswap): Likewise. Also move its leading comment back
37446         in place and split statement transformation into ...
37447         (bswap_replace): This.
37449 2014-05-22  Vladimir Makarov  <vmakarov@redhat.com>
37451         PR rtl-optimization/61215
37452         * lra-elelimination.c (lra_eliminate_regs_1): Don't use
37453         simplify_gen_subreg until final substitution.
37455 2014-05-23  Alan Modra  <amodra@gmail.com>
37457         PR target/61231
37458         * config/rs6000/rs6000.c (mem_operand_gpr): Handle SImode.
37459         * config/rs6000/rs6000.md (extendsidi2_lfiwax, extendsidi2_nocell):
37460         Use "Y" constraint rather than "m".
37462 2014-05-23  Kugan Vivekanandarajah  <kuganv@linaro.org>
37464         * config/aarch64/aarch64.c (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): New
37465         define.
37466         * config/aarch64/aarch64-protos.h (aarch64_atomic_assign_expand_fenv):
37467         New function declaration.
37468         * config/aarch64/aarch64-builtins.c (aarch64_builtins) : Add
37469         AARCH64_BUILTIN_GET_FPCR, AARCH64_BUILTIN_SET_FPCR.
37470         AARCH64_BUILTIN_GET_FPSR and AARCH64_BUILTIN_SET_FPSR.
37471         (aarch64_init_builtins) : Initialize builtins
37472         __builtins_aarch64_set_fpcr, __builtins_aarch64_get_fpcr.
37473         __builtins_aarch64_set_fpsr and __builtins_aarch64_get_fpsr.
37474         (aarch64_expand_builtin) : Expand builtins __builtins_aarch64_set_fpcr
37475         __builtins_aarch64_get_fpcr, __builtins_aarch64_get_fpsr,
37476         and __builtins_aarch64_set_fpsr.
37477         (aarch64_atomic_assign_expand_fenv): New function.
37478         * config/aarch64/aarch64.md (set_fpcr): New pattern.
37479         (get_fpcr) : Likewise.
37480         (set_fpsr) : Likewise.
37481         (get_fpsr) : Likewise.
37482         (unspecv): Add UNSPECV_GET_FPCR and UNSPECV_SET_FPCR, UNSPECV_GET_FPSR
37483         and UNSPECV_SET_FPSR.
37484         * doc/extend.texi (AARCH64 Built-in Functions) : Document
37485         __builtins_aarch64_set_fpcr, __builtins_aarch64_get_fpcr.
37486         __builtins_aarch64_set_fpsr and __builtins_aarch64_get_fpsr.
37488 2014-05-22  Vladimir Makarov  <vmakarov@redhat.com>
37490         PR rtl-optimization/60969
37491         * ira-costs.c (record_reg_classes): Process NO_REGS for matching
37492         constraints.  Set up mem cost for NO_REGS case.
37494 2014-05-22  Thomas Schwinge  <thomas@codesourcery.com>
37496         * builtin-types.def: Simplify examples for DEF_FUNCTION_TYPE_*.
37498 2012-05-22  Bernd Schmidt  <bernds@codesourcery.com>
37500         * config/darwin.c: Include "lto-section-names.h".
37501         (LTO_SEGMENT_NAME): Don't define.
37502         * config/i386/winnt.c: Include "lto-section-names.h".
37503         * lto-streamer.c: Include "lto-section-names.h".
37504         * lto-streamer.h (LTO_SECTION_NAME_PREFIX): Don't define.
37505         * lto-wrapper.c: Include "lto-section-names.h".
37506         (LTO_SECTION_NAME_PREFIX): Don't define.
37507         * lto-section-names.h: New file.
37508         * cgraphunit.c: Include "lto-section-names.h".
37510 2014-05-22  Peter Bergner  <bergner@vnet.ibm.com>
37512         * config/rs6000/htm.md (ttest): Use correct shift value to get CR0.
37514 2014-05-22  Richard Earnshaw  <rearnsha@arm.com>
37516         PR target/61208
37517         * arm.md (arm_cmpdi_unsigned): Fix length calculation for Thumb2.
37519 2014-05-22  Nick Clifton  <nickc@redhat.com>
37521         * config/msp430/msp430.h (ASM_SPEC): Add spaces after inserted options.
37523 2014-05-22  Eric Botcazou  <ebotcazou@adacore.com>
37525         * tree-ssa-forwprop.c (associate_plusminus): Extend (T)(P + A) - (T)P
37526         -> (T)A transformation to integer types.
37528 2014-05-22  Teresa Johnson  <tejohnson@google.com>
37530         * gcov-io.c (gcov_position): Use gcov_nonruntime_assert.
37531         (gcov_is_error): Remove gcc_assert from IN_LIBGCOV code.
37532         (gcov_rewrite): Use gcov_nonruntime_assert.
37533         (gcov_open): Ditto.
37534         (gcov_write_words): Ditto.
37535         (gcov_write_length): Ditto.
37536         (gcov_read_words): Use gcov_nonruntime_assert, and remove
37537         gcc_assert from IN_LIBGCOV code.
37538         (gcov_read_summary): Use gcov_error to flag profile corruption.
37539         (gcov_sync): Use gcov_nonruntime_assert.
37540         (gcov_seek): Remove gcc_assert from IN_LIBGCOV code.
37541         (gcov_histo_index): Use gcov_nonruntime_assert.
37542         (static void gcov_histogram_merge): Ditto.
37543         (compute_working_sets): Ditto.
37544         * gcov-io.h (gcov_nonruntime_assert): Define.
37545         (gcov_error): Define for !IN_LIBGCOV
37547 2014-05-22  Richard Biener  <rguenther@suse.de>
37549         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Handle
37550         BUILT_IN_REALLOC like BUILT_IN_STRDUP.
37551         (call_may_clobber_ref_p_1): Handle BUILT_IN_REALLOC as allocation
37552         and deallocation site.
37553         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
37554         Handle BUILT_IN_REALLOC similar to BUILT_IN_STRDUP with also
37555         passing through the incoming points-to set.
37556         (handle_lhs_call): Use flags argument instead of recomputing it.
37557         (find_func_aliases_for_call): Call handle_lhs_call with proper
37558         call return flags.
37560 2014-05-22  Jakub Jelinek  <jakub@redhat.com>
37562         * tree-streamer-in.c (unpack_ts_real_cst_value_fields): Make sure
37563         all padding bits in REAL_VALUE_TYPE are cleared.
37565 2014-05-22  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37567         Cleanup and improve multipass_dfa_lookahead_guard
37568         * config/i386/i386.c (core2i7_first_cycle_multipass_filter_ready_try,)
37569         (core2i7_first_cycle_multipass_begin,)
37570         (core2i7_first_cycle_multipass_issue,)
37571         (core2i7_first_cycle_multipass_backtrack): Update signature.
37572         * config/ia64/ia64.c
37573         (ia64_first_cycle_multipass_dfa_lookahead_guard_spec): Remove.
37574         (ia64_first_cycle_multipass_dfa_lookahead_guard): Update signature.
37575         (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD_GUARD_SPEC): Remove
37576         hook definition.
37577         (ia64_first_cycle_multipass_dfa_lookahead_guard): Merge logic from
37578         ia64_first_cycle_multipass_dfa_lookahead_guard_spec.  Update return
37579         values.
37580         * config/rs6000/rs6000.c (rs6000_use_sched_lookahead_guard): Update
37581         return values.
37582         * doc/tm.texi: Regenerate.
37583         * doc/tm.texi.in
37584         (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD_GUARD_SPEC): Remove.
37585         * haifa-sched.c (ready_try): Make signed to allow negative values.
37586         (rebug_ready_list_1): Update.
37587         (choose_ready): Simplify.
37588         (sched_extend_ready_list): Update.
37590 2014-05-22  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37592         Remove IA64 speculation tweaking flags
37593         * config/ia64/ia64.c (ia64_set_sched_flags): Delete handling of
37594         speculation tuning flags.
37595         (msched-prefer-non-data-spec-insns,)
37596         (msched-prefer-non-control-spec-insns): Obsolete options.
37597         * haifa-sched.c (choose_ready): Remove handling of
37598         PREFER_NON_CONTROL_SPEC and PREFER_NON_DATA_SPEC.
37599         * sched-int.h (enum SPEC_SCHED_FLAGS): Remove PREFER_NON_CONTROL_SPEC
37600         and PREFER_NON_DATA_SPEC.
37601         * sel-sched.c (process_spec_exprs): Remove handling of
37602         PREFER_NON_CONTROL_SPEC and PREFER_NON_DATA_SPEC.
37604 2014-05-22  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37606         Improve scheduling debug output
37607         * haifa-sched.c (debug_ready_list): Remove unnecessary prototype.
37608         (advance_one_cycle): Update.
37609         (schedule_insn, queue_to_ready): Add debug printouts.
37610         (debug_ready_list_1): New static function.
37611         (debug_ready_list): Update.
37612         (max_issue): Add debug printouts.
37613         (dump_insn_stream): New static function.
37614         (schedule_block): Use it.  Also better indent printouts.
37616 2014-05-22  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37618         Fix sched_insn debug counter
37619         * haifa-sched.c (schedule_insn): Update.
37620         (struct haifa_saved_data): Add nonscheduled_insns_begin.
37621         (save_backtrack_point, restore_backtrack_point): Update.
37622         (first_nonscheduled_insn): New static function.
37623         (queue_to_ready, choose_ready): Use it.
37624         (schedule_block): Init nonscheduled_insns_begin.
37625         (sched_emit_insn): Update.
37628 2014-05-22  Kugan Vivekanandarajah  <kuganv@linaro.org>
37630         * config/aarch64/aarch64.c (aarch64_regno_regclass) : Change CORE_REGS
37631         to GENERAL_REGS.
37632         (aarch64_secondary_reload) : LikeWise.
37633         (aarch64_class_max_nregs) : Remove CORE_REGS.
37634         * config/aarch64/aarch64.h (enum reg_class) : Remove CORE_REGS.
37635         (REG_CLASS_NAMES) : Likewise.
37636         (REG_CLASS_CONTENTS) : LikeWise.
37637         (INDEX_REG_CLASS) : Change CORE_REGS to GENERAL_REGS.
37639 2014-05-21  Guozhi Wei  <carrot@google.com>
37641         PR target/61202
37642         * config/aarch64/arm_neon.h (vqdmulh_n_s16): Change the last operand's
37643         constraint.
37644         (vqdmulhq_n_s16): Likewise.
37646 2014-05-21  Segher Boessenkool  <segher@kernel.crashing.org>
37648         * config/rs6000/predicates.md (update_indexed_address_mem): Delete.
37650 2014-05-21  Marek Polacek  <polacek@redhat.com>
37652         PR sanitizer/61272
37653         * ubsan.c (is_ubsan_builtin_p): Turn assert into a condition.
37655 2014-05-21  Martin Jambor  <mjambor@suse.cz>
37657         * doc/invoke.texi (Optimize Options): Document parameters
37658         ipa-cp-eval-threshold, ipa-max-agg-items, ipa-cp-loop-hint-bonus and
37659         ipa-cp-array-index-hint-bonus.
37661 2014-05-21  Mark Wielaard  <mjw@redhat.com>
37663         PR debug/16063
37664         * dwarf2out.c (gen_enumeration_type_die): Add DW_AT_type if DWARF
37665         version >= 3 or not strict DWARF.
37666         * langhooks.h (struct lang_hooks_for_types): Add
37667         enum_underlying_base_type.
37668         * langhooks.c (lhd_enum_underlying_base_type): New function.
37669         * gcc/langhooks.h (struct lang_hooks_for_types): Add
37670         enum_underlying_base_type.
37671         * langhooks-def.h (lhd_enum_underlying_base_type): New declaration.
37672         (LANG_HOOKS_ENUM_UNDERLYING_BASE_TYPE): New define.
37673         (LANG_HOOKS_FOR_TYPES_INITIALIZER): Add new lang hook.
37675 2014-05-21  Richard Biener  <rguenther@suse.de>
37677         * doc/invoke.texi (-flto-partition=): Document one and none algorithms.
37679 2014-05-21  John Marino  <gnugcc@marino.st>
37681         * config.gcc (*-*-dragonfly*): New target.
37682         * configure.ac: Detect dl_iterate_phdr (*freebsd*, *dragonfly*).
37683         * configure: Regenerate.
37684         * config/dragonfly-stdint.h: New.
37685         * config/dragonfly.h: New.
37686         * config/dragonfly.opt: New.
37687         * config/i386/dragonfly.h: New.
37688         * ginclude/stddef.h: Detect _PTRDIFF_T_DECLARED for DragonFly.
37690 2014-05-21  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
37692         * tree.def (VOID_CST): New.
37693         * tree-core.h (TI_VOID): New.
37694         * tree.h (void_node): New.
37695         * tree.c (tree_node_structure_for_code, tree_code_size)
37696         (iterative_hash_expr): Handle VOID_CST.
37697         (build_common_tree_nodes): Initialize void_node.
37699 2014-05-21  Bernd Schmidt  <bernds@codesourcery.com>
37701         * reload1.c (remove_init_insns, will_delete_init_insn_p): New static
37702         functions.
37703         (reload, calculate_needs_all_insns, reload_as_needed): Use them.
37705         * config/bfin/bfin.c (split_load_immediate): Use gen_int_mode in a few
37706         more places.
37708         * cfgrtl.c (cfg_layout_initialize): Weaken assert to only trigger if
37709         flag_reorder_blocks_and_partition.
37710         * hw-doloop.c (reorg_loops): Avoid reordering if that flag is set.
37712 2014-05-21  Oleg Endo  <olegendo@gcc.gnu.org>
37714         PR target/54236
37715         * config/sh/sh.md (*addc_r_1): Rename to addc_t_r.  Remove empty
37716         constraints.
37717         (*addc_r_t): Add new insn_and_split.
37719 2014-05-21  Jakub Jelinek  <jakub@redhat.com>
37721         PR middle-end/61252
37722         * omp-low.c (handle_simd_reference): New function.
37723         (lower_rec_input_clauses): Use it.  Defer adding reference
37724         initialization even for reduction without placeholder if in simd,
37725         handle it properly later on.
37727 2014-05-20  Jan Hubicka  <hubicka@ucw.cz>
37729         PR tree-optimization/60899
37730         * gimple-fold.c (can_refer_decl_in_current_unit_p): Cleanup;
37731         assume all static symbols will have definition wile parsing and
37732         check the do have definition later in compilation; check that
37733         variable referring symbol will be output before concluding that
37734         reference is safe; be conservative for referring local statics;
37735         be more precise about when comdat is output in other partition.
37737 2014-05-20  Jan Hubicka  <hubicka@ucw.cz>
37739         PR bootstrap/60984
37740         * ipa-inline-transform.c (inline_call): Use add CALLEE_REMOVED
37741         parameter.
37742         * ipa-inline.c (inline_to_all_callers): If callee was removed; return.
37743         (ipa_inline): Loop inline_to_all_callers until no more aliases
37744         are removed.
37746 2014-05-20  Jan Hubicka  <hubicka@ucw.cz>
37748         * ipa.c (ipa_discover_readonly_nonaddressable_var): Fix dumping;
37749         set writeonly flag only for vars actually written to.
37751 2014-05-20  Dehao Chen  <dehao@google.com>
37753         * ipa-inline-transform.c (clone_inlined_nodes): Use min of edge count
37754         and callee count to get clone count.
37755         * tree-inline.c (expand_call_inline): Use callee count instead of bb
37756         count in copy_body.
37758 2014-05-20  Richard Sandiford  <rdsandiford@googlemail.com>
37760         PR rtl-optimization/61243
37761         * emit-rtl.c (emit_copy_of_insn_after): Copy CROSSING_JUMP_P.
37763 2014-05-20  Xinliang David Li  <davidxl@google.com>
37765         * cgraphunit.c (walk_polymorphic_call_targets): Add
37766         dbgcnt and fopt-info support.
37767         * ipa-prop.c (ipa_make_edge_direct_to_target): Ditto.
37768         * ipa-devirt.c (ipa_devirt): Ditto.
37769         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children): Ditto.
37770         * ipa.c (walk_polymorphic_call_targets): Ditto.
37771         * gimple-fold.c (fold_gimple_assign): Ditto.
37772         (gimple_fold_call): Ditto.
37773         * dbgcnt.def: New counter.
37775 2014-05-20  DJ Delorie  <dj@redhat.com>
37777         * config/msp430/msp430.md (split): Don't allow subregs when
37778         splitting SImode adds.
37779         (andneghi): Fix subtraction logic.
37780         * config/msp430/predicates.md (msp430_nonsubreg_or_imm_operand): New.
37782 2014-05-20  Jan Hubicka  <hubicka@ucw.cz>
37784         * tree.h (DECL_ONE_ONLY): Return true only for externally visible
37785         symbols.
37786         * except.c (switch_to_exception_section, resolve_unique_section,
37787         get_named_text_section, default_function_rodata_section,
37788         align_variable, get_block_for_decl, default_section_type_flags):
37789         Use DECL_COMDAT_GROUP instead of DECL_ONE_ONLY.
37790         * symtab.c (symtab_add_to_same_comdat_group,
37791         symtab_make_decl_local, fixup_same_cpp_alias_visibility,
37792         symtab_nonoverwritable_alias, symtab_get_symbol_partitioning_class):
37793         Likewise.
37794         * cgraphclones.c (cgraph_create_virtual_clone): Likewise.
37795         * bb-reorder.c (pass_partition_blocks::gate): Likewise.
37796         * config/c6x/c6x.c (c6x_elf_unique_section): Likewise.
37797         (c6x_function_in_section_p): Likewise.
37798         * config/darwin.c (machopic_select_section): Likewise.
37799         * config/arm/arm.c (arm_function_in_section_p): Likewise.
37800         * config/mips/mips.c (mips_function_rodata_section): Likewise.
37801         * config/mep/mep.c (mep_select_section): LIkewise.
37802         * config/i386/i386.c (x86_64_elf_unique_section): Likewise.
37804 2014-05-20  Eric Botcazou  <ebotcazou@adacore.com>
37806         * tree-ssa-dom.c (hashable_expr_equal_p) <EXPR_CALL>: Also compare the
37807         EH region of calls to pure functions that can throw an exception.
37808         * tree-ssa-sccvn.c (vn_reference_eq): Remove duplicated test.
37809         (copy_reference_ops_from_call): Also copy the EH region of the call if
37810         it can throw an exception.
37812 2014-05-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
37814         * simplify-rtx.c (simplify_binary_operation_1): Optimize case of
37815         nested VEC_SELECTs that are inverses of each other.
37817 2014-05-20  Richard Biener  <rguenther@suse.de>
37819         * tree-ssa-sccvn.c (process_scc): Dump SCC here, when iterating,
37820         (extract_and_process_scc_for_name): not here.
37821         (cond_dom_walker::before_dom_children): Only process
37822         stmts that end the BB in interesting ways.
37823         (run_scc_vn): Mark param uses as visited.
37825 2014-05-20  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
37827         * config/arm/arm.md (arith_shiftsi): Do not predicate for
37828         arm_restrict_it.
37830 2014-05-20  Nick Clifton  <nickc@redhat.com>
37832         * config/msp430/msp430.c (TARGET_GIMPLIFY_VA_ARG_EXPR): Define.
37833         (msp430_gimplify_va_arg_expr): New function.
37834         (msp430_print_operand): Handle (CONST (ZERO_EXTRACT)).
37836         * config/msp430/msp430.md (zero_extendpsisi2): Use + constraint on
37837         operand 0 in order to prevent confusion about the number of
37838         registers involved.
37840 2014-05-20  Richard Biener  <rguenther@suse.de>
37842         PR tree-optimization/61221
37843         * tree-ssa-pre.c (el_to_update): Remove.
37844         (eliminate_dom_walker::before_dom_children): Handle released
37845         VDEFs by value-numbering them to the associated VUSE.  Update
37846         stmt immediately for substituted call address.
37847         (eliminate): Remove delayed stmt updating code.
37848         * tree-ssa-sccvn.c (vuse_ssa_val): New function valueizing
37849         possibly late re-numbered vuses.
37850         (vn_reference_lookup_2): Adjust.
37851         (vn_reference_lookup_pieces): Likewise.
37852         (vn_reference_lookup): Likewise.
37854 2014-05-20  Richard Biener  <rguenther@suse.de>
37856         * config.gcc: Remove need_64bit_hwint.
37857         * configure.ac: Do not define NEED_64BIT_HOST_WIDE_INT.
37858         * hwint.h: Do not check NEED_64BIT_HOST_WIDE_INT but assume
37859         it to be true.
37860         * config.in: Regenerate.
37861         * configure: Likewise.
37863 2014-05-19  David Wohlferd <dw@LimeGreenSocks.com>
37865         * doc/extend.texi: Create Label Attributes section,
37866         move all label attributes into it and reference it.
37868 2014-05-19  Richard Earnshaw  <rearnsha@arm.com>
37870         * arm.c (thumb1_reorg): When scanning backwards skip anything
37871         that's not a proper insn.
37873 2014-05-19  Richard Biener  <rguenther@suse.de>
37875         PR tree-optimization/61221
37876         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children):
37877         Do nothing for unreachable blocks.
37878         * tree-ssa-sccvn.c (cond_dom_walker::before_dom_children):
37879         Improve unreachability detection.
37881 2014-05-19  Richard Biener  <rguenther@suse.de>
37883         PR tree-optimization/61209
37884         * tree-ssa-sccvn.c (visit_phi): Avoid setting expr to VN_TOP.
37886 2014-05-19  Nick Clifton  <nickc@redhat.com>
37888         * except.c (init_eh): Fix computation of builtin setjmp buffer
37889         size to allow for targets where POINTER_SIZE > BITS_PER_WORD.
37891 2014-05-19  Richard Biener  <rguenther@suse.de>
37893         PR tree-optimization/61184
37894         * tree-vrp.c (is_negative_overflow_infinity): Use
37895         TREE_OVERFLOW_P and do that check first.
37896         (is_positive_overflow_infinity): Likewise.
37897         (is_overflow_infinity): Likewise.
37898         (vrp_operand_equal_p): Properly treat operands with
37899         differing overflow as not equal.
37901 2014-05-19  Bernd Schmidt  <bernds@codesourcery.com>
37903         * simplify-rtx.c (simplify_unary_operation_1): Use CONST_INT_P in
37904         shift simplification where it was intended.
37906 2014-05-19  Christian Bruel  <christian.bruel@st.com>
37908         PR target/61195
37909         * config/sh/sh.md (movsf_ie): Unset fp_mode for fmov.
37911 2014-05-19  Richard Sandiford  <r.sandiford@uk.ibm.com>
37913         PR target/61084
37914         * config/sparc/sparc.c (sparc_fold_builtin): Use widest_int rather
37915         than wide_int.
37917 2014-05-19  Richard Sandiford  <rdsandiford@googlemail.com>
37919         * reg-notes.def (CROSSING_JUMP): Likewise.
37920         * rtl.h (rtx_def): Update comment for jump flag.
37921         (CROSSING_JUMP_P): Define.
37922         * cfgcleanup.c (try_forward_edges, try_optimize_cfg): Use it instead
37923         of a REG_CROSSING_JUMP note.
37924         * cfghooks.c (tidy_fallthru_edges): Likewise.
37925         * cfgrtl.c (fixup_partition_crossing, rtl_verify_edges): Likewise.
37926         * emit-rtl.c (try_split): Likewise.
37927         * haifa-sched.c (sched_create_recovery_edges): Likewise.
37928         * ifcvt.c (find_if_case_1, find_if_case_2): Likewise.
37929         * jump.c (redirect_jump_2): Likewise.
37930         * reorg.c (follow_jumps, fill_slots_from_thread): Likewise.
37931         (relax_delay_slots): Likewise.
37932         * config/arc/arc.md (jump_i, cbranchsi4_scratch, *bbit): Likewise.
37933         (bbit_di): Likewise.
37934         * config/arc/arc.c (arc_reorg, arc_can_follow_jump): Likewise.
37935         * config/sh/sh.md (jump_compact): Likewise.
37936         * bb-reorder.c (rotate_loop): Likewise.
37937         (pass_duplicate_computed_gotos::execute): Likewise.
37938         (add_reg_crossing_jump_notes): Rename to...
37939         (update_crossing_jump_flags): ...this.
37940         (pass_partition_blocks::execute): Update accordingly.
37942 2014-05-19  Richard Sandiford  <rdsandiford@googlemail.com>
37944         * tree.h: Remove extraneous template <>.
37946 2014-05-17  Jan Hubicka  <hubicka@ucw.cz>
37948         * ipa.c (symtab_remove_unreachable_nodes): Remove
37949         symbol from comdat group if its body was eliminated.
37950         (comdat_can_be_unshared_p_1): Static symbols can always be privatized.
37951         * symtab.c (symtab_remove_from_same_comdat_group): Break out from ...
37952         (symtab_unregister_node): ... this one.
37953         (verify_symtab_base): More strict checking of comdats.
37954         * cgraph.h (symtab_remove_from_same_comdat_group): Declare.
37956 2014-05-17  Jan Hubicka  <hubicka@ucw.cz>
37958         * tree-pass.h (make_pass_ipa_comdats): New pass.
37959         * timevar.def (TV_IPA_COMDATS): New timevar.
37960         * passes.def (pass_ipa_comdats): Add.
37961         * Makefile.in (OBJS): Add ipa-comdats.o
37962         * ipa-comdats.c: New file.
37964 2014-05-17  Jan Hubicka  <hubicka@ucw.cz>
37966         * ipa.c (update_visibility_by_resolution_info): New function.
37967         (function_and_variable_visibility): Use it.
37969 2014-05-17  Jan Hubicka  <hubicka@ucw.cz>
37971         * cgraph.h (symtab_first_defined_symbol, symtab_next_defined_symbol):
37972         New functions.
37973         (FOR_EACH_DEFINED_SYMBOL): New macro.
37974         (varpool_first_static_initializer, varpool_next_static_initializer,
37975         varpool_first_defined_variable, varpool_next_defined_variable):
37976         Fix comments.
37977         (symtab_in_same_comdat_p): Correctly deal with inline functions.
37979 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
37981         * ggc-page.c (ggc_handle_finalizers): Add comment.
37983 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
37985         * ggc-common.c (ggc_internal_cleared_alloc): Adjust.
37986         * ggc-none.c (ggc_internal_alloc): Assert if a finalizer is passed.
37987         (ggc_internal_cleared_alloc): Likewise.
37988         * ggc-page.c (finalizer): New class.
37989         (vec_finalizer): Likewise.
37990         (globals::finalizers): New member.
37991         (globals::vec_finalizers): Likewise.
37992         (ggc_internal_alloc): Record the finalizer if any for the block being
37993         allocated.
37994         (ggc_handle_finalizers): New function.
37995         (ggc_collect): Call ggc_handle_finalizers.
37996         * ggc.h (ggc_internal_alloc): Add arguments to allow installing a
37997         finalizer.
37998         (ggc_internal_cleared_alloc): Likewise.
37999         (finalize): New function.
38000         (need_finalization_p): Likewise.
38001         (ggc_alloc): Install the type's destructor as the finalizer if it
38002         might do something.
38003         (ggc_cleared_alloc): Likewise.
38004         (ggc_vec_alloc): Likewise.
38005         (ggc_cleared_vec_alloc): Likewise.
38007 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
38009         * ggc.h (ggc_alloc_cleared_simd_clone_stat): Remove function.
38011 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
38013         * alias.c (record_alias_subset): Adjust.
38014         * bitmap.c (bitmap_element_allocate): Likewise.
38015         (bitmap_gc_alloc_stat): Likewise.
38016         * cfg.c (init_flow): Likewise.
38017         (alloc_block): Likewise.
38018         (unchecked_make_edge): Likewise.
38019         * cfgloop.c (alloc_loop): Likewise.
38020         (flow_loops_find): Likewise.
38021         (rescan_loop_exit): Likewise.
38022         * cfgrtl.c (init_rtl_bb_info): Likewise.
38023         * cgraph.c (insert_new_cgraph_node_version): Likewise.
38024         (cgraph_allocate_node): Likewise.
38025         (cgraph_create_edge_1): Likewise.
38026         (cgraph_allocate_init_indirect_info): Likewise.
38027         * cgraphclones.c (cgraph_clone_edge): Likewise.
38028         * cgraphunit.c (add_asm_node): Likewise.
38029         (init_lowered_empty_function): Likewise.
38030         * config/aarch64/aarch64.c (aarch64_init_machine_status): Likewise.
38031         * config/alpha/alpha.c (alpha_init_machine_status): Likewise.
38032         (alpha_use_linkage): Likewise.
38033         * config/arc/arc.c (arc_init_machine_status): Likewise.
38034         * config/arm/arm.c (arm_init_machine_status): Likewise.
38035         * config/avr/avr.c (avr_init_machine_status): Likewise.
38036         * config/bfin/bfin.c (bfin_init_machine_status): Likewise.
38037         * config/c6x/c6x.c (c6x_init_machine_status): Likewise.
38038         * config/cris/cris.c (cris_init_machine_status): Likewise.
38039         * config/darwin.c (machopic_indirection_name): Likewise.
38040         (darwin_build_constant_cfstring): Likewise.
38041         (darwin_enter_string_into_cfstring_table): Likewise.
38042         * config/epiphany/epiphany.c (epiphany_init_machine_status): Likewise.
38043         * config/frv/frv.c (frv_init_machine_status): Likewise.
38044         * config/i386/i386.c (get_dllimport_decl): Likewise.
38045         (ix86_init_machine_status): Likewise.
38046         (assign_386_stack_local): Likewise.
38047         * config/i386/winnt.c (i386_pe_record_external_function): Likewise.
38048         (i386_pe_maybe_record_exported_symbol): Likewise.
38049         (i386_pe_record_stub): Likewise.
38050         * config/ia64/ia64.c (ia64_init_machine_status): Likewise.
38051         * config/iq2000/iq2000.c (iq2000_init_machine_status): Likewise.
38052         * config/m32c/m32c.c (m32c_init_machine_status): Likewise.
38053         (m32c_note_pragma_address): Likewise.
38054         * config/mep/mep.c (mep_init_machine_status): Likewise.
38055         (mep_note_pragma_flag): Likewise.
38056         * config/mips/mips.c (mflip_mips16_use_mips16_p): Likewise.
38057         (mips16_local_alias): Likewise.
38058         (mips_init_machine_status): Likewise.
38059         * config/mmix/mmix.c (mmix_init_machine_status): Likewise.
38060         * config/moxie/moxie.c (moxie_init_machine_status): Likewise.
38061         * config/msp430/msp430.c (msp430_init_machine_status): Likewise.
38062         * config/nds32/nds32.c (nds32_init_machine_status): Likewise.
38063         * config/nios2/nios2.c (nios2_init_machine_status): Likewise.
38064         * config/pa/pa.c (pa_init_machine_status): Likewise.
38065         (pa_get_deferred_plabel): Likewise.
38066         * config/rl78/rl78.c (rl78_init_machine_status): Likewise.
38067         * config/rs6000/rs6000.c (builtin_function_type): Likewise.
38068         (rs6000_init_machine_status): Likewise.
38069         (output_toc): Likewise.
38070         * config/s390/s390.c (s390_init_machine_status): Likewise.
38071         * config/score/score.c (score_output_external): Likewise.
38072         * config/sparc/sparc.c (sparc_init_machine_status): Likewise.
38073         * config/spu/spu.c (spu_init_machine_status): Likewise.
38074         * config/tilegx/tilegx.c (tilegx_init_machine_status): Likewise.
38075         * config/tilepro/tilepro.c (tilepro_init_machine_status): Likewise.
38076         * config/xtensa/xtensa.c (xtensa_init_machine_status): Likewise.
38077         * coverage.c (coverage_end_function): Likewise.
38078         * dbxout.c (dbxout_init): Likewise.
38079         * doc/gty.texi: Don't mention variable_size attribute.
38080         * dwarf2cfi.c (new_cfi): Adjust.
38081         (new_cfi_row): Likewise.
38082         (copy_cfi_row): Likewise.
38083         (create_cie_data): Likewise.
38084         * dwarf2out.c (dwarf2out_alloc_current_fde): Likewise.
38085         (new_loc_descr): Likewise.
38086         (find_AT_string_in_table): Likewise.
38087         (add_addr_table_entry): Likewise.
38088         (new_die): Likewise.
38089         (add_var_loc_to_decl): Likewise.
38090         (clone_die): Likewise.
38091         (clone_as_declaration): Likewise.
38092         (break_out_comdat_types): Likewise.
38093         (new_loc_list): Likewise.
38094         (add_loc_descr_to_each): Likewise.
38095         (add_location_or_const_value_attribute): Likewise.
38096         (add_linkage_name): Likewise.
38097         (lookup_filename): Likewise.
38098         (dwarf2out_var_location): Likewise.
38099         (new_line_info_table): Likewise.
38100         (dwarf2out_init): Likewise.
38101         (mem_loc_descriptor): Likewise.
38102         (loc_descriptor): Likewise.
38103         (add_const_value_attribute): Likewise.
38104         (tree_add_const_value_attribute): Likewise.
38105         (comp_dir_string): Likewise.
38106         (dwarf2out_vms_debug_main_pointer): Likewise.
38107         (string_cst_pool_decl): Likewise.
38108         * emit-rtl.c (set_mem_attrs): Likewise.
38109         (get_reg_attrs): Likewise.
38110         (start_sequence): Likewise.
38111         (init_emit): Likewise.
38112         (init_emit_regs): Likewise.
38113         * except.c (init_eh_for_function): Likewise.
38114         (gen_eh_region): Likewise.
38115         (gen_eh_region_catch): Likewise.
38116         (gen_eh_landing_pad): Likewise.
38117         (add_call_site): Likewise.
38118         * function.c (add_frame_space): Likewise.
38119         (insert_temp_slot_address): Likewise.
38120         (assign_stack_temp_for_type): Likewise.
38121         (get_hard_reg_initial_val): Likewise.
38122         (allocate_struct_function): Likewise.
38123         (prepare_function_start): Likewise.
38124         (types_used_by_var_decl_insert): Likewise.
38125         * gengtype.c (variable_size_p): Remove function.
38126         (enum alloc_quantity): Remove enum.
38127         (write_typed_alloc_def): Remove function.
38128         (write_typed_struct_alloc_def): Likewise.
38129         (write_typed_typedef_alloc_def): Likewise.
38130         (write_typed_alloc_defns): Likewise.
38131         (main): Adjust.
38132         * ggc-common.c (ggc_cleared_alloc_htab_ignore_args): Adjust.
38133         (ggc_cleared_alloc_ptr_array_two_args): Likewise.
38134         * ggc.h (ggc_alloc): new function.
38135         (ggc_cleared_alloc): Likewise.
38136         (ggc_vec_alloc): Template on type of vector element, and remove
38137         element size argument.
38138         (ggc_cleared_vec_alloc): Likewise.
38139         * gimple.c (gimple_build_omp_for): Adjust.
38140         (gimple_copy): Likewise.
38141         * ipa-cp.c (get_replacement_map): Likewise.
38142         (find_aggregate_values_for_callers_subset): Likewise.
38143         (known_aggs_to_agg_replacement_list): Likewise.
38144         * ipa-devirt.c (get_odr_type): Likewise.
38145         * ipa-prop.c (ipa_node_duplication_hook): Likewise.
38146         (read_agg_replacement_chain): Likewise.
38147         * loop-iv.c (get_simple_loop_desc): Likewise.
38148         * lto-cgraph.c (input_node_opt_summary): Likewise.
38149         * lto-section-in.c (lto_new_in_decl_state): Likewise.
38150         * lto-streamer-in.c (lto_input_eh_catch_list): Likewise.
38151         (input_eh_region): Likewise.
38152         (input_eh_lp): Likewise.
38153         (input_cfg): Likewise.
38154         * optabs.c (set_optab_libfunc): Likewise.
38155         (init_tree_optimization_optabs): Likewise.
38156         (set_conv_libfunc): Likewise.
38157         * passes.c (do_per_function_toporder): Likewise.
38158         * rtl.h: Don't use variable_size gty attribute.
38159         * sese.c (if_region_set_false_region): Adjust.
38160         * stringpool.c (gt_pch_save_stringpool): Likewise.
38161         * target-globals.c (save_target_globals): Likewise.
38162         * toplev.c (general_init): Likewise.
38163         * trans-mem.c (record_tm_replacement): Likewise.
38164         (split_bb_make_tm_edge): Likewise.
38165         * tree-cfg.c (move_sese_region_to_fn): Likewise.
38166         * tree-data-ref.h (lambda_vector_new): Likewise.
38167         * tree-eh.c (add_stmt_to_eh_lp_fn): Likewise.
38168         * tree-iterator.c (tsi_link_before): Likewise.
38169         (tsi_link_after): Likewise.
38170         * tree-scalar-evolution.c (new_scev_info_str): Likewise.
38171         * tree-ssa-loop-niter.c (record_estimate): Likewise.
38172         * tree-ssa-operands.c (ssa_operand_alloc): Likewise.
38173         * tree-ssa-operands.h: Don't use variable_size gty attribute.
38174         * tree-ssa.c (init_tree_ssa): Adjust.
38175         * tree-ssanames.c (set_range_info): Likewise.
38176         (get_ptr_info): Likewise.
38177         (duplicate_ssa_name_ptr_info): Likewise.
38178         (duplicate_ssa_name_range_info): Likewise.
38179         * tree-streamer-in.c (unpack_ts_real_cst_value_fields): Likewise.
38180         (unpack_ts_fixed_cst_value_fields): Likewise.
38181         * tree.c (build_fixed): Likewise.
38182         (build_real): Likewise.
38183         (build_string): Likewise.
38184         (decl_priority_info): Likewise.
38185         (decl_debug_expr_insert): Likewise.
38186         (decl_value_expr_insert): Likewise.
38187         (decl_debug_args_insert): Likewise.
38188         (type_hash_add): Likewise.
38189         (build_omp_clause): Likewise.
38190         * ubsan.c (decl_for_type_insert): Likewise.
38191         * varasm.c (get_unnamed_section): Likewise.
38192         (get_noswitch_section): Likewise.
38193         (get_section): Likewise.
38194         (get_block_for_section): Likewise.
38195         (create_block_symbol): Likewise.
38196         (build_constant_desc): Likewise.
38197         (create_constant_pool): Likewise.
38198         (force_const_mem): Likewise.
38199         (record_tm_clone_pair): Likewise.
38200         * varpool.c (varpool_create_empty_node): Likewise.
38202 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
38204         * dwarf2out.c (tree_add_const_value_attribute): Call
38205         ggc_internal_cleared_alloc instead of ggc_alloc_cleared_atomic.
38206         * gengtype.c (write_typed_alloc_def): Call ggc_internal_<x>alloc
38207         instead of ggc_internal_<x>alloc_stat.
38208         * ggc-common.c (ggc_internal_cleared_alloc): Drop _stat suffix.
38209         (ggc_realloc): Likewise.
38210         * ggc-none.c (ggc_internal_alloc): Likewise.
38211         (ggc_internal_cleared_alloc): Likewise.
38212         * ggc-page.c: Likewise.
38213         * ggc.h (ggc_internal_alloc_stat): Likewise.
38214         (ggc_internal_alloc): Remove macro.
38215         (ggc_internal_cleared_alloc_stat): Drop _stat suffix.
38216         (ggc_internal_cleared_alloc): Remove macro.
38217         (GGC_RESIZEVEC): Adjust.
38218         (ggc_resizevar): Remove macro.
38219         (ggc_internal_vec_alloc_stat): Drop _stat suffix.
38220         (ggc_internal_cleared_vec_alloc_stat): Likewise.
38221         (ggc_internal_vec_cleared_alloc): Remove macro.
38222         (ggc_alloc_atomic_stat): Drop _stat suffix.
38223         (ggc_alloc_atomic): Remove macro.
38224         (ggc_alloc_cleared_atomic): Remove macro.
38225         (ggc_alloc_string_stat): Drop _stat suffix.
38226         (ggc_alloc_string): Remove macro.
38227         (ggc_alloc_rtx_def_stat): Adjust.
38228         (ggc_alloc_tree_node_stat): Likewise.
38229         (ggc_alloc_cleared_tree_node_stat): Likewise.
38230         (ggc_alloc_cleared_gimple_statement_stat): Likewise.
38231         (ggc_alloc_cleared_simd_clone_stat): Likewise.
38232         * gimple.c (gimple_build_omp_for): Likewise.
38233         (gimple_copy): Likewise.
38234         * stringpool.c (ggc_alloc_string_stat): Drop _stat suffix.
38235         * toplev.c (realloc_for_line_map): Adjust.
38236         * tree-data-ref.h (lambda_vector_new): Likewise.
38237         * tree-phinodes.c (allocate_phi_node): Likewise.
38238         * tree.c (grow_tree_vec_stat): Likewise.
38239         * vec.h (va_gc::reserve): Adjust.
38241 2014-05-17  Ajit Agarwal  <ajitkum@xilinx.com>
38243         * config/microblaze/microblaze.c (break_handler): New Declaration.
38244         (microblaze_break_function_p,microblaze_is_break_handler): New.
38245         (compute_frame_size): Use microblaze_break_function_p.
38246         Add the test of break_handler.
38247         (microblaze_function_prologue) : Add the test of variable
38248         break_handler.  Check the fnname by BREAK_HANDLER_NAME.
38249         (microblaze_function_epilogue) : Add the test of break_handler.
38250         (microblaze_globalize_label) : Add the test of break_handler.
38251         Check the name by BREAK_HANDLER_NAME.
38253         * config/microblaze/microblaze.h (BREAK_HANDLER_NAME): New macro
38255         * config/microblaze/microblaze.md (*<optab>,<optab>_internal): Add
38256         microblaze_is_break_handler test.
38257         (call_internal1,call_value_intern): Use microblaze_break_function_p.
38258         Use SYMBOL_REF_DECL.
38260         * config/microblaze/microblaze-protos.h
38261         (microblaze_break_function_p,microblaze_is_break_handler):
38262         New Declaration.
38264         * doc/extend.texi (MicroBlaze break_handler Functions): Document
38265         new MicroBlaze break_handler functions.
38267 2014-05-17  Uros Bizjak  <ubizjak@gmail.com>
38269         * doc/extend.texi (Size of an asm): Move node text according
38270         to its @menu entry position.
38272 2014-05-17  Marc Glisse  <marc.glisse@inria.fr>
38274         PR tree-optimization/61140
38275         PR tree-optimization/61150
38276         PR tree-optimization/61197
38277         * tree-ssa-phiopt.c (value_replacement): Punt on multiple phis.
38279 2014-05-17  Uros Bizjak  <ubizjak@gmail.com>
38281         * doc/invoke.texi (free): Mention Alpha.  Also enabled at -Os.
38283 2014-05-17  Richard Sandiford  <r.sandiford@uk.ibm.com>
38285         * wide-int.cc: Only include longlong.h if W_TYPE_SIZE==32 or
38286         __SIZEOF_INT128__ is defined.
38288 2014-05-17  Richard Sandiford  <rdsandiford@googlemail.com>
38290         * config/rs6000/rs6000.c (rs6000_real_tls_symbol_ref_p): New function.
38291         (rs6000_delegitimize_address): Use it.
38293 2014-05-17  Richard Sandiford  <rdsandiford@googlemail.com>
38295         * emit-rtl.h (replace_equiv_address, replace_equiv_address_nv): Add an
38296         inplace argument.  Store the new address in the original MEM when true.
38297         * emit-rtl.c (change_address_1): Likewise.
38298         (adjust_address_1, adjust_automodify_address_1, offset_address):
38299         Update accordingly.
38300         * rtl.h (plus_constant): Add an inplace argument.
38301         * explow.c (plus_constant): Likewise.  Try to reuse the original PLUS
38302         when true.  Avoid generating (plus X (const_int 0)).
38303         * function.c (instantiate_virtual_regs_in_rtx): Adjust the PLUS
38304         in-place.  Pass true to plus_constant.
38305         (instantiate_virtual_regs_in_insn): Pass true to replace_equiv_address.
38307 2014-05-16  Dehao Chen  <dehao@google.com>
38309         * tree-cfg.c (gimple_merge_blocks): Updates bb count with max count.
38311 2014-05-16  Oleg Endo  <olegendo@gcc.gnu.org>
38313         PR target/54089
38314         * config/sh/predicates.md (negt_reg_shl31_operand): Match additional
38315         patterns.
38316         * config/sh/sh.md (*negt_msb): Merge SH2A and non-SH2A variants.
38318 2014-05-16  Dehao Chen  <dehao@google.com>
38320         * ira-int.h (REG_FREQ_FROM_EDGE_FREQ): Use
38321         optimize_function_for_size_p.
38322         * regs.h (REG_FREQ_FROM_BB): Likewise.
38324 2014-05-16  Oleg Endo  <olegendo@gcc.gnu.org>
38326         PR target/51244
38327         * config/sh/sh.c (sh_eval_treg_value): Handle t_reg_operand and
38328         negt_reg_operand cases.
38329         * config/sh/sh.md (*cset_zero): Likewise by using cbranch_treg_value
38330         predicate.
38331         * config/sh/predicates.md (cbranch_treg_value): Simplify.
38333 2014-05-16  Oleg Endo  <olegendo@gcc.gnu.org>
38335         * config/sh/sh.c (sh_option_override): Set branch cost to 2 for all
38336         target variants.
38338 2014-05-16  David Malcolm  <dmalcolm@redhat.com>
38340         Revert:
38341         2014-04-29  David Malcolm  <dmalcolm@redhat.com>
38343         * tree-cfg.c (dump_function_to_file): Dump the return type of
38344         functions, in a line to itself before the function body, mimicking
38345         the layout of a C function.
38347 2014-05-16  Dehao Chen  <dehao@google.com>
38349         * cfghooks.c (make_forwarder_block): Use direct computation to
38350         get fall-through edge's count and frequency.
38352 2014-05-16  Benno Schulenberg  <bensberg@justemail.net>
38354         * config/arc/arc.c (arc_init): Fix typo in error message.
38355         * config/i386/i386.c (ix86_expand_builtin): Likewise.
38356         (split_stack_prologue_scratch_regno): Likewise.
38357         * fortran/check.c (gfc_check_fn_rc2008): Remove duplicate
38358         word from error message.
38360 2014-05-16  Zhouyi Zhou <yizhouzhou@ict.ac.cn>
38362         * ira-costs.c: Fix typo in comment.
38364 2014-05-16  David Wohlferd <dw@LimeGreenSocks.com>
38366         * doc/extend.texi: (Visibility Pragmas) Fix misplaced @xref
38368 2014-05-16  Jan Hubicka  <hubicka@ucw.cz>
38370         * varpool.c (dump_varpool_node): Dump write-only flag.
38371         * lto-cgraph.c (lto_output_varpool_node, input_varpool_node): Stream
38372         write-only flag.
38373         * tree-cfg.c (execute_fixup_cfg): Remove statements setting
38374         write-only variables.
38375         * ipa.c (process_references): New function.
38376         (set_readonly_bit): New function.
38377         (set_writeonly_bit): New function.
38378         (clear_addressable_bit): New function.
38379         (ipa_discover_readonly_nonaddressable_var): Mark write only variables;
38380         fix handling of aliases.
38381         * cgraph.h (struct varpool_node): Add writeonly flag.
38383 2014-05-16  Vladimir Makarov  <vmakarov@redhat.com>
38385         PR rtl-optimization/60969
38386         * ira-costs.c (record_reg_classes): Allow only memory for pseudo.
38387         Calculate costs for this case.
38389 2014-05-16  Eric Botcazou  <ebotcazou@adacore.com>
38391         * fold-const (fold_unary_loc) <NON_LVALUE_EXPR>: New case.
38392         <CASE_CONVERT>: Pass arg0 instead of op0 to fold_convert_const.
38394 2014-05-16  Richard Biener  <rguenther@suse.de>
38396         PR tree-optimization/61194
38397         * tree-vect-patterns.c (adjust_bool_pattern): Also handle
38398         bool patterns ending in a COND_EXPR.
38400 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38402         * config/aarch64/aarch64.c (aarch64_rtx_mult_cost): Fix FNMUL case.
38404 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38406         * config/aarch64/aarch64.c (aarch64_rtx_costs): Handle the case
38407         where we were unable to cost an RTX.
38409 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38411         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost SYMBOL_REF,
38412         HIGH, LO_SUM.
38414 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38415             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38417         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost TRUNCATE.
38419 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38420             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38422         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost FMA,
38423         FLOAT_EXTEND, FLOAT_TRUNCATE, ABS, SMAX, and SMIN.
38425 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38426             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38428         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost comparison
38429         operators.
38431 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38432             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38434         * config/aarch64/aarch64.c (aarch64_rtx_costs): Improve costs for
38435         DIV/MOD.
38437 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38438             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38440         * config/aarch64/aarch64.c (aarch64_rtx_arith_op_extract_p): New.
38441         (aarch64_rtx_costs): Improve costs for SIGN/ZERO_EXTRACT.
38443 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38444             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38446         * config/aarch64/aarch64.c (aarch64_rtx_costs): Improve costs for
38447         rotates and shifts.
38449 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38450             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38452         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost
38453         ZERO_EXTEND and SIGN_EXTEND better.
38455 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38456             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38458         * config/aarch64/aarch64.c (aarch64_rtx_costs): Improve cost for
38459         logical operations.
38461 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38462             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38464         * config/aarch64/aarch64.c (aarch64_rtx_costs): Use address
38465         costs when costing loads and stores to memory.
38467 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38468             Philip Tomsich  <philipp.tomsich@theobroma-systems.com>
38470         * config/aarch64/aarch64.c (aarch64_rtx_costs): Improve costing
38471         for SET RTX.
38473 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38475         * config/aarch64/aarch64.c (aarch64_rtx_costs): Set default costs.
38477 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38478             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38480         * config/aarch64/aarch64.c (aarch64_strip_shift_or_extend): Rename
38481         to...
38482         (aarch64_strip_extend): ...this, don't strip shifts, check RTX is
38483         well formed.
38484         (aarch64_rtx_mult_cost): New.
38485         (aarch64_rtx_costs): Use it, refactor as appropriate.
38487 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38488             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38490         * config/aarch64/aarch64.c (aarch64_build_constant): Conditionally
38491         emit instructions, return number of instructions which would
38492         be emitted.
38493         (aarch64_add_constant): Update call to aarch64_build_constant.
38494         (aarch64_output_mi_thunk): Likewise.
38495         (aarch64_rtx_costs): Estimate cost of a CONST_INT, cost of
38496         a CONST_DOUBLE.
38498 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38500         * config/aarch64/aarch64.c (aarch64_rtx_costs_wrapper): New.
38501         (TARGET_RTX_COSTS): Call it.
38503 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38505         * config/aarch64/aarch64.c (cortexa57_addrcost_table): New.
38506         (cortexa57_vector_cost): Likewise.
38507         (cortexa57_tunings): Use them.
38509 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38511         * config/aarch64/aarch64-protos.h (scale_addr_mode_cost): New.
38512         (cpu_addrcost_table): Use it.
38513         * config/aarch64/aarch64.c (generic_addrcost_table): Initialize it.
38514         (aarch64_address_cost): Rewrite using aarch64_classify_address,
38515         move it.
38517 2014-05-16  Richard Biener  <rguenther@suse.de>
38519         * tree-ssa-sccvn.c: Include tree-cfg.h and domwalk.h.
38520         (set_ssa_val_to): Handle unexpected sets to VN_TOP.
38521         (visit_phi): Ignore edges marked as not executable.
38522         (class cond_dom_walker): New.
38523         (cond_dom_walker::before_dom_children): Value-number
38524         control statements and mark successor edges as not
38525         executable if possible.
38526         (run_scc_vn): First walk all control statements in
38527         dominator order, marking edges as not executable.
38528         * tree-inline.c (copy_edges_for_bb): Be not confused
38529         about random edge flags.
38531 2014-05-16  Richard Biener  <rguenther@suse.de>
38533         * tree-ssa-sccvn.c (visit_use): Also constant-fold calls.
38535 2014-05-15  Peter Bergner  <bergner@vnet.ibm.com>
38537         PR target/61193
38538         * config/rs6000/htmxlintrin.h (_HTM_TBEGIN_STARTED): New define.
38539         (__TM_simple_begin): Use it.
38540         (__TM_begin): Likewise.
38542 2014-05-15  Martin Jambor  <mjambor@suse.cz>
38544         PR ipa/61085
38545         * ipa-prop.c (update_indirect_edges_after_inlining): Check
38546         type_preserved flag when the indirect edge is polymorphic.
38548 2014-05-15  Martin Jambor  <mjambor@suse.cz>
38550         PR tree-optimization/61090
38551         * tree-sra.c (sra_modify_expr): Pass the current gsi to
38552         build_ref_for_model.
38554 2014-05-15  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
38556         * config/arm/arm.c (arm_option_override): Use the SCHED_PRESSURE_MODEL
38557         enum name for PARAM_SCHED_PRESSURE_ALGORITHM.
38559 2014-05-15  Jakub Jelinek  <jakub@redhat.com>
38561         PR tree-optimization/61158
38562         * fold-const.c (fold_binary_loc): If X is zero-extended and
38563         shiftc >= prec, make sure zerobits is all ones instead of
38564         invoking undefined behavior.
38566 2014-05-15  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
38568         * regcprop.h: New file.
38569         * regcprop.c (skip_debug_insn_p): New decl.
38570         (replace_oldest_value_reg): Check skip_debug_insn_p.
38571         (copyprop_hardreg_forward_bb_without_debug_insn): New function.
38572         * shrink-wrap.c: Include regcprop.h.
38573         (prepare_shrink_wrap): Call
38574         copyprop_hardreg_forward_bb_without_debug_insn.
38576 2014-05-15  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
38578         * shrink-wrap.h: Update comment.
38579         * shrink-wrap.c: Update comment.
38580         (next_block_for_reg): Rename to live_edge_for_reg.
38581         (live_edge_for_reg): Allow live_edge->dest has two predecessors.
38582         (move_insn_for_shrink_wrap): Split live_edge.
38583         (prepre_shrink_wrap): One more parameter for move_insn_for_shrink_wrap.
38585 2014-05-14  Eric Botcazou  <ebotcazou@adacore.com>
38587         * config/sparc/sparc-protos.h (sparc_absnegfloat_split_legitimate):
38588         Delete.
38589         * config/sparc/sparc.c (sparc_absnegfloat_split_legitimate): Likewise.
38590         * config/sparc/sparc.md (fptype_ut699): New attribute.
38591         (in_branch_delay): Return false if -mfix-ut699 is specified and
38592         fptype_ut699 is set to single.
38593         (truncdfsf2): Add fptype_ut699 attribute.
38594         (fix_truncdfsi2): Likewise.
38595         (floatsisf2): Change fptype attribute.
38596         (fix_truncsfsi2): Likewise.
38597         (negtf2_notv9): Delete.
38598         (negtf2_v9): Likewise.
38599         (negtf2_hq): New instruction.
38600         (negtf2): New instruction and splitter.
38601         (negdf2_notv9): Rewrite.
38602         (abstf2_notv9): Delete.
38603         (abstf2_hq_v9): Likewise.
38604         (abstf2_v9): Likewise.
38605         (abstf2_hq): New instruction.
38606         (abstf2): New instruction and splitter.
38607         (absdf2_notv9): Rewrite.
38609 2014-05-14  Cary Coutant  <ccoutant@google.com>
38611         PR debug/61013
38612         * opts.c (common_handle_option): Don't special-case "-g".
38613         (set_debug_level): Default to at least level 2 with "-g".
38615 2014-05-14  DJ Delorie  <dj@redhat.com>
38617         * config/msp430/msp430.c (msp430_builtin): Add
38618         MSP430_BUILTIN_DELAY_CYCLES.
38619         (msp430_init_builtins): Register void __delay_cycles(long long).
38620         (msp430_builtin_decl): Add it.
38621         (cg_magic_constant): New.
38622         (msp430_expand_delay_cycles): New.
38623         (msp430_expand_builtin): Call it.
38624         (msp430_print_operand_raw): Change integer printing from "int" to
38625         HOST_WIDE_INT.
38626         * config/msp430/msp430.md (define_constants): Add delay_cycles tags.
38627         (delay_cycles_start): New.
38628         (delay_cycles_end): New.
38629         (delay_cycles_32): New.
38630         (delay_cycles_32x): New.
38631         (delay_cycles_16): New.
38632         (delay_cycles_16x): New.
38633         (delay_cycles_2): New.
38634         (delay_cycles_1): New.
38635         * doc/extend.texi: Document __delay_cycles().
38637 2014-05-14  Sandra Loosemore  <sandra@codesourcery.com>
38639         * config/nios2/nios2.md (nios2_cbranch): Fix paste-o in
38640         length attribute computation.
38642 2014-05-14  Richard Sandiford  <rdsandiford@googlemail.com>
38644         PR debug/61188
38645         * print-rtl.c (print_rtx): Suppress uids if flag_dump_unnumbered.
38647 2014-05-14  Richard Sandiford  <r.sandiford@uk.ibm.com>
38649         PR target/61084
38650         * config/sparc/sparc.md: Fix types of low and high in DI constant
38651         splitter.  Use gen_int_mode in some other splitters.
38653 2014-05-14  Martin Jambor  <mjambor@suse.cz>
38655         PR ipa/60897
38656         * ipa-prop.c (ipa_modify_formal_parameters): Reset DECL_LANG_SPECIFIC.
38658 2014-05-14  James Norris  <jnorris@codesourcery.com>
38660         * omp-low.c (expand_parallel_call): Remove shadow variable.
38661         (expand_omp_taskreg): Likewise.
38663 2014-05-14  Ilya Tocar  <ilya.tocar@intel.com>
38665         * common/config/i386/i386-common.c
38666         (OPTION_MASK_ISA_CLFLUSHOPT_SET): Define.
38667         (OPTION_MASK_ISA_XSAVES_SET): Ditto.
38668         (OPTION_MASK_ISA_XSAVEC_SET): Ditto.
38669         (OPTION_MASK_ISA_CLFLUSHOPT_UNSET): Ditto.
38670         (OPTION_MASK_ISA_XSAVES_UNSET): Ditto.
38671         (OPTION_MASK_ISA_XSAVEC_UNSET): Ditto.
38672         (ix86_handle_option): Handle OPT_mxsavec, OPT_mxsaves, OPT_mclflushopt.
38673         * config.gcc (i[34567]86-*-*): Add clflushoptintrin.h,
38674         xsavecintrin.h, xsavesintrin.h.
38675         (x86_64-*-*): Ditto.
38676         * config/i386/clflushoptintrin.h: New.
38677         * config/i386/xsavecintrin.h: Ditto.
38678         * config/i386/xsavesintrin.h: Ditto.
38679         * config/i386/cpuid.h (bit_CLFLUSHOPT): Define.
38680         (bit_XSAVES): Ditto.
38681         (bit_XSAVES): Ditto.
38682         * config/i386/driver-i386.c (host_detect_local_cpu): Handle
38683         -mclflushopt, -mxsavec, -mxsaves, -mno-xsaves, -mno-xsavec,
38684         -mno-clflushopt.
38685         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
38686         OPTION_MASK_ISA_CLFLUSHOPT, OPTION_MASK_ISA_XSAVEC,
38687         OPTION_MASK_ISA_XSAVES.
38688         * config/i386/i386.c (ix86_target_string): Handle -mclflushopt,
38689         -mxsavec, -mxsaves.
38690         (PTA_CLFLUSHOPT) Define.
38691         (PTA_XSAVEC): Ditto.
38692         (PTA_XSAVES): Ditto.
38693         (ix86_option_override_internal): Handle new options.
38694         (ix86_valid_target_attribute_inner_p): Ditto.
38695         (ix86_builtins): Add IX86_BUILTIN_XSAVEC, IX86_BUILTIN_XSAVEC64,
38696         IX86_BUILTIN_XSAVES, IX86_BUILTIN_XRSTORS, IX86_BUILTIN_XSAVES64,
38697         IX86_BUILTIN_XRSTORS64, IX86_BUILTIN_CLFLUSHOPT.
38698         (bdesc_special_args): Add __builtin_ia32_xsaves,
38699         __builtin_ia32_xrstors, __builtin_ia32_xsavec, __builtin_ia32_xsaves64,
38700         __builtin_ia32_xrstors64, __builtin_ia32_xsavec64.
38701         (ix86_init_mmx_sse_builtins): Add __builtin_ia32_clflushopt.
38702         (ix86_expand_builtin): Handle new builtins.
38703         * config/i386/i386.h (TARGET_CLFLUSHOPT) Define.
38704         (TARGET_CLFLUSHOPT_P): Ditto.
38705         (TARGET_XSAVEC): Ditto.
38706         (TARGET_XSAVEC_P): Ditto.
38707         (TARGET_XSAVES): Ditto.
38708         (TARGET_XSAVES_P): Ditto.
38709         * config/i386/i386.md (ANY_XSAVE): Add UNSPECV_XSAVEC, UNSPECV_XSAVES.
38710         (ANY_XSAVE64)" Add UNSPECV_XSAVEC64, UNSPECV_XSAVES64.
38711         (attr xsave): Add xsavec, xsavec64, xsaves, xsaves64.
38712         (ANY_XRSTOR): New.
38713         (ANY_XRSTOR64): Ditto.
38714         (xrstor): Ditto.
38715         (xrstor): Change into <xrstor>.
38716         (xrstor_rex64): Change into <xrstor>_rex64.
38717         (xrstor64): Change into <xrstor>64
38718         (clflushopt): New.
38719         * config/i386/i386.opt (mclflushopt): New.
38720         (mxsavec): Ditto.
38721         (mxsaves): Ditto.
38722         * config/i386/x86intrin.h: Add clflushoptintrin.h, xsavesintrin.h,
38723         xsavecintrin.h.
38724         * doc/invoke.texi: Document new options.
38726 2014-05-14  Andrey Belevantsev  <abel@ispras.ru>
38728         PR rtl-optimization/60866
38729         * sel-sched-ir (sel_init_new_insn): New parameter old_seqno.
38730         Default it to -1.  Pass it down to init_simplejump_data.
38731         (init_simplejump_data): New parameter old_seqno.  Pass it down
38732         to get_seqno_for_a_jump.
38733         (get_seqno_for_a_jump): New parameter old_seqno.  Use it for
38734         initializing new jump seqno as a last resort.  Add comment.
38735         (sel_redirect_edge_and_branch): Save old seqno of the conditional
38736         jump and pass it down to sel_init_new_insn.
38737         (sel_redirect_edge_and_branch_force): Likewise.
38739 2014-05-14  Georg-Johann Lay  <avr@gjlay.de>
38741         * config/avr/avr.h (REG_CLASS_CONTENTS): Use unsigned suffix for
38742         shifted values to avoid build warning.
38744 2014-05-14  Eric Botcazou  <ebotcazou@adacore.com>
38746         * cfgcleanup.c (try_forward_edges): Use location_t for locations.
38747         * cfgrtl.c (rtl_merge_blocks): Fix comment.
38748         (cfg_layout_merge_blocks): Likewise.
38749         * except.c (emit_to_new_bb_before): Remove prev_bb local variable.
38751 2014-05-14  Andrey Belevantsev  <abel@ispras.ru>
38753         PR rtl-optimization/60901
38754         * config/i386/i386.c (ix86_dependencies_evaluation_hook): Check that
38755         bb predecessor belongs to the same scheduling region.  Adjust comment.
38757 2014-05-13  Peter Bergner  <bergner@vnet.ibm.com>
38759         * doc/sourcebuild.texi: (dfp_hw): Document.
38760         (p8vector_hw): Likewise.
38761         (powerpc_eabi_ok): Likewise.
38762         (powerpc_elfv2): Likewise.
38763         (powerpc_htm_ok): Likewise.
38764         (ppc_recip_hw): Likewise.
38765         (vsx_hw): Likewise.
38767 2014-05-13  Cary Coutant  <ccoutant@google.com>
38769         * opts.c (finish_options): Use -ggnu-pubnames with -gsplit-dwarf.
38771 2014-05-13  David Malcolm  <dmalcolm@redhat.com>
38773         * gengtype-parse.c (require3): Eliminate in favor of...
38774         (require4): New.
38775         (require_template_declaration): Update to support optional single *
38776         on a type.
38778         * gengtype.c (get_ultimate_base_class): Add a non-const overload.
38779         (create_user_defined_type): Handle a single level of explicit
38780         pointerness within template arguments.
38781         (struct write_types_data): Add field "kind".
38782         (filter_type_name): Handle "*" character.
38783         (write_user_func_for_structure_ptr): Require a write_types_data
38784         rather than just a prefix string, so that we can look up the kind
38785         of the wtd and use it as an index into wrote_user_func_for_ptr,
38786         ensuring that such functions are written at most once.  Support
38787         subclasses by invoking the marking function of the ultimate base class.
38788         (write_user_func_for_structure_body): Require a write_types_data
38789         rather than just a prefix string, so that we can pass this to
38790         write_user_func_for_structure_ptr.
38791         (write_func_for_structure): Likewise.
38792         (ggc_wtd): Add initializer of new "kind" field.
38793         (pch_wtd): Likewise.
38795         * gengtype.h (enum write_types_kinds): New.
38796         (struct type): Add field wrote_user_func_for_ptr to the "s"
38797         union member.
38799 2014-05-13  Richard Sandiford  <r.sandiford@uk.ibm.com>
38801         * fold-const.c (optimize_bit_field_compare): Use wi:: operations
38802         instead of const_binop.
38803         (fold_binary_loc): Likewise.
38805 2014-05-13  Richard Sandiford  <r.sandiford@uk.ibm.com>
38807         * tree-dfa.h (get_addr_base_and_unit_offset_1): Update array index
38808         calculation to match get_ref_base_and_extent.
38810 2014-05-13  Catherine Moore  <clm@codesourcery.com>
38811             Sandra Loosemore  <sandra@codesourcery.com>
38813         * configure.ac: Fix assembly for explicit JALR relocation check.
38814         * configure: Regenerate.
38816 2014-05-13  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
38818         * config/arm/arm.c (neon_itype): Remove NEON_RESULTPAIR.
38819         (arm_init_neon_builtins): Remove handling of NEON_RESULTPAIR.
38820         Remove associated type declarations and initialisations.
38821         (arm_expand_neon_builtin): Likewise.
38822         (neon_emit_pair_result_insn): Delete.
38823         * config/arm/arm_neon_builtins (vtrn, vzip, vuzp): Delete.
38824         * config/arm/neon.md (neon_vtrn<mode>): Delete.
38825         (neon_vzip<mode>): Likewise.
38826         (neon_vuzp<mode>): Likewise.
38828 2014-05-13  Richard Biener  <rguenther@suse.de>
38830         PR ipa/60973
38831         * tree-inline.c (remap_gimple_stmt): Clear tail call flag,
38832         it needs revisiting whether the call still may be tail-called.
38834 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38836         * rtl.def (SYMBOL_REF): Remove middle "0" field.
38837         * rtl.h (block_symbol): Reduce number of fields to 2.
38838         (rtx_def): Add u2.symbol_ref_flags.
38839         (SYMBOL_REF_FLAGS): Use it.
38840         (SYMBOL_REF_DATA, SET_SYMBOL_REF_DECL, SYMBOL_REF_DECL)
38841         (SET_SYMBOL_REF_CONSTANT, SYMBOL_REF_CONSTANT): Lower index.
38842         * gengtype.c (adjust_field_rtx_def): Remove SYMBOL_REF_FLAGS handling.
38843         Lower index of SYMBOL_REF_DATA.
38844         * print-rtl.c (print_rtx): Lower index for SYMBOL_REF_DATA.
38845         Print SYMBOL_REF_FLAGS at the same time.
38846         * genattrtab.c (attr_rtx_1): Only initialize 1 "0" SYMBOL_REF field.
38848 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38850         * rtl.def (VAR_LOCATION): Remove "i" field.
38851         * rtl.h (rtx_def): Add u2.var_location_status.
38852         (PAT_VAR_LOCATION_STATUS): Use it.
38853         (gen_rtx_VAR_LOCATION): Declare.
38854         * gengenrtl.c (excluded_rtx): Add VAR_LOCATION.
38855         * emit-rtl.c (gen_rtx_VAR_LOCATION): New function.
38856         * var-tracking.c (emit_note_insn_var_location): Remove casts.
38858 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38860         * rtl.def (scratch): Fix outdated comment and remove "0" field.
38861         * gengtype.c (adjust_field_rtx_def): Update accordingly.
38863 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38865         * rtl.def (DEBUG_INSN, INSN, JUMP_INSN, CALL_INSN, JUMP_TABLE_DATA)
38866         (BARRIER, CODE_LABEL, NOTE): Remove first "i" field.
38867         * rtl.h (rtx_def): Add insn_uid to u2 field.
38868         (RTX_FLAG_CHECK8): Delete in favor of...
38869         (RTL_INSN_CHAIN_FLAG_CHECK): ...this new macro.
38870         (INSN_DELETED_P): Update accordingly.
38871         (INSN_UID): Use u2.insn_uid.
38872         (INSN_CHAIN_CODE_P): Define.
38873         (PREV_INSN, NEXT_INSN, BLOCK_FOR_INSN, PATTERN, INSN_LOCATION)
38874         (INSN_CODE, REG_NOTES, CALL_INSN_FUNCTION_USAGE, CODE_LABEL_NUMBER)
38875         (NOTE_DATA, NOTE_DELETED_LABEL_NAME, NOTE_BLOCK, NOTE_EH_HANDLER)
38876         (NOTE_BASIC_BLOCK, NOTE_VAR_LOCATION, NOTE_CFI, NOTE_LABEL_NUMBER)
38877         (NOTE_KIND, LABEL_NAME, LABEL_NUSES, JUMP_LABEL, LABEL_REFS): Lower
38878         indices accordingly.
38879         * print-rtl.c (print_rtx): Print INSN_UIDs before the main loop.
38880         Update indices for insn-chain rtxes.
38881         * gengtype.c (gen_rtx_next): Adjust test for insn-chain rtxes.
38882         (adjust_field_rtx_def): Lower '0' indices for all insn-chain rtxes.
38883         * emit-rtl.c (gen_label_rtx): Update gen_rtx_LABEL call.
38884         * caller-save.c (init_caller_save): Update gen_rtx_INSN calls.
38885         * combine.c (try_combine): Likewise.
38886         * ira.c (setup_prohibited_mode_move_regs): Likewise.
38888 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38890         * rtl.def (REG): Remove middle field.
38891         * rtl.h (rtx_def): Add orignal_regno to u2.
38892         (ORIGINAL_REGNO): Use it instead of field 1.
38893         (REG_ATTRS): Lower field index accordingly.
38894         * gengtype.c (adjust_field_rtx_def): Remove handling of
38895         ORIGINAL_REGNO.  Move REG_ATTRS index down.
38896         * print-rtl.c (print_rtx): Move ORIGINAL_REGNO handling to the
38897         code that prints the REGNO.
38899 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38901         * print-rtl.c (print_rtx): Guard whole '0' block with ifndef
38902         GENERATOR_FILE.
38904 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38906         * rtl.h (rtx_def): Mark u2 as GTY ((skip)).
38908 2014-05-13  Bin Cheng  <bin.cheng@arm.com>
38910         * tree-ssa-loop-ivopts.c (contain_complex_addr_expr): New.
38911         (alloc_iv): Lower base expressions containing ADDR_EXPR.
38913 2014-05-13  Ian Bolton  <ian.bolton@arm.com>
38915         * config/aarch64/aarch64-protos.h
38916         (aarch64_hard_regno_caller_save_mode): New prototype.
38917         * config/aarch64/aarch64.c (aarch64_hard_regno_caller_save_mode):
38918         New function.
38919         * config/aarch64/aarch64.h (HARD_REGNO_CALLER_SAVE_MODE): New macro.
38921 2014-05-13  Christian Bruel  <christian.bruel@st.com>
38923         * target.def (mode_switching): New hook vector.
38924         (mode_emit, mode_needed, mode_after, mode_entry): New hooks.
38925         (mode_exit, modepriority_to_mode): Likewise.
38926         * mode-switching.c (MODE_NEEDED, MODE_AFTER, MODE_ENTRY): Hookify.
38927         (MODE_EXIT, MODE_PRIORITY_TO_MODE, EMIT_MODE_SET): Likewise.
38928         * target.h: Include tm.h and hard-reg-set.h.
38929         * doc/tm.texi.in (EMIT_MODE_SET, MODE_NEEDED, MODE_AFTER, MODE_ENTRY)
38930         (MODE_EXIT, MODE_PRIORITY_TO_MODE): Delete and hookify.
38931         * doc/tm.texi Regenerate.
38932         * config/sh/sh.h (MODE_NEEDED, MODE_AFTER, MODE_ENTRY): Delete
38933         (MODE_EXIT, MODE_PRIORITY_TO_MODE, EMIT_MODE_SET): Likewise.
38934         * config/sh/sh.c (sh_emit_mode_set, sh_mode_priority): Hookify.
38935         (sh_mode_needed, sh_mode_after, sh_mode_entry, sh_mode_exit): Likewise.
38936         * config/i386/i386.h (MODE_NEEDED, MODE_AFTER, MODE_ENTRY): Delete
38937         (MODE_EXIT, MODE_PRIORITY_TO_MODE, EMIT_MODE_SET): Likewise.
38938         * config/i386/i386-protos.h (ix86_mode_needed, ix86_mode_after)
38939         (ix86_mode_entrym, ix86_emit_mode_set): Remove external declaration.
38940         * config/i386/i386.c (ix86_mode_needed, ix86_mode_after,
38941         (ix86_mode_exit, ix86_mode_entry, ix86_mode_priority)
38942         (ix86_emit_mode_set): Hookify.
38943         * config/epiphany/epiphany.h (MODE_NEEDED, MODE_AFTER, MODE_ENTRY):
38944         Delete.
38945         (MODE_EXIT, MODE_PRIORITY_TO_MODE, EMIT_MODE_SET): Likewise.
38946         * config/epiphany/epiphany-protos.h (epiphany_mode_needed)
38947         (emit_set_fp_mode, epiphany_mode_entry_exit, epiphany_mode_after)
38948         (epiphany_mode_priority_to_mode): Remove declaration.
38949         * config/epiphany/epiphany.c (emit_set_fp_mode): Hookify.
38950         (epiphany_mode_needed, epiphany_mode_priority_to_mode): Likewise.
38951         (epiphany_mode_entry, epiphany_mode_exit, epiphany_mode_after):
38952         Likewise.
38953         (epiphany_mode_priority_to_mode): Change priority type.  Hookify.
38954         (epiphany_mode_needed, epiphany_mode_entry_exit): Hookify.
38955         (epiphany_mode_after, epiphany_mode_entry, emit_set_fp_mode): Hookify.
38957 2014-05-13  Jakub Jelinek  <jakub@redhat.com>
38959         PR target/61060
38960         * config/i386/i386.c (ix86_expand_set_or_movmem): If count_exp
38961         is const0_rtx, return immediately.  Don't test count == 0 when
38962         it is always true.
38964 2014-05-13  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
38966         * Makefile.in: add shrink-wrap.o.
38967         * config/i386/i386.c: include "shrink-wrap.h"
38968         * function.c: Likewise.
38969         (requires_stack_frame_p, next_block_for_reg,
38970         move_insn_for_shrink_wrap, prepare_shrink_wrap,
38971         dup_block_and_redirect): Move to shrink-wrap.c
38972         (thread_prologue_and_epilogue_insns): Extract three code segments
38973         as functions in shrink-wrap.c
38974         * function.h: Move #ifdef HAVE_simple_return ... #endif block to
38975         shrink-wrap.h
38976         * shrink-wrap.c: New file.
38977         * shrink-wrap.h: New file.
38979 2014-05-12  David Wohlferd  <dw@LimeGreenSocks.com>
38981         * doc/extend.texi: Reflect current numbers of pragmas.  Remove
38982         reference to Solaris.
38984 2014-05-12  Mike Stump  <mikestump@comcast.net>
38986         PR other/31778
38987         * genattrtab.c (filename): Add.
38988         (convert_set_attr_alternative): Improve error message.
38989         (check_defs): Restore read_md_filename for error messages.
38990         (gen_insn): Save filename.
38992 2014-05-12  Dimitris Papavasiliou  <dpapavas@gmail.com>
38994         * doc/invoke.texi: Document new switches -Wno-shadow-ivar,
38995         -fno-local-ivars and -fivar-visibility.
38996         * c-family/c.opt: Make -Wshadow also implicitly enable
38997         -Wshadow-ivar.
38999 2014-05-12  David Wohlferd  <dw@LimeGreenSocks.com>
39001         * doc/tm.texi: Remove reference to deleted macro.
39002         * doc/tm.texi.in: Likewise.
39004 2014-05-12  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
39006         PR target/60991
39007         * config/avr/avr.c (avr_out_store_psi): Use correct constant
39008         to restore Y.
39010 2014-05-12  Georg-Johann Lay  <avr@gjlay.de>
39012         PR libgcc/61152
39013         * config/arm/arm.h (License): Add GCC Runtime Library Exception.
39014         * config/arm/aout.h (License): Same.
39015         * config/arm/bpabi.h (License): Same.
39016         * config/arm/elf.h (License): Same.
39017         * config/arm/linux-elf.h (License): Same.
39018         * config/arm/linux-gas.h (License): Same.
39019         * config/arm/netbsd-elf.h (License): Same.
39020         * config/arm/uclinux-eabi.h (License): Same.
39021         * config/arm/uclinux-elf.h (License): Same.
39022         * config/arm/vxworks.h (License): Same.
39024 2014-05-11  Jakub Jelinek  <jakub@redhat.com>
39026         * tree.h (OMP_CLAUSE_LINEAR_STMT): Define.
39027         * tree.c (omp_clause_num_ops): Increase OMP_CLAUSE_LINEAR
39028         number of operands to 3.
39029         (walk_tree_1): Walk all operands of OMP_CLAUSE_LINEAR.
39030         * tree-nested.c (convert_nonlocal_omp_clauses,
39031         convert_local_omp_clauses): Handle OMP_CLAUSE_DEPEND.
39032         * gimplify.c (gimplify_scan_omp_clauses): Handle
39033         OMP_CLAUSE_LINEAR_STMT.
39034         * omp-low.c (lower_rec_input_clauses): Fix typo.
39035         (maybe_add_implicit_barrier_cancel, lower_omp_1): Add
39036         cast between Fortran boolean_type_node and C _Bool if
39037         needed.
39039 2014-05-11  Richard Sandiford  <rdsandiford@googlemail.com>
39041         PR tree-optimization/61136
39042         * wide-int.h (multiple_of_p): Define a version that doesn't return
39043         the quotient.
39044         * fold-const.c (extract_muldiv_1): Use wi::multiple_of_p instead of an
39045         integer_zerop/const_binop pair.
39046         (multiple_of_p): Likewise, converting both operands to widest_int
39047         precision.
39049 2014-05-09  Teresa Johnson  <tejohnson@google.com>
39051         * cgraphunit.c (analyze_functions): Use correct dump file.
39053 2014-05-09  Florian Weimer  <fweimer@redhat.com>
39055         * cfgexpand.c (stack_protect_decl_p): New function, extracted from
39056         expand_used_vars.
39057         (stack_protect_return_slot_p): New function.
39058         (expand_used_vars): Call stack_protect_decl_p and
39059         stack_protect_return_slot_p for -fstack-protector-strong.
39061 2014-05-09  David Wohlferd <LimeGreenSocks@yahoo.com>
39062         Andrew Haley <aph@redhat.com>
39063         Richard Sandiford <rdsandiford@googlemail.com>
39065         * doc/extend.texi: Rewrite inline asm page / re-org asm-related
39066         pages.
39068 2014-05-09  Kenneth Zadeck  <zadeck@naturalbridge.com>
39070         PR middle-end/61111
39071         * fold-const.c (fold_binary_loc): Changed width of mask.
39073 2014-05-09  Georg-Johann Lay  <avr@gjlay.de>
39075         * config/avr/avr-fixed.md (round<mode>3): Use -1U instead of -1 in
39076         unsigned int initializers for regno_in, regno_out.
39078 2014-05-09  Georg-Johann Lay  <avr@gjlay.de>
39080         PR target/61055
39081         * config/avr/avr.md (cc): Add new attribute set_vzn.
39082         (addqi3, addqq3, adduqq3, subqi3, subqq3, subuqq3, negqi2) [cc]:
39083         Set cc insn attribute to set_vzn instead of set_zn for alternatives
39084         with INC, DEC or NEG.
39085         * config/avr/avr.c (avr_notice_update_cc): Handle SET_VZN.
39086         (avr_out_plus_1): ADIW sets cc0 to CC_SET_CZN.
39087         INC, DEC and ADD+ADC set cc0 to CC_CLOBBER.
39089 2014-05-09  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39091         Revert:
39092         2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39094         * wide-int.cc (UTItype): Define.
39095         (UDWtype): Define for appropriate W_TYPE_SIZE.
39097 2014-05-09  Richard Biener  <rguenther@suse.de>
39099         * Makefile.in (GTFILES): Remove tree-ssa-propagate.c.
39100         * tree-ssa-propagate.c: Do not include gt-tree-ssa-propagate.h.
39101         (interesting_ssa_edges, varying_ssa_edges): Move out of GC space.
39102         (add_ssa_edge, process_ssa_edge_worklist, ssa_prop_init,
39103         ssa_propagate): Adjust.
39105 2014-05-08  Jeff Law  <law@redhat.com>
39107         PR tree-optimization/61009
39108         * tree-ssa-threadedge.c (thread_through_normal_block): Return a
39109         tri-state rather than a boolean.  When a block is too big to
39110         thread through, inform caller via negative return value.
39111         (thread_across_edge): If a block was too big for normal threading,
39112         then it's too big for a joiner too, so remove temporary equivalences
39113         and return immediately.
39115 2014-05-08  Manuel López-Ibáñez  <manu@gcc.gnu.org>
39116             Matthias Klose  <doko@ubuntu.com>
39118         PR driver/61106
39119         * optc-gen.awk: Fix option handling for -Wunused-parameter.
39121 2014-05-08  Uros Bizjak  <ubizjak@gmail.com>
39123         PR target/59952
39124         * config/i386/i386.c (PTA_HASWELL): Remove PTA_RTM.
39126 2014-05-08  Uros Bizjak  <ubizjak@gmail.com>
39128         PR target/61092
39129         * config/alpha/alpha.c: Include gimple-iterator.h.
39130         (alpha_gimple_fold_builtin): New function.  Move
39131         ALPHA_BUILTIN_UMULH folding from ...
39132         (alpha_fold_builtin): ... here.
39133         (TARGET_GIMPLE_FOLD_BUILTIN): New define.
39135 2014-05-08  Wei Mi  <wmi@google.com>
39137         PR target/58066
39138         * config/i386/i386.c (ix86_compute_frame_layout): Update
39139         preferred_stack_boundary for call, expanded from tls descriptor.
39140         * config/i386/i386.md (*tls_global_dynamic_32_gnu): Update RTX
39141         to depend on SP register.
39142         (*tls_local_dynamic_base_32_gnu): Ditto.
39143         (*tls_local_dynamic_32_once): Ditto.
39144         (tls_global_dynamic_64_<mode>): Set
39145         ix86_tls_descriptor_calls_expanded_in_cfun.
39146         (tls_local_dynamic_base_64_<mode>): Ditto.
39147         (tls_global_dynamic_32): Set
39148         ix86_tls_descriptor_calls_expanded_in_cfun. Update RTX
39149         to depend on SP register.
39150         (tls_local_dynamic_base_32): Ditto.
39152 2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39154         * config/arm/arm_neon.h: Update comment.
39155         * config/arm/neon-docgen.ml: Delete.
39156         * config/arm/neon-gen.ml: Delete.
39157         * doc/arm-neon-intrinsics.texi: Update comment.
39159 2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39161         * config/arm/arm_neon_builtins.def (vadd, vsub): Only define the v2sf
39162         and v4sf versions.
39163         (vand, vorr, veor, vorn, vbic): Remove.
39164         * config/arm/neon.md (neon_vadd, neon_vsub, neon_vadd_unspec): Adjust
39165         iterator.
39166         (neon_vsub_unspec): Likewise.
39167         (neon_vorr, neon_vand, neon_vbic, neon_veor, neon_vorn): Remove.
39169 2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39171         * config/arm/arm_neon.h (vadd_s8): GNU C implementation
39172         (vadd_s16): Likewise.
39173         (vadd_s32): Likewise.
39174         (vadd_f32): Likewise.
39175         (vadd_u8): Likewise.
39176         (vadd_u16): Likewise.
39177         (vadd_u32): Likewise.
39178         (vadd_s64): Likewise.
39179         (vadd_u64): Likewise.
39180         (vaddq_s8): Likewise.
39181         (vaddq_s16): Likewise.
39182         (vaddq_s32): Likewise.
39183         (vaddq_s64): Likewise.
39184         (vaddq_f32): Likewise.
39185         (vaddq_u8): Likewise.
39186         (vaddq_u16): Likewise.
39187         (vaddq_u32): Likewise.
39188         (vaddq_u64): Likewise.
39189         (vmul_s8): Likewise.
39190         (vmul_s16): Likewise.
39191         (vmul_s32): Likewise.
39192         (vmul_f32): Likewise.
39193         (vmul_u8): Likewise.
39194         (vmul_u16): Likewise.
39195         (vmul_u32): Likewise.
39196         (vmul_p8): Likewise.
39197         (vmulq_s8): Likewise.
39198         (vmulq_s16): Likewise.
39199         (vmulq_s32): Likewise.
39200         (vmulq_f32): Likewise.
39201         (vmulq_u8): Likewise.
39202         (vmulq_u16): Likewise.
39203         (vmulq_u32): Likewise.
39204         (vsub_s8): Likewise.
39205         (vsub_s16): Likewise.
39206         (vsub_s32): Likewise.
39207         (vsub_f32): Likewise.
39208         (vsub_u8): Likewise.
39209         (vsub_u16): Likewise.
39210         (vsub_u32): Likewise.
39211         (vsub_s64): Likewise.
39212         (vsub_u64): Likewise.
39213         (vsubq_s8): Likewise.
39214         (vsubq_s16): Likewise.
39215         (vsubq_s32): Likewise.
39216         (vsubq_s64): Likewise.
39217         (vsubq_f32): Likewise.
39218         (vsubq_u8): Likewise.
39219         (vsubq_u16): Likewise.
39220         (vsubq_u32): Likewise.
39221         (vsubq_u64): Likewise.
39222         (vand_s8): Likewise.
39223         (vand_s16): Likewise.
39224         (vand_s32): Likewise.
39225         (vand_u8): Likewise.
39226         (vand_u16): Likewise.
39227         (vand_u32): Likewise.
39228         (vand_s64): Likewise.
39229         (vand_u64): Likewise.
39230         (vandq_s8): Likewise.
39231         (vandq_s16): Likewise.
39232         (vandq_s32): Likewise.
39233         (vandq_s64): Likewise.
39234         (vandq_u8): Likewise.
39235         (vandq_u16): Likewise.
39236         (vandq_u32): Likewise.
39237         (vandq_u64): Likewise.
39238         (vorr_s8): Likewise.
39239         (vorr_s16): Likewise.
39240         (vorr_s32): Likewise.
39241         (vorr_u8): Likewise.
39242         (vorr_u16): Likewise.
39243         (vorr_u32): Likewise.
39244         (vorr_s64): Likewise.
39245         (vorr_u64): Likewise.
39246         (vorrq_s8): Likewise.
39247         (vorrq_s16): Likewise.
39248         (vorrq_s32): Likewise.
39249         (vorrq_s64): Likewise.
39250         (vorrq_u8): Likewise.
39251         (vorrq_u16): Likewise.
39252         (vorrq_u32): Likewise.
39253         (vorrq_u64): Likewise.
39254         (veor_s8): Likewise.
39255         (veor_s16): Likewise.
39256         (veor_s32): Likewise.
39257         (veor_u8): Likewise.
39258         (veor_u16): Likewise.
39259         (veor_u32): Likewise.
39260         (veor_s64): Likewise.
39261         (veor_u64): Likewise.
39262         (veorq_s8): Likewise.
39263         (veorq_s16): Likewise.
39264         (veorq_s32): Likewise.
39265         (veorq_s64): Likewise.
39266         (veorq_u8): Likewise.
39267         (veorq_u16): Likewise.
39268         (veorq_u32): Likewise.
39269         (veorq_u64): Likewise.
39270         (vbic_s8): Likewise.
39271         (vbic_s16): Likewise.
39272         (vbic_s32): Likewise.
39273         (vbic_u8): Likewise.
39274         (vbic_u16): Likewise.
39275         (vbic_u32): Likewise.
39276         (vbic_s64): Likewise.
39277         (vbic_u64): Likewise.
39278         (vbicq_s8): Likewise.
39279         (vbicq_s16): Likewise.
39280         (vbicq_s32): Likewise.
39281         (vbicq_s64): Likewise.
39282         (vbicq_u8): Likewise.
39283         (vbicq_u16): Likewise.
39284         (vbicq_u32): Likewise.
39285         (vbicq_u64): Likewise.
39286         (vorn_s8): Likewise.
39287         (vorn_s16): Likewise.
39288         (vorn_s32): Likewise.
39289         (vorn_u8): Likewise.
39290         (vorn_u16): Likewise.
39291         (vorn_u32): Likewise.
39292         (vorn_s64): Likewise.
39293         (vorn_u64): Likewise.
39294         (vornq_s8): Likewise.
39295         (vornq_s16): Likewise.
39296         (vornq_s32): Likewise.
39297         (vornq_s64): Likewise.
39298         (vornq_u8): Likewise.
39299         (vornq_u16): Likewise.
39300         (vornq_u32): Likewise.
39301         (vornq_u64): Likewise.
39303 2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39305         * wide-int.cc (UTItype): Define.
39306         (UDWtype): Define for appropriate W_TYPE_SIZE.
39308 2014-05-08  Marc Glisse  <marc.glisse@inria.fr>
39310         PR tree-optimization/59100
39311         * tree-ssa-phiopt.c: Include tree-inline.h.
39312         (neutral_element_p, absorbing_element_p): New functions.
39313         (value_replacement): Handle conditional binary operations with a
39314         neutral or absorbing element.
39316 2014-05-08  Richard Biener  <rguenther@suse.de>
39318         * tree-ssa-sccvn.c (vn_get_expr_for): Valueize operands before
39319         folding the expression.
39320         (valueize_expr): Remove.
39321         (visit_reference_op_load): Do not valueize the result of
39322         vn_get_expr_for.
39323         (simplify_binary_expression): Likewise.
39324         (simplify_unary_expression): Likewise.
39326 2014-05-08  Richard Biener  <rguenther@suse.de>
39328         * gimplify.c (gimplify_call_expr): Use saved fnptrtype for
39329         looking at TYPE_ARG_TYPES.
39331 2014-05-08  Richard Biener  <rguenther@suse.de>
39333         * gimple-fold.c (gimple_fold_stmt_to_constant_1): Remove
39334         pointer propagation special-case.
39336 2014-05-08  Bin Cheng  <bin.cheng@arm.com>
39338         * tree-affine.c (tree_to_aff_combination): Handle MEM_REF for
39339         core part of address expressions.
39341 2014-05-08  Alan Modra  <amodra@gmail.com>
39343         PR target/60737
39344         * config/rs6000/rs6000.c (expand_block_move): Allow 64-bit
39345         loads and stores when -mno-strict-align at any alignment.
39346         (expand_block_clear): Similarly.  Also correct calculation of
39347         instruction count.
39349 2014-05-07  Thomas Preud'homme  <thomas.preudhomme@arm.com>
39351         PR middle-end/39246
39352         * tree-complex.c (expand_complex_move): Keep line info when expanding
39353         complex move.
39354         * tree-ssa-uninit.c (warn_uninit): New argument. Ignore assignment
39355         of complex expression. Use new argument to display correct location
39356         for values coming from phi statement.
39357         (warn_uninitialized_vars): Adapt to new signature of warn_uninit.
39358         (warn_uninitialized_phi): Pass location of phi argument to
39359         warn_uninit.
39360         * tree-ssa.c (ssa_undefined_value_p): For SSA_NAME initialized by a
39361         COMPLEX_EXPR, recurse on each part of the COMPLEX_EXPR.
39363 2014-05-07  Segher Boessenkool  <segher@kernel.crashing.org>
39365         * config/rs6000/predicates.md (indexed_address_mem): New.
39366         * config/rs6000/rs6000.md (type): Remove load_ext, load_ext_u,
39367         load_ext_ux, load_ux, load_u, store_ux, store_u, fpload_ux, fpload_u,
39368         fpstore_ux, fpstore_u.
39369         (sign_extend, indexed, update): New.
39370         (cell_micro): Adjust.
39371         (*zero_extend<mode>di2_internal1, *zero_extendsidi2_lfiwzx,
39372         *extendsidi2_lfiwax, *extendsidi2_nocell, *extendsfdf2_fpr,
39373         *movsi_internal1, *movsi_internal1_single, *movhi_internal,
39374         *movqi_internal, *movcc_internal1, mov<mode>_hardfloat,
39375         *mov<mode>_softfloat, *mov<mode>_hardfloat32, *mov<mode>_hardfloat64,
39376         *mov<mode>_softfloat64, *movdi_internal32, *movdi_internal64,
39377         *mov<mode>_string, *ldmsi8, *ldmsi7, *ldmsi6, *ldmsi5, *ldmsi4,
39378         *ldmsi3, *stmsi8, *stmsi7, *stmsi6, *stmsi5, *stmsi4, *stmsi3,
39379         *movdi_update1, movdi_<mode>_update, movdi_<mode>_update_stack,
39380         *movsi_update1, *movsi_update2, movsi_update, movsi_update_stack,
39381         *movhi_update1, *movhi_update2, *movhi_update3, *movhi_update4,
39382         *movqi_update1, *movqi_update2, *movqi_update3, *movsf_update1,
39383         *movsf_update2, *movsf_update3, *movsf_update4, *movdf_update1,
39384         *movdf_update2, load_toc_aix_si, load_toc_aix_di, probe_stack_<mode>,
39385         *stmw, *lmw, as well as 10 anonymous patterns): Adjust.
39387         * config/rs6000/dfp.md (movsd_store, movsd_load): Adjust.
39388         * config/rs6000/vsx.md (*vsx_movti_32bit, *vsx_extract_<mode>_load,
39389         *vsx_extract_<mode>_store): Adjust.
39390         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_microcoded_insn,
39391         is_cracked_insn, insn_must_be_first_in_group,
39392         insn_must_be_last_in_group): Adjust.
39394         * config/rs6000/40x.md (ppc403-load, ppc403-store, ppc405-float):
39395         Adjust.
39396         * config/rs6000/440.md (ppc440-load, ppc440-store, ppc440-fpload,
39397         ppc440-fpstore): Adjust.
39398         * config/rs6000/476.md (ppc476-load, ppc476-store, ppc476-fpload,
39399         ppc476-fpstore): Adjust.
39400         * config/rs6000/601.md (ppc601-load, ppc601-store, ppc601-fpload,
39401         ppc601-fpstore): Adjust.
39402         * config/rs6000/603.md (ppc603-load, ppc603-store, ppc603-fpload):
39403         Adjust.
39404         * config/rs6000/6xx.md (ppc604-load, ppc604-store, ppc604-fpload):
39405         Adjust.
39406         * config/rs6000/7450.md (ppc7450-load, ppc7450-store, ppc7450-fpload,
39407         ppc7450-fpstore): Adjust.
39408         * config/rs6000/7xx.md (ppc750-load, ppc750-store): Adjust.
39409         * config/rs6000/8540.md (ppc8540_load, ppc8540_store): Adjust.
39410         * config/rs6000/a2.md (ppca2-load, ppca2-fp-load, ppca2-fp-store):
39411         Adjust.
39412         * config/rs6000/cell.md (cell-load, cell-load-ux, cell-load-ext,
39413         cell-fpload, cell-fpload-update, cell-store, cell-store-update,
39414         cell-fpstore, cell-fpstore-update): Adjust.
39415         * config/rs6000/e300c2c3.md (ppce300c3_load, ppce300c3_fpload,
39416         ppce300c3_store, ppce300c3_fpstore): Adjust.
39417         * config/rs6000/e500mc.md (e500mc_load, e500mc_fpload, e500mc_store,
39418         e500mc_fpstore): Adjust.
39419         * config/rs6000/e500mc64.md (e500mc64_load, e500mc64_fpload,
39420         e500mc64_store, e500mc64_fpstore): Adjust.
39421         * config/rs6000/e5500.md (e5500_load, e5500_fpload, e5500_store,
39422         e5500_fpstore): Adjust.
39423         * config/rs6000/e6500.md (e6500_load, e6500_fpload, e6500_store,
39424         e6500_fpstore): Adjust.
39425         * config/rs6000/mpc.md (mpccore-load, mpccore-store, mpccore-fpload):
39426         Adjust.
39427         * config/rs6000/power4.md (power4-load, power4-load-ext,
39428         power4-load-ext-update, power4-load-ext-update-indexed,
39429         power4-load-update-indexed, power4-load-update, power4-fpload,
39430         power4-fpload-update, power4-store, power4-store-update,
39431         power4-store-update-indexed, power4-fpstore, power4-fpstore-update):
39432         Adjust.
39433         * config/rs6000/power5.md (power5-load, power5-load-ext,
39434         power5-load-ext-update, power5-load-ext-update-indexed,
39435         power5-load-update-indexed, power5-load-update, power5-fpload,
39436         power5-fpload-update, power5-store, power5-store-update,
39437         power5-store-update-indexed, power5-fpstore, power5-fpstore-update):
39438         Adjust.
39439         * config/rs6000/power6.md (power6-load, power6-load-ext,
39440         power6-load-update, power6-load-update-indexed,
39441         power6-load-ext-update, power6-load-ext-update-indexed, power6-fpload,
39442         power6-fpload-update, power6-store, power6-store-update,
39443         power6-store-update-indexed, power6-fpstore, power6-fpstore-update):
39444         Adjust.
39445         * config/rs6000/power7.md (power7-load, power7-load-ext,
39446         power7-load-update, power7-load-update-indexed,
39447         power7-load-ext-update, power7-load-ext-update-indexed, power7-fpload,
39448         power7-fpload-update, power7-store, power7-store-update,
39449         power7-store-update-indexed, power7-fpstore, power7-fpstore-update):
39450         Adjust.
39451         * config/rs6000/power8.md (power8-load, power8-load-update,
39452         power8-load-ext, power8-load-ext-update, power8-fpload,
39453         power8-fpload-update, power8-store, power8-store-update-indexed,
39454         power8-fpstore, power8-fpstore-update): Adjust.
39455         * config/rs6000/rs64.md (rs64a-load, rs64a-store, rs64a-fpload):
39456         Adjust.
39457         * config/rs6000/titan.md (titan_lsu_load, titan_lsu_fpload,
39458         titan_lsu_store, titan_lsu_fpstore): Adjust.
39459         * config/rs6000/xfpu.md (fp-load, fp-store): Adjust.
39461 2014-05-07  Oleg Endo  <olegendo@gcc.gnu.org>
39463         PR target/60884
39464         * config/sh/sh-mem.cc (sh_expand_strlen): Use loop when emitting
39465         unrolled byte insns.  Emit address increments after move insns.
39467 2014-05-07  David Malcolm  <dmalcolm@redhat.com>
39469         * gimple.h (gimple_builtin_call_types_compatible_p): Accept a
39470         const_gimple, rather than a gimple.
39471         (gimple_call_builtin_p): Likewise, for the three variants.
39473         * gimple.c (gimple_builtin_call_types_compatible_p): Likewise.
39474         (gimple_call_builtin_p): Likewise, for the three variants.
39476 2014-05-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
39478         PR tree-optimization/61095
39479         * tree-ssanames.c (get_nonzero_bits): Fix type extension in wi::shwi.
39481 2014-05-07  Richard Biener  <rguenther@suse.de>
39483         PR tree-optimization/61034
39484         * tree-ssa-alias.c (call_may_clobber_ref_p_1): Export.
39485         (maybe_skip_until): Use translate to take into account
39486         lattices when trying to do disambiguations.
39487         (get_continuation_for_phi_1): Likewise.
39488         (get_continuation_for_phi): Adjust for added translate arguments.
39489         (walk_non_aliased_vuses): Likewise.
39490         * tree-ssa-alias.h (get_continuation_for_phi): Adjust prototype.
39491         (walk_non_aliased_vuses): Likewise.
39492         (call_may_clobber_ref_p_1): Declare.
39493         * tree-ssa-sccvn.c (vn_reference_lookup_3): Also disambiguate against
39494         calls.  Stop early if we are only supposed to disambiguate.
39495         * tree-ssa-pre.c (translate_vuse_through_block): Adjust.
39497 2014-05-07  Joern Rennecke  <joern.rennecke@embecosm.com>
39499         * config/epiphany/epiphany.c (epiphany_handle_interrupt_attribute):
39500         Emit an error when the function has arguments.
39502 2014-05-07  Thomas Schwinge  <thomas@codesourcery.com>
39504         * cfgloop.h (unswitch_loops): Remove.
39505         * doc/passes.texi: Remove references to loop-unswitch.c
39506         * timevar.def (TV_LOOP_UNSWITCH): Remove.
39508 2014-05-07  Evgeny Stupachenko  <evstupac@gmail.com>
39510         * tree-vect-data-refs.c (vect_grouped_load_supported): New
39511         check for loads group of length 3.
39512         (vect_permute_load_chain): New permutations for loads group of
39513         length 3.
39514         * tree-vect-stmts.c (vect_model_load_cost): Change cost
39515         of vec_perm_shuffle for the new permutations.
39517 2014-05-07  Alan Lawrence  <alan.lawrence@arm.com>
39519         * config/aarch64/arm_neon.h (vtrn1_f32, vtrn1_p8, vtrn1_p16, vtrn1_s8,
39520         vtrn1_s16, vtrn1_s32, vtrn1_u8, vtrn1_u16, vtrn1_u32, vtrn1q_f32,
39521         vtrn1q_f64, vtrn1q_p8, vtrn1q_p16, vtrn1q_s8, vtrn1q_s16, vtrn1q_s32,
39522         vtrn1q_s64, vtrn1q_u8, vtrn1q_u16, vtrn1q_u32, vtrn1q_u64, vtrn2_f32,
39523         vtrn2_p8, vtrn2_p16, vtrn2_s8, vtrn2_s16, vtrn2_s32, vtrn2_u8,
39524         vtrn2_u16, vtrn2_u32, vtrn2q_f32, vtrn2q_f64, vtrn2q_p8, vtrn2q_p16,
39525         vtrn2q_s8, vtrn2q_s16, vtrn2q_s32, vtrn2q_s64, vtrn2q_u8, vtrn2q_u16,
39526         vtrn2q_u32, vtrn2q_u64): Replace temporary asm with __builtin_shuffle.
39528 2014-05-07  Thomas Schwinge  <thomas@codesourcery.com>
39530         * loop-unswitch.c: Delete.
39532 2014-05-07  Richard Biener  <rguenther@suse.de>
39534         * config.gcc: Always set need_64bit_hwint to yes.
39536 2014-05-07  Chung-Ju Wu  <jasonwucj@gmail.com>
39538         * config/nds32/nds32.h (HONOR_REG_ALLOC_ORDER): Have it in favor
39539         of using optimize_size.
39541 2014-05-06  Mike Stump  <mikestump@comcast.net>
39543         * wide-int.h (wi::int_traits <HOST_WIDE_INT>): Always define.
39545 2014-05-06  Joseph Myers  <joseph@codesourcery.com>
39547         * config/i386/sse.md (*mov<mode>_internal)
39548         (*<sse>_loadu<ssemodesuffix><avxsizesuffix><mask_name>)
39549         (*<sse2_avx_avx512f>_loaddqu<mode><mask_name>)
39550         (<sse>_andnot<mode>3, <code><mode>3, *andnot<mode>3)
39551         (*<code><mode>3, *andnot<mode>3<mask_name>)
39552         (<mask_codefor><code><mode>3<mask_name>): Only consider
39553         TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL for modes of size 16.
39555 2014-05-06  Richard Sandiford  <rdsandiford@googlemail.com>
39557         Revert:
39558         2014-05-03  Richard Sandiford  <rdsandiford@googlemail.com>
39560         * lra-constraints.c (valid_address_p): Move earlier in file.
39561         Add a constraint argument to the address_info version.
39562         (satisfies_memory_constraint_p): New function.
39563         (satisfies_address_constraint_p): Likewise.
39564         (process_alt_operands, curr_insn_transform): Use them.
39565         (process_address): Pass the constraint to valid_address_p when
39566         checking address operands.
39568 2014-05-06  Richard Sandiford  <r.sandiford@uk.ibm.com>
39570         * lto-cgraph.c (compute_ltrans_boundary): Make node variables local
39571         to their respective blocks.  Fix inadvertent use of "node".
39573 2014-05-06  Richard Sandiford  <rdsandiford@googlemail.com>
39575         * emit-rtl.c (init_derived_machine_modes): New functionm, split
39576         out from...
39577         (init_emit_once): ...here.
39578         * rtl.h (init_derived_machine_modes): Declare.
39579         * toplev.c (do_compile): Call it even if no_backend.
39581 2014-05-06  Kenneth Zadeck  <zadeck@naturalbridge.com>
39582             Mike Stump  <mikestump@comcast.net>
39583             Richard Sandiford  <rdsandiford@googlemail.com>
39584             Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
39586         * alias.c (ao_ref_from_mem): Use wide-int interfaces.
39587         (rtx_equal_for_memref_p): Update comment.
39588         (adjust_offset_for_component_ref): Use wide-int interfaces.
39589         * builtins.c (get_object_alignment_2): Likewise.
39590         (c_readstr): Likewise.
39591         (target_char_cast): Add comment.
39592         (determine_block_size): Use wide-int interfaces.
39593         (expand_builtin_signbit): Likewise.
39594         (fold_builtin_int_roundingfn): Likewise.
39595         (fold_builtin_bitop): Likewise.
39596         (fold_builtin_bswap): Likewise.
39597         (fold_builtin_logarithm): Use signop.
39598         (fold_builtin_pow): Likewise.
39599         (fold_builtin_memory_op): Use wide-int interfaces.
39600         (fold_builtin_object_size): Likewise.
39601         * cfgloop.c (alloc_loop): Initialize nb_iterations_upper_bound and
39602         nb_iterations_estimate.
39603         (record_niter_bound): Use wide-int interfaces.
39604         (get_estimated_loop_iterations_int): Likewise.
39605         (get_estimated_loop_iterations): Likewise.
39606         (get_max_loop_iterations): Likewise.
39607         * cfgloop.h: Include wide-int.h.
39608         (struct nb_iter_bound): Change bound to widest_int.
39609         (struct loop): Change nb_iterations_upper_bound and
39610         nb_iterations_estimate to widest_int.
39611         (record_niter_bound): Switch to use widest_int.
39612         (get_estimated_loop_iterations): Likewise.
39613         (get_max_loop_iterations): Likewise.
39614         (gcov_type_to_double_int): Rename to gcov_type_to_wide_int and
39615         update for wide-int.
39616         * cgraph.c (cgraph_add_thunk): Use wide-int interfaces.
39617         * combine.c (try_combine): Likewise.
39618         (subst): Use CONST_SCALAR_INT_P rather than CONST_INT_P.
39619         * config/aarch64/aarch64.c (aapcs_vfp_sub_candidate): Use wide-int
39620         interfaces.
39621         (aarch64_float_const_representable_p): Likewise.
39622         * config/arc/arc.c: Include wide-int.h.
39623         (arc_can_use_doloop_p): Use wide-int interfaces.
39624         * config/arm/arm.c (aapcs_vfp_sub_candidate): Likewise.
39625         (vfp3_const_double_index): Likewise.
39626         * config/avr/avr.c (avr_out_round): Likewise.
39627         (avr_fold_builtin): Likewise.
39628         * config/bfin/bfin.c (bfin_local_alignment): Likewise.
39629         (bfin_can_use_doloop_p): Likewise.
39630         * config/darwin.c (darwin_mergeable_constant_section): Likewise.
39631         (machopic_select_rtx_section): Update to handle CONST_WIDE_INT.
39632         * config/i386/i386.c: Include wide-int.h.
39633         (ix86_data_alignment): Use wide-int interfaces.
39634         (ix86_local_alignment): Likewise.
39635         (ix86_emit_swsqrtsf): Update real_from_integer.
39636         * config/msp430/msp430.c (msp430_attr): Use wide-int interfaces.
39637         * config/nds32/nds32.c (nds32_insert_attributes): Likewise.
39638         * config/rs6000/predicates.md (any_operand): Add const_wide_int.
39639         (zero_constant): Likewise.
39640         (input_operand): Likewise.
39641         (splat_input_operand): Likewise.
39642         (non_logical_cint_operand): Change const_double to const_wide_int.
39643         * config/rs6000/rs6000.c (num_insns_constant): Handle CONST_WIDE_INT.
39644         (easy_altivec_constant): Remove comment.
39645         (paired_expand_vector_init): Use CONSTANT_P.
39646         (rs6000_legitimize_address): Handle CONST_WIDE_INT.
39647         (rs6000_emit_move): Update checks.
39648         (rs6000_aggregate_candidate): Use wide-int interfaces.
39649         (rs6000_expand_ternop_builtin): Likewise.
39650         (rs6000_output_move_128bit): Handle CONST_WIDE_INT.
39651         (rs6000_assemble_integer): Likewise.
39652         (rs6000_hash_constant): Likewise.
39653         (output_toc): Likewise.
39654         (rs6000_rtx_costs): Likewise.
39655         (rs6000_emit_swrsqrt); Update call to real_from_integer.
39656         * config/rs6000/rs6000-c.c: Include wide-int.h.
39657         (altivec_resolve_overloaded_builtin): Use wide-int interfaces.
39658         * config/rs6000/rs6000.h (TARGET_SUPPORTS_WIDE_INT): New.
39659         * config/rs6000/rs6000.md: Use const_scalar_int_operand.
39660         Handle CONST_WIDE_INT.
39661         * config/sol2-c.c (solaris_pragma_align): Change low to unsigned HWI.
39662         Use tree_fits_uhwi_p.
39663         * config/sparc/sparc.c: Include wide-int.h.
39664         (sparc_fold_builtin): Use wide-int interfaces.
39665         * config/vax/vax.c: Include wide-int.h.
39666         (vax_float_literal): Use real_from_integer.
39667         * coretypes.h (struct hwivec_def): New.
39668         (hwivec): New.
39669         (const_hwivec): New.
39670         * cse.c (hash_rtx_cb): Handle CONST_WIDE_INT.
39671         (equiv_constant): Handle CONST_WIDE_INT.
39672         * cselib.c (rtx_equal_for_cselib_1): Use CASE_CONST_UNIQUE.
39673         (cselib_hash_rtx): Handle CONST_WIDE_INT.
39674         * dbxout.c (stabstr_U): Use wide-int interfaces.
39675         (dbxout_type): Update to use cst_fits_shwi_p.
39676         * defaults.h (LOG2_BITS_PER_UNIT): Define.
39677         (TARGET_SUPPORTS_WIDE_INT): Add default.
39678         * dfp.c: Include wide-int.h.
39679         (decimal_real_to_integer2): Use wide-int interfaces and rename to
39680         decimal_real_to_integer.
39681         * dfp.h (decimal_real_to_integer2): Return a wide_int and rename to
39682         decimal_real_to_integer.
39683         * doc/generic.texi (Constant expressions): Update for wide_int.
39684         * doc/rtl.texi (const_double): Likewise.
39685         (const_wide_int, CONST_WIDE_INT, CONST_WIDE_INT_VEC): New.
39686         (CONST_WIDE_INT_NUNITS, CONST_WIDE_INT_ELT): New.
39687         * doc/tm.texi.in (REAL_VALUE_TO_INT): Remove.
39688         (REAL_VALUE_FROM_INT): Remove.
39689         (TARGET_SUPPORTS_WIDE_INT): New.
39690         * doc/tm.texi: Regenerate.
39691         * dojump.c (prefer_and_bit_test): Use wide-int interfaces.
39692         * double-int.h: Include wide-int.h.
39693         (struct wi::int_traits): New.
39694         * dwarf2out.c (get_full_len): New.
39695         (dw_val_equal_p): Add case dw_val_class_wide_int.
39696         (size_of_loc_descr): Likewise.
39697         (output_loc_operands): Likewise.
39698         (insert_double): Remove.
39699         (insert_wide_int): New.
39700         (add_AT_wide): New.
39701         (print_die): Add case dw_val_class_wide_int.
39702         (attr_checksum): Likewise.
39703         (attr_checksum_ordered): Likewise.
39704         (same_dw_val_p): Likewise.
39705         (size_of_die): Likewise.
39706         (value_format): Likewise.
39707         (output_die): Likewise.
39708         (double_int_type_size_in_bits): Rename to offset_int_type_size_in_bits.
39709         Use wide-int.
39710         (clz_loc_descriptor): Use wide-int interfaces.
39711         (mem_loc_descriptor): Likewise.  Handle CONST_WIDE_INT.
39712         (loc_descriptor): Use wide-int interfaces.  Handle CONST_WIDE_INT.
39713         (round_up_to_align): Use wide-int interfaces.
39714         (field_byte_offset): Likewise.
39715         (insert_double): Rename to insert_wide_int.  Use wide-int interfaces.
39716         (add_const_value_attribute): Handle CONST_WIDE_INT.  Update
39717         CONST_DOUBLE handling.  Use wide-int interfaces.
39718         (add_bound_info): Use tree_fits_uhwi_p.  Use wide-int interfaces.
39719         (gen_enumeration_type_die): Use add_AT_wide.
39720         (hash_loc_operands): Add case dw_val_class_wide_int.
39721         (compare_loc_operands): Likewise.
39722         * dwarf2out.h: Include wide-int.h.
39723         (wide_int_ptr): New.
39724         (enum dw_val_class): Add dw_val_class_wide_int.
39725         (struct dw_val_struct): Add val_wide.
39726         * emit-rtl.c (const_wide_int_htab): New.
39727         (const_wide_int_htab_hash): New.
39728         (const_wide_int_htab_eq): New.
39729         (lookup_const_wide_int): New.
39730         (const_double_htab_hash): Use wide-int interfaces.
39731         (const_double_htab_eq): Likewise.
39732         (rtx_to_double_int): Conditionally compile for wide-int.
39733         (immed_double_int_const): Rename to immed_wide_int_const and
39734         update for wide-int.
39735         (immed_double_const): Conditionally compile for wide-int.
39736         (init_emit_once): Use wide-int interfaces.
39737         * explow.c (plus_constant): Likewise.
39738         * expmed.c (mask_rtx): Move further up file.  Use wide-int interfaces.
39739         (lshift_value): Use wide-int interfaces.
39740         (expand_mult): Likewise.
39741         (choose_multiplier): Likewise.
39742         (expand_smod_pow2): Likewise.
39743         (make_tree): Likewise.
39744         * expr.c (convert_modes): Consolidate handling of constants.
39745         Use wide-int interfaces.
39746         (emit_group_load_1): Add note.
39747         (store_expr): Update comment.
39748         (get_inner_reference): Use wide-int interfaces.
39749         (expand_constructor): Update comment.
39750         (expand_expr_real_2): Use wide-int interfaces.
39751         (expand_expr_real_1): Likewise.
39752         (reduce_to_bit_field_precision): Likewise.
39753         (const_vector_from_tree): Likewise.
39754         * final.c: Include wide-int-print.h.
39755         (output_addr_const): Handle CONST_WIDE_INT.  Use CONST_DOUBLE_AS_INT_P.
39756         * fixed-value.c: Include wide-int.h.
39757         (fixed_from_string): Use wide-int interfaces.
39758         (fixed_to_decimal): Likewise.
39759         (fixed_convert_from_real): Likewise.
39760         (real_convert_from_fixed): Likewise.
39761         * fold-const.h (mem_ref_offset): Return an offset_int.
39762         (div_if_zero_remainder): Remove code parameter.
39763         * fold-const.c (div_if_zero_remainder): Remove code parameter.
39764         Use wide-int interfaces.
39765         (may_negate_without_overflow_p): Use wide-int interfaces.
39766         (negate_expr_p): Likewise.
39767         (fold_negate_expr): Likewise.
39768         (int_const_binop_1): Likewise.
39769         (const_binop): Likewise.
39770         (fold_convert_const_int_from_int): Likewise.
39771         (fold_convert_const_int_from_real): Likewise.
39772         (fold_convert_const_int_from_fixed): Likewise.
39773         (fold_convert_const_fixed_from_int): Likewise.
39774         (all_ones_mask_p): Take an unsigned size.  Use wide-int interfaces.
39775         (sign_bit_p): Use wide-int interfaces.
39776         (make_range_step): Likewise.
39777         (build_range_check): Likewise.  Pass an integer of the correct type
39778         instead of using integer_one_node.
39779         (range_predecessor): Pass an integer of the correct type instead
39780         of using integer_one_node.
39781         (range_successor): Likewise.
39782         (merge_ranges): Likewise.
39783         (unextend): Use wide-int interfaces.
39784         (extract_muldiv_1): Likewise.
39785         (fold_div_compare): Likewise.
39786         (fold_single_bit_test): Likewise.
39787         (fold_sign_changed_comparison): Likewise.
39788         (try_move_mult_to_index): Update calls to div_if_zero_remainder.
39789         (fold_plusminus_mult_expr): Use wide-int interfaces.
39790         (native_encode_int): Likewise.
39791         (native_interpret_int): Likewise.
39792         (fold_unary_loc): Likewise.
39793         (pointer_may_wrap_p): Likewise.
39794         (size_low_cst): Likewise.
39795         (mask_with_tz): Likewise.
39796         (fold_binary_loc): Likewise.
39797         (fold_ternary_loc): Likewise.
39798         (multiple_of_p): Likewise.
39799         (tree_call_nonnegative_warnv_p): Update calls to
39800         tree_int_cst_min_precision and real_from_integer.
39801         (fold_negate_const): Use wide-int interfaces.
39802         (fold_abs_const): Likewise.
39803         (fold_relational_const): Use tree_int_cst_lt.
39804         (round_up_loc): Use wide-int interfaces.
39805         * genemit.c (gen_exp): Add CONST_WIDE_INT case.
39806         * gengenrtl.c (excluded_rtx): Add CONST_WIDE_INT case.
39807         * gengtype.c: Remove include of double-int.h.
39808         (do_typedef): Use wide-int interfaces.
39809         (open_base_files): Add wide-int.h.
39810         (main): Add offset_int and widest_int typedefs.
39811         * gengtype-lex.l: Handle "^".
39812         (CXX_KEYWORD): Add "static".
39813         * gengtype-parse.c (require3): New.
39814         (require_template_declaration): Handle constant template arguments
39815         and nested templates.
39816         * gengtype-state.c: Don't include "double-int.h".
39817         * genpreds.c (write_one_predicate_function): Update comment.
39818         (write_tm_constrs_h): Add check for hval and lval use in
39819         CONST_WIDE_INT.
39820         * genrecog.c (validate_pattern): Add CONST_WIDE_INT case.
39821         (add_to_sequence): Likewise.
39822         * gensupport.c (struct std_pred_table): Add const_scalar_int_operand
39823         and const_double_operand.
39824         * gimple.c (preprocess_case_label_vec_for_gimple): Use wide-int
39825         interfaces.
39826         * gimple-fold.c (get_base_constructor): Likewise.
39827         (fold_array_ctor_reference): Likewise.
39828         (fold_nonarray_ctor_reference): Likewise.
39829         (fold_const_aggregate_ref_1): Likewise.
39830         (gimple_val_nonnegative_real_p): Likewise.
39831         (gimple_fold_indirect_ref): Likewise.
39832         * gimple-pretty-print.c (dump_ssaname_info): Likewise.
39833         * gimple-ssa-strength-reduction.c: Include wide-int-print.h.
39834         (struct slsr_cand_d): Change index to be widest_int.
39835         (struct incr_info_d): Change incr to be widest_int.
39836         (alloc_cand_and_find_basis): Use wide-int interfaces.
39837         (slsr_process_phi): Likewise.
39838         (backtrace_base_for_ref): Likewise.  Return a widest_int.
39839         (restructure_reference): Take a widest_int instead of a double_int.
39840         (slsr_process_ref): Use wide-int interfaces.
39841         (create_mul_ssa_cand): Likewise.
39842         (create_mul_imm_cand): Likewise.
39843         (create_add_ssa_cand): Likewise.
39844         (create_add_imm_cand): Take a widest_int instead of a double_int.
39845         (slsr_process_add): Use wide-int interfaces.
39846         (slsr_process_cast): Likewise.
39847         (slsr_process_copy): Likewise.
39848         (dump_candidate): Likewise.
39849         (dump_incr_vec): Likewise.
39850         (replace_ref): Likewise.
39851         (cand_increment): Likewise.  Return a widest_int.
39852         (cand_abs_increment): Likewise.
39853         (replace_mult_candidate): Take a widest_int instead of a double_int.
39854         (replace_unconditional_candidate): Use wide-int interfaces.
39855         (incr_vec_index): Take a widest_int instead of a double_int.
39856         (create_add_on_incoming_edge): Likewise.
39857         (create_phi_basis): Use wide-int interfaces.
39858         (replace_conditional_candidate): Likewise.
39859         (record_increment): Take a widest_int instead of a double_int.
39860         (record_phi_increments): Use wide-int interfaces.
39861         (phi_incr_cost): Take a widest_int instead of a double_int.
39862         (lowest_cost_path): Likewise.
39863         (total_savings): Likewise.
39864         (analyze_increments): Use wide-int interfaces.
39865         (ncd_with_phi): Take a widest_int instead of a double_int.
39866         (ncd_of_cand_and_phis): Likewise.
39867         (nearest_common_dominator_for_cands): Likewise.
39868         (insert_initializers): Use wide-int interfaces.
39869         (all_phi_incrs_profitable): Likewise.
39870         (replace_one_candidate): Likewise.
39871         (replace_profitable_candidates): Likewise.
39872         * godump.c: Include wide-int-print.h.
39873         (go_output_typedef): Use wide-int interfaces.
39874         * graphite-clast-to-gimple.c (gmp_cst_to_tree): Likewise.
39875         * graphite-sese-to-poly.c (tree_int_to_gmp): Likewise.
39876         (build_loop_iteration_domains): Likewise.
39877         * hooks.h: Include wide-int.h rather than double-int.h.
39878         (hook_bool_dint_dint_uint_bool_true): Delete.
39879         (hook_bool_wint_wint_uint_bool_true): Declare.
39880         * hooks.c (hook_bool_dint_dint_uint_bool_true): Removed.
39881         (hook_bool_wint_wint_uint_bool_true): New.
39882         * internal-fn.c (ubsan_expand_si_overflow_addsub_check): Use wide-int
39883         interfaces.
39884         (ubsan_expand_si_overflow_mul_check): Likewise.
39885         * ipa-devirt.c (get_polymorphic_call_info): Likewise.
39886         * ipa-prop.c (compute_complex_assign_jump_func): Likewise.
39887         (get_ancestor_addr_info): Likewise.
39888         (ipa_modify_call_arguments): Likewise.
39889         * loop-doloop.c (doloop_modify): Likewise.
39890         (doloop_optimize): Likewise.
39891         * loop-iv.c (iv_number_of_iterations): Likewise.
39892         * loop-unroll.c (decide_unroll_constant_iterations): Likewise.
39893         (unroll_loop_constant_iterations): Likewise.
39894         (decide_unroll_runtime_iterations): Likewise.
39895         (unroll_loop_runtime_iterations): Likewise.
39896         (decide_peel_simple): Likewise.
39897         (decide_unroll_stupid): Likewise.
39898         * lto-streamer-in.c (streamer_read_wi): Add.
39899         (input_cfg): Use wide-int interfaces.
39900         (lto_input_tree_1): Likewise.
39901         * lto-streamer-out.c (streamer_write_wi): Add.
39902         (hash_tree): Use wide-int interfaces.
39903         (output_cfg): Likewise.
39904         * Makefile.in (OBJS): Add wide-int.o and wide-int-print.o.
39905         (GTFILES): Add wide-int.h and signop.h.
39906         (TAGS): Look for .cc files too.
39907         * omp-low.c (scan_omp_1_op): Use wide-int interfaces.
39908         * optabs.c (expand_subword_shift): Likewise.
39909         (expand_doubleword_shift): Likewise.
39910         (expand_absneg_bit): Likewise.
39911         (expand_copysign_absneg): Likewise.
39912         (expand_copysign_bit): Likewise.
39913         * postreload.c (reload_cse_simplify_set): Likewise.
39914         * predict.c (predict_iv_comparison): Likewise.
39915         * pretty-print.h: Include wide-int-print.h.
39916         (pp_wide_int) New.
39917         * print-rtl.c (print_rtx): Add CONST_WIDE_INT case.
39918         * print-tree.c: Include wide-int-print.h.
39919         (print_node_brief): Use wide-int interfaces.
39920         (print_node): Likewise.
39921         * read-rtl.c (validate_const_wide_int): New.
39922         (read_rtx_code): Add CONST_WIDE_INT case.
39923         * real.c: Include wide-int.h.
39924         (real_to_integer2): Delete.
39925         (real_to_integer): New function, returning a wide_int.
39926         (real_from_integer): Take a wide_int rather than two HOST_WIDE_INTs.
39927         (ten_to_ptwo): Update call to real_from_integer.
39928         (real_digit): Likewise.
39929         * real.h: Include signop.h, wide-int.h and insn-modes.h.
39930         (real_to_integer2, REAL_VALUE_FROM_INT, REAL_VALUE_FROM_UNSIGNED_INT)
39931         (REAL_VALUE_TO_INT): Delete.
39932         (real_to_integer): Declare a wide-int form.
39933         (real_from_integer): Take a wide_int rather than two HOST_WIDE_INTs.
39934         * recog.c (const_int_operand): Improve comment.
39935         (const_scalar_int_operand): New.
39936         (const_double_operand): Add a separate definition for CONST_WIDE_INT.
39937         * rtlanal.c (commutative_operand_precedence): Handle CONST_WIDE_INT.
39938         (split_double): Likewise.
39939         * rtl.c (DEF_RTL_EXPR): Handle CONST_WIDE_INT.
39940         (rtx_size): Likewise.
39941         (rtx_alloc_stat_v): New.
39942         (rtx_alloc_stat): Now calls rtx_alloc_stat_v.
39943         (cwi_output_hex): New.
39944         (iterative_hash_rtx): Handle CONST_WIDE_INT.
39945         (cwi_check_failed_bounds): New.
39946         * rtl.def (CONST_WIDE_INT): New.
39947         * rtl.h: Include <utility> and wide-int.h.
39948         (struct hwivec_def): New.
39949         (CWI_GET_NUM_ELEM): New.
39950         (CWI_PUT_NUM_ELEM): New.
39951         (struct rtx_def): Add num_elem and hwiv.
39952         (CASE_CONST_SCALAR_INT): Modify for TARGET_SUPPORTS_WIDE_INT.
39953         (CASE_CONST_UNIQUE): Likewise.
39954         (CASE_CONST_ANY): Likewise.
39955         (CONST_SCALAR_INT_P): Likewise.
39956         (CONST_WIDE_INT_P): New.
39957         (CWI_ELT): New.
39958         (HWIVEC_CHECK): New.
39959         (cwi_check_failed_bounds): New.
39960         (CWI_ELT): New.
39961         (HWIVEC_CHECK): New.
39962         (CONST_WIDE_INT_VEC) New.
39963         (CONST_WIDE_INT_NUNITS) New.
39964         (CONST_WIDE_INT_ELT) New.
39965         (rtx_mode_t): New type.
39966         (wi::int_traits <rtx_mode_t>): New.
39967         (wi::shwi): New.
39968         (wi::min_value): New.
39969         (wi::max_value): New.
39970         (rtx_alloc_v) New.
39971         (const_wide_int_alloc): New.
39972         (immed_wide_int_const): New.
39973         * sched-vis.c (print_value): Handle CONST_WIDE_INT.
39974         * sel-sched-ir.c (lhs_and_rhs_separable_p): Update comment.
39975         * signop.h: New file.
39976         * simplify-rtx.c (mode_signbit_p): Handle CONST_WIDE_INT.
39977         (simplify_const_unary_operation): Use wide-int interfaces.
39978         (simplify_binary_operation_1): Likewise.
39979         (simplify_const_binary_operation): Likewise.
39980         (simplify_const_relational_operation): Likewise.
39981         (simplify_immed_subreg): Likewise.
39982         * stmt.c (expand_case): Likewise.
39983         * stor-layout.h (set_min_and_max_values_for_integral_type): Take a
39984         signop rather than a bool.
39985         * stor-layout.c (layout_type): Use wide-int interfaces.
39986         (initialize_sizetypes): Update calls to
39987         set_min_and_max_values_for_integral_type.
39988         (set_min_and_max_values_for_integral_type): Take a signop rather
39989         than a bool.  Use wide-int interfaces.
39990         (fixup_signed_type): Update accordingly.  Remove
39991         HOST_BITS_PER_DOUBLE_INT limit.
39992         (fixup_unsigned_type): Likewise.
39993         * system.h (STATIC_CONSTANT_P): New.
39994         (STATIC_ASSERT): New.
39995         * target.def (can_use_doloop_p): Take widest_ints rather than
39996         double_ints.
39997         * target.h: Include wide-int.h rather than double-int.h.
39998         * targhooks.h (can_use_doloop_if_innermost): Take widest_ints rather
39999         than double_ints.
40000         * targhooks.c (default_cxx_get_cookie_size): Use tree_int_cst_lt
40001         rather than INT_CST_LT_UNSIGNED.
40002         (can_use_doloop_if_innermost): Take widest_ints rather than
40003         double_ints.
40004         * tree-affine.c: Include wide-int-print.h.
40005         (double_int_ext_for_comb): Delete.
40006         (wide_int_ext_for_comb): New.
40007         (aff_combination_zero): Use wide-int interfaces.
40008         (aff_combination_const): Take a widest_int instead of a double_int.
40009         (aff_combination_elt): Use wide-int interfaces.
40010         (aff_combination_scale): Take a widest_int instead of a double_int.
40011         (aff_combination_add_elt): Likewise.
40012         (aff_combination_add_cst): Likewise.
40013         (aff_combination_add): Use wide-int interfaces.
40014         (aff_combination_convert): Likewise.
40015         (tree_to_aff_combination): Likewise.
40016         (add_elt_to_tree): Take a widest_int instead of a double_int.
40017         (aff_combination_to_tree): Use wide-int interfaces.
40018         (aff_combination_remove_elt): Likewise.
40019         (aff_combination_add_product): Take a widest_int instead of
40020         a double_int.
40021         (aff_combination_mult): Use wide-int interfaces.
40022         (aff_combination_expand): Likewise.
40023         (double_int_constant_multiple_p): Delete.
40024         (wide_int_constant_multiple_p): New.
40025         (aff_combination_constant_multiple_p): Take a widest_int pointer
40026         instead of a double_int pointer.
40027         (print_aff): Use wide-int interfaces.
40028         (get_inner_reference_aff): Take a widest_int pointer
40029         instead of a double_int pointer.
40030         (aff_comb_cannot_overlap_p): Take widest_ints instead of double_ints.
40031         * tree-affine.h: Include wide-int.h.
40032         (struct aff_comb_elt): Change type of coef to widest_int.
40033         (struct affine_tree_combination): Change type of offset to widest_int.
40034         (double_int_ext_for_comb): Delete.
40035         (wide_int_ext_for_comb): New.
40036         (aff_combination_const): Use widest_int instead of double_int.
40037         (aff_combination_scale): Likewise.
40038         (aff_combination_add_elt): Likewise.
40039         (aff_combination_constant_multiple_p): Likewise.
40040         (get_inner_reference_aff): Likewise.
40041         (aff_comb_cannot_overlap_p): Likewise.
40042         (aff_combination_zero_p): Use wide-int interfaces.
40043         * tree.c: Include tree.h.
40044         (init_ttree): Use make_int_cst.
40045         (tree_code_size): Removed code for INTEGER_CST case.
40046         (tree_size): Add INTEGER_CST case.
40047         (make_node_stat): Update comment.
40048         (get_int_cst_ext_nunits, build_new_int_cst, build_int_cstu): New.
40049         (build_int_cst_type): Use wide-int interfaces.
40050         (double_int_to_tree): Likewise.
40051         (double_int_fits_to_tree_p): Delete.
40052         (force_fit_type_double): Delete.
40053         (force_fit_type): New.
40054         (int_cst_hash_hash): Use wide-int interfaces.
40055         (int_cst_hash_eq): Likewise.
40056         (build_int_cst_wide): Delete.
40057         (wide_int_to_tree): New.
40058         (cache_integer_cst): Use wide-int interfaces.
40059         (build_low_bits_mask): Likewise.
40060         (cst_and_fits_in_hwi): Likewise.
40061         (real_value_from_int_cst): Likewise.
40062         (make_int_cst_stat): New.
40063         (integer_zerop): Use wide_int interfaces.
40064         (integer_onep): Likewise.
40065         (integer_all_onesp): Likewise.
40066         (integer_pow2p): Likewise.
40067         (integer_nonzerop): Likewise.
40068         (tree_log2): Likewise.
40069         (tree_floor_log2): Likewise.
40070         (tree_ctz): Likewise.
40071         (int_size_in_bytes): Likewise.
40072         (mem_ref_offset): Return an offset_int rather than a double_int.
40073         (build_type_attribute_qual_variant): Use wide_int interfaces.
40074         (type_hash_eq): Likewise
40075         (tree_int_cst_equal): Likewise.
40076         (tree_int_cst_lt): Delete.
40077         (tree_int_cst_compare): Likewise.
40078         (tree_fits_shwi_p): Use wide_int interfaces.
40079         (tree_fits_uhwi_p): Likewise.
40080         (tree_int_cst_sign_bit): Likewise.
40081         (tree_int_cst_sgn): Likewise.
40082         (tree_int_cst_min_precision): Take a signop rather than a bool.
40083         (simple_cst_equal): Use wide_int interfaces.
40084         (compare_tree_int): Likewise.
40085         (iterative_hash_expr): Likewise.
40086         (int_fits_type_p): Likewise.  Use tree_int_cst_lt rather than
40087         INT_CST_LT.
40088         (get_type_static_bounds): Use wide_int interfaces.
40089         (tree_int_cst_elt_check_failed): New.
40090         (build_common_tree_nodes): Reordered to set prec before filling in
40091         value.
40092         (int_cst_value): Check cst_and_fits_in_hwi.
40093         (widest_int_cst_value): Use wide_int interfaces.
40094         (upper_bound_in_type): Likewise.
40095         (lower_bound_in_type): Likewise.
40096         (num_ending_zeros): Likewise.
40097         (drop_tree_overflow): Likewise.
40098         * tree-call-cdce.c (check_pow): Update call to real_from_integer.
40099         (gen_conditions_for_pow_cst_base): Likewise.
40100         * tree-cfg.c: Include wide-int.h and wide-int-print.h.
40101         (group_case_labels_stmt): Use wide-int interfaces.
40102         (verify_gimple_assign_binary): Likewise.
40103         (print_loop): Likewise.
40104         * tree-chrec.c (tree_fold_binomial): Likewise.
40105         * tree-core.h (struct tree_base): Add int_length.
40106         (struct tree_int_cst): Change rep of value.
40107         * tree-data-ref.c (dr_analyze_innermost): Use wide-int interfaces.
40108         (dr_may_alias_p): Likewise.
40109         (max_stmt_executions_tree): Likewise.
40110         * tree.def (INTEGER_CST): Update comment.
40111         * tree-dfa.c (get_ref_base_and_extent): Use wide-int interfaces.
40112         * tree-dfa.h (get_addr_base_and_unit_offset_1): Likewise.
40113         * tree-dump.c: Include wide-int.h and wide-int-print.h.
40114         (dequeue_and_dump): Use wide-int interfaces.
40115         * tree.h: Include wide-int.h.
40116         (NULL_TREE): Moved to earlier loc in file.
40117         (TREE_INT_CST_ELT_CHECK): New.
40118         (tree_int_cst_elt_check_failed): New.
40119         (TYPE_SIGN): New.
40120         (TREE_INT_CST): Delete.
40121         (TREE_INT_CST_LOW): Use wide-int interfaces.
40122         (TREE_INT_CST_HIGH): Delete.
40123         (TREE_INT_CST_NUNITS): New.
40124         (TREE_INT_CST_EXT_NUNITS): Likewise.
40125         (TREE_INT_CST_OFFSET_NUNITS): Likewise.
40126         (TREE_INT_CST_ELT): Likewise.
40127         (INT_CST_LT): Delete.
40128         (tree_int_cst_elt_check): New (two forms).
40129         (type_code_size): Update comment.
40130         (make_int_cst_stat, make_int_cst): New.
40131         (tree_to_double_int): Delete.
40132         (double_int_fits_to_tree_p): Delete.
40133         (force_fit_type_double): Delete.
40134         (build_int_cstu): Replace with out-of-line function.
40135         (build_int_cst_wide): Delete.
40136         (tree_int_cst_lt): Define inline.
40137         (tree_int_cst_le): New.
40138         (tree_int_cst_compare): Define inline.
40139         (tree_int_cst_min_precision): Take a signop rather than a bool.
40140         (wi::int_traits <const_tree>): New.
40141         (wi::int_traits <tree>): New.
40142         (wi::extended_tree): New.
40143         (wi::int_traits <wi::extended_tree>): New.
40144         (wi::to_widest): New.
40145         (wi::to_offset): New.
40146         (wi::fits_to_tree_p): New.
40147         (wi::min_value): New.
40148         (wi::max_value): New.
40149         * tree-inline.c (remap_gimple_op_r): Use wide-int interfaces.
40150         (copy_tree_body_r): Likewise.
40151         * tree-object-size.c (compute_object_offset): Likewise.
40152         (addr_object_size): Likewise.
40153         * tree-predcom.c: Include wide-int-print.h.
40154         (struct dref_d): Change type of offset to widest_int.
40155         (dump_dref): Call wide-int printer.
40156         (aff_combination_dr_offset): Use wide-int interfaces.
40157         (determine_offset): Take a widest_int pointer rather than a
40158         double_int pointer.
40159         (split_data_refs_to_components): Use wide-int interfaces.
40160         (suitable_component_p): Likewise.
40161         (order_drefs): Likewise.
40162         (add_ref_to_chain): Likewise.
40163         (valid_initializer_p): Likewise.
40164         (determine_roots_comp): Likewise.
40165         * tree-pretty-print.c: Include wide-int-print.h.
40166         (dump_generic_node): Use wide-int interfaces.
40167         * tree-sra.c (sra_ipa_modify_expr): Likewise.
40168         * tree-ssa-address.c (addr_for_mem_ref): Likewise.
40169         (move_fixed_address_to_symbol): Likewise.
40170         (move_hint_to_base): Likewise.
40171         (move_pointer_to_base): Likewise.
40172         (move_variant_to_index): Likewise.
40173         (most_expensive_mult_to_index): Likewise.
40174         (addr_to_parts): Likewise.
40175         (copy_ref_info): Likewise.
40176         * tree-ssa-alias.c (indirect_ref_may_alias_decl_p): Likewise.
40177         (indirect_refs_may_alias_p): Likewise.
40178         (stmt_kills_ref_p_1): Likewise.
40179         * tree-ssa.c (non_rewritable_mem_ref_base): Likewise.
40180         * tree-ssa-ccp.c: Update comment at top of file.  Include
40181         wide-int-print.h.
40182         (struct prop_value_d): Change type of mask to widest_int.
40183         (extend_mask): New function.
40184         (dump_lattice_value): Use wide-int interfaces.
40185         (get_default_value): Likewise.
40186         (set_constant_value): Likewise.
40187         (set_value_varying): Likewise.
40188         (valid_lattice_transition): Likewise.
40189         (set_lattice_value): Likewise.
40190         (value_to_double_int): Delete.
40191         (value_to_wide_int): New.
40192         (get_value_from_alignment): Use wide-int interfaces.
40193         (get_value_for_expr): Likewise.
40194         (do_dbg_cnt): Likewise.
40195         (ccp_finalize): Likewise.
40196         (ccp_lattice_meet): Likewise.
40197         (bit_value_unop_1): Use widest_ints rather than double_ints.
40198         (bit_value_binop_1): Likewise.
40199         (bit_value_unop): Use wide-int interfaces.
40200         (bit_value_binop): Likewise.
40201         (bit_value_assume_aligned): Likewise.
40202         (evaluate_stmt): Likewise.
40203         (ccp_fold_stmt): Likewise.
40204         (visit_cond_stmt): Likewise.
40205         (ccp_visit_stmt): Likewise.
40206         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Likewise.
40207         (constant_pointer_difference): Likewise.
40208         (associate_pointerplus): Likewise.
40209         (combine_conversions): Likewise.
40210         * tree-ssa-loop.h: Include wide-int.h.
40211         (struct tree_niter_desc): Change type of max to widest_int.
40212         * tree-ssa-loop-im.c (mem_refs_may_alias_p): Use wide-int interfaces.
40213         * tree-ssa-loop-ivcanon.c (remove_exits_and_undefined_stmts): Likewise.
40214         (remove_redundant_iv_tests): Likewise.
40215         (canonicalize_loop_induction_variables): Likewise.
40216         * tree-ssa-loop-ivopts.c (alloc_iv): Likewise.
40217         (constant_multiple_of): Take a widest_int pointer instead of
40218         a double_int pointer.
40219         (get_computation_aff): Use wide-int interfaces.
40220         (ptr_difference_cost): Likewise.
40221         (difference_cost): Likewise.
40222         (get_loop_invariant_expr_id): Likewise.
40223         (get_computation_cost_at): Likewise.
40224         (iv_elimination_compare_lt): Likewise.
40225         (may_eliminate_iv): Likewise.
40226         * tree-ssa-loop-niter.h (estimated_loop_iterations): Use widest_int
40227         instead of double_int.
40228         (max_loop_iterations): Likewise.
40229         (max_stmt_executions): Likewise.
40230         (estimated_stmt_executions): Likewise.
40231         * tree-ssa-loop-niter.c: Include wide-int-print.h.
40232         (split_to_var_and_offset): Use wide-int interfaces.
40233         (determine_value_range): Likewise.
40234         (bound_difference_of_offsetted_base): Likewise.
40235         (bounds_add): Take a widest_int instead of a double_int.
40236         (number_of_iterations_ne_max): Use wide-int interfaces.
40237         (number_of_iterations_ne): Likewise.
40238         (number_of_iterations_lt_to_ne): Likewise.
40239         (assert_loop_rolls_lt): Likewise.
40240         (number_of_iterations_lt): Likewise.
40241         (number_of_iterations_le): Likewise.
40242         (number_of_iterations_cond): Likewise.
40243         (number_of_iterations_exit): Likewise.
40244         (finite_loop_p): Likewise.
40245         (derive_constant_upper_bound_assign): Likewise.
40246         (derive_constant_upper_bound): Return a widest_int.
40247         (derive_constant_upper_bound_ops): Likewise.
40248         (do_warn_aggressive_loop_optimizations): Use wide-int interfaces.
40249         (record_estimate): Take a widest_int rather than a double_int.
40250         (record_nonwrapping_iv): Use wide-int interfaces.
40251         (double_int_cmp): Delete.
40252         (wide_int_cmp): New.
40253         (bound_index): Take a widest_int rather than a double_int.
40254         (discover_iteration_bound_by_body_walk): Use wide-int interfaces.
40255         (maybe_lower_iteration_bound): Likewise.
40256         (estimate_numbers_of_iterations_loop): Likewise.
40257         (estimated_loop_iterations): Take a widest_int pointer than than
40258         a double_int pointer.
40259         (estimated_loop_iterations_int): Use wide-int interfaces.
40260         (max_loop_iterations): Take a widest_int pointer than than
40261         a double_int pointer.
40262         (max_loop_iterations_int): Use wide-int interfaces.
40263         (max_stmt_executions): Take a widest_int pointer than than
40264         a double_int pointer.
40265         (estimated_stmt_executions): Likewise.
40266         (n_of_executions_at_most): Use wide-int interfaces.
40267         (scev_probably_wraps_p): Likewise.
40268         * tree-ssa-math-opts.c (gimple_expand_builtin_pow): Update calls
40269         to real_to_integer.
40270         * tree-scalar-evolution.c (simplify_peeled_chrec): Use wide-int
40271         interfaces.
40272         * tree-ssanames.c (set_range_info): Use wide_int_refs rather than
40273         double_ints.  Adjust for trailing_wide_ints <3> representation.
40274         (set_nonzero_bits): Likewise.
40275         (get_range_info): Return wide_ints rather than double_ints.
40276         Adjust for trailing_wide_ints <3> representation.
40277         (get_nonzero_bits): Likewise.
40278         (duplicate_ssa_name_range_info): Adjust for trailing_wide_ints <3>
40279         representation.
40280         * tree-ssanames.h (struct range_info_def): Replace min, max and
40281         nonzero_bits with a trailing_wide_ints <3>.
40282         (set_range_info): Use wide_int_refs rather than double_ints.
40283         (set_nonzero_bits): Likewise.
40284         (get_range_info): Return wide_ints rather than double_ints.
40285         (get_nonzero_bits): Likewise.
40286         * tree-ssa-phiopt.c (jump_function_from_stmt): Use wide-int interfaces.
40287         * tree-ssa-pre.c (phi_translate_1): Likewise.
40288         * tree-ssa-reassoc.c (decrement_power): Use calls to real_from_integer.
40289         (acceptable_pow_call): Likewise.
40290         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Use wide-int
40291         interfaces.
40292         (vn_reference_fold_indirect): Likewise.
40293         (vn_reference_maybe_forwprop_address): Likewise.
40294         (valueize_refs_1): Likewise.
40295         * tree-ssa-structalias.c (get_constraint_for_ptr_offset): Likewise.
40296         * tree-ssa-uninit.c (is_value_included_in): Use wide-int interfaces,
40297         tree_int_cst_lt and tree_int_cst_le.
40298         * tree-streamer-in.c (unpack_ts_base_value_fields): Use wide-int
40299         interfaces.
40300         (streamer_alloc_tree): Likewise.
40301         * tree-streamer-out.c (pack_ts_int_cst_value_fields): Likewise.
40302         (streamer_write_tree_header): Likewise.
40303         (streamer_write_integer_cst): Likewise.
40304         * tree-switch-conversion.c (emit_case_bit_tests): Likewise.
40305         (build_constructors): Likewise.
40306         (array_value_type): Likewise.
40307         * tree-vect-data-refs.c (vect_prune_runtime_alias_test_list): Likewise.
40308         (vect_check_gather): Likewise.
40309         * tree-vect-generic.c (build_replicated_const): Likewise.
40310         (expand_vector_divmod): Likewise.
40311         * tree-vect-loop.c (vect_transform_loop): Likewise.
40312         * tree-vect-loop-manip.c (vect_do_peeling_for_loop_bound): Likewise.
40313         (vect_do_peeling_for_alignment): Likewise.
40314         * tree-vect-patterns.c (vect_recog_divmod_pattern): Likewise.
40315         * tree-vrp.c: Include wide-int.h.
40316         (operand_less_p): Use wide-int interfaces and tree_int_cst_lt.
40317         (extract_range_from_assert): Use wide-int interfaces.
40318         (vrp_int_const_binop): Likewise.
40319         (zero_nonzero_bits_from_vr): Take wide_int pointers rather than
40320         double_int pointers.
40321         (ranges_from_anti_range): Use wide-int interfaces.
40322         (quad_int_cmp): Delete.
40323         (quad_int_pair_sort): Likewise.
40324         (extract_range_from_binary_expr_1): Use wide-int interfaces.
40325         (extract_range_from_unary_expr_1): Likewise.
40326         (adjust_range_with_scev): Likewise.
40327         (masked_increment): Take and return wide_ints rather than double_ints.
40328         (register_edge_assert_for_2): Use wide-int interfaces.
40329         (check_array_ref): Likewise.
40330         (search_for_addr_array): Likewise.
40331         (maybe_set_nonzero_bits): Likewise.
40332         (union_ranges): Pass an integer of the correct type instead of
40333         using integer_one_node.
40334         (intersect_ranges): Likewise.
40335         (simplify_truth_ops_using_ranges): Likewise.
40336         (simplify_bit_ops_using_ranges): Use wide-int interfaces.
40337         (range_fits_type_p): Likewise.
40338         (simplify_cond_using_ranges): Likewise.  Take a signop rather than
40339         a bool.
40340         (simplify_conversion_using_ranges): Use wide-int interfaces.
40341         (simplify_float_conversion_using_ranges): Likewise.
40342         (vrp_finalize): Likewise.
40343         * value-prof.c (gimple_divmod_fixed_value_transform): Likewise.
40344         (gimple_stringops_transform): Likewise.
40345         * varasm.c (decode_addr_const): Likewise.
40346         (const_hash_1): Likewise.
40347         (const_rtx_hash_1): Likewise
40348         (output_constant): Likewise.
40349         (array_size_for_constructor): Likewise.
40350         (output_constructor_regular_field): Likewise.
40351         (output_constructor_bitfield): Likewise.
40352         * var-tracking.c (loc_cmp): Handle CONST_WIDE_INT.
40353         * mkconfig.sh: Include machmode.h to pick up BITS_PER_UNIT for
40354         GENERATOR_FILEs.
40355         * gencheck.c: Define BITS_PER_UNIT.
40356         * wide-int.cc: New.
40357         * wide-int.h: New.
40358         * wide-int-print.cc: New.
40359         * wide-int-print.h: New.
40361 2014-05-06  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
40363         * config/avr/avr.c (avr_can_eliminate): Mark unused argument.
40365 2014-05-06  Richard Biener  <rguenther@suse.de>
40367         * tree-pass.h (TODO_verify_ssa, TODO_verify_flow,
40368         TODO_verify_stmts, TODO_verify_rtl_sharing): Remove.
40369         (TODO_verify_all): Adjust.
40370         * asan.c: Remove references to TODO_verify_ssa, TODO_verify_flow,
40371         TODO_verify_stmts and TODO_verify_rtl_sharing.
40372         * bb-reorder.c: Likewise.
40373         * cfgexpand.c: Likewise.
40374         * cprop.c: Likewise.
40375         * cse.c: Likewise.
40376         * function.c: Likewise.
40377         * fwprop.c: Likewise.
40378         * gcse.c: Likewise.
40379         * gimple-ssa-isolate-paths.c: Likewise.
40380         * gimple-ssa-strength-reduction.c: Likewise.
40381         * ipa-split.c: Likewise.
40382         * loop-init.c: Likewise.
40383         * loop-unroll.c: Likewise.
40384         * lower-subreg.c: Likewise.
40385         * modulo-sched.c: Likewise.
40386         * postreload-gcse.c: Likewise.
40387         * predict.c: Likewise.
40388         * recog.c: Likewise.
40389         * sched-rgn.c: Likewise.
40390         * store-motion.c: Likewise.
40391         * tracer.c: Likewise.
40392         * trans-mem.c: Likewise.
40393         * tree-call-cdce.c: Likewise.
40394         * tree-cfg.c: Likewise.
40395         * tree-cfgcleanup.c: Likewise.
40396         * tree-complex.c: Likewise.
40397         * tree-eh.c: Likewise.
40398         * tree-emutls.c: Likewise.
40399         * tree-if-conv.c: Likewise.
40400         * tree-into-ssa.c: Likewise.
40401         * tree-loop-distribution.c: Likewise.
40402         * tree-object-size.c: Likewise.
40403         * tree-parloops.c: Likewise.
40404         * tree-pass.h: Likewise.
40405         * tree-sra.c: Likewise.
40406         * tree-ssa-ccp.c: Likewise.
40407         * tree-ssa-copy.c: Likewise.
40408         * tree-ssa-copyrename.c: Likewise.
40409         * tree-ssa-dce.c: Likewise.
40410         * tree-ssa-dom.c: Likewise.
40411         * tree-ssa-dse.c: Likewise.
40412         * tree-ssa-forwprop.c: Likewise.
40413         * tree-ssa-ifcombine.c: Likewise.
40414         * tree-ssa-loop-ch.c: Likewise.
40415         * tree-ssa-loop-ivcanon.c: Likewise.
40416         * tree-ssa-loop.c: Likewise.
40417         * tree-ssa-math-opts.c: Likewise.
40418         * tree-ssa-phiopt.c: Likewise.
40419         * tree-ssa-phiprop.c: Likewise.
40420         * tree-ssa-pre.c: Likewise.
40421         * tree-ssa-reassoc.c: Likewise.
40422         * tree-ssa-sink.c: Likewise.
40423         * tree-ssa-strlen.c: Likewise.
40424         * tree-ssa-tail-merge.c: Likewise.
40425         * tree-ssa-uncprop.c: Likewise.
40426         * tree-switch-conversion.c: Likewise.
40427         * tree-tailcall.c: Likewise.
40428         * tree-vect-generic.c: Likewise.
40429         * tree-vectorizer.c: Likewise.
40430         * tree-vrp.c: Likewise.
40431         * tsan.c: Likewise.
40432         * var-tracking.c: Likewise.
40433         * bt-load.c: Likewise.
40434         * cfgcleanup.c: Likewise.
40435         * combine-stack-adj.c: Likewise.
40436         * combine.c: Likewise.
40437         * compare-elim.c: Likewise.
40438         * config/epiphany/resolve-sw-modes.c: Likewise.
40439         * config/i386/i386.c: Likewise.
40440         * config/mips/mips.c: Likewise.
40441         * config/s390/s390.c: Likewise.
40442         * config/sh/sh_treg_combine.cc: Likewise.
40443         * config/sparc/sparc.c: Likewise.
40444         * dce.c: Likewise.
40445         * dse.c: Likewise.
40446         * final.c: Likewise.
40447         * ifcvt.c: Likewise.
40448         * mode-switching.c: Likewise.
40449         * passes.c: Likewise.
40450         * postreload.c: Likewise.
40451         * ree.c: Likewise.
40452         * reg-stack.c: Likewise.
40453         * regcprop.c: Likewise.
40454         * regrename.c: Likewise.
40455         * web.c: Likewise.
40457 2014-05-06  Richard Biener  <rguenther@suse.de>
40459         PR middle-end/61070
40460         * bitmap.c (debug_bitmap): Dump to stderr, not stdout.
40461         * tree-ssa-structalias.c (dump_solution_for_var): Likewise.
40463 2014-05-05  Jan Hubicka  <hubicka@ucw.cz>
40465         PR ipa/60965
40466         * ipa-devirt.c (get_class_context): Allow POD to change to non-POD.
40468 2014-05-05  Radovan Obradovic  <robradovic@mips.com>
40469             Tom de Vries  <tom@codesourcery.com>
40471         * target.def (call_fusage_contains_non_callee_clobbers): New
40472         DEFHOOKPOD.
40473         * doc/tm.texi.in (@node Stack and Calling): Add Miscellaneous Register
40474         Hooks to @menu.
40475         (@node Miscellaneous Register Hooks): New node.
40476         (@hook TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS): New hook.
40477         * doc/tm.texi: Regenerate.
40479 2014-05-05  Marek Polacek  <polacek@redhat.com>
40481         PR driver/61065
40482         * opts.c (common_handle_option): Call error_at instead of warning_at.
40484 2014-05-05  Richard Biener  <rguenther@suse.de>
40486         * passes.c (execute_function_todo): Don't reset TODO_verify_ssa
40487         from last_verified if update_ssa ran.  Move TODO_verify_rtl_sharing
40488         under the TODO_verify_il umbrella.
40490 2014-05-05  Richard Biener  <rguenther@suse.de>
40492         * passes.c (execute_function_todo): Move TODO_verify_flow under
40493         the TODO_verify_ul umbrella.
40495 2014-05-05  Richard Biener  <rguenther@suse.de>
40497         PR middle-end/61010
40498         * fold-const.c (fold_binary_loc): Consistently avoid canonicalizing
40499         X & CST away from a CST that is the mask of a mode.
40501 2014-05-05  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
40503         * config/picochip/picochip-protos.h (picochip_regno_nregs): Change
40504         int argument to enum machine_mode.
40505         (picochip_class_max_nregs): Ditto.
40506         * config/picochip/picochip.c (picochip_regno_nregs): Ditto.
40507         (picochip_class_max_nregs): Ditto.
40509 2014-05-05  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
40511         * target.def: Add new target hook.
40512         * doc/tm.texi: Regenerate.
40513         * targhooks.h (default_keep_leaf_when_profiled): Add prototype.
40514         * targhooks.c (default_keep_leaf_when_profiled): New function.
40516         * config/s390/s390.c (s390_keep_leaf_when_profiled): New function.
40517         (TARGET_KEEP_LEAF_WHEN_PROFILED): Define.
40519 2014-05-05  Bin Cheng  <bin.cheng@arm.com>
40521         PR tree-optimization/60363
40522         * gcc/tree-ssa-threadupdate.c (get_value_locus_in_path): New.
40523         (copy_phi_args): New parameters.  Call get_value_locus_in_path.
40524         (update_destination_phis): New parameter.
40525         (create_edge_and_update_destination_phis): Ditto.
40526         (ssa_fix_duplicate_block_edges): Pass new arguments.
40527         (thread_single_edge): Ditto.
40529 2014-05-04  Peter Bergner  <bergner@vnet.ibm.com>
40531         * config/rs6000/rs6000.h (RS6000_BTM_HARD_FLOAT): New define.
40532         (RS6000_BTM_COMMON): Add RS6000_BTM_HARD_FLOAT.
40533         (TARGET_EXTRA_BUILTINS): Add TARGET_HARD_FLOAT.
40534         * config/rs6000/rs6000-builtin.def (BU_MISC_1):
40535         Use RS6000_BTM_HARD_FLOAT.
40536         (BU_MISC_2): Likewise.
40537         * config/rs6000/rs6000.c (rs6000_builtin_mask_calculate): Handle
40538         RS6000_BTM_HARD_FLOAT.
40539         (rs6000_option_override_internal): Enforce -mhard-float if -mhard-dfp
40540         is explicitly used.
40541         (rs6000_invalid_builtin): Add hard floating builtin support.
40542         (rs6000_expand_builtin): Relax the gcc_assert to allow the new
40543         hard float builtins.
40544         (rs6000_builtin_mask_names): Add RS6000_BTM_HARD_FLOAT.
40546 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40548         * config/sh/sh_optimize_sett_clrt.cc (sh_optimize_sett_clrt::execute):
40549         Add missing function* argument.
40551 2014-05-03  Richard Sandiford  <rdsandiford@googlemail.com>
40553         * lra-constraints.c (valid_address_p): Move earlier in file.
40554         Add a constraint argument to the address_info version.
40555         (satisfies_memory_constraint_p): New function.
40556         (satisfies_address_constraint_p): Likewise.
40557         (process_alt_operands, curr_insn_transform): Use them.
40558         (process_address): Pass the constraint to valid_address_p when
40559         checking address operands.
40561 2014-05-03  Richard Sandiford  <rdsandiford@googlemail.com>
40563         * config/mips/mips.c (mips_isa_rev): New variable.
40564         (mips_set_architecture): Set it.
40565         * config/mips/mips.h (TARGET_CPU_CPP_BUILTINS): Set __mips_isa_rev
40566         from mips_isa_rev.
40567         (ISA_HAS_MUL3, ISA_HAS_FP_CONDMOVE, ISA_HAS_8CC, ISA_HAS_FP4)
40568         (ISA_HAS_PAIRED_SINGLE, ISA_HAS_MADD_MSUB, ISA_HAS_FP_RECIP_RSQRT)
40569         (ISA_HAS_CLZ_CLO, ISA_HAS_ROR, ISA_HAS_WSBH, ISA_HAS_PREFETCH)
40570         (ISA_HAS_SEB_SEH, ISA_HAS_EXT_INS, ISA_HAS_MXHC1)
40571         (ISA_HAS_HILO_INTERLOCKS, ISA_HAS_SYNCI, MIN_FPRS_PER_FMT): Reexpress
40572         conditions in terms of mips_isa_rev.
40573         (mips_isa_rev): Declare.
40575 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40577         * config/sh/sh-mem.cc: Use tabs instead of spaces.
40578         (prob_unlikely, prob_likely): Make variables const.
40580 2014-05-03  Denis Chertykov  <chertykov@gmail.com>
40582         * config/avr/avr.c (avr_adjust_insn_length): Handle JUMP_TABLE_DATA.
40584 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40586         * config/sh/sh.h (SH_ASM_SPEC): Handle m1, m2*, m3* and m4* cases.
40588 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40590         * config/sh/sh.h (ROUND_ADVANCE): Delete macro.
40591         (ROUND_REG, PASS_IN_REG_P): Move and rename macros to ...
40592         * config/sh/sh.c (sh_round_reg, sh_pass_in_reg_p): ... these new
40593         functions.
40594         (sh_arg_partial_bytes, sh_function_arg, sh_function_arg_advance,
40595         sh_setup_incoming_varargs): Replace usage of PASS_IN_REG_P with
40596         sh_pass_in_reg_p.
40597         Replace usage of ROUND_REG with sh_round_reg.
40598         Use CEIL instead of ROUND_ADVANCE.
40600 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40602         PR target/61026
40603         * config/sh/sh.c: Include stdlib headers before everything else.
40605 2014-05-02  Jakub Jelinek  <jakub@redhat.com>
40607         * gimplify.c (gimplify_adjust_omp_clauses_1): Handle
40608         GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE.
40609         (gimplify_adjust_omp_clauses): Simd region is never
40610         directly nested in combined parallel.  Instead, for linear
40611         with copyin/copyout, if in combined for simd loop, make decl
40612         firstprivate/lastprivate on OMP_FOR.
40613         * omp-low.c (expand_omp_for_generic, expand_omp_for_static_nochunk,
40614         expand_omp_for_static_chunk): When setting endvar, also set
40615         fd->loop.v to the same value.
40617 2014-05-02  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
40619         * hwint.h (zext_hwi): Fix signed overflow for prec == 63.
40621 2014-05-02  Alan Lawrence  <alan.lawrence@arm.com>
40623         * config/aarch64/aarch64.c (aarch64_expand_vec_perm_1): Tidy bit-flip
40624         expression.
40626 2014-05-02  Marek Polacek  <polacek@redhat.com>
40628         * doc/invoke.texi: Describe -fsanitize=float-divide-by-zero.
40630 2014-05-02  Kito Cheng  <kito@0xlab.org>
40632         * defaults.h (HONOR_REG_ALLOC_ORDER): Change HONOR_REG_ALLOC_ORDER
40633         to a C expression marco.
40634         * ira-color.c (HONOR_REG_ALLOC_ORDER) : Ditto.
40635         * config/arm/arm.h (HONOR_REG_ALLOC_ORDER): Ditto.
40636         * config/nds32/nds32.h (HONOR_REG_ALLOC_ORDER): Ditto.
40637         * doc/tm.texi (HONOR_REG_ALLOC_ORDER): Update document for
40638         HONOR_REG_ALLOC_ORDER.
40639         * doc/tm.texi.in (HONOR_REG_ALLOC_ORDER): Ditto.
40641 2014-05-01  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
40643         * config/arc/arc.c (TARGET_LRA_P): Undef before redefine.
40645 2014-05-01  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
40647         * config/arc/arc.c (arc_select_cc_mode): Fix typo.
40649 2014-05-01  Yuri Rumyantsev  <ysrumyan@gmail.com>
40651         * tree-if-conv.c (is_cond_scalar_reduction): New function.
40652         (convert_scalar_cond_reduction): Likewise.
40653         (predicate_scalar_phi): Add recognition and transformation
40654         of simple conditioanl reduction to be vectorizable.
40656 2014-05-01  Marek Polacek  <polacek@redhat.com>
40658         PR c/43245
40659         * doc/invoke.texi: Document -Wdiscarded-qualifiers.
40661 2014-04-30  Alan Lawrence  <alan.lawrence@arm.com>
40663         * config/aarch64/arm_neon.h (vuzp1_f32, vuzp1_p8, vuzp1_p16, vuzp1_s8,
40664         vuzp1_s16, vuzp1_s32, vuzp1_u8, vuzp1_u16, vuzp1_u32, vuzp1q_f32,
40665         vuzp1q_f64, vuzp1q_p8, vuzp1q_p16, vuzp1q_s8, vuzp1q_s16, vuzp1q_s32,
40666         vuzp1q_s64, vuzp1q_u8, vuzp1q_u16, vuzp1q_u32, vuzp1q_u64, vuzp2_f32,
40667         vuzp2_p8, vuzp2_p16, vuzp2_s8, vuzp2_s16, vuzp2_s32, vuzp2_u8,
40668         vuzp2_u16, vuzp2_u32, vuzp2q_f32, vuzp2q_f64, vuzp2q_p8, vuzp2q_p16,
40669         vuzp2q_s8, vuzp2q_s16, vuzp2q_s32, vuzp2q_s64, vuzp2q_u8, vuzp2q_u16,
40670         vuzp2q_u32, vuzp2q_u64): Replace temporary asm with __builtin_shuffle.
40672 2014-04-30  Joern Rennecke  <joern.rennecke@embecosm.com>
40674         * config/arc/arc.opt (mlra): Move comment above option name
40675         to avoid mis-parsing as language options.
40677 2014-04-30  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
40679         * config/sol2-10.h (TARGET_LIBC_HAS_FUNCTION): Move ...
40680         * config/sol2.h: ... here.
40681         * config/sol2-10.h: Remove.
40683         * config/sol2-bi.h (WCHAR_TYPE, WCHAR_TYPE_SIZE, WINT_TYPE)
40684         (WINT_TYPE_SIZE, MULTILIB_DEFAULTS, DEF_ARCH32_SPEC)
40685         (DEF_ARCH64_SPEC, ASM_CPU_DEFAULT_SPEC, LINK_ARCH64_SPEC_BASE)
40686         (LINK_ARCH64_SPEC, ARCH_DEFAULT_EMULATION, TARGET_LD_EMULATION)
40687         (LINK_ARCH_SPEC, SUBTARGET_EXTRA_SPECS): Move ...
40688         * config/sol2.h: ... here.
40689         (SECTION_NAME_FORMAT): Don't redefine.
40690         (STARTFILE_ARCH32_SPEC): Rename to ...
40691         (STARTFILE_ARCH_SPEC): ... this.
40692         (ASM_OUTPUT_ALIGNED_COMMON): Move ...
40693         * config/sparc/sol2.h: ... here.
40694         (SECTION_NAME_FORMAT): Don't undef.
40695         * config/i386/sol2.h (ASM_CPU_DEFAULT_SPEC)
40696         (SUBTARGET_EXTRA_SPECS): Remove.
40697         * config/sparc/sol2.h (ASM_CPU_DEFAULT_SPEC): Remove.
40699         * config/i386/sol2-bi.h (TARGET_SUBTARGET_DEFAULT)
40700         (MD_STARTFILE_PREFIX): Remove.
40701         (SUBTARGET_OPTIMIZATION_OPTIONS, ASM_CPU32_DEFAULT_SPEC)
40702         (ASM_CPU64_DEFAULT_SPEC, ASM_CPU_SPEC, ASM_SPEC, DEFAULT_ARCH32_P)
40703         (ARCH64_SUBDIR, ARCH32_EMULATION, ARCH64_EMULATION)
40704         (ASM_COMMENT_START, JUMP_TABLES_IN_TEXT_SECTION)
40705         (ASM_OUTPUT_DWARF_PCREL, ASM_OUTPUT_ALIGNED_COMMON)
40706         (USE_IX86_FRAME_POINTER, USE_X86_64_FRAME_POINTER): Move ...
40707         * config/i386/sol2.h: ... here.
40708         (TARGET_SUBTARGET_DEFAULT, SIZE_TYPE, PTRDIFF_TYPE): Remove.
40709         * config/i386/sol2-bi.h: Remove.
40710         * config/sol2.h (MD_STARTFILE_PREFIX): Remove.
40711         (LINK_ARCH32_SPEC_BASE): Remove /usr/ccs/lib/libp, /usr/ccs/lib.
40713         * config/i386/t-sol2-64: Rename to ...
40714         * config/i386/t-sol2: ... this.
40715         * config/sparc/t-sol2-64: Rename to ...
40716         * config/sparc/t-sol2: ... this.
40718         * config.gcc (*-*-solaris2*): Split sol2_tm_file into
40719         sol2_tm_file_head, sol2_tm_file_tail.
40720         Include ${cpu_type}/sol2.h before sol2.h.
40721         Remove sol2-10.h.
40722         (i[34567]86-*-solaris2* | x86_64-*-solaris2.1[0-9]*): Include
40723         i386/x86-64.h between sol2_tm_file_head and sol2_tm_file_tail.
40724         Remove i386/sol2-bi.h, sol2-bi.h from tm_file.
40725         Reflect i386/t-sol2-64 renaming.
40726         (sparc*-*-solaris2*): Remove sol2-bi.h from tm_file.
40727         Reflect sparc/t-sol2-64 renaming.
40729 2014-04-30  Richard Biener  <rguenther@suse.de>
40731         * passes.c (execute_function_todo): Move TODO_verify_stmts
40732         and TODO_verify_ssa under the TODO_verify_il umbrella.
40733         * tree-ssa.h (verify_ssa): Adjust prototype.
40734         * tree-ssa.c (verify_ssa): Add parameter to tell whether
40735         we should verify SSA operands.
40736         * tree-cfg.h (verify_gimple_in_cfg): Adjust prototype.
40737         * tree-cfg.c (verify_gimple_in_cfg): Add parameter to tell
40738         whether we should verify whether not throwing stmts have EH info.
40739         * graphite-scop-detection.c (create_sese_edges): Adjust.
40740         * tree-ssa-loop-manip.c (verify_loop_closed_ssa): Likewise.
40741         * tree-eh.c (lower_try_finally_switch): Do not add the
40742         default case label twice.
40744 2014-04-30  Marek Polacek  <polacek@redhat.com>
40746         * gcc.c (sanitize_spec_function): Handle SANITIZE_FLOAT_DIVIDE.
40747         * builtins.def: Initialize builtins even for SANITIZE_FLOAT_DIVIDE.
40748         * flag-types.h (enum sanitize_code): Add SANITIZE_FLOAT_DIVIDE.
40749         * opts.c (common_handle_option): Add -fsanitize=float-divide-by-zero.
40751 2014-04-29  Alan Lawrence  <alan.lawrence@arm.com>
40753         * config/aarch64/arm_neon.h (vzip1_f32, vzip1_p8, vzip1_p16, vzip1_s8,
40754         vzip1_s16, vzip1_s32, vzip1_u8, vzip1_u16, vzip1_u32, vzip1q_f32,
40755         vzip1q_f64, vzip1q_p8, vzip1q_p16, vzip1q_s8, vzip1q_s16, vzip1q_s32,
40756         vzip1q_s64, vzip1q_u8, vzip1q_u16, vzip1q_u32, vzip1q_u64, vzip2_f32,
40757         vzip2_p8, vzip2_p16, vzip2_s8, vzip2_s16, vzip2_s32, vzip2_u8,
40758         vzip2_u16, vzip2_u32, vzip2q_f32, vzip2q_f64, vzip2q_p8, vzip2q_p16,
40759         vzip2q_s8, vzip2q_s16, vzip2q_s32, vzip2q_s64, vzip2q_u8, vzip2q_u16,
40760         vzip2q_u32, vzip2q_u64): Replace inline __asm__ with __builtin_shuffle.
40762 2014-04-29  David Malcolm  <dmalcolm@redhat.com>
40764         * tree-cfg.c (dump_function_to_file): Dump the return type of
40765         functions, in a line to itself before the function body, mimicking
40766         the layout of a C function.
40768 2014-04-29  Jakub Jelinek  <jakub@redhat.com>
40770         PR tree-optimization/60971
40771         * tree-tailcall.c (process_assignment): Reject conversions which
40772         reduce precision.
40774 2014-04-29  James Greenhalgh  <james.greenhalgh@arm.com>
40776         * calls.c (initialize_argument_information): Always treat
40777         PUSH_ARGS_REVERSED as 1, simplify code accordingly.
40778         (expand_call): Likewise.
40779         (emit_library_call_calue_1): Likewise.
40780         * expr.c (PUSH_ARGS_REVERSED): Do not define.
40781         (emit_push_insn): Always treat PUSH_ARGS_REVERSED as 1, simplify
40782         code accordingly.
40784 2014-04-29  Nick Clifton  <nickc@redhat.com>
40786         * config/msp430/msp430.md (umulsidi): Fix typo.
40787         (mulhisi3): Enable even inside interrupt handlers.
40788         * config/msp430/msp430.c (msp430_print_operand): %O: Allow for the
40789         bigger return address pushed in large mode.
40791 2014-04-29  Nick Clifton  <nickc@redhat.com>
40793         * config/arc/arc.c (arc_select_cc_mode): Fix parentheses.
40794         (arc_init_reg_tables): Use a machine_mode enum to iterate over
40795         available modes.
40796         * config/m32r/m32r.c (init_reg_tables): Likewise.
40797         * config/m32c/m32c.c (m32c_illegal_subreg_p): Use a machine_mode
40798         enum to hold the modes.
40800 2014-04-29  Richard Biener  <rguenther@suse.de>
40802         * dominance.c (free_dominance_info): Add overload with
40803         function parameter.
40804         (dom_info_state): Likewise.
40805         (dom_info_available_p): Likewise.
40806         * basic-block.h (free_dominance_info, dom_info_state,
40807         dom_info_available_p): Declare overloads.
40808         * passes.c (execute_function_todo): Verify that verifiers
40809         don't change dominator info state.  Drop dominator info
40810         for IPA pass invocations.
40811         * cgraph.c (release_function_body): Restore asserts that
40812         dominator information is released.
40814 2014-04-29  Patrick Palka  <patrick@parcs.ath.cx>
40816         * doc/invoke.texi: Fix typo.
40817         * tree-vrp.c: Fix typos.
40818         * gimple.c (infer_nonnull_range): Reorder operands of an && condition.
40820 2014-04-29  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
40822         * config/aarch64/aarch64.md (mov<mode>cc): New for GPF.
40824 2014-04-28  James Greenhalgh  <james.greenhalgh@arm.com>
40826         * config/aarch64/aarch64-builtins.c
40827         (aarch64_types_storestruct_lane_qualifiers): New.
40828         (TYPES_STORESTRUCT_LANE): Likewise.
40829         * config/aarch64/aarch64-simd-builtins.def (st2_lane): New.
40830         (st3_lane): Likewise.
40831         (st4_lane): Likewise.
40832         * config/aarch64/aarch64-simd.md (vec_store_lanesoi_lane<mode>): New.
40833         (vec_store_lanesci_lane<mode>): Likewise.
40834         (vec_store_lanesxi_lane<mode>): Likewise.
40835         (aarch64_st2_lane<VQ:mode>): Likewise.
40836         (aarch64_st3_lane<VQ:mode>): Likewise.
40837         (aarch64_st4_lane<VQ:mode>): Likewise.
40838         * config/aarch64/aarch64.md (unspec): Add UNSPEC_ST{2,3,4}_LANE.
40839         * config/aarch64/arm_neon.h
40840         (__ST2_LANE_FUNC): Rewrite using builtins, update use points to
40841         use new macro arguments.
40842         (__ST3_LANE_FUNC): Likewise.
40843         (__ST4_LANE_FUNC): Likewise.
40844         * config/aarch64/iterators.md (V_TWO_ELEM): New.
40845         (V_THREE_ELEM): Likewise.
40846         (V_FOUR_ELEM): Likewise.
40848 2014-04-28  David Malcolm  <dmalcolm@redhat.com>
40850         * doc/gimple.texi: Replace the description of the now-defunct
40851         union gimple_statement_d with a diagram showing the
40852         gimple_statement_base class hierarchy and its relationships to
40853         the GSS_ and GIMPLE_ enums.
40855 2014-04-28  James Greenhalgh  <james.greenhalgh@arm.com>
40857         * config/aarch64/aarch64-protos.h (aarch64_modes_tieable_p): New.
40858         * config/aarch64/aarch64.c
40859         (aarch64_cannot_change_mode_class): Weaken conditions.
40860         (aarch64_modes_tieable_p): New.
40861         * config/aarch64/aarch64.h (MODES_TIEABLE_P): Use it.
40863 2014-04-28  Pat Haugen  <pthaugen@us.ibm.com>
40865         * config/rs6000/sync.md (AINT mode_iterator): Move definition.
40866         (loadsync_<mode>): Change mode.
40867         (load_quadpti, store_quadpti): New.
40868         (atomic_load<mode>, atomic_store<mode>): Add support for TI mode.
40869         * config/rs6000/rs6000.md (unspec enum): Add UNSPEC_LSQ.
40871 2014-04-28  Martin Jambor  <mjambor@suse.cz>
40873         * tree-sra.c (sra_modify_expr): Generate new memory accesses with
40874         same alias type as the original statement.
40875         (subreplacement_assignment_data): New type.
40876         (handle_unscalarized_data_in_subtree): New type of parameter,
40877         generate new memory accesses with same alias type as the original
40878         statement.
40879         (load_assign_lhs_subreplacements): Likewise.
40880         (sra_modify_constructor_assign): Generate new memory accesses with
40881         same alias type as the original statement.
40883 2014-04-28  Richard Biener  <rguenther@suse.de>
40885         * tree-pass.h (TODO_verify_il): Define.
40886         (TODO_verify_all): Complete properly.
40887         * passes.c (execute_function_todo): Move existing loop-closed
40888         SSA verification under TODO_verify_il.
40889         (execute_one_pass): Trigger TODO_verify_il at todo-after time.
40890         * graphite-sese-to-poly.c (rewrite_cross_bb_scalar_deps):
40891         Fix tree sharing issue.
40893 2014-04-28  Richard Biener  <rguenther@suse.de>
40895         PR middle-end/60092
40896         * builtins.def (DEF_C11_BUILTIN): Add.
40897         (BUILT_IN_ALIGNED_ALLOC): Likewise.
40898         * coretypes.h (enum function_class): Add function_c11_misc.
40899         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Handle
40900         BUILT_IN_ALIGNED_ALLOC like BUILT_IN_MALLOC.
40901         (call_may_clobber_ref_p_1): Likewise.
40902         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Likewise.
40903         (mark_all_reaching_defs_necessary_1): Likewise.
40904         (propagate_necessity): Likewise.
40905         (eliminate_unnecessary_stmts): Likewise.
40906         * tree-ssa-ccp.c (evaluate_stmt): Handle BUILT_IN_ALIGNED_ALLOC.
40908 2014-04-28  Richard Biener  <rguenther@suse.de>
40910         * tree-vrp.c (vrp_var_may_overflow): Remove.
40911         (vrp_visit_phi_node): Rather than bumping to +-INF possibly
40912         with overflow immediately bump to one before that value and
40913         let iteration figure out overflow status.
40915 2014-04-28  Richard Biener  <rguenther@suse.de>
40917         * configure.ac: Do valgrind header checks unconditionally.
40918         Add --enable-valgrind-annotations.
40919         * system.h: Guard valgrind header inclusion with
40920         ENABLE_VALGRIND_ANNOTATIONS instead of ENABLE_VALGRIND_CHECKING.
40921         * alloc-pool.c (pool_alloc, pool_free): Use
40922         ENABLE_VALGRIND_ANNOTATIONS instead of ENABLE_VALGRIND_CHECKING
40923         to guard possibly dead code.
40924         * config.in: Regenerated.
40925         * configure: Likewise.
40927 2014-04-28  Jeff Law  <law@redhat.com>
40929         PR tree-optimization/60902
40930         * tree-ssa-threadedge.c
40931         (record_temporary_equivalences_from_stmts_at_dest): Only iterate
40932         over real defs when invalidating outputs from statements that do not
40933         produce useful outputs for threading.
40935 2014-04-28  Richard Biener  <rguenther@suse.de>
40937         PR tree-optimization/60979
40938         * graphite-scop-detection.c (scopdet_basic_block_info): Reject
40939         SCOPs that end in a block with a successor with abnormal
40940         predecessors.
40942 2014-04-28  Richard Biener  <rguenther@suse.de>
40944         * tree-pass.h (execute_pass_list): Adjust prototype.
40945         * passes.c (pass_manager::execute_early_local_passes): Adjust.
40946         (do_per_function): Change callback signature, push all actual
40947         work to the callbals.
40948         (do_per_function_toporder): Likewise.
40949         (execute_function_dump): Adjust.
40950         (execute_function_todo): Likewise.
40951         (clear_last_verified): Likewise.
40952         (verify_curr_properties): Likewise.
40953         (update_properties_after_pass): Likewise.
40954         (execute_pass_list_1): Split out from ...
40955         (execute_pass_list): ... here.  Adjust.
40956         (execute_ipa_pass_list): Likewise.
40957         * cgraphunit.c (cgraph_add_new_function): Adjust.
40958         (analyze_function): Likewise.
40959         (expand_function): Likewise.
40960         * cgraph.c (release_function_body): Free dominance info
40961         here instead of asserting it was magically freed elsewhere.
40963 2014-04-28  Eric Botcazou  <ebotcazou@adacore.com>
40965         * configure.ac: Tweak GAS check for LEON instructions on SPARC.
40966         * configure: Regenerate.
40967         * config/sparc/sparc.opt (muser-mode): New option.
40968         * config/sparc/sync.md (atomic_compare_and_swap<mode>_1): Do not enable
40969         for LEON3.
40970         (atomic_compare_and_swap_leon3_1): New instruction for LEON3.
40971         * doc/invoke.texi (SPARC options): Document -muser-mode.
40973 2014-04-27  Richard Sandiford  <rdsandiford@googlemail.com>
40975         * cselib.c (find_slot_memmode): Delete.
40976         (cselib_hasher): Change compare_type to a struct.
40977         (cselib_hasher::equal): Update accordingly.  Don't expect wrapped
40978         constants.
40979         (preserve_constants_and_equivs): Adjust for new compare_type.
40980         (cselib_find_slot): Likewise.  Take the mode of the rtx as argument.
40981         (wrap_constant): Delete.
40982         (cselib_lookup_mem, cselib_lookup_1): Update calls to cselib_find_slot.
40984 2014-04-26  Markus Trippelsdorf  <markus@trippelsdorf.de>
40986         * doc/install.texi (Building with profile feedback): Remove
40987         outdated sentence.
40989 2014-04-26  Tom de Vries  <tom@codesourcery.com>
40991         * config/i386/i386.md (define_expand "ldexpxf3"): Fix out-of-bounds
40992         array accesses.
40994 2014-04-25  Cary Coutant  <ccoutant@google.com>
40996         PR debug/60929
40997         * dwarf2out.c (should_move_die_to_comdat): A type definition
40998         can contain a subprogram definition, but don't move it to a
40999         comdat unit.
41000         (clone_as_declaration): Copy DW_AT_abstract_origin attribute.
41001         (generate_skeleton_bottom_up): Remove DW_AT_object_pointer attribute
41002         from original DIE.
41003         (clone_tree_hash): Rename to...
41004         (clone_tree_partial): ...this; change callers.  Copy
41005         DW_TAG_subprogram DIEs as declarations.
41006         (copy_decls_walk): Don't copy children of a declaration into a
41007         type unit.
41009 2014-04-25  H.J. Lu  <hongjiu.lu@intel.com>
41011         PR target/60969
41012         * config/i386/i386.md (*movsf_internal): Set MODE to SI for
41013         alternative 12.
41015 2014-04-25  Jiong Wang  <jiong.wang@arm.com>
41017         * config/arm/predicates.md (call_insn_operand): Add long_call check.
41018         * config/arm/arm.md (sibcall, sibcall_value): Force the address to
41019         reg for long_call.
41020         * config/arm/arm.c (arm_function_ok_for_sibcall): Remove long_call
41021         restriction.
41023 2014-04-25  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41025         * config/arm/arm.c (arm_cortex_a8_tune): Initialise T16-related fields.
41027 2014-04-25  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
41029         PR tree-optimization/60930
41030         * gimple-ssa-strength-reduction.c (create_mul_imm_cand):  Reject
41031         creating a multiply candidate by folding two constant
41032         multiplicands when the result overflows.
41034 2014-04-25  Jakub Jelinek  <jakub@redhat.com>
41036         PR tree-optimization/60960
41037         * tree-vect-generic.c (expand_vector_operation): Only call
41038         expand_vector_divmod if type's mode satisfies VECTOR_MODE_P.
41040 2014-04-25  Tom de Vries  <tom@codesourcery.com>
41042         * expr.c (clobber_reg_mode): New function.
41043         * expr.h (clobber_reg): New function.
41045 2014-04-25  Tom de Vries  <tom@codesourcery.com>
41047         * rtlanal.c (find_all_hard_reg_sets): Note INSN_CALL_FUNCTION_USAGE
41048         clobbers.
41050 2014-04-25  Radovan Obradovic  <robradovic@mips.com>
41051             Tom de Vries  <tom@codesourcery.com>
41053         * rtlanal.c (find_all_hard_reg_sets): Add bool implicit parameter and
41054         handle.
41055         * rtl.h (find_all_hard_reg_sets): Add bool parameter.
41056         * haifa-sched.c (recompute_todo_spec, check_clobbered_conditions): Add
41057         new argument to find_all_hard_reg_sets call.
41059 2014-04-25  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41061         * config/arm/aarch-common.c (aarch_rev16_shright_mask_imm_p):
41062         Use HOST_WIDE_INT_C for mask literal.
41063         (aarch_rev16_shleft_mask_imm_p): Likewise.
41065 2014-04-25  Eric Botcazou  <ebotcazou@adacore.com>
41067         PR target/60941
41068         * config/sparc/sparc.md (ashlsi3_extend): Delete.
41070 2014-04-25  Marc Glisse  <marc.glisse@inria.fr>
41072         PR preprocessor/56540
41073         * config/i386/i386-c.c (ix86_target_macros): Define
41074         __SIZEOF_FLOAT80__ and __SIZEOF_FLOAT128__.
41076 2014-04-25  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
41078         * configure.ac (tga_func): Remove.
41079         (LIB_TLS_SPEC): Remove.
41080         * configure: Regenerate.
41081         * config.in: Regenerate.
41082         * config/sol2.h (LIB_SPEC): Don't use LIB_TLS_SPEC.
41084 2014-04-25  Richard Biener  <rguenther@suse.de>
41086         PR ipa/60912
41087         * tree-ssa-structalias.c (ipa_pta_execute): Compute direct
41088         call stmt use/clobber sets during stmt walk instead of
41089         walking the possibly incomplete set of caller edges.
41091 2014-04-25  Richard Biener  <rguenther@suse.de>
41093         PR ipa/60911
41094         * passes.c (apply_ipa_transforms): Inline into only caller ...
41095         (execute_one_pass): ... here.  Properly bring in function
41096         bodies for nodes we want to apply IPA transforms to.
41098 2014-04-24  Cong Hou  <congh@google.com>
41100         PR tree-optimization/60896
41101         * tree-vect-patterns.c (vect_recog_dot_prod_pattern): Pick up
41102         all statements in PATTERN_DEF_SEQ in recognized widen-mult pattern.
41103         (vect_mark_pattern_stmts): Set the def type of all statements in
41104         PATTERN_DEF_SEQ as vect_internal_def.
41106 2014-04-24  Michael Meissner  <meissner@linux.vnet.ibm.com>
41108         * doc/extend.texi (PowerPC Built-in Functions): Document new
41109         powerpc extended divide, bcd, pack/unpack 128-bit, builtin functions.
41110         (PowerPC AltiVec/VSX Built-in Functions): Likewise.
41112         * config/rs6000/predicates.md (const_0_to_3_operand): New
41113         predicate to match 0..3 integer constants.
41115         * config/rs6000/rs6000-builtin.def (BU_DFP_MISC_1): Add new macros
41116         to support adding miscellaneous builtin functions.
41117         (BU_DFP_MISC_2): Likewise.
41118         (BU_P7_MISC_1): Likewise.
41119         (BU_P7_MISC_2): Likewise.
41120         (BU_P8V_MISC_3): Likewise.
41121         (BU_MISC_1): Likewise.
41122         (BU_MISC_2): Likewise.
41123         (DIVWE): Add extended divide builtin functions.
41124         (DIVWEO): Likewise.
41125         (DIVWEU): Likewise.
41126         (DIVWEUO): Likewise.
41127         (DIVDE): Likewise.
41128         (DIVDEO): Likewise.
41129         (DIVDEU): Likewise.
41130         (DIVDEUO): Likewise.
41131         (DXEX): Add decimal floating-point builtin functions.
41132         (DXEXQ): Likewise.
41133         (DDEDPD): Likewise.
41134         (DDEDPDQ): Likewise.
41135         (DENBCD): Likewise.
41136         (DENBCDQ): Likewise.
41137         (DIEX): Likewise.
41138         (DIEXQ): Likewise.
41139         (DSCLI): Likewise.
41140         (DSCLIQ): Likewise.
41141         (DSCRI): Likewise.
41142         (DSCRIQ): Likewise.
41143         (CDTBCD): Add new BCD builtin functions.
41144         (CBCDTD): Likewise.
41145         (ADDG6S): Likewise.
41146         (BCDADD): Likewise.
41147         (BCDADD_LT): Likewise.
41148         (BCDADD_EQ): Likewise.
41149         (BCDADD_GT): Likewise.
41150         (BCDADD_OV): Likewise.
41151         (BCDSUB): Likewise.
41152         (BCDSUB_LT): Likewise.
41153         (BCDSUB_EQ): Likewise.
41154         (BCDSUB_GT): Likewise.
41155         (BCDSUB_OV): Likewise.
41156         (PACK_TD): Add new pack/unpack 128-bit type builtin functions.
41157         (UNPACK_TD): Likewise.
41158         (PACK_TF): Likewise.
41159         (UNPACK_TF): Likewise.
41160         (UNPACK_TF_0): Likewise.
41161         (UNPACK_TF_1): Likewise.
41162         (PACK_V1TI): Likewise.
41163         (UNPACK_V1TI): Likewise.
41165         * config/rs6000/rs6000.c (rs6000_builtin_mask_calculate): Add
41166         support for decimal floating point builtin functions.
41167         (rs6000_expand_ternop_builtin): Add checks for the new builtin
41168         functions that take constant arguments.
41169         (rs6000_invalid_builtin): Add decimal floating point builtin support.
41170         (rs6000_init_builtins): Setup long double, _Decimal64, and
41171         _Decimal128 types for new builtin functions.
41172         (builtin_function_type): Set the unsigned flags appropriately for
41173         the new builtin functions.
41174         (rs6000_opt_masks): Add support for decimal floating point builtin
41175         functions.
41177         * config/rs6000/rs6000.h (RS6000_BTM_DFP): Add support for decimal
41178         floating point builtin functions.
41179         (RS6000_BTM_COMMON): Likewise.
41180         (RS6000_BTI_long_double): Likewise.
41181         (RS6000_BTI_dfloat64): Likewise.
41182         (RS6000_BTI_dfloat128): Likewise.
41183         (long_double_type_internal_node): Likewise.
41184         (dfloat64_type_internal_node): Likewise.
41185         (dfloat128_type_internal_node): Likewise.
41187         * config/rs6000/altivec.h (UNSPEC_BCDADD): Add support for ISA
41188         2.07 bcd arithmetic instructions.
41189         (UNSPEC_BCDSUB): Likewise.
41190         (UNSPEC_BCD_OVERFLOW): Likewise.
41191         (UNSPEC_BCD_ADD_SUB): Likewise.
41192         (bcd_add_sub): Likewise.
41193         (BCD_TEST): Likewise.
41194         (bcd<bcd_add_sub>): Likewise.
41195         (bcd<bcd_add_sub>_test): Likewise.
41196         (bcd<bcd_add_sub>_test2): Likewise.
41197         (bcd<bcd_add_sub>_<code>): Likewise.
41198         (peephole2 for combined bcd ops): Likewise.
41200         * config/rs6000/dfp.md (UNSPEC_DDEDPD): Add support for new
41201         decimal floating point builtin functions.
41202         (UNSPEC_DENBCD): Likewise.
41203         (UNSPEC_DXEX): Likewise.
41204         (UNSPEC_DIEX): Likewise.
41205         (UNSPEC_DSCLI): Likewise.
41206         (UNSPEC_DSCRI): Likewise.
41207         (D64_D128): Likewise.
41208         (dfp_suffix): Likewise.
41209         (dfp_ddedpd_<mode>): Likewise.
41210         (dfp_denbcd_<mode>): Likewise.
41211         (dfp_dxex_<mode>): Likewise.
41212         (dfp_diex_<mode>): Likewise.
41213         (dfp_dscli_<mode>): Likewise.
41214         (dfp_dscri_<mode>): Likewise.
41216         * config/rs6000/rs6000.md (UNSPEC_ADDG6S): Add support for new BCD
41217         builtin functions.
41218         (UNSPEC_CDTBCD): Likewise.
41219         (UNSPEC_CBCDTD): Likewise.
41220         (UNSPEC_DIVE): Add support for new extended divide builtin functions.
41221         (UNSPEC_DIVEO): Likewise.
41222         (UNSPEC_DIVEU): Likewise.
41223         (UNSPEC_DIVEUO): Likewise.
41224         (UNSPEC_UNPACK_128BIT): Add support for new builtin functions to
41225         pack/unpack 128-bit types.
41226         (UNSPEC_PACK_128BIT): Likewise.
41227         (idiv_ldiv): New mode attribute to set the 32/64-bit divide type.
41228         (udiv<mode>3): Use idiv_ldiv mode attribute.
41229         (div<mode>3): Likewise.
41230         (addg6s): Add new BCD builtin functions.
41231         (cdtbcd): Likewise.
41232         (cbcdtd): Likewise.
41233         (UNSPEC_DIV_EXTEND): Add support for new extended divide instructions.
41234         (div_extend): Likewise.
41235         (div<div_extend>_<mode>"): Likewise.
41236         (FP128_64): Add support for new builtin functions to pack/unpack
41237         128-bit types.
41238         (unpack<mode>): Likewise.
41239         (unpacktf_0): Likewise.
41240         (unpacktf_1): Likewise.
41241         (unpack<mode>_dm): Likewise.
41242         (unpack<mode>_nodm): Likewise.
41243         (pack<mode>): Likewise.
41244         (unpackv1ti): Likewise.
41245         (packv1ti): Likewise.
41247 2014-04-24  Vishnu K S  <Vishnu.k_s@atmel.com>
41249         * gcc/config/avr/avr.c: Add comment on why -fdelete-null-pointer-checks
41250         is disabled.
41252 2014-04-24  Jakub Jelinek  <jakub@redhat.com>
41254         * tree.h (OMP_CLAUSE_LINEAR_GIMPLE_SEQ): Define.
41255         * gimplify.c (omp_is_private): Change last argument's type to int.
41256         Only diagnose lastprivate if the simd argument is 1, only diagnose
41257         linear if the simd argument is 2.
41258         (gimplify_omp_for): Adjust omp_is_private callers.  When adding
41259         lastprivate or private, add the clause to OMP_FOR_CLAUSES.  Pass
41260         GOVD_EXPLICIT to omp_add_variable.  For simd with collapse == 1
41261         create OMP_CLAUSE_LINEAR rather than OMP_CLAUSE_PRIVATE for var.
41262         If var != decl and decl is in OMP_CLAUSE_LINEAR, gimplify decl
41263         increment to OMP_CLAUSE_LINEAR_GIMPLE_SEQ.
41264         * omp-low.c (scan_sharing_clauses, lower_lastprivate_clauses): Handle
41265         OMP_CLAUSE_LINEAR_GIMPLE_SEQ.
41266         * tree-nested.c (convert_nonlocal_omp_clauses,
41267         convert_local_omp_clauses): Handle OMP_CLAUSE_LINEAR.
41269 2014-04-24  Segher Boessenkool  <segher@kernel.crashing.org>
41271         PR target/60822
41272         * config/m68k/m68k.md (extendplussidi): Don't allow memory for
41273         operand 1.
41275 2014-04-24  Dimitris Papavasiliou  <dpapavas@gmail.com>
41277         * flag-types.h (enum ivar_visibility): Add.
41279 2014-04-24  Trevor Saunders  <tsaunders@mozilla.com>
41281         * config/sh/sh_treg_combine.c (sh_treg_combine::execute): Take
41282         function * argument.
41284 2014-04-24  Alan Lawrence  <alan.lawrence@arm.com>
41286         * config/aarch64/aarch64.c (aarch64_evpc_tbl): Enable for bigendian.
41288 2014-04-24  Radovan Obradovic  <robradovic@mips.com>
41289             Tom de Vries  <tom@codesourcery.com>
41291         * reg-notes.def (REG_NOTE (CALL_DECL)): New reg-note REG_CALL_DECL.
41292         * calls.c (expand_call, emit_library_call_value_1): Add REG_CALL_DECL
41293         reg-note.
41294         * combine.c (distribute_notes): Handle REG_CALL_DECL reg-note.
41295         * emit-rtl.c (try_split): Same.
41297 2014-04-24  Radovan Obradovic  <robradovic@mips.com>
41298             Tom de Vries  <tom@codesourcery.com>
41300         * common.opt (fuse-caller-save): New option.
41302 2014-04-24  Tejas Belagod  <tejas.belagod@arm.com>
41304         * config/aarch64/aarch64.c (aarch64_evpc_tbl): Reverse order of
41305         elements for big-endian.
41307 2014-04-24  Richard Biener  <rguenther@suse.de>
41309         * expr.c (expand_expr_real_1): Avoid gimple_assign_rhs_to_tree
41310         during TER and instead use the sepops interface for expanding
41311         non-GIMPLE_SINGLE_RHS.
41313 2014-04-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
41315         * config/i386/sol2.h (ASM_PREFERRED_EH_DATA_FORMAT): Only redefine
41316         if not HAVE_AS_IX86_DIFF_SECT_DELTA.
41318 2014-04-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
41320         * configure.ac (gcc_cv_as_cfi_directive): Support Solaris/x86
41321         assembler 64-bit option.
41322         * configure: Regenerate.
41324 2014-04-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41326         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Check
41327         TARGET_SIMD rather than TARGET_GENERAL_REGS_ONLY.
41328         (TARGET_SIMD): Take AARCH64_ISA_SIMD into account.
41329         (TARGET_FLOAT): Take AARCH64_ISA_FP into account.
41330         (TARGET_CRYPTO): Take TARGET_SIMD into account.
41332 2014-04-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41334         * config/aarch64/aarch64-builtins.c
41335         (aarch64_builtin_vectorized_function): Handle BUILT_IN_BSWAP16,
41336         BUILT_IN_BSWAP32, BUILT_IN_BSWAP64.
41337         * config/aarch64/aarch64-simd.md (bswap<mode>): New pattern.
41338         * config/aarch64/aarch64-simd-builtins.def: Define vector bswap
41339         builtins.
41340         * config/aarch64/iterator.md (VDQHSD): New mode iterator.
41341         (Vrevsuff): New mode attribute.
41343 2014-04-24  Terry Guo  <terry.guo@arm.com>
41345         * config/arm/arm.h (machine_function): Define variable
41346         after_arm_reorg here.
41347         * config/arm/arm.c (after_arm_reorg): Remove the definition.
41348         (arm_split_constant): Update the way to access variable
41349         after_arm_reorg.
41350         (arm_reorg): Ditto.
41351         (arm_output_function_epilogue): Remove the reset of after_arm_reorg.
41353 2014-04-23  Tom de Vries  <tom@codesourcery.com>
41355         * target-hooks-macros.h: Fix DEFHOOKPOD argument order in comment.
41357 2014-04-23  David Malcolm  <dmalcolm@redhat.com>
41359         * is-a.h: Update comments to reflect the following changes to the
41360         "pointerness" of the API, making the template parameter match the
41361         return type, allowing use of is-a.h with typedefs of pointers.
41362         (is_a_helper::cast): Return a T rather then a pointer to a T, so
41363         that the return type matches the parameter to the is_a_helper.
41364         (as_a): Likewise.
41365         (dyn_cast): Likewise.
41367         * cgraph.c (cgraph_node_for_asm): Update for removal of implicit
41368         pointer from the is-a.h API.
41370         * cgraph.h (is_a_helper <cgraph_node>::test): Convert to...
41371         (is_a_helper <cgraph_node *>::test): ...this, matching change to
41372         is-a.h API.
41373         (is_a_helper <varpool_node>::test): Likewise, convert to...
41374         (is_a_helper <varpool_node *>::test): ...this.
41376         (varpool_first_variable): Update for removal of implicit pointer
41377         from the is-a.h API.
41378         (varpool_next_variable): Likewise.
41379         (varpool_first_static_initializer): Likewise.
41380         (varpool_next_static_initializer): Likewise.
41381         (varpool_first_defined_variable): Likewise.
41382         (varpool_next_defined_variable): Likewise.
41383         (cgraph_first_defined_function): Likewise.
41384         (cgraph_next_defined_function): Likewise.
41385         (cgraph_first_function): Likewise.
41386         (cgraph_next_function): Likewise.
41387         (cgraph_first_function_with_gimple_body): Likewise.
41388         (cgraph_next_function_with_gimple_body): Likewise.
41389         (cgraph_alias_target): Likewise.
41390         (varpool_alias_target): Likewise.
41391         (cgraph_function_or_thunk_node): Likewise.
41392         (varpool_variable_node): Likewise.
41393         (symtab_real_symbol_p): Likewise.
41394         * cgraphunit.c (referred_to_p): Likewise.
41395         (analyze_functions): Likewise.
41396         (handle_alias_pairs): Likewise.
41397         * gimple-fold.c (can_refer_decl_in_current_unit_p): Likewise.
41398         * gimple-ssa.h (gimple_vuse_op): Likewise.
41399         (gimple_vdef_op): Likewise.
41400         * gimple-streamer-in.c (input_gimple_stmt): Likewise.
41401         * gimple.c (gimple_build_asm_1): Likewise.
41402         (gimple_build_try): Likewise.
41403         (gimple_build_resx): Likewise.
41404         (gimple_build_eh_dispatch): Likewise.
41405         (gimple_build_omp_for): Likewise.
41406         (gimple_omp_for_set_clauses): Likewise.
41408         * gimple.h (is_a_helper <gimple_statement_asm>::test): Convert to...
41409         (is_a_helper <gimple_statement_asm *>::test): ...this.
41410         (is_a_helper <gimple_statement_bind>::test): Convert to...
41411         (is_a_helper <gimple_statement_bind *>::test): ...this.
41412         (is_a_helper <gimple_statement_call>::test): Convert to...
41413         (is_a_helper <gimple_statement_call *>::test): ...this.
41414         (is_a_helper <gimple_statement_catch>::test): Convert to...
41415         (is_a_helper <gimple_statement_catch *>::test): ...this.
41416         (is_a_helper <gimple_statement_resx>::test): Convert to...
41417         (is_a_helper <gimple_statement_resx *>::test): ...this.
41418         (is_a_helper <gimple_statement_eh_dispatch>::test): Convert to...
41419         (is_a_helper <gimple_statement_eh_dispatch *>::test): ...this.
41420         (is_a_helper <gimple_statement_eh_else>::test): Convert to...
41421         (is_a_helper <gimple_statement_eh_else *>::test): ...this.
41422         (is_a_helper <gimple_statement_eh_filter>::test): Convert to...
41423         (is_a_helper <gimple_statement_eh_filter *>::test): ...this.
41424         (is_a_helper <gimple_statement_eh_mnt>::test): Convert to...
41425         (is_a_helper <gimple_statement_eh_mnt *>::test): ...this.
41426         (is_a_helper <gimple_statement_omp_atomic_load>::test): Convert to...
41427         (is_a_helper <gimple_statement_omp_atomic_load *>::test): ...this.
41428         (is_a_helper <gimple_statement_omp_atomic_store>::test): Convert to...
41429         (is_a_helper <gimple_statement_omp_atomic_store *>::test): ...this.
41430         (is_a_helper <gimple_statement_omp_return>::test): Convert to...
41431         (is_a_helper <gimple_statement_omp_return *>::test): ...this.
41432         (is_a_helper <gimple_statement_omp_continue>::test): Convert to...
41433         (is_a_helper <gimple_statement_omp_continue *>::test): ...this.
41434         (is_a_helper <gimple_statement_omp_critical>::test): Convert to...
41435         (is_a_helper <gimple_statement_omp_critical *>::test): ...this.
41436         (is_a_helper <gimple_statement_omp_for>::test): Convert to...
41437         (is_a_helper <gimple_statement_omp_for *>::test): ...this.
41438         (is_a_helper <gimple_statement_omp_taskreg>::test): Convert to...
41439         (is_a_helper <gimple_statement_omp_taskreg *>::test): ...this.
41440         (is_a_helper <gimple_statement_omp_parallel>::test): Convert to...
41441         (is_a_helper <gimple_statement_omp_parallel *>::test): ...this.
41442         (is_a_helper <gimple_statement_omp_target>::test): Convert to...
41443         (is_a_helper <gimple_statement_omp_target *>::test): ...this.
41444         (is_a_helper <gimple_statement_omp_sections>::test): Convert to...
41445         (is_a_helper <gimple_statement_omp_sections *>::test): ...this.
41446         (is_a_helper <gimple_statement_omp_single>::test): Convert to...
41447         (is_a_helper <gimple_statement_omp_single *>::test): ...this.
41448         (is_a_helper <gimple_statement_omp_teams>::test): Convert to...
41449         (is_a_helper <gimple_statement_omp_teams *>::test): ...this.
41450         (is_a_helper <gimple_statement_omp_task>::test): Convert to...
41451         (is_a_helper <gimple_statement_omp_task *>::test): ...this.
41452         (is_a_helper <gimple_statement_phi>::test): Convert to...
41453         (is_a_helper <gimple_statement_phi *>::test): ...this.
41454         (is_a_helper <gimple_statement_transaction>::test): Convert to...
41455         (is_a_helper <gimple_statement_transaction *>::test): ...this.
41456         (is_a_helper <gimple_statement_try>::test): Convert to...
41457         (is_a_helper <gimple_statement_try *>::test): ...this.
41458         (is_a_helper <gimple_statement_wce>::test): Convert to...
41459         (is_a_helper <gimple_statement_wce *>::test): ...this.
41460         (is_a_helper <const gimple_statement_asm>::test): Convert to...
41461         (is_a_helper <const gimple_statement_asm *>::test): ...this.
41462         (is_a_helper <const gimple_statement_bind>::test): Convert to...
41463         (is_a_helper <const gimple_statement_bind *>::test): ...this.
41464         (is_a_helper <const gimple_statement_call>::test): Convert to...
41465         (is_a_helper <const gimple_statement_call *>::test): ...this.
41466         (is_a_helper <const gimple_statement_catch>::test): Convert to...
41467         (is_a_helper <const gimple_statement_catch *>::test): ...this.
41468         (is_a_helper <const gimple_statement_resx>::test): Convert to...
41469         (is_a_helper <const gimple_statement_resx *>::test): ...this.
41470         (is_a_helper <const gimple_statement_eh_dispatch>::test): Convert to...
41471         (is_a_helper <const gimple_statement_eh_dispatch *>::test): ...this.
41472         (is_a_helper <const gimple_statement_eh_filter>::test): Convert to...
41473         (is_a_helper <const gimple_statement_eh_filter *>::test): ...this.
41474         (is_a_helper <const gimple_statement_omp_atomic_load>::test):
41475         Convert to...
41476         (is_a_helper <const gimple_statement_omp_atomic_load *>::test):
41477         ...this.
41478         (is_a_helper <const gimple_statement_omp_atomic_store>::test):
41479         Convert to...
41480         (is_a_helper <const gimple_statement_omp_atomic_store *>::test):
41481         ...this.
41482         (is_a_helper <const gimple_statement_omp_return>::test): Convert to...
41483         (is_a_helper <const gimple_statement_omp_return *>::test): ...this.
41484         (is_a_helper <const gimple_statement_omp_continue>::test): Convert
41485         to...
41486         (is_a_helper <const gimple_statement_omp_continue *>::test): ...this.
41487         (is_a_helper <const gimple_statement_omp_critical>::test): Convert
41488         to...
41489         (is_a_helper <const gimple_statement_omp_critical *>::test): ...this.
41490         (is_a_helper <const gimple_statement_omp_for>::test): Convert to...
41491         (is_a_helper <const gimple_statement_omp_for *>::test): ...this.
41492         (is_a_helper <const gimple_statement_omp_taskreg>::test): Convert to...
41493         (is_a_helper <const gimple_statement_omp_taskreg *>::test): ...this.
41494         (is_a_helper <const gimple_statement_omp_parallel>::test): Convert
41495         to...
41496         (is_a_helper <const gimple_statement_omp_parallel *>::test): ...this.
41497         (is_a_helper <const gimple_statement_omp_target>::test): Convert to...
41498         (is_a_helper <const gimple_statement_omp_target *>::test): ...this.
41499         (is_a_helper <const gimple_statement_omp_sections>::test): Convert
41500         to...
41501         (is_a_helper <const gimple_statement_omp_sections *>::test): ...this.
41502         (is_a_helper <const gimple_statement_omp_single>::test): Convert to...
41503         (is_a_helper <const gimple_statement_omp_single *>::test): ...this.
41504         (is_a_helper <const gimple_statement_omp_teams>::test): Convert to...
41505         (is_a_helper <const gimple_statement_omp_teams *>::test): ...this.
41506         (is_a_helper <const gimple_statement_omp_task>::test): Convert to...
41507         (is_a_helper <const gimple_statement_omp_task *>::test): ...this.
41508         (is_a_helper <const gimple_statement_phi>::test): Convert to...
41509         (is_a_helper <const gimple_statement_phi *>::test): ...this.
41510         (is_a_helper <const gimple_statement_transaction>::test): Convert to...
41511         (is_a_helper <const gimple_statement_transaction *>::test): ...this.
41512         (is_a_helper <const gimple_statement_with_ops>::test): Convert to...
41513         (is_a_helper <const gimple_statement_with_ops *>::test): ...this.
41514         (is_a_helper <gimple_statement_with_ops>::test): Convert to...
41515         (is_a_helper <gimple_statement_with_ops *>::test): ...this.
41516         (is_a_helper <const gimple_statement_with_memory_ops>::test): Convert
41517         to...
41518         (is_a_helper <const gimple_statement_with_memory_ops *>::test):
41519         ...this.
41520         (is_a_helper <gimple_statement_with_memory_ops>::test): Convert to...
41521         (is_a_helper <gimple_statement_with_memory_ops *>::test): ...this.
41523         (gimple_use_ops): Update for removal of implicit pointer from the
41524         is-a.h API.
41525         (gimple_set_use_ops): Likewise.
41526         (gimple_vuse): Likewise.
41527         (gimple_vdef): Likewise.
41528         (gimple_vuse_ptr): Likewise.
41529         (gimple_vdef_ptr): Likewise.
41530         (gimple_set_vuse): Likewise.
41531         (gimple_set_vdef): Likewise.
41532         (gimple_omp_return_set_lhs): Likewise.
41533         (gimple_omp_return_lhs): Likewise.
41534         (gimple_omp_return_lhs_ptr): Likewise.
41535         (gimple_call_fntype): Likewise.
41536         (gimple_call_set_fntype): Likewise.
41537         (gimple_call_set_internal_fn): Likewise.
41538         (gimple_call_use_set): Likewise.
41539         (gimple_call_clobber_set): Likewise.
41540         (gimple_bind_vars): Likewise.
41541         (gimple_bind_set_vars): Likewise.
41542         (gimple_bind_body_ptr): Likewise.
41543         (gimple_bind_set_body): Likewise.
41544         (gimple_bind_add_stmt): Likewise.
41545         (gimple_bind_block): Likewise.
41546         (gimple_bind_set_block): Likewise.
41547         (gimple_asm_ninputs): Likewise.
41548         (gimple_asm_noutputs): Likewise.
41549         (gimple_asm_nclobbers): Likewise.
41550         (gimple_asm_nlabels): Likewise.
41551         (gimple_asm_input_op): Likewise.
41552         (gimple_asm_input_op_ptr): Likewise.
41553         (gimple_asm_output_op): Likewise.
41554         (gimple_asm_output_op_ptr): Likewise.
41555         (gimple_asm_set_output_op): Likewise.
41556         (gimple_asm_clobber_op): Likewise.
41557         (gimple_asm_set_clobber_op): Likewise.
41558         (gimple_asm_label_op): Likewise.
41559         (gimple_asm_set_label_op): Likewise.
41560         (gimple_asm_string): Likewise.
41561         (gimple_catch_types): Likewise.
41562         (gimple_catch_types_ptr): Likewise.
41563         (gimple_catch_handler_ptr): Likewise.
41564         (gimple_catch_set_types): Likewise.
41565         (gimple_catch_set_handler): Likewise.
41566         (gimple_eh_filter_types): Likewise.
41567         (gimple_eh_filter_types_ptr): Likewise.
41568         (gimple_eh_filter_failure_ptr): Likewise.
41569         (gimple_eh_filter_set_types): Likewise.
41570         (gimple_eh_filter_set_failure): Likewise.
41571         (gimple_eh_must_not_throw_fndecl): Likewise.
41572         (gimple_eh_must_not_throw_set_fndecl): Likewise.
41573         (gimple_eh_else_n_body_ptr): Likewise.
41574         (gimple_eh_else_e_body_ptr): Likewise.
41575         (gimple_eh_else_set_n_body): Likewise.
41576         (gimple_eh_else_set_e_body): Likewise.
41577         (gimple_try_eval_ptr): Likewise.
41578         (gimple_try_cleanup_ptr): Likewise.
41579         (gimple_try_set_eval): Likewise.
41580         (gimple_try_set_cleanup): Likewise.
41581         (gimple_wce_cleanup_ptr): Likewise.
41582         (gimple_wce_set_cleanup): Likewise.
41583         (gimple_phi_capacity): Likewise.
41584         (gimple_phi_num_args): Likewise.
41585         (gimple_phi_result): Likewise.
41586         (gimple_phi_result_ptr): Likewise.
41587         (gimple_phi_set_result): Likewise.
41588         (gimple_phi_arg): Likewise.
41589         (gimple_phi_set_arg): Likewise.
41590         (gimple_resx_region): Likewise.
41591         (gimple_resx_set_region): Likewise.
41592         (gimple_eh_dispatch_region): Likewise.
41593         (gimple_eh_dispatch_set_region): Likewise.
41594         (gimple_omp_critical_name): Likewise.
41595         (gimple_omp_critical_name_ptr): Likewise.
41596         (gimple_omp_critical_set_name): Likewise.
41597         (gimple_omp_for_clauses): Likewise.
41598         (gimple_omp_for_clauses_ptr): Likewise.
41599         (gimple_omp_for_set_clauses): Likewise.
41600         (gimple_omp_for_collapse): Likewise.
41601         (gimple_omp_for_index): Likewise.
41602         (gimple_omp_for_index_ptr): Likewise.
41603         (gimple_omp_for_set_index): Likewise.
41604         (gimple_omp_for_initial): Likewise.
41605         (gimple_omp_for_initial_ptr): Likewise.
41606         (gimple_omp_for_set_initial): Likewise.
41607         (gimple_omp_for_final): Likewise.
41608         (gimple_omp_for_final_ptr): Likewise.
41609         (gimple_omp_for_set_final): Likewise.
41610         (gimple_omp_for_incr): Likewise.
41611         (gimple_omp_for_incr_ptr): Likewise.
41612         (gimple_omp_for_set_incr): Likewise.
41613         (gimple_omp_for_pre_body_ptr): Likewise.
41614         (gimple_omp_for_set_pre_body): Likewise.
41615         (gimple_omp_parallel_clauses): Likewise.
41616         (gimple_omp_parallel_clauses_ptr): Likewise.
41617         (gimple_omp_parallel_set_clauses): Likewise.
41618         (gimple_omp_parallel_child_fn): Likewise.
41619         (gimple_omp_parallel_child_fn_ptr): Likewise.
41620         (gimple_omp_parallel_set_child_fn): Likewise.
41621         (gimple_omp_parallel_data_arg): Likewise.
41622         (gimple_omp_parallel_data_arg_ptr): Likewise.
41623         (gimple_omp_parallel_set_data_arg): Likewise.
41624         (gimple_omp_task_clauses): Likewise.
41625         (gimple_omp_task_clauses_ptr): Likewise.
41626         (gimple_omp_task_set_clauses): Likewise.
41627         (gimple_omp_task_child_fn): Likewise.
41628         (gimple_omp_task_child_fn_ptr): Likewise.
41629         (gimple_omp_task_set_child_fn): Likewise.
41630         (gimple_omp_task_data_arg): Likewise.
41631         (gimple_omp_task_data_arg_ptr): Likewise.
41632         (gimple_omp_task_set_data_arg): Likewise.
41633         (gimple_omp_taskreg_clauses): Likewise.
41634         (gimple_omp_taskreg_clauses_ptr): Likewise.
41635         (gimple_omp_taskreg_set_clauses): Likewise.
41636         (gimple_omp_taskreg_child_fn): Likewise.
41637         (gimple_omp_taskreg_child_fn_ptr): Likewise.
41638         (gimple_omp_taskreg_set_child_fn): Likewise.
41639         (gimple_omp_taskreg_data_arg): Likewise.
41640         (gimple_omp_taskreg_data_arg_ptr): Likewise.
41641         (gimple_omp_taskreg_set_data_arg): Likewise.
41642         (gimple_omp_task_copy_fn): Likewise.
41643         (gimple_omp_task_copy_fn_ptr): Likewise.
41644         (gimple_omp_task_set_copy_fn): Likewise.
41645         (gimple_omp_task_arg_size): Likewise.
41646         (gimple_omp_task_arg_size_ptr): Likewise.
41647         (gimple_omp_task_set_arg_size): Likewise.
41648         (gimple_omp_task_arg_align): Likewise.
41649         (gimple_omp_task_arg_align_ptr): Likewise.
41650         (gimple_omp_task_set_arg_align): Likewise.
41651         (gimple_omp_single_clauses): Likewise.
41652         (gimple_omp_single_clauses_ptr): Likewise.
41653         (gimple_omp_single_set_clauses): Likewise.
41654         (gimple_omp_target_clauses): Likewise.
41655         (gimple_omp_target_clauses_ptr): Likewise.
41656         (gimple_omp_target_set_clauses): Likewise.
41657         (gimple_omp_target_child_fn): Likewise.
41658         (gimple_omp_target_child_fn_ptr): Likewise.
41659         (gimple_omp_target_set_child_fn): Likewise.
41660         (gimple_omp_target_data_arg): Likewise.
41661         (gimple_omp_target_data_arg_ptr): Likewise.
41662         (gimple_omp_target_set_data_arg): Likewise.
41663         (gimple_omp_teams_clauses): Likewise.
41664         (gimple_omp_teams_clauses_ptr): Likewise.
41665         (gimple_omp_teams_set_clauses): Likewise.
41666         (gimple_omp_sections_clauses): Likewise.
41667         (gimple_omp_sections_clauses_ptr): Likewise.
41668         (gimple_omp_sections_set_clauses): Likewise.
41669         (gimple_omp_sections_control): Likewise.
41670         (gimple_omp_sections_control_ptr): Likewise.
41671         (gimple_omp_sections_set_control): Likewise.
41672         (gimple_omp_for_set_cond): Likewise.
41673         (gimple_omp_for_cond): Likewise.
41674         (gimple_omp_atomic_store_set_val): Likewise.
41675         (gimple_omp_atomic_store_val): Likewise.
41676         (gimple_omp_atomic_store_val_ptr): Likewise.
41677         (gimple_omp_atomic_load_set_lhs): Likewise.
41678         (gimple_omp_atomic_load_lhs): Likewise.
41679         (gimple_omp_atomic_load_lhs_ptr): Likewise.
41680         (gimple_omp_atomic_load_set_rhs): Likewise.
41681         (gimple_omp_atomic_load_rhs): Likewise.
41682         (gimple_omp_atomic_load_rhs_ptr): Likewise.
41683         (gimple_omp_continue_control_def): Likewise.
41684         (gimple_omp_continue_control_def_ptr): Likewise.
41685         (gimple_omp_continue_set_control_def): Likewise.
41686         (gimple_omp_continue_control_use): Likewise.
41687         (gimple_omp_continue_control_use_ptr): Likewise.
41688         (gimple_omp_continue_set_control_use): Likewise.
41689         (gimple_transaction_body_ptr): Likewise.
41690         (gimple_transaction_label): Likewise.
41691         (gimple_transaction_label_ptr): Likewise.
41692         (gimple_transaction_set_body): Likewise.
41693         (gimple_transaction_set_label): Likewise.
41695         * ipa-devirt.c (build_type_inheritance_graph): Likewise.
41696         * ipa-inline-analysis.c (inline_write_summary): Likewise.
41697         * ipa-ref.c (ipa_record_reference): Likewise.
41698         * ipa-reference.c (analyze_function): Likewise.
41699         (ipa_reference_write_optimization_summary): Likewise.
41700         * ipa.c (symtab_remove_unreachable_nodes): Likewise.
41701         (address_taken_from_non_vtable_p): Likewise.
41702         (comdat_can_be_unshared_p_1): Likewise.
41703         * lto-cgraph.c (lto_output_ref): Likewise.
41704         (add_references): Likewise.
41705         (compute_ltrans_boundary): Likewise.
41706         (output_symtab): Likewise.
41707         (input_ref): Likewise.
41708         (input_cgraph_1): Likewise.
41709         (output_cgraph_opt_summary): Likewise.
41710         * lto-streamer-out.c (lto_output): Likewise.
41711         (output_symbol_p): Likewise.
41712         * lto-streamer.h (lsei_next_function_in_partition): Likewise.
41713         (lsei_start_function_in_partition): Likewise.
41714         (lsei_next_variable_in_partition): Likewise.
41715         (lsei_start_variable_in_partition): Likewise.
41716         * symtab.c (insert_to_assembler_name_hash): Likewise.
41717         (unlink_from_assembler_name_hash): Likewise.
41718         (symtab_unregister_node): Likewise.
41719         (symtab_remove_node): Likewise.
41720         (dump_symtab_node): Likewise.
41721         (verify_symtab_base): Likewise.
41722         (verify_symtab_node): Likewise.
41723         (symtab_make_decl_local): Likewise.
41724         (symtab_alias_ultimate_target): Likewise.
41725         (symtab_resolve_alias): Likewise.
41726         (symtab_get_symbol_partitioning_class): Likewise.
41727         * tree-phinodes.c (allocate_phi_node): Likewise.
41728         (reserve_phi_args_for_new_edge): Likewise.
41729         (remove_phi_args): Likewise.
41730         * varpool.c (varpool_node_for_asm): Likewise.
41731         (varpool_remove_unreferenced_decls): Likewise.
41733 2014-04-23  Jeff Law  <law@redhat.com>
41735         PR tree-optimization/60902
41736         * tree-ssa-threadedge.c
41737         (record_temporary_equivalences_from_stmts_at_dest): Make sure to
41738         invalidate outputs from statements that do not produce useful
41739         outputs for threading.
41741 2014-04-23  Venkataramanan Kumar  <venkataramanan.kumar@linaro.org>
41743         * config/aarch64/aarch64.md (stack_protect_set, stack_protect_test)
41744         (stack_protect_set_<mode>, stack_protect_test_<mode>): Add
41745         machine descriptions for Stack Smashing Protector.
41747 2014-04-23  Richard Earnshaw  <rearnsha@arm.com>
41749         * aarch64.md (<optab>_rol<mode>3): New pattern.
41750         (<optab>_rolsi3_uxtw): Likewise.
41751         * aarch64.c (aarch64_strip_shift): Handle ROTATE and ROTATERT.
41753 2014-04-23  James Greenhalgh  <james.greenhalgh@arm.com>
41755         * config/arm/arm.c (arm_cortex_a57_tune): Initialize all fields.
41756         (arm_cortex_a12_tune): Likewise.
41758 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41760         * config/aarch64/aarch64.c (aarch64_rtx_costs): Handle BSWAP.
41762 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41764         * config/arm/arm.md (arm_rev16si2): New pattern.
41765         (arm_rev16si2_alt): Likewise.
41766         * config/arm/arm.c (arm_new_rtx_costs): Handle rev16 case.
41768 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41770         * config/aarch64/aarch64.md (rev16<mode>2): New pattern.
41771         (rev16<mode>2_alt): Likewise.
41772         * config/aarch64/aarch64.c (aarch64_rtx_costs): Handle rev16 case.
41773         * config/arm/aarch-common.c (aarch_rev16_shright_mask_imm_p): New.
41774         (aarch_rev16_shleft_mask_imm_p): Likewise.
41775         (aarch_rev16_p_1): Likewise.
41776         (aarch_rev16_p): Likewise.
41777         * config/arm/aarch-common-protos.h (aarch_rev16_p): Declare extern.
41778         (aarch_rev16_shright_mask_imm_p): Likewise.
41779         (aarch_rev16_shleft_mask_imm_p): Likewise.
41781 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41783         * config/arm/aarch-common-protos.h (alu_cost_table): Add rev field.
41784         * config/arm/aarch-cost-tables.h (generic_extra_costs): Specify
41785         rev cost.
41786         (cortex_a53_extra_costs): Likewise.
41787         (cortex_a57_extra_costs): Likewise.
41788         * config/arm/arm.c (cortexa9_extra_costs): Likewise.
41789         (cortexa7_extra_costs): Likewise.
41790         (cortexa8_extra_costs): Likewise.
41791         (cortexa12_extra_costs): Likewise.
41792         (cortexa15_extra_costs): Likewise.
41793         (v7m_extra_costs): Likewise.
41794         (arm_new_rtx_costs): Handle BSWAP.
41796 2013-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41798         * config/arm/arm.c (cortexa8_extra_costs): New table.
41799         (arm_cortex_a8_tune): New tuning struct.
41800         * config/arm/arm-cores.def (cortex-a8): Use cortex_a8 tuning struct.
41802 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41804         * config/arm/arm.c (arm_new_rtx_costs): Handle FMA.
41806 2014-04-23  Richard Biener  <rguenther@suse.de>
41808         * Makefile.in (OBJS): Remove loop-unswitch.o.
41809         * tree-pass.h (make_pass_rtl_unswitch): Remove.
41810         * passes.def (pass_rtl_unswitch): Likewise.
41811         * loop-init.c (gate_rtl_unswitch): Likewise.
41812         (rtl_unswitch): Likewise.
41813         (pass_data_rtl_unswitch): Likewise.
41814         (pass_rtl_unswitch): Likewise.
41815         (make_pass_rtl_unswitch): Likewise.
41816         * rtl.h (reversed_condition): Likewise.
41817         (compare_and_jump_seq): Likewise.
41818         * loop-iv.c (reversed_condition): Move here from loop-unswitch.c
41819         and make static.
41820         * loop-unroll.c (compare_and_jump_seq): Likewise.
41822 2014-04-23  Richard Biener  <rguenther@suse.de>
41824         PR tree-optimization/60903
41825         * tree-ssa-loop-im.c (analyze_memory_references): Remove
41826         commented code block.
41827         (execute_sm_if_changed): Properly apply IRREDUCIBLE_LOOP
41828         loop flags to newly created BBs and edges.
41830 2014-04-23  Nick Clifton  <nickc@redhat.com>
41832         * config/msp430/msp430.c (msp430_handle_option): Move function
41833         to msp430-common.c
41834         (msp430_option_override): Simplify mcu and mcpu option handling.
41835         (msp430_is_f5_mcu): Rename to msp430_use_f5_series_hwmult.  Add
41836         support for -mhwmult command line option.
41837         (has_32bit_hwmult): Rename to use_32bit_hwmult.  Add support for
41838         -mhwmult command line option.
41839         (msp430_hwmult_enabled): Delete.
41840         (msp43o_output_labelref): Add support for -mhwmult command line option.
41841         * config/msp430/msp430.md (mulhisi3, umulhisi3, mulsidi3)
41842         (umulsidi3): Likewise.
41843         * config/msp430/msp430.opt (mmcu): Add Report attribute.
41844         (mcpu, mlarge, msmall): Likewise.
41845         (mhwmult): New option.
41846         * config/msp430/msp430-protos.h (msp430_hwmult_enabled): Remove
41847         prototype.
41848         (msp430_is_f5_mcu): Remove prototype.
41849         (msp430_use_f5_series_hwmult): Add prototype.
41850         * config/msp430/msp430-opts.h: New file.
41851         * common/config/msp430: New directory.
41852         * common/config/msp430/msp430-common.c: New file.
41853         * config.gcc (msp430): Remove target_has_targetm_common.
41854         * doc/invoke.texi: Document -mhwmult command line option.
41856 2014-04-23  Nick Clifton  <nickc@redhat.com>
41858         * config/i386/cygwin.h (ENDFILE_SPEC): Include
41859         default-manifest.o if it can be found in the search path.
41860         * config/i386/mingw32.h (ENDFILE_SPEC): Likewise.
41862 2014-04-23  Terry Guo  <terry.guo@arm.com>
41864         * config/arm/arm.h (ASM_APP_OFF): Re-define it in a cleaner way.
41866 2014-04-23  Richard Biener  <rguenther@suse.de>
41868         PR middle-end/60895
41869         * tree-inline.c (declare_return_variable): Use mark_addressable.
41871 2014-04-23  Richard Biener  <rguenther@suse.de>
41873         PR middle-end/60891
41874         * loop-init.c (loop_optimizer_init): Make sure to apply
41875         LOOPS_MAY_HAVE_MULTIPLE_LATCHES before fixing up loops.
41877 2014-04-22  Jakub Jelinek  <jakub@redhat.com>
41879         PR sanitizer/60275
41880         * common.opt (fsanitize-recover, fsanitize-undefined-trap-on-error):
41881         New options.
41882         * gcc.c (sanitize_spec_function): Don't return "" for "undefined"
41883         if flag_sanitize_undefined_trap_on_error.
41884         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_DIVREM_OVERFLOW_ABORT,
41885         BUILT_IN_UBSAN_HANDLE_SHIFT_OUT_OF_BOUNDS_ABORT,
41886         BUILT_IN_UBSAN_HANDLE_VLA_BOUND_NOT_POSITIVE_ABORT,
41887         BUILT_IN_UBSAN_HANDLE_TYPE_MISMATCH_ABORT,
41888         BUILT_IN_UBSAN_HANDLE_ADD_OVERFLOW_ABORT,
41889         BUILT_IN_UBSAN_HANDLE_SUB_OVERFLOW_ABORT,
41890         BUILT_IN_UBSAN_HANDLE_MUL_OVERFLOW_ABORT,
41891         BUILT_IN_UBSAN_HANDLE_NEGATE_OVERFLOW_ABORT,
41892         BUILT_IN_UBSAN_HANDLE_LOAD_INVALID_VALUE_ABORT): New builtins.
41893         * ubsan.c (ubsan_instrument_unreachable): Return
41894         __builtin_trap () if flag_sanitize_undefined_trap_on_error.
41895         (ubsan_expand_null_ifn): Emit __builtin_trap ()
41896         if flag_sanitize_undefined_trap_on_error and
41897         __ubsan_handle_type_mismatch_abort if !flag_sanitize_recover.
41898         (ubsan_expand_null_ifn, ubsan_build_overflow_builtin,
41899         instrument_bool_enum_load): Emit __builtin_trap () if
41900         flag_sanitize_undefined_trap_on_error and
41901         __builtin_handle_*_abort () if !flag_sanitize_recover.
41902         * doc/invoke.texi (-fsanitize-recover,
41903         -fsanitize-undefined-trap-on-error): Document.
41905 2014-04-22  Christian Bruel  <christian.bruel@st.com>
41907         * config/sh/sh.md (mov<mode>): Replace movQIHI.
41908         Force immediates to SImode.
41910 2014-04-22  Sandra Loosemore  <sandra@codesourcery.com>
41912         * config/nios2/nios2.md (UNSPEC_ROUND): New.
41913         (lroundsfsi2): New.
41914         * config/nios2/nios2.opt (mno-custom-round, mcustom-round=): New.
41915         * config/nios2/nios2-opts.h (N2FPU_ALL_CODES): Add round.
41916         * config/nios2/nios2.c (N2F_NO_ERRNO): Define.
41917         (nios2_fpu_insn): Add entry for round.
41918         (N2FPU_NO_ERRNO_P): Define.
41919         (nios2_custom_check_insns): Add check for N2F_NO_ERRNO and
41920         flag_errno_math.
41921         * doc/invoke.texi (Nios II Options): Document -mcustom-round.
41923 2014-04-22  Richard Henderson  <rth@redhat.com>
41925         * config/aarch64/aarch64 (addti3, subti3): New expanders.
41926         (add<GPI>3_compare0): Remove leading * from name.
41927         (add<GPI>3_carryin): Likewise.
41928         (sub<GPI>3_compare0): Likewise.
41929         (sub<GPI>3_carryin): Likewise.
41930         (<su_optab>mulditi3): New expander.
41931         (multi3): New expander.
41932         (madd<GPI>): Remove leading * from name.
41934 2014-04-22  Martin Jambor  <mjambor@suse.cz>
41936         * cgraphclones.c (cgraph_function_versioning): Copy
41937         ipa_transforms_to_apply instead of asserting it is empty.
41939 2014-04-22  H.J. Lu  <hongjiu.lu@intel.com>
41941         PR target/60868
41942         * config/i386/i386.c (ix86_expand_set_or_movmem): Call counter_mode
41943         on count_exp to get mode.
41945 2014-04-22  Andrew Pinski  <apinski@cavium.com>
41947         * config/aarch64/aarch64.c (aarch64_load_symref_appropriately):
41948         Handle TLS for ILP32.
41949         * config/aarch64/aarch64.md (tlsie_small): Rename to ...
41950         (tlsie_small_<mode>): this and handle PTR.
41951         (tlsie_small_sidi): New pattern.
41952         (tlsle_small): Change to an expand to handle ILP32.
41953         (tlsle_small_<mode>): New pattern.
41954         (tlsdesc_small): Rename to ...
41955         (tlsdesc_small_<mode>): this and handle PTR.
41957 2014-04-22  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
41959         * config/aarch64/aarch64.c (TARGET_FLAGS_REGNUM): Define.
41961 2014-04-22  Alex Velenko  <Alex.Velenko@arm.com>
41963         * config/aarch64/aarch64-builtins.c (TYPES_REINTERP): Removed.
41964         (aarch64_types_signed_unsigned_qualifiers): Qualifier added.
41965         (aarch64_types_signed_poly_qualifiers): Likewise.
41966         (aarch64_types_unsigned_signed_qualifiers): Likewise.
41967         (aarch64_types_poly_signed_qualifiers): Likewise.
41968         (TYPES_REINTERP_SS): Type macro added.
41969         (TYPES_REINTERP_SU): Likewise.
41970         (TYPES_REINTERP_SP): Likewise.
41971         (TYPES_REINTERP_US): Likewise.
41972         (TYPES_REINTERP_PS): Likewise.
41973         (aarch64_fold_builtin): New expression folding added.
41974         * config/aarch64/aarch64-simd-builtins.def (REINTERP):
41975         Declarations removed.
41976         (REINTERP_SS): Declarations added.
41977         (REINTERP_US): Likewise.
41978         (REINTERP_PS): Likewise.
41979         (REINTERP_SU): Likewise.
41980         (REINTERP_SP): Likewise.
41981         * config/aarch64/arm_neon.h (vreinterpret_p8_f64): Implemented.
41982         (vreinterpretq_p8_f64): Likewise.
41983         (vreinterpret_p16_f64): Likewise.
41984         (vreinterpretq_p16_f64): Likewise.
41985         (vreinterpret_f32_f64): Likewise.
41986         (vreinterpretq_f32_f64): Likewise.
41987         (vreinterpret_f64_f32): Likewise.
41988         (vreinterpret_f64_p8): Likewise.
41989         (vreinterpret_f64_p16): Likewise.
41990         (vreinterpret_f64_s8): Likewise.
41991         (vreinterpret_f64_s16): Likewise.
41992         (vreinterpret_f64_s32): Likewise.
41993         (vreinterpret_f64_s64): Likewise.
41994         (vreinterpret_f64_u8): Likewise.
41995         (vreinterpret_f64_u16): Likewise.
41996         (vreinterpret_f64_u32): Likewise.
41997         (vreinterpret_f64_u64): Likewise.
41998         (vreinterpretq_f64_f32): Likewise.
41999         (vreinterpretq_f64_p8): Likewise.
42000         (vreinterpretq_f64_p16): Likewise.
42001         (vreinterpretq_f64_s8): Likewise.
42002         (vreinterpretq_f64_s16): Likewise.
42003         (vreinterpretq_f64_s32): Likewise.
42004         (vreinterpretq_f64_s64): Likewise.
42005         (vreinterpretq_f64_u8): Likewise.
42006         (vreinterpretq_f64_u16): Likewise.
42007         (vreinterpretq_f64_u32): Likewise.
42008         (vreinterpretq_f64_u64): Likewise.
42009         (vreinterpret_s64_f64): Likewise.
42010         (vreinterpretq_s64_f64): Likewise.
42011         (vreinterpret_u64_f64): Likewise.
42012         (vreinterpretq_u64_f64): Likewise.
42013         (vreinterpret_s8_f64): Likewise.
42014         (vreinterpretq_s8_f64): Likewise.
42015         (vreinterpret_s16_f64): Likewise.
42016         (vreinterpretq_s16_f64): Likewise.
42017         (vreinterpret_s32_f64): Likewise.
42018         (vreinterpretq_s32_f64): Likewise.
42019         (vreinterpret_u8_f64): Likewise.
42020         (vreinterpretq_u8_f64): Likewise.
42021         (vreinterpret_u16_f64): Likewise.
42022         (vreinterpretq_u16_f64): Likewise.
42023         (vreinterpret_u32_f64): Likewise.
42024         (vreinterpretq_u32_f64): Likewise.
42026 2014-04-22  Alex Velenko  <Alex.Velenko@arm.com>
42028         * config/aarch64/aarch64/aarch64-builtins.c (TYPES_REINTERP): Removed.
42029         * config/aarch64/aarch64/aarch64-simd-builtins.def (REINTERP): Removed.
42030         (vreinterpret_p8_s8): Likewise.
42031         * config/aarch64/aarch64/arm_neon.h (vreinterpret_p8_s8): Uses cast.
42032         (vreinterpret_p8_s16): Likewise.
42033         (vreinterpret_p8_s32): Likewise.
42034         (vreinterpret_p8_s64): Likewise.
42035         (vreinterpret_p8_f32): Likewise.
42036         (vreinterpret_p8_u8): Likewise.
42037         (vreinterpret_p8_u16): Likewise.
42038         (vreinterpret_p8_u32): Likewise.
42039         (vreinterpret_p8_u64): Likewise.
42040         (vreinterpret_p8_p16): Likewise.
42041         (vreinterpretq_p8_s8): Likewise.
42042         (vreinterpretq_p8_s16): Likewise.
42043         (vreinterpretq_p8_s32): Likewise.
42044         (vreinterpretq_p8_s64): Likewise.
42045         (vreinterpretq_p8_f32): Likewise.
42046         (vreinterpretq_p8_u8): Likewise.
42047         (vreinterpretq_p8_u16): Likewise.
42048         (vreinterpretq_p8_u32): Likewise.
42049         (vreinterpretq_p8_u64): Likewise.
42050         (vreinterpretq_p8_p16): Likewise.
42051         (vreinterpret_p16_s8): Likewise.
42052         (vreinterpret_p16_s16): Likewise.
42053         (vreinterpret_p16_s32): Likewise.
42054         (vreinterpret_p16_s64): Likewise.
42055         (vreinterpret_p16_f32): Likewise.
42056         (vreinterpret_p16_u8): Likewise.
42057         (vreinterpret_p16_u16): Likewise.
42058         (vreinterpret_p16_u32): Likewise.
42059         (vreinterpret_p16_u64): Likewise.
42060         (vreinterpret_p16_p8): Likewise.
42061         (vreinterpretq_p16_s8): Likewise.
42062         (vreinterpretq_p16_s16): Likewise.
42063         (vreinterpretq_p16_s32): Likewise.
42064         (vreinterpretq_p16_s64): Likewise.
42065         (vreinterpretq_p16_f32): Likewise.
42066         (vreinterpretq_p16_u8): Likewise.
42067         (vreinterpretq_p16_u16): Likewise.
42068         (vreinterpretq_p16_u32): Likewise.
42069         (vreinterpretq_p16_u64): Likewise.
42070         (vreinterpretq_p16_p8): Likewise.
42071         (vreinterpret_f32_s8): Likewise.
42072         (vreinterpret_f32_s16): Likewise.
42073         (vreinterpret_f32_s32): Likewise.
42074         (vreinterpret_f32_s64): Likewise.
42075         (vreinterpret_f32_u8): Likewise.
42076         (vreinterpret_f32_u16): Likewise.
42077         (vreinterpret_f32_u32): Likewise.
42078         (vreinterpret_f32_u64): Likewise.
42079         (vreinterpret_f32_p8): Likewise.
42080         (vreinterpret_f32_p16): Likewise.
42081         (vreinterpretq_f32_s8): Likewise.
42082         (vreinterpretq_f32_s16): Likewise.
42083         (vreinterpretq_f32_s32): Likewise.
42084         (vreinterpretq_f32_s64): Likewise.
42085         (vreinterpretq_f32_u8): Likewise.
42086         (vreinterpretq_f32_u16): Likewise.
42087         (vreinterpretq_f32_u32): Likewise.
42088         (vreinterpretq_f32_u64): Likewise.
42089         (vreinterpretq_f32_p8): Likewise.
42090         (vreinterpretq_f32_p16): Likewise.
42091         (vreinterpret_s64_s8): Likewise.
42092         (vreinterpret_s64_s16): Likewise.
42093         (vreinterpret_s64_s32): Likewise.
42094         (vreinterpret_s64_f32): Likewise.
42095         (vreinterpret_s64_u8): Likewise.
42096         (vreinterpret_s64_u16): Likewise.
42097         (vreinterpret_s64_u32): Likewise.
42098         (vreinterpret_s64_u64): Likewise.
42099         (vreinterpret_s64_p8): Likewise.
42100         (vreinterpret_s64_p16): Likewise.
42101         (vreinterpretq_s64_s8): Likewise.
42102         (vreinterpretq_s64_s16): Likewise.
42103         (vreinterpretq_s64_s32): Likewise.
42104         (vreinterpretq_s64_f32): Likewise.
42105         (vreinterpretq_s64_u8): Likewise.
42106         (vreinterpretq_s64_u16): Likewise.
42107         (vreinterpretq_s64_u32): Likewise.
42108         (vreinterpretq_s64_u64): Likewise.
42109         (vreinterpretq_s64_p8): Likewise.
42110         (vreinterpretq_s64_p16): Likewise.
42111         (vreinterpret_u64_s8): Likewise.
42112         (vreinterpret_u64_s16): Likewise.
42113         (vreinterpret_u64_s32): Likewise.
42114         (vreinterpret_u64_s64): Likewise.
42115         (vreinterpret_u64_f32): Likewise.
42116         (vreinterpret_u64_u8): Likewise.
42117         (vreinterpret_u64_u16): Likewise.
42118         (vreinterpret_u64_u32): Likewise.
42119         (vreinterpret_u64_p8): Likewise.
42120         (vreinterpret_u64_p16): Likewise.
42121         (vreinterpretq_u64_s8): Likewise.
42122         (vreinterpretq_u64_s16): Likewise.
42123         (vreinterpretq_u64_s32): Likewise.
42124         (vreinterpretq_u64_s64): Likewise.
42125         (vreinterpretq_u64_f32): Likewise.
42126         (vreinterpretq_u64_u8): Likewise.
42127         (vreinterpretq_u64_u16): Likewise.
42128         (vreinterpretq_u64_u32): Likewise.
42129         (vreinterpretq_u64_p8): Likewise.
42130         (vreinterpretq_u64_p16): Likewise.
42131         (vreinterpret_s8_s16): Likewise.
42132         (vreinterpret_s8_s32): Likewise.
42133         (vreinterpret_s8_s64): Likewise.
42134         (vreinterpret_s8_f32): Likewise.
42135         (vreinterpret_s8_u8): Likewise.
42136         (vreinterpret_s8_u16): Likewise.
42137         (vreinterpret_s8_u32): Likewise.
42138         (vreinterpret_s8_u64): Likewise.
42139         (vreinterpret_s8_p8): Likewise.
42140         (vreinterpret_s8_p16): Likewise.
42141         (vreinterpretq_s8_s16): Likewise.
42142         (vreinterpretq_s8_s32): Likewise.
42143         (vreinterpretq_s8_s64): Likewise.
42144         (vreinterpretq_s8_f32): Likewise.
42145         (vreinterpretq_s8_u8): Likewise.
42146         (vreinterpretq_s8_u16): Likewise.
42147         (vreinterpretq_s8_u32): Likewise.
42148         (vreinterpretq_s8_u64): Likewise.
42149         (vreinterpretq_s8_p8): Likewise.
42150         (vreinterpretq_s8_p16): Likewise.
42151         (vreinterpret_s16_s8): Likewise.
42152         (vreinterpret_s16_s32): Likewise.
42153         (vreinterpret_s16_s64): Likewise.
42154         (vreinterpret_s16_f32): Likewise.
42155         (vreinterpret_s16_u8): Likewise.
42156         (vreinterpret_s16_u16): Likewise.
42157         (vreinterpret_s16_u32): Likewise.
42158         (vreinterpret_s16_u64): Likewise.
42159         (vreinterpret_s16_p8): Likewise.
42160         (vreinterpret_s16_p16): Likewise.
42161         (vreinterpretq_s16_s8): Likewise.
42162         (vreinterpretq_s16_s32): Likewise.
42163         (vreinterpretq_s16_s64): Likewise.
42164         (vreinterpretq_s16_f32): Likewise.
42165         (vreinterpretq_s16_u8): Likewise.
42166         (vreinterpretq_s16_u16): Likewise.
42167         (vreinterpretq_s16_u32): Likewise.
42168         (vreinterpretq_s16_u64): Likewise.
42169         (vreinterpretq_s16_p8): Likewise.
42170         (vreinterpretq_s16_p16): Likewise.
42171         (vreinterpret_s32_s8): Likewise.
42172         (vreinterpret_s32_s16): Likewise.
42173         (vreinterpret_s32_s64): Likewise.
42174         (vreinterpret_s32_f32): Likewise.
42175         (vreinterpret_s32_u8): Likewise.
42176         (vreinterpret_s32_u16): Likewise.
42177         (vreinterpret_s32_u32): Likewise.
42178         (vreinterpret_s32_u64): Likewise.
42179         (vreinterpret_s32_p8): Likewise.
42180         (vreinterpret_s32_p16): Likewise.
42181         (vreinterpretq_s32_s8): Likewise.
42182         (vreinterpretq_s32_s16): Likewise.
42183         (vreinterpretq_s32_s64): Likewise.
42184         (vreinterpretq_s32_f32): Likewise.
42185         (vreinterpretq_s32_u8): Likewise.
42186         (vreinterpretq_s32_u16): Likewise.
42187         (vreinterpretq_s32_u32): Likewise.
42188         (vreinterpretq_s32_u64): Likewise.
42189         (vreinterpretq_s32_p8): Likewise.
42190         (vreinterpretq_s32_p16): Likewise.
42191         (vreinterpret_u8_s8): Likewise.
42192         (vreinterpret_u8_s16): Likewise.
42193         (vreinterpret_u8_s32): Likewise.
42194         (vreinterpret_u8_s64): Likewise.
42195         (vreinterpret_u8_f32): Likewise.
42196         (vreinterpret_u8_u16): Likewise.
42197         (vreinterpret_u8_u32): Likewise.
42198         (vreinterpret_u8_u64): Likewise.
42199         (vreinterpret_u8_p8): Likewise.
42200         (vreinterpret_u8_p16): Likewise.
42201         (vreinterpretq_u8_s8): Likewise.
42202         (vreinterpretq_u8_s16): Likewise.
42203         (vreinterpretq_u8_s32): Likewise.
42204         (vreinterpretq_u8_s64): Likewise.
42205         (vreinterpretq_u8_f32): Likewise.
42206         (vreinterpretq_u8_u16): Likewise.
42207         (vreinterpretq_u8_u32): Likewise.
42208         (vreinterpretq_u8_u64): Likewise.
42209         (vreinterpretq_u8_p8): Likewise.
42210         (vreinterpretq_u8_p16): Likewise.
42211         (vreinterpret_u16_s8): Likewise.
42212         (vreinterpret_u16_s16): Likewise.
42213         (vreinterpret_u16_s32): Likewise.
42214         (vreinterpret_u16_s64): Likewise.
42215         (vreinterpret_u16_f32): Likewise.
42216         (vreinterpret_u16_u8): Likewise.
42217         (vreinterpret_u16_u32): Likewise.
42218         (vreinterpret_u16_u64): Likewise.
42219         (vreinterpret_u16_p8): Likewise.
42220         (vreinterpret_u16_p16): Likewise.
42221         (vreinterpretq_u16_s8): Likewise.
42222         (vreinterpretq_u16_s16): Likewise.
42223         (vreinterpretq_u16_s32): Likewise.
42224         (vreinterpretq_u16_s64): Likewise.
42225         (vreinterpretq_u16_f32): Likewise.
42226         (vreinterpretq_u16_u8): Likewise.
42227         (vreinterpretq_u16_u32): Likewise.
42228         (vreinterpretq_u16_u64): Likewise.
42229         (vreinterpretq_u16_p8): Likewise.
42230         (vreinterpretq_u16_p16): Likewise.
42231         (vreinterpret_u32_s8): Likewise.
42232         (vreinterpret_u32_s16): Likewise.
42233         (vreinterpret_u32_s32): Likewise.
42234         (vreinterpret_u32_s64): Likewise.
42235         (vreinterpret_u32_f32): Likewise.
42236         (vreinterpret_u32_u8): Likewise.
42237         (vreinterpret_u32_u16): Likewise.
42238         (vreinterpret_u32_u64): Likewise.
42239         (vreinterpret_u32_p8): Likewise.
42240         (vreinterpret_u32_p16): Likewise.
42241         (vreinterpretq_u32_s8): Likewise.
42242         (vreinterpretq_u32_s16): Likewise.
42243         (vreinterpretq_u32_s32): Likewise.
42244         (vreinterpretq_u32_s64): Likewise.
42245         (vreinterpretq_u32_f32): Likewise.
42246         (vreinterpretq_u32_u8): Likewise.
42247         (vreinterpretq_u32_u16): Likewise.
42248         (vreinterpretq_u32_u64): Likewise.
42249         (vreinterpretq_u32_p8): Likewise.
42250         (vreinterpretq_u32_p16): Likewise.
42252 2014-04-22  Alex Velenko  <Alex.Velenko@arm.com>
42254         * gcc/config/aarch64/aarch64-simd.md (aarch64_s<optab><mode>):
42255         Pattern extended.
42256         * config/aarch64/aarch64-simd-builtins.def (sqneg): Iterator extended.
42257         (sqabs): Likewise.
42258         * config/aarch64/arm_neon.h (vqneg_s64): New intrinsic.
42259         (vqnegd_s64): Likewise.
42260         (vqabs_s64): Likewise.
42261         (vqabsd_s64): Likewise.
42263 2014-04-22  Richard Henderson  <rth@redhat.com>
42265         * config/sparc/sparc.c (sparc_init_modes): Hoist GET_MODE_SIZE
42266         computation to the top of the loop.
42268 2014-04-22  Renlin  <renlin.li@arm.com>
42269             Jiong Wang  <jiong.wang@arm.com>
42271         * config/aarch64/aarch64.h (aarch64_frame): Delete "fp_lr_offset".
42272         * config/aarch64/aarch64.c (aarch64_layout_frame)
42273         (aarch64_initial_elimination_offset): Likewise.
42275 2014-04-22  Marcus Shawcroft  <marcus.shawcroft@arm.com>
42277         * config/aarch64/aarch64.c (aarch64_initial_elimination_offset):
42278         Fix indentation.
42280 2014-04-22  Richard Sandiford  <rdsandiford@googlemail.com>
42282         * machmode.h (bitwise_mode_for_mode): Declare.
42283         * stor-layout.h (bitwise_type_for_mode): Likewise.
42284         * stor-layout.c (bitwise_mode_for_mode): New function.
42285         (bitwise_type_for_mode): Likewise.
42286         * builtins.c (fold_builtin_memory_op): Use it instead of
42287         int_mode_for_mode and build_nonstandard_integer_type.
42289 2014-04-22  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
42291         * config.gcc (enable_obsolete): Remove *-*-solaris2.9*.
42292         (*-*-solaris2.[0-9] | *-*-solaris2.[0-9].*): Mark unsupported.
42293         (*-*-solaris2*): Simplify.
42294         (i[34567]86-*-solaris2* | x86_64-*-solaris2.1[0-9]*): Likewise.
42295         (i[34567]86-*-solaris2* | x86_64-*-solaris2.1[0-9]*): Remove
42296         *-*-solaris2.9* handling.
42298         * configure.ac (gcc_cv_as_hidden): Remove test for Solaris 9/x86
42299         as bug.
42300         (gcc_cv_ld_hidden): Remove *-*-solaris2.9* handling.
42301         (ld_tls_support): Remove i?86-*-solaris2.9, sparc*-*-solaris2.9
42302         handling, simplify.
42303         (gcc_cv_as_gstabs_flag): Remove workaround for Solaris 9/x86 as bug.
42304         * configure: Regenerate.
42306         * config/i386/sol2-9.h: Remove.
42308         * doc/install.texi (Specific, i?86-*-solaris2.9): Remove.
42309         (Specific, *-*-solaris2*): Mention Solaris 9 support removal.
42310         Remove Solaris 9 references.
42312 2014-04-22  Vidya Praveen  <vidyapraveen@arm.com>
42314         * aarch64.md (float<GPI:mode><GPF:mode>2): Remove.
42315         (floatuns<GPI:mode><GPF:mode>2): Remove.
42316         (<optab><fcvt_target><GPF:mode>2): New pattern for equal width float
42317         and floatuns conversions.
42318         (<optab><fcvt_iesize><GPF:mode>2): New pattern for inequal width float
42319         and floatuns conversions.
42320         * iterators.md (fcvt_target, FCVT_TARGET): Support SF and DF modes.
42321         (w1,w2): New mode attributes for inequal width conversions.
42323 2014-04-22  Renlin Li  <Renlin.Li@arm.com>
42325         * config/aarch64/aarch64.c (aarch64_print_operand_address): Adjust
42326         the output asm format.
42328 2014-04-22  James Greenhalgh  <james.greenhalgh@arm.com>
42330         * config/aarch64/aarch64-simd.md
42331         (aarch64_cm<optab>di): Always split.
42332         (*aarch64_cm<optab>di): New.
42333         (aarch64_cmtstdi): Always split.
42334         (*aarch64_cmtstdi): New.
42336 2014-04-22  Jakub Jelinek  <jakub@redhat.com>
42338         PR tree-optimization/60823
42339         * omp-low.c (ipa_simd_modify_function_body): Go through
42340         all SSA_NAMEs and for those refering to vector arguments
42341         which are going to be replaced adjust SSA_NAME_VAR and,
42342         if it is a default definition, change it into a non-default
42343         definition assigned at the beginning of function from new_decl.
42344         (ipa_simd_modify_stmt_ops): Rewritten.
42345         * tree-dfa.c (set_ssa_default_def): When removing default def,
42346         check for NULL loc instead of NULL *loc.
42348 2014-04-22  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
42350         * config/arm/arm.c (arm_hard_regno_mode_ok): Loosen
42351         restrictions on core registers for DImode values in Thumb2.
42353 2014-04-22  Ian Bolton  <ian.bolton@arm.com>
42355         * config/arm/arm.md (*anddi_notdi_zesidi): New pattern.
42356         * config/arm/thumb2.md (*iordi_notdi_zesidi): New pattern.
42358 2014-04-22  Ian Bolton  <ian.bolton@arm.com>
42360         * config/arm/thumb2.md (*iordi_notdi_di): New pattern.
42361         (*iordi_notzesidi_di): Likewise.
42362         (*iordi_notsesidi_di): Likewise.
42364 2014-04-22  Ian Bolton  <ian.bolton@arm.com>
42366         * config/arm/arm-protos.h (tune_params): New struct members.
42367         * config/arm/arm.c: Initialise tune_params per processor.
42368         (thumb2_reorg): Suppress conversion from t32 to t16 when optimizing
42369         for speed, based on new tune_params.
42371 2014-04-22  Alex Velenko  <Alex.Velenko@arm.com>
42373         * config/aarch64/aarch64-builtins.c (BUILTIN_VDQF_DF): Macro added.
42374         * config/aarch64/aarch64-simd-builtins.def (frintn): Use added macro.
42375         * config/aarch64/aarch64-simd.md (<frint_pattern>): Comment corrected.
42376         * config/aarch64/aarch64.md (<frint_pattern>): Likewise.
42377         * config/aarch64/arm_neon.h (vrnd_f64): Added.
42378         (vrnda_f64): Likewise.
42379         (vrndi_f64): Likewise.
42380         (vrndm_f64): Likewise.
42381         (vrndn_f64): Likewise.
42382         (vrndp_f64): Likewise.
42383         (vrndx_f64): Likewise.
42385 2014-04-22  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
42387         * config/arm/arm.c (arm_print_operand, thumb_exit): Make sure
42388         GET_MODE_SIZE argument is enum machine_mode.
42390 2014-04-22  Jakub Jelinek  <jakub@redhat.com>
42392         PR target/60910
42393         * config/sparc/sparc.c (sparc_init_modes): Pass enum machine_mode
42394         value instead of int to GET_MODE_CLASS and GET_MODE_SIZE macros.
42396 2014-04-22  Lin Zuojian  <manjian2006@gmail.com>
42398         PR middle-end/60281
42399         * asan.c (asan_emit_stack_protection): Force the base to align to
42400         appropriate bits if STRICT_ALIGNMENT.  Set shadow_mem align to
42401         appropriate bits if STRICT_ALIGNMENT.
42402         * cfgexpand.c (expand_stack_vars): Set base_align appropriately
42403         when asan is on.
42404         (expand_used_vars): Leave a space in the stack frame for alignment
42405         if STRICT_ALIGNMENT.
42407 2014-04-21  David Malcolm  <dmalcolm@redhat.com>
42409         * gimple.h (gimple_assign_single_p): Accept a const_gimple rather
42410         than a gimple.
42411         (gimple_store_p): Likewise.
42412         (gimple_assign_load_p): Likewise.
42413         (gimple_assign_cast_p): Likewise.
42414         (gimple_clobber_p): Likewise.
42416         * doc/gimple.texi (gimple_assign_cast_p): Accept a const_gimple
42417         rather than a gimple.
42418         (gimple_assign_cast_p): Likewise.
42420 2014-04-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
42422         PR target/60735
42423         * config/rs6000/rs6000.md (mov<mode>_softfloat32, FMOVE64 case):
42424         If mode is DDmode and TARGET_E500_DOUBLE allow move.
42426         * config/rs6000/rs6000.c (rs6000_debug_reg_global): Print some
42427         more debug information for E500 if -mdebug=reg.
42429 2014-04-21  Uros Bizjak  <ubizjak@gmail.com>
42431         PR target/60909
42432         * config/i386/i386.c (ix86_expand_builtin)
42433         <case IX86_BUILTIN_RDRAND{16,32,64}_STEP>: Use temporary
42434         register for target RTX.
42435         <case IX86_BUILTIN_RDSEED{16,32,64}_STEP>: Ditto.
42437 2014-04-18  Cong Hou  <congh@google.com>
42439         * tree-vect-patterns.c (vect_recog_widen_mult_pattern): Enhance
42440         the widen-mult pattern by handling two operands with different sizes,
42441         and operands whose size is smaller than half of the result type.
42443 2014-04-18  Jan Hubicka  <hubicka@ucw.cz>
42445         * ipa-inline.h (INLINE_HINT_known_hot): New hint.
42446         * ipa-inline-analysis.c (dump_inline_hints): Dump it.
42447         (do_estimate_edge_time): Compute it.
42448         * ipa-inline.c (want_inline_small_function_p): Bypass
42449         INLINE_INSNS_AUTO/SINGLE limits for calls that are known to be hot.
42451 2014-04-18  Jan Hubicka  <hubicka@ucw.cz>
42453         * ipa-inline.c (spec_rem): New static variable.
42454         (dump_overall_stats): New function.
42455         (dump_inline_stats): New function.
42457 2014-04-18  Richard Henderson  <rth@redhat.com>
42459         * config/aarch64/aarch64.c (aarch64_register_move_cost): Pass a mode
42460         to GET_MODE_SIZE, not a reg_class_t.
42462 2014-04-18  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
42464         * config/rs6000/vsx.md (vsx_xxmrghw_<mode>): Adjust for little-endian.
42465         (vsx_xxmrglw_<mode>): Likewise.
42467 2014-04-17  Michael Meissner  <meissner@linux.vnet.ibm.com>
42469         PR target/60876
42470         * config/rs6000/rs6000.c (rs6000_setup_reg_addr_masks): Make sure
42471         GET_MODE_SIZE gets passed an enum machine_mode type and not integer.
42472         (rs6000_init_hard_regno_mode_ok): Likewise.
42474 2014-04-17  Jan Hubicka  <hubicka@ucw.cz>
42476         * ipa-inline.c (inline_small_functions): Account only non-cold
42477         functions.
42478         * doc/invoke.texi (inline-unit-growth): Update documentation.
42480 2014-04-17  Pat Haugen  <pthaugen@us.ibm.com>
42482         * config/rs6000/rs6000.md (addti3, subti3): New.
42484 2014-04-17  H.J. Lu  <hongjiu.lu@intel.com>
42486         PR target/60863
42487         * config/i386/i386.c (ix86_expand_clear): Remove outdated
42488         comment.  Check optimize_insn_for_size_p instead of
42489         optimize_insn_for_speed_p.
42491 2014-04-17  Martin Jambor  <mjambor@suse.cz>
42493         * gimple-iterator.c (gsi_start_edge): New function.
42494         * gimple-iterator.h (gsi_start_edge): Declare.
42495         * tree-sra.c (single_non_eh_succ): New function.
42496         (disqualify_ops_if_throwing_stmt): Renamed to
42497         disqualify_if_bad_bb_terminating_stmt.  Allow throwing statements
42498         having one non-EH successor BB.
42499         (sra_modify_expr): If stmt ends bb, use single non-EH successor to
42500         generate loads into replacements.
42501         (sra_modify_assign): Likewise and and also use the simple path for
42502         such statements.
42503         (sra_modify_function_body): Commit statements on edges.
42505 2014-04-17  Richard Biener  <rguenther@suse.de>
42507         PR middle-end/60849
42508         * tree-ssa-propagate.c (valid_gimple_rhs_p): Allow vector
42509         comparison results and add clarifying comment.
42511 2014-04-17  Jakub Jelinek  <jakub@redhat.com>
42513         * genmodes.c (struct mode_data): Add need_bytesize_adj field.
42514         (blank_mode): Initialize it.
42515         (emit_mode_size_inline, emit_mode_nunits_inline,
42516         emit_mode_inner_inline): New functions.
42517         (emit_insn_modes_h): Call them and surround their output with
42518         #if GCC_VERSION >= 4001 ... #endif.
42519         * machmode.h (GET_MODE_SIZE, GET_MODE_NUNITS, GET_MODE_INNER):
42520         For GCC_VERSION >= 4001 use mode_*_inline routines instead of
42521         mode_* arrays if the argument is __builtin_constant_p.
42522         * lower-subreg.c (dump_choices): Make sure GET_MODE_SIZE argument
42523         is enum machine_mode.
42525 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42527         * passes.c (opt_pass::execute): Adjust.
42528         (pass_manager::execute_pass_mode_switching): Likewise.
42529         (early_local_passes::execute): Likewise.
42530         (execute_one_pass): Pass cfun to the pass's execute method.
42531         * tree-pass.h (opt_pass::execute): Add function * argument.
42532         * asan.c, auto-inc-dec.c, bb-reorder.c, bt-load.c, cfgcleanup.c,
42533         cfgexpand.c, cfgrtl.c, cgraphbuild.c, combine-stack-adj.c, combine.c,
42534         compare-elim.c, config/arc/arc.c, config/epiphany/mode-switch-use.c,
42535         config/epiphany/resolve-sw-modes.c, config/i386/i386.c,
42536         config/mips/mips.c, config/rl78/rl78.c, config/s390/s390.c,
42537         config/sparc/sparc.c, cprop.c, dce.c, df-core.c, dse.c, dwarf2cfi.c,
42538         except.c, final.c, function.c, fwprop.c, gcse.c, gimple-low.c,
42539         gimple-ssa-isolate-paths.c, gimple-ssa-strength-reduction.c,
42540         graphite.c, ifcvt.c, init-regs.c, ipa-cp.c, ipa-devirt.c,
42541         ipa-inline-analysis.c, ipa-inline.c, ipa-profile.c, ipa-pure-const.c,
42542         ipa-reference.c, ipa-split.c, ipa.c, ira.c, jump.c, loop-init.c,
42543         lower-subreg.c, mode-switching.c, omp-low.c, postreload-gcse.c,
42544         postreload.c, predict.c, recog.c, ree.c, reg-stack.c, regcprop.c,
42545         reginfo.c, regrename.c, reorg.c, sched-rgn.c, stack-ptr-mod.c,
42546         store-motion.c, tracer.c, trans-mem.c, tree-call-cdce.c, tree-cfg.c,
42547         tree-cfgcleanup.c, tree-complex.c, tree-eh.c, tree-emutls.c,
42548         tree-if-conv.c, tree-into-ssa.c, tree-loop-distribution.c, tree-nrv.c,
42549         tree-object-size.c, tree-parloops.c, tree-predcom.c, tree-ssa-ccp.c,
42550         tree-ssa-copy.c, tree-ssa-copyrename.c, tree-ssa-dce.c,
42551         tree-ssa-dom.c, tree-ssa-dse.c, tree-ssa-forwprop.c,
42552         tree-ssa-ifcombine.c, tree-ssa-loop-ch.c, tree-ssa-loop-im.c,
42553         tree-ssa-loop-ivcanon.c, tree-ssa-loop-prefetch.c,
42554         tree-ssa-loop-unswitch.c, tree-ssa-loop.c, tree-ssa-math-opts.c,
42555         tree-ssa-phiopt.c, tree-ssa-phiprop.c, tree-ssa-pre.c,
42556         tree-ssa-reassoc.c, tree-ssa-sink.c, tree-ssa-strlen.c,
42557         tree-ssa-structalias.c, tree-ssa-uncprop.c, tree-ssa-uninit.c,
42558         tree-ssa.c, tree-ssanames.c, tree-stdarg.c, tree-switch-conversion.c,
42559         tree-tailcall.c, tree-vect-generic.c, tree-vectorizer.c, tree-vrp.c,
42560         tree.c, tsan.c, ubsan.c, var-tracking.c, vtable-verify.c, web.c:
42561         Adjust.
42563 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42565         * passes.c (opt_pass::gate): Take function * argument.
42566         (gate_all_early_local_passes): Merge into
42567         (early_local_passes::gate): this.
42568         (gate_all_early_optimizations): Merge into
42569         (all_early_optimizations::gate): this.
42570         (gate_all_optimizations): Mege into
42571         (all_optimizations::gate): this.
42572         (gate_all_optimizations_g): Merge into
42573         (all_optimizations_g::gate): this.
42574         (gate_rest_of_compilation): Mege into
42575         (rest_of_compilation::gate): this.
42576         (gate_postreload): Merge into
42577         (postreload::gate): this.
42578         (dump_one_pass): Pass cfun to the pass's gate method.
42579         (execute_ipa_summary_passes): Likewise.
42580         (execute_one_pass): Likewise.
42581         (ipa_write_summaries_2): Likewise.
42582         (ipa_write_optimization_summaries_1): Likewise.
42583         (ipa_read_summaries_1): Likewise.
42584         (ipa_read_optimization_summaries_1): Likewise.
42585         (execute_ipa_stmt_fixups): Likewise.
42586         * tree-pass.h (opt_pass::gate): Add function * argument.
42587         * asan.c, auto-inc-dec.c, bb-reorder.c, bt-load.c,
42588         combine-stack-adj.c, combine.c, compare-elim.c,
42589         config/epiphany/resolve-sw-modes.c, config/i386/i386.c,
42590         config/rl78/rl78.c, config/sh/sh_optimize_sett_clrt.cc,
42591         config/sh/sh_treg_combine.cc, config/sparc/sparc.c, cprop.c, cse.c,
42592         dce.c, df-core.c, dse.c, dwarf2cfi.c, except.c,  fwprop.c, gcse.c,
42593         gimple-ssa-isolate-paths.c, gimple-ssa-strength-reduction.c,
42594         graphite.c, ifcvt.c, init-regs.c, ipa-cp.c, ipa-devirt.c,
42595         ipa-profile.c, ipa-pure-const.c, ipa-reference.c, ipa-split.c, ipa.c,
42596         loop-init.c, lower-subreg.c, mode-switching.c, modulo-sched.c,
42597         omp-low.c, postreload-gcse.c, postreload.c, predict.c, recog.c, ree.c,
42598         reg-stack.c, regcprop.c, regrename.c, reorg.c, sched-rgn.c,
42599         store-motion.c, tracer.c, trans-mem.c, tree-call-cdce.c, tree-cfg.c,
42600         tree-cfgcleanup.c, tree-complex.c, tree-eh.c, tree-emutls.c,
42601         tree-if-conv.c, tree-into-ssa.c, tree-loop-distribution.c,
42602         tree-nrv.c, tree-parloops.c, tree-predcom.c, tree-profile.c,
42603         tree-sra.c, tree-ssa-ccp.c, tree-ssa-copy.c, tree-ssa-copyrename.c,
42604         tree-ssa-dce.c, tree-ssa-dom.c, tree-ssa-dse.c, tree-ssa-forwprop.c,
42605         tree-ssa-ifcombine.c, tree-ssa-loop-ch.c, tree-ssa-loop-im.c,
42606         tree-ssa-loop-ivcanon.c, tree-ssa-loop-prefetch.c,
42607         tree-ssa-loop-unswitch.c, tree-ssa-loop.c, tree-ssa-math-opts.c,
42608         tree-ssa-phiopt.c, tree-ssa-phiprop.c, tree-ssa-pre.c,
42609         tree-ssa-reassoc.c, tree-ssa-sink.c, tree-ssa-strlen.c,
42610         tree-ssa-structalias.c, tree-ssa-uncprop.c, tree-ssa-uninit.c,
42611         tree-ssa.c, tree-stdarg.c, tree-switch-conversion.c, tree-tailcall.c,
42612         tree-vect-generic.c, tree-vectorizer.c, tree-vrp.c, tsan.c, ubsan.c,
42613         var-tracking.c, vtable-verify.c, web.c: Adjust.
42615 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42617         * configure.ac: Check for -Woverloaded-virtual and enable it if found.
42618         * configure: Regenerate.
42620 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42622         * passes.c (dump_one_pass): don't check pass->has_gate.
42623         (execute_ipa_summary_passes): Likewise.
42624         (execute_one_pass): Likewise.
42625         (ipa_write_summaries_2): Likewise.
42626         (ipa_write_optimization_summaries_1): Likewise.
42627         (ipa_read_optimization_summaries_1): Likewise.
42628         (execute_ipa_stmt_fixups): Likewise.
42629         * tree-pass.h (pass_data::has_gate): Remove.
42630         * asan.c, auto-inc-dec.c, bb-reorder.c, bt-load.c, cfgcleanup.c,
42631         cfgexpand.c, cfgrtl.c, cgraphbuild.c, combine-stack-adj.c, combine.c,
42632         compare-elim.c, config/arc/arc.c, config/epiphany/mode-switch-use.c,
42633         config/epiphany/resolve-sw-modes.c, config/i386/i386.c,
42634         config/mips/mips.c, config/rl78/rl78.c, config/s390/s390.c,
42635         config/sh/sh_optimize_sett_clrt.cc, config/sh/sh_treg_combine.cc,
42636         config/sparc/sparc.c, cprop.c, cse.c, dce.c, df-core.c, dse.c,
42637         dwarf2cfi.c, except.c, final.c, function.c, fwprop.c, gcse.c,
42638         gimple-low.c, gimple-ssa-isolate-paths.c,
42639         gimple-ssa-strength-reduction.c, graphite.c, ifcvt.c, init-regs.c,
42640         ipa-cp.c, ipa-devirt.c, ipa-inline-analysis.c, ipa-inline.c,
42641         ipa-profile.c, ipa-pure-const.c, ipa-reference.c, ipa-split.c, ipa.c,
42642         ira.c, jump.c, loop-init.c, lower-subreg.c, mode-switching.c,
42643         modulo-sched.c, omp-low.c, postreload-gcse.c, postreload.c, predict.c,
42644         recog.c, ree.c, reg-stack.c, regcprop.c, reginfo.c, regrename.c,
42645         reorg.c, sched-rgn.c, stack-ptr-mod.c, store-motion.c, tracer.c,
42646         trans-mem.c, tree-call-cdce.c, tree-cfg.c, tree-cfgcleanup.c,
42647         tree-complex.c, tree-eh.c, tree-emutls.c, tree-if-conv.c,
42648         tree-into-ssa.c, tree-loop-distribution.c, tree-nrv.c,
42649         tree-object-size.c, tree-parloops.c, tree-predcom.c, tree-profile.c,
42650         tree-sra.c, tree-ssa-ccp.c, tree-ssa-copy.c, tree-ssa-copyrename.c,
42651         tree-ssa-dce.c, tree-ssa-dom.c, tree-ssa-dse.c, tree-ssa-forwprop.c,
42652         tree-ssa-ifcombine.c, tree-ssa-loop-ch.c, tree-ssa-loop-im.c,
42653         tree-ssa-loop-ivcanon.c, tree-ssa-loop-prefetch.c,
42654         tree-ssa-loop-unswitch.c, tree-ssa-loop.c, tree-ssa-math-opts.c,
42655         tree-ssa-phiopt.c, tree-ssa-phiprop.c, tree-ssa-pre.c,
42656         tree-ssa-reassoc.c, tree-ssa-sink.c, tree-ssa-strlen.c,
42657         tree-ssa-structalias.c, tree-ssa-uncprop.c, tree-ssa-uninit.c,
42658         tree-ssa.c, tree-ssanames.c, tree-stdarg.c, tree-switch-conversion.c,
42659         tree-tailcall.c, tree-vect-generic.c, tree-vectorizer.c, tree-vrp.c,
42660         tree.c, tsan.c, ubsan.c, var-tracking.c, vtable-verify.c, web.c:
42661         Adjust.
42663 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42665         * pass_manager.h (pass_manager::register_dump_files_1): Remove
42666         declaration.
42667         * passes.c (pass_manager::register_dump_files_1): Merge into
42668         (pass_manager::register_dump_files): this, and remove its handling of
42669         properties since the pass always has the properties anyway.
42670         (pass_manager::pass_manager): Adjust.
42672 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42674         * pass_manager.h (pass_manager::register_dump_files_1): Adjust.
42675         * passes.c (pass_manager::register_dump_files_1): Remove dead code
42676         dealing with properties.
42677         (pass_manager::register_dump_files): Adjust.
42679 2014-03-20  Mark Wielaard  <mjw@redhat.com>
42681         * dwarf2out.c (add_bound_info): If HOST_WIDE_INT is big enough,
42682         then represent the bound as normal constant value.
42684 2014-04-17  Jakub Jelinek  <jakub@redhat.com>
42686         PR target/60847
42687         Forward port from 4.8 branch
42688         2013-07-19  Kirill Yukhin  <kirill.yukhin@intel.com>
42690         * config/i386/bmiintrin.h (_blsi_u32): New.
42691         (_blsi_u64): Ditto.
42692         (_blsr_u32): Ditto.
42693         (_blsr_u64): Ditto.
42694         (_blsmsk_u32): Ditto.
42695         (_blsmsk_u64): Ditto.
42696         (_tzcnt_u32): Ditto.
42697         (_tzcnt_u64): Ditto.
42699 2014-04-17  Kito Cheng  <kito@0xlab.org>
42701         * gcc.c (used_arg): Prevent out of bound access for multilib_options.
42703 2014-04-17  Richard Biener  <rguenther@suse.de>
42705         PR middle-end/60849
42706         * tree-ssa-propagate.c (valid_gimple_rhs_p): Only allow effective
42707         boolean results for comparisons.
42709 2014-04-17  Richard Biener  <rguenther@suse.de>
42711         PR tree-optimization/60836
42712         * tree-vect-loop.c (vect_create_epilog_for_reduction): Force
42713         initial PHI args to be gimple values.
42715 2014-04-17  Richard Biener  <rguenther@suse.de>
42717         PR tree-optimization/60841
42718         * tree-vect-data-refs.c (vect_analyze_data_refs): Count stmts.
42719         * tree-vect-loop.c (vect_analyze_loop_2): Pass down number
42720         of stmts to SLP build.
42721         * tree-vect-slp.c (vect_slp_analyze_bb_1): Likewise.
42722         (vect_analyze_slp): Likewise.
42723         (vect_analyze_slp_instance): Likewise.
42724         (vect_build_slp_tree): Limit overall SLP tree growth.
42725         * tree-vectorizer.h (vect_analyze_data_refs,
42726         vect_analyze_slp): Adjust prototypes.
42728 2014-04-17  Evgeny Stupachenko  <evstupac@gmail.com>
42730         * config/i386/i386.c (x86_add_stmt_cost): Fix vector cost model for
42731         Silvermont.
42733 2014-04-17  Evgeny Stupachenko  <evstupac@gmail.com>
42735         * config/i386/x86-tune.def (TARGET_SLOW_PSHUFB): New tune definition.
42736         * config/i386/i386.h (TARGET_SLOW_PSHUFB): New tune flag.
42737         * config/i386/i386.c (expand_vec_perm_even_odd_1): Avoid byte shuffles
42738         for TARGET_SLOW_PSHUFB
42740 2014-04-17  Evgeny Stupachenko  <evstupac@gmail.com>
42742         * config/i386/i386.c (slm_cost): Adjust vec_to_scalar_cost.
42743         * config/i386/i386.c (intel_cost): Ditto.
42745 2014-04-17  Joey Ye  <joey.ye@arm.com>
42747         * opts.c (OPT_fif_conversion, OPT_fif_conversion2): Disable for Og.
42749 2014-04-16  Jan Hubicka  <hubicka@ucw.cz>
42751         * opts.c (common_handle_option): Disable -fipa-reference coorectly
42752         with -fuse-profile.
42754 2014-04-16  Jan Hubicka  <hubicka@ucw.cz>
42756         * ipa-devirt.c (odr_type_d): Add field all_derivations_known.
42757         (type_all_derivations_known_p): New predicate.
42758         (type_all_ctors_visible_p): New predicate.
42759         (type_possibly_instantiated_p): New predicate.
42760         (get_odr_type): Compute all_derivations_known.
42761         (dump_odr_type): Dump the flag.
42762         (maybe_record_type): Cleanup.
42763         (record_target_from_binfo): Add bases_to_consider array;
42764         record bases for types w/o instances and skip CXX destructor.
42765         (possible_polymorphic_call_targets_1): Add bases_to_consider
42766         and consider_construction parameters; check if type may have instance.
42767         (get_polymorphic_call_info): Set maybe_in_construction to true
42768         when we know nothing.
42769         (record_targets_from_bases): Skip CXX destructors; they are
42770         never called for types in construction.
42771         (possible_polymorphic_call_targets): Do not record target when
42772         type may not have instance.
42774 2014-04-16  Jan Hubicka  <hubicka@ucw.cz>
42776         PR ipa/60854
42777         * ipa.c (symtab_remove_unreachable_nodes): Mark targets of
42778         external aliases alive, too.
42780 2014-04-16  Andrew  Pinski  <apinski@cavium.com>
42782         * config/host-linux.c (TRY_EMPTY_VM_SPACE): Change aarch64 ilp32
42783         definition.
42785 2014-04-16  Eric Botcazou  <ebotcazou@adacore.com>
42787         * final.c (compute_alignments): Do not apply loop alignment to a block
42788         falling through to the exit.
42790 2014-04-16  Catherine Moore  <clm@codesourcery.com>
42792         * mips.md (*mov<mode>_internal, *movhi_internal, *movqi_internal):
42793         Adjust constraints for microMIPS store patterns.
42795 2014-04-16  Pitchumani Sivanupandi  <Pitchumani.S@atmel.com>
42797         * config/avr/avr-mcus.def: Correct typo for atxmega256a3bu macro.
42799 2014-04-16  Eric Botcazou  <ebotcazou@adacore.com>
42801         * tree-ssa-operands.c (create_vop_var): Set DECL_IGNORED_P.
42802         (append_use): Run at -O0.
42803         (append_vdef): Likewise.
42804         * tree-ssa-ter.c (ter_is_replaceable_p): Do not special-case -O0.
42805         * tree-ssa-uninit.c (warn_uninitialized_vars): Remove obsolete comment.
42807 2014-04-16  Jakub Jelinek  <jakub@redhat.com>
42809         PR tree-optimization/60844
42810         * tree-ssa-reassoc.c (reassoc_remove_stmt): New function.
42811         (propagate_op_to_single_use, remove_visited_stmt_chain,
42812         linearize_expr, repropagate_negates, reassociate_bb): Use it
42813         instead of gsi_remove.
42815 2014-04-16  Martin Jambor  <mjambor@suse.cz>
42817         * cgraphclones.c (cgraph_create_virtual_clone): Duplicate
42818         ipa_transforms_to_apply.
42819         (cgraph_function_versioning): Assert that old_node has empty
42820         ipa_transforms_to_apply.
42821         * trans-mem.c (ipa_tm_create_version): Likewise.
42822         * tree-inline.c (tree_function_versioning): Do not duplicate
42823         ipa_transforms_to_apply.
42825 2014-04-16  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
42827         PR target/60817
42828         * configure.ac (set_have_as_tls): Merge i[34567]86-*-* and
42829         x86_64-*-* cases.
42830         Pass necessary as flags on 64-bit Solaris/x86.
42831         Use lowercase relocs for x86_64-*-*.
42832         * configure: Regenerate.
42834 2014-04-15  Jan Hubicka  <jh@suse.cz>
42836         * ipa-devirt.c (referenced_from_vtable_p): New predicate.
42837         (maybe_record_node, likely_target_p): Use it.
42839 2014-04-15  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
42841         PR target/60839
42842         Revert following patch
42844         2014-04-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
42846         PR target/60735
42847         * config/rs6000/rs6000.c (rs6000_hard_regno_mode_ok): If we have
42848         software floating point or no floating point registers, do not
42849         allow any type in the FPRs.  Eliminate a test for SPE SIMD types
42850         in GPRs that occurs after we tested for GPRs that would never be
42851         true.
42853         * config/rs6000/rs6000.md (mov<mode>_softfloat32, FMOVE64):
42854         Rewrite tests to use TARGET_DOUBLE_FLOAT and TARGET_E500_DOUBLE,
42855         since the FMOVE64 type is DFmode/DDmode.  If TARGET_E500_DOUBLE,
42856         specifically allow DDmode, since that does not use the SPE SIMD
42857         instructions.
42859 2014-03-21  Mark Wielaard  <mjw@redhat.com>
42861         * dwarf2out.c (gen_enumeration_type_die): Add DW_AT_const_value
42862         as unsigned or int depending on type and value used.
42864 2014-04-15  Richard Biener  <rguenther@suse.de>
42866         PR rtl-optimization/56965
42867         * alias.c (ncr_compar, nonoverlapping_component_refs_p): Move ...
42868         * tree-ssa-alias.c (ncr_compar, nonoverlapping_component_refs_p):
42869         ... here.
42870         * alias.c (true_dependence_1): Do not call
42871         nonoverlapping_component_refs_p.
42872         * tree-ssa-alias.c (indirect_ref_may_alias_decl_p): Call
42873         nonoverlapping_component_refs_p.
42874         (indirect_refs_may_alias_p): Likewise.
42876 2014-04-15  Teresa Johnson  <tejohnson@google.com>
42878         * cfg.c (dump_bb_info): Fix flags check.
42879         * tree-cfg.c (remove_bb): Only dump TDF_BLOCKS when removing.
42881 2014-04-15  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
42883         PR rtl-optimization/60663
42884         * config/arm/arm.c (arm_new_rtx_costs): Improve ASM_OPERANDS case,
42885         avoid 0 cost.
42887 2014-04-15  Richard Biener  <rguenther@suse.de>
42889         * lto-streamer.h (LTO_major_version): Bump to 4.
42891 2014-04-15  Richard Biener  <rguenther@suse.de>
42893         * common.opt (lto_partition_model): New enum.
42894         (flto-partition=): Merge separate options with a single with argument,
42895         add -flto-partition=one support.
42896         * flag-types.h (enum lto_partition_model): Declare.
42897         * opts.c (finish_options): Remove duplicate -flto-partition=
42898         option check.
42899         * lto-wrapper.c (run_gcc): Adjust.
42901 2014-04-15  Richard Biener  <rguenther@suse.de>
42903         * alias.c (ncr_compar): New function.
42904         (nonoverlapping_component_refs_p): Re-implement in O (n log n).
42906 2014-04-15  Richard Biener  <rguenther@suse.de>
42908         * alias.c (record_component_aliases): Do not walk BINFOs.
42910 2014-04-15  Richard Biener  <rguenther@suse.de>
42912         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
42913         Add struct function argument and adjust.
42914         (find_func_aliases_for_call): Likewise.
42915         (find_func_aliases): Likewise.
42916         (find_func_clobbers): Likewise.
42917         (intra_create_variable_infos): Likewise.
42918         (compute_points_to_sets): Likewise.
42919         (ipa_pta_execute): Adjust.  Do not push/pop cfun.
42921 2014-04-15  Richard Biener  <rguenther@suse.de>
42923         * tree.c (iterative_hash_expr): Use enum tree_code_class
42924         to store TREE_CODE_CLASS.
42925         (tree_block): Likewise.
42926         (tree_set_block): Likewise.
42927         * tree.h (fold_build_pointer_plus_loc): Use
42928         convert_to_ptrofftype_loc.
42930 2014-04-15  Jakub Jelinek  <jakub@redhat.com>
42932         PR plugins/59335
42933         * Makefile.in (PLUGIN_HEADERS): Add various headers that have been
42934         added in 4.9.
42936 2014-04-15  Eric Botcazou  <ebotcazou@adacore.com>
42938         * cfgloop.h (struct loop): Move force_vectorize down.
42939         * gimplify.c (gimple_boolify) <ANNOTATE_EXPR>: Handle new kinds.
42940         (gimplify_expr) <ANNOTATE_EXPR>: Minor tweak.
42941         * lto-streamer-in.c (input_cfg): Read dont_vectorize field.
42942         * lto-streamer-out.c (output_cfg): Write dont_vectorize field.
42943         * tree-cfg.c (replace_loop_annotate): Revamp and handle new kinds.
42944         * tree-core.h (enum annot_expr_kind): Add new kind values.
42945         * tree-inline.c (copy_loops): Copy dont_vectorize field and reorder.
42946         * tree-pretty-print.c (dump_generic_node) <ANNOTATE_EXPR>: Handle new
42947         kinds.
42948         * tree.def (ANNOTATE_EXPR): Tweak comment.
42950 2014-04-14  Jan Hubicka  <hubicka@ucw.cz>
42952         * ipa-devirt.c (maybe_record_node): Ignore all non-methods (including
42953         cxa_pure_virtual).
42955 2014-04-14  Paolo Carlini  <paolo.carlini@oracle.com>
42957         * tree.h (TYPE_IDENTIFIER): Declare.
42958         * tree.c (subrange_type_for_debug_p): Use it.
42959         * godump.c (go_format_type): Likewise.
42960         * dwarf2out.c (is_cxx_auto, modified_type_die,
42961         gen_type_die_with_usage, gen_type_die_with_usage): Likewise.
42962         * dbxout.c (dbxout_type, dbxout_symbol): Likewise.
42964 2014-04-14  Jan Hubicka  <hubicka@ucw.cz>
42966         PR lto/60820
42967         * varpool.c (varpool_remove_node): Do not alter decls when streaming.
42969 2014-04-14  Uros Bizjak  <ubizjak@gmail.com>
42971         * config/i386/i386.c (examine_argument): Return bool.  Return true if
42972         parameter should be passed in memory.
42973         <case X86_64_COMPLEX_X87_CLASS>: Adjust.
42974         (construct_container): Update calls to examine_argument.
42975         (function_arg_advance_64): Ditto.
42976         (return_in_memory_32): Merge with ix86_return_in_memory.
42977         (return_in_memory_64): Ditto.
42978         (return_in_memory_ms_64): Ditto.
42980 2014-04-14  Jan Hubicka  <hubicka@ucw.cz>
42982         * ipa-utils.c (ipa_merge_profiles): Merge profile_id.
42983         * coverage.c (coverage_compute_profile_id): Handle externally visible
42984         symbols.
42986 2014-04-14  Martin Jambor  <mjambor@suse.cz>
42988         * tree-sra.c (ipa_sra_preliminary_function_checks): Skip
42989         DECL_DISREGARD_INLINE_LIMITS functions.
42991 2014-04-14  H.J. Lu  <hongjiu.lu@intel.com>
42993         PR target/60827
42994         * config/i386/i386.md (*fixuns_trunc<mode>_1): Revert the last change.
42996 2014-04-14  H.J. Lu  <hongjiu.lu@intel.com>
42998         PR target/60827
42999         * config/i386/i386.md (*fixuns_trunc<mode>_1): Check
43000         optimize_insn_for_speed_p instead of
43001         optimize_function_for_speed_p.
43003 2014-04-14  Yufeng Zhang  <yufeng.zhang@arm.com>
43005         * doc/invoke.texi (free): Document AArch64.
43007 2014-04-14  Richard Biener  <rguenther@suse.de>
43009         PR tree-optimization/60042
43010         * tree-ssa-pre.c (inhibit_phi_insertion): Remove.
43011         (insert_into_preds_of_block): Do not prevent PHI insertion
43012         for REFERENCE exprs here ...
43013         (eliminate_dom_walker::before_dom_children): ... but prevent
43014         their use here under similar conditions when applied to the
43015         IL after PRE optimizations.
43017 2014-04-14  Richard Biener  <rguenther@suse.de>
43019         * passes.def: Move early points-to after early SRA.
43021 2014-04-14  Richard Biener  <rguenther@suse.de>
43023         * tree-ssa-forwprop.c (simplify_gimple_switch): Enhance
43024         check for which sign-changes we allow when forwarding
43025         a converted value into a switch.
43027 2014-04-14  Eric Botcazou  <ebotcazou@adacore.com>
43029         * stor-layout.c (place_field): Finalize non-constant offset for the
43030         field, if any.
43032 2014-04-14  Richard Biener  <rguenther@suse.de>
43034         * tree-switch-conversion.c (lshift_cheap_p): Get speed_p
43035         as argument.
43036         (expand_switch_using_bit_tests_p): Likewise.
43037         (process_switch): Compute and pass on speed_p based on the
43038         switch stmt.
43039         * tree-ssa-math-opts.c (gimple_expand_builtin_pow): Use
43040         optimize_bb_for_speed_p.
43042 2014-04-14  Eric Botcazou  <ebotcazou@adacore.com>
43044         * cfgloop.h (struct loop): Rename force_vect into force_vectorize.
43045         * function.h (struct function): Rename has_force_vect_loops into
43046         has_force_vectorize_loops.
43047         * lto-streamer-in.c (input_cfg): Adjust for renaming.
43048         (input_struct_function_base): Likewise.
43049         * lto-streamer-out.c (output_cfg): Likewise.
43050         (output_struct_function_base): Likewise.
43051         * omp-low.c (expand_omp_simd): Likewise.
43052         * tree-cfg.c (move_sese_region_to_fn): Likewise.
43053         * tree-if-conv.c (ifcvt_can_use_mask_load_store): Likewise.
43054         (version_loop_for_if_conversion): Likewise.
43055         (tree_if_conversion): Likewise.
43056         (main_tree_if_conversion): Likewise.
43057         (gate_tree_if_conversion): Likewise.
43058         * tree-inline.c (copy_loops): Likewise.
43059         * tree-ssa-loop-ivcanon.c (tree_unroll_loops_completely_1): Likewise.
43060         * tree-ssa-loop.c (tree_loop_vectorize): Likewise.
43061         * tree-ssa-phiopt.c (tree_ssa_phiopt_worker): Likewise.
43062         * tree-vect-loop.c (vect_estimate_min_profitable_iters): Likewise.
43063         * tree-vectorizer.c (vectorize_loops): Likewise.
43064         * tree-vectorizer.h (unlimited_cost_model): Likewise.
43066 2014-04-14  Richard Biener  <rguenther@suse.de>
43068         PR lto/60720
43069         * lto-streamer-out.c (wrap_refs): New function.
43070         (lto_output): Wrap symbol references in global initializes in
43071         type-preserving MEM_REFs.
43073 2014-04-14  Christian Bruel  <christian.bruel@st.com>
43075         * config/sh/sh-mem.cc (sh_expand_strlen): Unroll last word.
43077 2014-04-14  Christian Bruel  <christian.bruel@st.com>
43079         * config/sh/sh.md (setmemqi): New expand pattern.
43080         * config/sh/sh.h (CLEAR_RATIO): Define.
43081         * config/sh/sh-mem.cc (sh_expand_setmem): Define.
43082         * config/sh/sh-protos.h (sh_expand_setmem): Declare.
43084 2014-04-14  Richard Biener  <rguenther@suse.de>
43086         PR middle-end/55022
43087         * fold-const.c (negate_expr_p): Don't negate directional rounding
43088         division.
43089         (fold_negate_expr): Likewise.
43091 2014-04-14  Richard Biener  <rguenther@suse.de>
43093         PR tree-optimization/59817
43094         PR tree-optimization/60453
43095         * graphite-scop-detection.c (graphite_can_represent_scev): Complete
43096         recursion to catch all CHRECs in the scalar evolution and restrict
43097         the predicate for the remains appropriately.
43099 2014-04-12  Catherine Moore  <clm@codesourcery.com>
43101         * config/mips/constraints.md: Add new register constraint "kb".
43102         * config/mips/mips.md (*mov<mode>_internal): Use constraint "kb".
43103         (*movhi_internal): Likewise.
43104         (*movqi_internal): Likewise.
43105         * config/mips/mips.h (M16_STORE_REGS): New register class.
43106         (REG_CLASS_NAMES): Add M16_STORE_REGS.
43107         (REG_CLASS_CONTENTS): Likewise.
43108         * config/mips/mips.c (mips_regno_to_class): Add M16_STORE_REGS.
43110 2014-04-11  Tobias Burnus  <burnus@net-b.de>
43112         PR c/60194
43113         * doc/invoke.texi (-Wformat-signedness): Document it.
43114         (Wformat=2): Mention that this enables -Wformat-signedness.
43116 2014-04-11  Joern Rennecke  <joern.rennecke@embecosm.com>
43118         * common/config/epiphany/epiphany-common.c
43119         (epiphany_option_optimization_table): Enable section anchors by
43120         default at -O1 or higher.
43121         * config/epiphany/epiphany.c (TARGET_MAX_ANCHOR_OFFSET): Define.
43122         (TARGET_MIN_ANCHOR_OFFSET): Likewise.
43123         (epiphany_rtx_costs) <SET>: For binary operators, the set as such
43124         carries no extra cost.
43125         (epiphany_legitimate_address_p): For BLKmode, apply SImode check.
43126         * config/epiphany/epiphany.h (ASM_OUTPUT_DEF): Define.
43127         * config/epiphany/predicates.md (memclob_operand): New predicate.
43128         * config/epiphany/epiphany.md (stack_adjust_add, stack_adjust_str):
43129         Use memclob_operand predicate and X constraint for operand 3.
43131 2014-04-11  Joern Rennecke  <joern.rennecke@embecosm.com>
43133         * config/epiphany/epiphany.c (epiphany_rtx_cost): Compare
43134         with CC_N_NE / CC_C_LTU / CC_C_GTU carries no extra cost for
43135         its operands.
43137 2014-04-11  Joern Rennecke  <joern.rennecke@embecosm.com>
43139         PR rtl-optimization/60651
43140         * mode-switching.c (optimize_mode_switching): Make sure to emit
43141         sets of a lower numbered entity before sets of a higher numbered
43142         entity to a mode of the same or lower priority.
43143         When creating a seginfo for a basic block that starts with a code
43144         label, move the insertion point past the code label.
43145         (new_seginfo): Document and enforce requirement that
43146         NOTE_INSN_BASIC_BLOCK only appears for empty blocks.
43147         * doc/tm.texi.in: Document ordering constraint for emitted mode sets.
43148         * doc/tm.texi: Regenerate.
43150 2014-01-11  Joern Rennecke  <joern.rennecke@embecosm.com>
43152         PR target/60811
43153         * config/arc/arc.c (arc_save_restore): Fix assert typo.
43155 2013-04-11  Jakub Jelinek  <jakub@redhat.com>
43157         * BASE-VER: Set to 4.10.0.
43159 2014-04-11  Tobias Burnus  <burnus@net-b.de>
43161         PR other/59055
43162         * doc/bugreport.texi (Bugs): Remove nodes pointing to the nirvana.
43163         * doc/gcc.texi (Service): Update description in the @menu
43164         * doc/invoke.texi (Option Summary): Remove misplaced and
43165         duplicated @menu.
43167 2014-04-11  Steve Ellcey  <sellcey@mips.com>
43168             Jakub Jelinek  <jakub@redhat.com>
43170         PR middle-end/60556
43171         * expr.c (convert_move): Use emit_store_flag_force instead of
43172         emit_store_flag.  Pass lowpart_mode instead of VOIDmode as 5th
43173         argument to it.
43175 2014-04-11  Richard Biener  <rguenther@suse.de>
43177         PR middle-end/60797
43178         * varasm.c (assemble_alias): Avoid endless error reporting
43179         recursion by setting TREE_ASM_WRITTEN.
43181 2014-04-11  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
43183         * config/s390/s390.md: Add a splitter for NOT rtx.
43185 2014-04-11  Jakub Jelinek  <jakub@redhat.com>
43187         PR rtl-optimization/60663
43188         * cse.c (cse_insn): Set src_volatile on ASM_OPERANDS in PARALLEL.
43190 2014-04-10  Jan Hubicka  <hubicka@ucw.cz>
43191             Jakub Jelinek  <jakub@redhat.com>
43193         PR lto/60567
43194         * ipa.c (function_and_variable_visibility): Copy forced_by_abi
43195         flag from decl_node to node.
43197 2014-04-10  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
43199         PR debug/60655
43200         * config/arm/arm.c (TARGET_CONST_NOT_OK_FOR_DEBUG_P): Define
43201         (arm_const_not_ok_for_debug_p): Reject MINUS with SYM_REF's
43202         ameliorating the cases where it can be.
43204 2014-04-09  David Edelsohn  <dje.gcc@gmail.com>
43206         Revert
43207         2014-04-08  Pat Haugen  <pthaugen@us.ibm.com>
43209         * config/rs6000/sync.md (AINT mode_iterator): Move definition.
43210         (loadsync_<mode>): Change mode.
43211         (load_quadpti, store_quadpti): New.
43212         (atomic_load<mode>, atomic_store<mode>): Add support for TI mode.
43213         * config/rs6000/rs6000.md (unspec enum): Add UNSPEC_LSQ.
43214         * config/rs6000/predicates.md (quad_memory_operand): !TARGET_SYNC_TI.
43216 2014-04-09  Cong Hou  <congh@google.com>
43218         PR testsuite/60773
43219         * doc/sourcebuild.texi (vect_widen_mult_si_to_di_pattern): Add
43220         documentation.
43222 2014-04-08  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
43224         * config/rs6000/rs6000.c (rs6000_expand_vector_set): Use vnand
43225         instead of vnor to exploit possible fusion opportunity in the
43226         future.
43227         (altivec_expand_vec_perm_const_le): Likewise.
43229 2014-04-08  Pat Haugen  <pthaugen@us.ibm.com>
43231         * config/rs6000/sync.md (AINT mode_iterator): Move definition.
43232         (loadsync_<mode>): Change mode.
43233         (load_quadpti, store_quadpti): New.
43234         (atomic_load<mode>, atomic_store<mode>): Add support for TI mode.
43235         * config/rs6000/rs6000.md (unspec enum): Add UNSPEC_LSQ.
43237 2014-04-08  Richard Sandiford  <rdsandiford@googlemail.com>
43239         PR target/60763
43240         * config/rs6000/vsx.md (vsx_xscvdpspn_scalar): Change input to DImode.
43241         * config/rs6000/rs6000.md (reload_vsx_from_gprsf): Update accordingly.
43242         Use gen_rtx_REG rather than simplify_gen_subreg for op0_di.
43244 2014-04-08  Richard Biener  <rguenther@suse.de>
43246         PR middle-end/60706
43247         * tree-pretty-print.c (pp_double_int): For HWI32 hosts with
43248         a 64bit widest int print double-int similar to on HWI64 hosts.
43250 2014-04-08  Richard Biener  <rguenther@suse.de>
43252         PR tree-optimization/60785
43253         * graphite-sese-to-poly.c (rewrite_phi_out_of_ssa): Treat
43254         default defs properly.
43256 2014-04-08  Nathan Sidwell  <nathan@codesourcery.com>
43258         * doc/invoke (Wnon-virtual-dtor): Update to match implementation.
43259         (Weffc++): Likewise.
43261 2014-04-07  Jan Hubicka  <hubcika@ucw.cz>
43263         * ipa-devirt.c (maybe_record_node): When node is not recorded,
43264         set completep to false rather than true.
43266 2014-04-07  Douglas B Rupp  <rupp@adacore.com>
43268         PR target/60504
43269         * config/arm/arm.h (ASM_PREFERRED_EH_DATA_FORMAT): Expose from
43270         ARM_TARGET2_DWARF_FORMAT.
43272 2014-04-07  Charles Baylis  <charles.baylis@linaro.org>
43274         PR target/60609
43275         * config/arm/arm.h (ASM_OUTPUT_CASE_END): Remove.
43276         (LABEL_ALIGN_AFTER_BARRIER): Align barriers which occur after
43277         ADDR_DIFF_VEC.
43279 2014-04-07  Richard Biener  <rguenther@suse.de>
43281         PR tree-optimization/60766
43282         * tree-ssa-loop-ivopts.c (cand_value_at): Compute in an unsigned type.
43283         (may_eliminate_iv): Convert cand_value_at result to desired type.
43285 2014-04-07  Jason Merrill  <jason@redhat.com>
43287         PR c++/60731
43288         * common.opt (-fno-gnu-unique): Add.
43289         * config/elfos.h (USE_GNU_UNIQUE_OBJECT): Check it.
43291 2014-04-07  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
43293         * haifa-sched.c: Fix outdated function reference and minor
43294         grammar errors in introductory comment.
43296 2014-04-07  Richard Biener  <rguenther@suse.de>
43298         PR middle-end/60750
43299         * tree-ssa-operands.c (maybe_add_call_vops): Also add VDEFs
43300         for noreturn calls.
43301         * tree-cfgcleanup.c (fixup_noreturn_call): Do not remove VDEFs.
43303 2014-04-06  John David Anglin  <danglin@gcc.gnu.org>
43305         PR debug/55794
43306         * config/pa/pa.c (pa_output_function_epilogue): Skip address and code
43307         size accounting for thunks.
43308         (pa_asm_output_mi_thunk): Use final_start_function() and
43309         final_end_function() to output function start and end directives.
43311 2014-04-05  Pitchumani Sivanupandi  <Pitchumani.S@atmel.com>
43313         * config/avr/avr-arch.h (avr_mcu_t): Add dev_attribute field to have
43314         device specific ISA/ feature information. Remove short_sp and
43315         errata_skip ds.  Add avr_device_specific_features enum to have device
43316         specific info.
43317         * config/avr/avr-c.c (avr_cpu_cpp_builtins): use dev_attribute to check
43318         errata_skip. Add __AVR_ISA_RMW__ builtin macro if RMW ISA available.
43319         * config/avr/avr-devices.c (avr_mcu_types): Update AVR_MCU macro for
43320         updated device specific info.
43321         * config/avr/avr-mcus.def: Merge device specific details to
43322         dev_attribute field.
43323         * config/avr/avr.c (avr_2word_insn_p): use dev_attribute field to check
43324         errata_skip.
43325         * config/avr/avr.h (AVR_HAVE_8BIT_SP): same for short sp info.
43326         * config/avr/driver-avr.c (avr_device_to_as): Pass -mrmw option to
43327         assembler if RMW isa supported by current device.
43328         * config/avr/genmultilib.awk: Update as device info structure changed.
43329         * doc/invoke.texi: Add info for __AVR_ISA_RMW__ builtin macro
43331 2014-04-04  Cong Hou  <congh@google.com>
43333         PR tree-optimization/60656
43334         * tree-vect-stmts.c (supportable_widening_operation):
43335         Fix a bug that elements in a vector with vect_used_by_reduction
43336         property are incorrectly reordered when the operation on it is not
43337         consistant with the one in reduction operation.
43339 2014-04-04  John David Anglin  <danglin@gcc.gnu.org>
43341         PR rtl-optimization/60155
43342         * gcse.c (record_set_data): New function.
43343         (single_set_gcse): New function.
43344         (gcse_emit_move_after): Use single_set_gcse instead of single_set.
43345         (hoist_code): Likewise.
43346         (get_pressure_class_and_nregs): Likewise.
43348 2014-04-04  Eric Botcazou  <ebotcazou@adacore.com>
43350         * explow.c (probe_stack_range): Emit a final optimization blockage.
43352 2014-04-04  Anthony Green  <green@moxielogic.com>
43354         * config/moxie/moxie.md (zero_extendqisi2, zero_extendhisi2): Fix
43355         typos.
43357 2014-04-04  Jan Hubicka  <hubicka@ucw.cz>
43359         PR ipa/59626
43360         * lto-cgraph.c (input_overwrite_node): Check that partitioning
43361         flags are set only during streaming.
43362         * ipa.c (process_references, walk_polymorphic_call_targets,
43363         symtab_remove_unreachable_nodes): Drop bodies of always inline
43364         after early inlining.
43365         (symtab_remove_unreachable_nodes): Remove always_inline attribute.
43367 2014-04-04  Jakub Jelinek  <jakub@redhat.com>
43368         Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
43370         PR debug/60655
43371         * dwarf2out.c (const_ok_for_output_1): Reject expressions
43372         containing a NOT.
43374 2014-04-04  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
43376         PR bootstrap/60743
43377         * config/arm/cortex-a53.md (cortex_a53_fdivs): Reduce reservation
43378         duration.
43379         (cortex_a53_fdivd): Likewise.
43381 2014-04-04  Martin Jambor  <mjambor@suse.cz>
43383         PR ipa/60640
43384         * cgraph.h (cgraph_clone_node): New parameter added to declaration.
43385         Adjust all callers.
43386         * cgraph.c (clone_of_p): Also return true if thunks match.
43387         (verify_edge_corresponds_to_fndecl): Removed extraneous call to
43388         cgraph_function_or_thunk_node and an obsolete comment.
43389         * cgraphclones.c (build_function_type_skip_args): Moved upwards in the
43390         file.
43391         (build_function_decl_skip_args): Likewise.
43392         (set_new_clone_decl_and_node_flags): New function.
43393         (duplicate_thunk_for_node): Likewise.
43394         (redirect_edge_duplicating_thunks): Likewise.
43395         (cgraph_clone_node): New parameter args_to_skip, pass it to
43396         redirect_edge_duplicating_thunks which is called instead of
43397         cgraph_redirect_edge_callee.
43398         (cgraph_create_virtual_clone): Pass args_to_skip to cgraph_clone_node,
43399         moved setting of a lot of flags to set_new_clone_decl_and_node_flags.
43401 2014-04-04  Jeff Law  <law@redhat.com>
43403         PR target/60657
43404         * config/arm/predicates.md (const_int_I_operand): New predicate.
43405         (const_int_M_operand): Similarly.
43406         * config/arm/arm.md (insv_zero): Use const_int_M_operand instead of
43407         const_int_operand.
43408         (insv_t2, extv_reg, extzv_t2): Likewise.
43409         (load_multiple_with_writeback): Similarly for const_int_I_operand.
43410         (pop_multiple_with_writeback_and_return): Likewise.
43411         (vfp_pop_multiple_with_writeback): Likewise
43413 2014-04-04  Richard Biener  <rguenther@suse.de>
43415         PR ipa/60746
43416         * tree-ssanames.c (make_ssa_name_fn): Fix assert.
43417         * gimple.c (gimple_set_bb): Avoid ICEing for NULL cfun for
43418         non-GIMPLE_LABELs.
43419         * gimplify.h (gimple_add_tmp_var_fn): Declare.
43420         * gimplify.c (gimple_add_tmp_var_fn): New function.
43421         * gimple-expr.h (create_tmp_reg_fn): Declare.
43422         * gimple-expr.c (create_tmp_reg_fn): New function.
43423         * gimple-low.c (record_vars_into): Don't change cfun.
43424         * cgraph.c (cgraph_redirect_edge_call_stmt_to_callee): Fix
43425         code generation without cfun.
43427 2014-04-04  Thomas Schwinge  <thomas@codesourcery.com>
43429         PR bootstrap/60719
43430         * Makefile.in (install-driver): Fix shell scripting.
43432 2014-04-03  Cong Hou  <congh@google.com>
43434         PR tree-optimization/60505
43435         * tree-vectorizer.h (struct _stmt_vec_info): Add th field as the
43436         threshold of number of iterations below which no vectorization
43437         will be done.
43438         * tree-vect-loop.c (new_loop_vec_info):
43439         Initialize LOOP_VINFO_COST_MODEL_THRESHOLD.
43440         * tree-vect-loop.c (vect_analyze_loop_operations):
43441         Set LOOP_VINFO_COST_MODEL_THRESHOLD.
43442         * tree-vect-loop.c (vect_transform_loop):
43443         Use LOOP_VINFO_COST_MODEL_THRESHOLD.
43444         * tree-vect-loop.c (vect_analyze_loop_2): Check the maximum number
43445         of iterations of the loop and see if we should build the epilogue.
43447 2014-04-03  Richard Biener  <rguenther@suse.de>
43449         * tree-streamer.h (struct streamer_tree_cache_d): Add next_idx member.
43450         (streamer_tree_cache_create): Adjust.
43451         * tree-streamer.c (streamer_tree_cache_add_to_node_array): Adjust
43452         to allow optional nodes array.
43453         (streamer_tree_cache_insert_1): Use next_idx to assign idx.
43454         (streamer_tree_cache_append): Likewise.
43455         (streamer_tree_cache_create): Create nodes array optionally
43456         as specified by parameter.
43457         * lto-streamer-out.c (create_output_block): Avoid maintaining
43458         the node array in the writer cache.
43459         (DFS_write_tree): Remove assertion.
43460         (produce_asm_for_decls): Free the out decl state hash table early.
43461         * lto-streamer-in.c (lto_data_in_create): Adjust for
43462         streamer_tree_cache_create prototype change.
43464 2014-04-03  Richard Biener  <rguenther@suse.de>
43466         * tree-streamer-out.c (streamer_write_chain): Do not temporarily
43467         set TREE_CHAIN to NULL_TREE.
43469 2014-04-03  Richard Biener  <rguenther@suse.de>
43471         PR tree-optimization/60740
43472         * graphite-scop-detection.c (stmt_simple_for_scop_p): Iterate
43473         over all GIMPLE_COND operands.
43475 2014-04-03  Nathan Sidwell  <nathan@codesourcery.com>
43477         * doc/invoke.texi (Wnon-virtual-dtor): Adjust documentation.
43478         (Weffc++): Remove Scott's numbering, merge lists and reference
43479         Wnon-virtual-dtor.
43481 2014-04-03  Nick Clifton  <nickc@redhat.com>
43483         * config/rl78/rl78-expand.md (movqi): Handle (SUBREG (SYMBOL_REF))
43484         properly.
43486 2014-04-03  Martin Jambor  <mjambor@suse.cz>
43488         * ipa-cp.c (ipcp_verify_propagated_values): Also dump symtab and
43489         mention gcc_unreachable before failing.
43490         * ipa.c (symtab_remove_unreachable_nodes): Also print order of
43491         removed symbols.
43493 2014-04-02  Jan Hubicka  <hubicka@ucw.cz>
43495         PR ipa/60659
43496         * ipa-devirt.c (get_polymorphic_call_info): Do not ICE on type
43497         inconsistent code and instead mark the context inconsistent.
43498         (possible_polymorphic_call_targets): For inconsistent contexts
43499         return empty complete list.
43501 2014-04-02  Anthony Green  <green@moxielogic.com>
43503         * config/moxie/moxie.md (zero_extendqisi2, zero_extendhisi2)
43504         (extendqisi2, extendhisi2): Define.
43505         * config/moxie/moxie.h (DEFAULT_SIGNED_CHAR): Change to 0.
43506         (WCHAR_TYPE): Change to unsigned int.
43508 2014-04-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
43510         PR tree-optimization/60733
43511         * gimple-ssa-strength-reduction.c (ncd_with_phi): Change required
43512         insertion point for PHI candidates to be the end of the feeding
43513         block for the PHI argument.
43515 2014-04-02  Vladimir Makarov  <vmakarov@redhat.com>
43517         PR rtl-optimization/60650
43518         * lra-constraints.c (process_alt_operands): Decrease reject for
43519         earlyclobber matching.
43521 2014-04-02  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
43523         * config/s390/s390.c (s390_expand_insv): Use GET_MODE_BITSIZE.
43525 2014-04-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
43527         * config/spu/spu.c (pad_bb): Do not crash when the last
43528         insn is CODE_FOR_blockage.
43530 2014-04-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
43532         * config/spu/spu.md ("insv"): Fail if bitoffset+bitsize
43533         lies outside the target mode.
43535 2014-04-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
43537         PR target/60735
43538         * config/rs6000/rs6000.c (rs6000_hard_regno_mode_ok): If we have
43539         software floating point or no floating point registers, do not
43540         allow any type in the FPRs.  Eliminate a test for SPE SIMD types
43541         in GPRs that occurs after we tested for GPRs that would never be
43542         true.
43544         * config/rs6000/rs6000.md (mov<mode>_softfloat32, FMOVE64):
43545         Rewrite tests to use TARGET_DOUBLE_FLOAT and TARGET_E500_DOUBLE,
43546         since the FMOVE64 type is DFmode/DDmode.  If TARGET_E500_DOUBLE,
43547         specifically allow DDmode, since that does not use the SPE SIMD
43548         instructions.
43550 2014-04-02  Richard Biener  <rguenther@suse.de>
43552         PR middle-end/60729
43553         * optabs.c (expand_abs_nojump): Honor flag_trapv only for
43554         MODE_INTs.  Properly use negv_optab.
43555         (expand_abs): Likewise.
43557 2014-04-02  Richard Biener  <rguenther@suse.de>
43559         PR bootstrap/60719
43560         * Makefile.in (install-driver): Guard extra installs with special
43561         names properly.
43563 2014-04-01  Michael Meissner  <meissner@linux.vnet.ibm.com>
43565         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
43566         Document vec_vgbbd.
43568 2014-04-01  Richard Henderson  <rth@redhat.com>
43570         PR target/60704
43571         * config/i386/i386.md (*float<SWI48><MODEF>2_sse): Leave the second
43572         alternative enabled before register allocation.
43574 2014-04-01  Chung-Lin Tang  <cltang@codesourcery.com>
43576         * config/nios2/nios2.md (unspec): Remove UNSPEC_TLS, UNSPEC_TLS_LDM.
43577         * config/nios2/nios2.c (nios2_function_profiler): Fix addi operand
43578         typo.
43579         (nios2_large_got_address): Remove unneeded 'sym' parameter.
43580         (nios2_got_address): Update nios2_large_got_address call site.
43581         (nios2_delegitimize_address): New function.
43582         (TARGET_DELEGITIMIZE_ADDRESS): Define to nios2_delegitimize_address.
43583         * config/nios2/linux.h (GLIBC_DYNAMIC_LINKER): Define.
43584         (LINK_SPEC): Specify dynamic linker using GNU_USER_DYNAMIC_LINKER.
43586 2014-04-01  Martin Husemann  <martin@duskware.de>
43588         * config/mips/netbsd.h (TARGET_OS_CPP_BUILTINS): Define __mips_o32
43589         for -mabi=32.
43591 2014-04-01  Richard Sandiford  <rdsandiford@googlemail.com>
43593         PR rtl-optimization/60604
43594         * recog.c (general_operand): Incorporate REG_CANNOT_CHANGE_MODE_P
43595         check from register_operand.
43596         (register_operand): Redefine in terms of general_operand.
43597         (nonmemory_operand): Use register_operand for the non-constant cases.
43599 2014-04-01  Richard Biener  <rguenther@suse.de>
43601         * gimple.h (struct gimple_statement_base): Align subcode to 16 bits.
43603 2014-04-01  Sebastian Huber  <sebastian.huber@embedded-brains.de>
43605         * doc/invoke.texi (mapp-regs): Clarify.
43607 2014-03-31  Ulrich Drepper  <drepper@gmail.com>
43609         * config/i386/avx512fintrin.h (__v32hi): Define type.
43610         (__v64qi): Likewise.
43611         (_mm512_set1_epi8): Define.
43612         (_mm512_set1_epi16): Define.
43613         (_mm512_set4_epi32): Define.
43614         (_mm512_set4_epi64): Define.
43615         (_mm512_set4_pd): Define.
43616         (_mm512_set4_ps): Define.
43617         (_mm512_setr4_epi64): Define.
43618         (_mm512_setr4_epi32): Define.
43619         (_mm512_setr4_pd): Define.
43620         (_mm512_setr4_ps): Define.
43621         (_mm512_setzero_epi32): Define.
43623 2014-03-31  Martin Jambor  <mjambor@suse.cz>
43625         PR middle-end/60647
43626         * tree-sra.c (callsite_has_enough_arguments_p): Renamed to
43627         callsite_arguments_match_p.  Updated all callers.  Also check types of
43628         corresponding formal parameters and actual arguments.
43629         (not_all_callers_have_enough_arguments_p) Renamed to
43630         some_callers_have_mismatched_arguments_p.
43632 2014-03-31  Yuri Rumyantsev  <ysrumyan@gmail.com>
43634         * tree-inline.c (copy_loops): Add missed copy of 'safelen'.
43636 2014-03-31  Kugan Vivekanandarajah  <kuganv@linaro.org>
43638         PR target/60034
43639         * aarch64/aarch64.c (aarch64_classify_address): Fix alignment for
43640         section anchor.
43642 2014-03-30  Uros Bizjak  <ubizjak@gmail.com>
43644         * config/i386/sse.md (FMAMODE_NOVF512): New mode iterator.
43645         (<sd_mask_codefor>fma_fmadd_<mode><sd_maskz_name><round_name>):
43646         Split out
43647         <sd_mask_codefor>fma_fmadd_<VF_512:mode><sd_maskz_name><round_name>.
43648         Use FMAMODE_NOVF512 mode iterator.
43649         (<sd_mask_codefor>fma_fmsub_<mode><sd_maskz_name><round_name>): Ditto.
43650         (<sd_mask_codefor>fma_fnmadd_<mode><sd_maskz_name><round_name>): Ditto.
43651         (<sd_mask_codefor>fma_fnmsub_<mode><sd_maskz_name><round_name>): Ditto.
43652         (<sd_mask_codefor>fma_fmaddsub_<mode><sd_maskz_name><round_name>):
43653         Split out
43654         <sd_mask_codefor>fma_fmaddsub_<VF_512:mode><sd_maskz_name><round_name>.
43655         Use VF_128_256 mode iterator.
43656         (<sd_mask_codefor>fma_fmsubadd_<mode><sd_maskz_name><round_name>):
43657         Ditto.
43659 2014-03-28  Jan Hubicka  <hubicka@ucw.cz>
43661         * cgraph.c (cgraph_redirect_edge_call_stmt_to_callee): Clear
43662         static chain if needed.
43664 2014-03-28  Vladimir Makarov  <vmakarov@redhat.com>
43666         PR target/60697
43667         * lra-constraints.c (index_part_to_reg): New.
43668         (process_address): Use it.
43670 2014-03-27  Jeff Law  <law@redhat.com>
43671             Jakub Jelinek  <jakub@redhat.com>
43673         PR target/60648
43674         * expr.c (do_tablejump): Use simplify_gen_binary rather than
43675         gen_rtx_{PLUS,MULT} to build up the address expression.
43677         * i386/i386.c (ix86_legitimize_address): Use copy_addr_to_reg to avoid
43678         creating non-canonical RTL.
43680 2014-03-28  Jan Hubicka  <hubicka@ucw.cz>
43682         PR ipa/60243
43683         * ipa-inline.c (want_inline_small_function_p): Short circuit large
43684         functions; reorganize to make cheap checks first.
43685         (inline_small_functions): Do not estimate growth when dumping;
43686         it is expensive.
43687         * ipa-inline.h (inline_summary): Add min_size.
43688         (growth_likely_positive): New function.
43689         * ipa-inline-analysis.c (dump_inline_summary): Add min_size.
43690         (set_cond_stmt_execution_predicate): Cleanup.
43691         (estimate_edge_size_and_time): Compute min_size.
43692         (estimate_calls_size_and_time): Likewise.
43693         (estimate_node_size_and_time): Likewise.
43694         (inline_update_overall_summary): Update min_size.
43695         (do_estimate_edge_time): Likewise.
43696         (do_estimate_edge_size): Update.
43697         (do_estimate_edge_hints): Update.
43698         (growth_likely_positive): New function.
43700 2014-03-28  Jakub Jelinek  <jakub@redhat.com>
43702         PR target/60693
43703         * config/i386/i386.c (ix86_copy_addr_to_reg): Call copy_addr_to_reg
43704         also if addr has VOIDmode.
43706 2014-03-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
43708         * config/arm/aarch-common.c (aarch_crypto_can_dual_issue): New.
43709         * config/arm/aarch-common-protos.h (aarch_crypto_can_dual_issue):
43710         Declare extern.
43711         * config/arm/cortex-a53.md: Add reservations and bypass for crypto
43712         instructions as well as AdvancedSIMD loads.
43714 2014-03-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
43716         * config/aarch64/aarch64-simd.md (aarch64_crypto_aes<aes_op>v16qi):
43717         Use crypto_aese type.
43718         (aarch64_crypto_aes<aesmc_op>v16qi): Use crypto_aesmc type.
43719         * config/arm/arm.md (is_neon_type): Replace crypto_aes with
43720         crypto_aese, crypto_aesmc.  Move to types.md.
43721         * config/arm/types.md (crypto_aes): Split into crypto_aese,
43722         crypto_aesmc.
43723         * config/arm/iterators.md (crypto_type): Likewise.
43725 2014-03-28  Jan Hubicka  <hubicka@ucw.cz>
43727         * cgraph.c: Include expr.h and tree-dfa.h.
43728         (cgraph_redirect_edge_call_stmt_to_callee): If call in noreturn;
43729         remove LHS.
43731 2014-03-28  Vladimir Makarov  <vmakarov@redhat.com>
43733         PR target/60675
43734         * lra-assigns.c (find_hard_regno_for): Remove unavailable hard
43735         regs from checking multi-reg pseudos.
43737 2014-03-28  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
43739         * config/arm/t-aprofile (MULTILIB_MATCHES): Correct A12 rule.
43741 2014-03-28  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
43743         * config/rs6000/rs6000.c (fusion_gpr_load_p): Refuse optimization
43744         if it would clobber the stack pointer, even temporarily.
43746 2014-03-28  Eric Botcazou  <ebotcazou@adacore.com>
43748         * mode-switching.c: Make small adjustments to the top comment.
43750 2014-03-27  Michael Meissner  <meissner@linux.vnet.ibm.com>
43752         * config/rs6000/constraints.md (wD constraint): New constraint to
43753         match the constant integer to get the top DImode/DFmode out of a
43754         vector in a VSX register.
43756         * config/rs6000/predicates.md (vsx_scalar_64bit): New predicate to
43757         match the constant integer to get the top DImode/DFmode out of a
43758         vector in a VSX register.
43760         * config/rs6000/rs6000-builtins.def (VBPERMQ): Add vbpermq builtin
43761         for ISA 2.07.
43763         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
43764         vbpermq builtins.
43766         * config/rs6000/rs6000.c (rs6000_debug_reg_global): If
43767         -mdebug=reg, print value of VECTOR_ELEMENT_SCALAR_64BIT.
43769         * config/rs6000/vsx.md (vsx_extract_<mode>, V2DI/V2DF modes):
43770         Optimize vec_extract of 64-bit values, where the value being
43771         extracted is in the top word, where we can use scalar
43772         instructions.  Add direct move and store support.  Combine the big
43773         endian/little endian vector select load support into a single insn.
43774         (vsx_extract_<mode>_internal1): Likewise.
43775         (vsx_extract_<mode>_internal2): Likewise.
43776         (vsx_extract_<mode>_load): Likewise.
43777         (vsx_extract_<mode>_store): Likewise.
43778         (vsx_extract_<mode>_zero): Delete, big and little endian insns are
43779         combined into vsx_extract_<mode>_load.
43780         (vsx_extract_<mode>_one_le): Likewise.
43782         * config/rs6000/rs6000.h (VECTOR_ELEMENT_SCALAR_64BIT): Macro to
43783         define the top 64-bit vector element.
43785         * doc/md.texi (PowerPC and IBM RS6000 constraints): Document wD
43786         constraint.
43788         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
43789         Document vec_vbpermq builtin.
43791         PR target/60672
43792         * config/rs6000/altivec.h (vec_xxsldwi): Add missing define to
43793         enable use of xxsldwi and xxpermdi builtin functions.
43794         (vec_xxpermdi): Likewise.
43796         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
43797         Document use of vec_xxsldwi and vec_xxpermdi builtins.
43799 2014-03-27  Vladimir Makarov  <vmakarov@redhat.com>
43801         PR rtl-optimization/60650
43802         * lra-assign.c (find_hard_regno_for, spill_for): Add parameter
43803         first_p.  Use it.
43804         (find_spills_for): New.
43805         (assign_by_spills): Pass the new parameter to find_hard_regno_for.
43806         Spill all pseudos on the second iteration.
43808 2014-03-27  Marek Polacek  <polacek@redhat.com>
43810         PR c/50347
43811         * doc/extend.texi (ffs Builtins): Change unsigned types to signed
43812         types.
43814 2014-03-27  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
43816         * config/s390/s390.c (s390_can_use_return_insn): Check for
43817         call-saved FPRs on 31 bit.
43819 2014-03-27  Jakub Jelinek  <jakub@redhat.com>
43821         PR middle-end/60682
43822         * omp-low.c (lower_omp_1): For gimple_clobber_p stmts,
43823         if they need regimplification, just drop them instead of
43824         calling gimple_regimplify_operands on them.
43826 2014-03-27  Marcus Shawcroft  <marcus.shawcroft@arm.com>
43828         PR target/60580
43829         * config/aarch64/aarch64.c (faked_omit_frame_pointer): Remove.
43830         (aarch64_frame_pointer_required): Adjust logic.
43831         (aarch64_can_eliminate): Adjust logic.
43832         (aarch64_override_options_after_change): Adjust logic.
43834 2014-03-27  Dehao Chen  <dehao@google.com>
43836         * ipa-inline.c (early_inliner): Update node's inline info.
43838 2014-03-26  Dehao Chen  <dehao@google.com>
43840         * dojump.c (do_compare_rtx_and_jump): Sets correct probability for
43841         compiler inserted conditional jumps for NAN float check.
43843 2014-03-26  Jakub Jelinek  <jakub@redhat.com>
43845         * ubsan.h (ubsan_create_data): Change second argument's type
43846         to const location_t *.
43847         * ubsan.c (ubsan_source_location): If xloc.file is NULL, set it to
43848         _("<unknown>").
43849         (ubsan_create_data): Change second argument to const location_t *PLOC.
43850         Create Loc field whenever PLOC is non-NULL.
43851         (ubsan_instrument_unreachable, ubsan_expand_null_ifn,
43852         ubsan_build_overflow_builtin, instrument_bool_enum_load): Adjust
43853         callers.
43855         PR other/59545
43856         * real.c (real_to_integer2): Change type of low to UHWI.
43858 2014-03-26  Tobias Burnus  <burnus@net-b.de>
43860         * gcc.c (LINK_COMMAND_SPEC): Use libcilkrts.spec for -fcilkplus.
43861         (CILK_SELF_SPECS): New define.
43862         (driver_self_specs): Use it.
43864 2014-03-26  Richard Biener  <rguenther@suse.de>
43866         * tree-pretty-print.c (percent_K_format): Implement special
43867         case for LTO and its stripped down BLOCK tree.
43869 2014-03-26  Jakub Jelinek  <jakub@redhat.com>
43871         PR sanitizer/60636
43872         * ubsan.c (instrument_si_overflow): Instrument ABS_EXPR.
43874         * tree-vrp.c (simplify_internal_call_using_ranges): If only
43875         one range is range_int_cst_p, but not both, at least optimize
43876         addition/subtraction of 0 and multiplication by 0 or 1.
43877         * gimple-fold.c (gimple_fold_call): Fold
43878         IFN_UBSAN_CHECK_{ADD,SUB,MUL}.
43879         (gimple_fold_stmt_to_constant_1): If both op0 and op1 aren't
43880         INTEGER_CSTs, try to fold at least x * 0 and y - y.
43882 2014-03-26  Eric Botcazou  <ebotcazou@adacore.com>
43884         PR rtl-optimization/60452
43885         * rtlanal.c (rtx_addr_can_trap_p_1): Fix head comment.
43886         <case REG>: Return 1 for invalid offsets from the frame pointer.
43888 2014-03-26  Marek Polacek  <polacek@redhat.com>
43890         PR c/37428
43891         * doc/extend.texi (C Extensions): Mention variable-length arrays in
43892         a structure/union.
43894 2014-03-26  Marek Polacek  <polacek@redhat.com>
43896         PR c/39525
43897         * doc/extend.texi (Designated Inits): Describe what happens to omitted
43898         field members.
43900 2014-03-26  Marek Polacek  <polacek@redhat.com>
43902         PR other/59545
43903         * ira-color.c (update_conflict_hard_regno_costs): Perform the
43904         multiplication in unsigned type.
43906 2014-03-26  Chung-Ju Wu  <jasonwucj@gmail.com>
43908         * doc/install.texi: Document nds32le-*-elf and nds32be-*-elf.
43910 2014-03-26  Chung-Ju Wu  <jasonwucj@gmail.com>
43912         * doc/contrib.texi: Add myself as Andes nds32 port contributor.
43914 2014-03-25  Jan Hubicka  <hubicka@ucw.cz>
43916         PR ipa/60315
43917         * cif-code.def (UNREACHABLE) New code.
43918         * ipa-inline.c (inline_small_functions): Skip edges to
43919         __builtlin_unreachable.
43920         (estimate_edge_growth): Allow edges to __builtlin_unreachable.
43921         * ipa-inline-analysis.c (edge_set_predicate): Redirect edges with false
43922         predicate to __bulitin_unreachable.
43923         (set_cond_stmt_execution_predicate): Fix issue when
43924         invert_tree_comparison returns ERROR_MARK.
43925         * ipa-pure-const.c (propagate_pure_const, propagate_nothrow): Do not
43926         propagate to inline clones.
43927         * cgraph.c (verify_edge_corresponds_to_fndecl): Allow redirection
43928         to unreachable.
43929         * ipa-cp.c (create_specialized_node): Be ready for new node to appear.
43930         * cgraphclones.c (cgraph_clone_node): If call destination is already
43931         ureachable, do not redirect it back.
43932         * tree-inline.c (fold_marked_statements): Hanlde calls becoming
43933         unreachable.
43935 2014-03-25  Jan Hubicka  <hubicka@ucw.cz>
43937         * ipa-pure-const.c (propagate_pure_const, propagate_nothrow):
43938         Do not modify inline clones.
43940 2014-03-25  Jakub Jelinek  <jakub@redhat.com>
43942         * config/i386/i386.md (general_sext_operand): New mode attr.
43943         (addv<mode>4, subv<mode>4, mulv<mode>4): If operands[2] is CONST_INT,
43944         don't generate (sign_extend (const_int)).
43945         (*addv<mode>4, *subv<mode>4, *mulv<mode>4): Disallow CONST_INT_P
43946         operands[2].  Use We constraint instead of <i> and
43947         <general_sext_operand> predicate instead of <general_operand>.
43948         (*addv<mode>4_1, *subv<mode>4_1, *mulv<mode>4_1): New insns.
43949         * config/i386/constraints.md (We): New constraint.
43950         * config/i386/predicates.md (x86_64_sext_operand,
43951         sext_operand): New predicates.
43953 2014-03-25  Martin Jambor  <mjambor@suse.cz>
43955         PR ipa/60600
43956         * ipa-cp.c (ipa_get_indirect_edge_target_1): Redirect type
43957         inconsistent devirtualizations to __builtin_unreachable.
43959 2014-03-25  Marek Polacek  <polacek@redhat.com>
43961         PR c/35449
43962         * doc/extend.texi (Example of asm with clobbered asm reg): Fix typo.
43964 2014-03-25  Alan Lawrence  <alan.lawrence@arm.com>
43966         * config/aarch64/aarch64.c (aarch64_simd_valid_immediate): Reverse
43967         order of elements for big-endian.
43969 2014-03-25  Richard Biener  <rguenther@suse.de>
43971         PR middle-end/60635
43972         * gimplify-me.c (gimple_regimplify_operands): Update the
43973         re-gimplifed stmt.
43975 2014-03-25  Martin Jambor  <mjambor@suse.cz>
43977         PR ipa/59176
43978         * lto-cgraph.c (lto_output_node): Stream body_removed flag.
43979         (lto_output_varpool_node): Likewise.
43980         (input_overwrite_node): Likewise.
43981         (input_varpool_node): Likewise.
43983 2014-03-25  Richard Biener  <rguenther@suse.de>
43985         * lto-wrapper.c (merge_and_complain): Handle OPT_fPIE like OPT_fpie.
43986         (run_gcc): Likewise.
43988 2014-03-25  Jakub Jelinek  <jakub@redhat.com>
43990         * combine.c (simplify_compare_const): Add MODE argument.
43991         Handle mode_width 0 as very large mode_width.
43992         (try_combine, simplify_comparison): Adjust callers.
43994         * cselib.c (cselib_hash_rtx): Perform addition in unsigned
43995         type to avoid signed integer overflow.
43996         * explow.c (plus_constant): Likewise.
43998 2014-03-25  Dominik Vogt  <vogt@linux.vnet.ibm.com>
44000         * doc/generic.texi: Correct typos.
44002 2014-03-24  Tobias Burnus  <burnus@net-b.de>
44004         * doc/invoke.texi (-flto): Expand section about
44005         using static libraries with LTO.
44007 2014-03-24  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
44009         PR rtl-optimization/60501
44010         * optabs.def (addptr3_optab): New optab.
44011         * optabs.c (gen_addptr3_insn, have_addptr3_insn): New function.
44012         * doc/md.texi ("addptrm3"): Document new RTL standard expander.
44013         * expr.h (gen_addptr3_insn, have_addptr3_insn): Add prototypes.
44015         * lra.c (emit_add3_insn): Use the addptr pattern if available.
44017         * config/s390/s390.md ("addptrdi3", "addptrsi3"): New expanders.
44019 2014-03-24  Ulrich Drepper  <drepper@gmail.com>
44021         * config/i386/avx512fintrin.h: Define _mm512_set1_ps and
44022         _mm512_set1_pd.
44024         * config/i386/avxintrin.h (_mm256_undefined_si256): Define.
44025         (_mm256_undefined_ps): Define.
44026         (_mm256_undefined_pd): Define.
44027         * config/i386/emmintrin.h (_mm_undefined_si128): Define.
44028         (_mm_undefined_pd): Define.
44029         * config/i386/xmmintrin.h (_mm_undefined_ps): Define.
44030         * config/i386/avx512fintrin.h (_mm512_undefined_si512): Define.
44031         (_mm512_undefined_ps): Define.
44032         (_mm512_undefined_pd): Define.
44033         Use _mm*_undefined_*.
44034         * config/i386/avx2intrin.h: Use _mm*_undefined_*.
44036 2014-03-24  Alex Velenko  <Alex.Velenko@arm.com>
44038         * config/aarch64/aarch64-simd-builtins.def (lshr): DI mode excluded.
44039         (lshr_simd): DI mode added.
44040         * config/aarch64/aarch64-simd.md (aarch64_lshr_simddi): New pattern.
44041         (aarch64_ushr_simddi): Likewise.
44042         * config/aarch64/aarch64.md (UNSPEC_USHR64): New unspec.
44043         * config/aarch64/arm_neon.h (vshr_n_u64): Intrinsic fixed.
44044         (vshrd_n_u64): Likewise.
44046 2014-03-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
44048         * Makefile.in (s-macro_list): Depend on cc1.
44050 2014-03-23  Teresa Johnson  <tejohnson@google.com>
44052         * ipa-utils.c (ipa_print_order): Use specified dump file.
44054 2014-03-23  Eric Botcazou  <ebotcazou@adacore.com>
44056         PR rtl-optimization/60601
44057         * bb-reorder.c (fix_up_fall_thru_edges): Test EDGE_FALLTHRU everywhere.
44059         * gcc.c (eval_spec_function): Initialize save_growing_value.
44061 2014-03-22  Jakub Jelinek  <jakub@redhat.com>
44063         PR sanitizer/60613
44064         * internal-fn.c (ubsan_expand_si_overflow_addsub_check): For
44065         code == MINUS_EXPR, never swap op0 with op1.
44067         * toplev.c (init_local_tick): Avoid signed integer multiplication
44068         overflow.
44069         * genautomata.c (reserv_sets_hash_value): Fix rotate idiom, avoid
44070         shift by first operand's bitsize.
44072 2014-03-21  Jakub Jelinek  <jakub@redhat.com>
44074         PR target/60610
44075         * config/i386/i386.h (TARGET_64BIT_P): If not TARGET_BI_ARCH,
44076         redefine to 1 or 0.
44077         * config/i386/darwin.h (TARGET_64BIT_P): Redefine to
44078         TARGET_ISA_64BIT_P(x).
44080 2014-03-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
44082         * config/rs6000/rs6000.c (rs6000_expand_vector_set): Generate a
44083         pattern for vector nor instead of subtract from splat(-1).
44084         (altivec_expand_vec_perm_const_le): Likewise.
44086 2014-03-21  Richard Henderson  <rth@twiddle.net>
44088         PR target/60598
44089         * ifcvt.c (dead_or_predicable): Return FALSE if there are any frame
44090         related insns after epilogue_completed.
44092 2014-03-21  Martin Jambor  <mjambor@suse.cz>
44094         PR ipa/59176
44095         * cgraph.h (symtab_node): New flag body_removed.
44096         * ipa.c (symtab_remove_unreachable_nodes): Set body_removed flag
44097         when removing bodies.
44098         * symtab.c (dump_symtab_base): Dump body_removed flag.
44099         * cgraph.c (verify_edge_corresponds_to_fndecl): Skip nodes which
44100         had their bodies removed.
44102 2014-03-21  Martin Jambor  <mjambor@suse.cz>
44104         PR ipa/60419
44105         * ipa.c (symtab_remove_unreachable_nodes): Clear thunk flag of nodes
44106         in the border.
44108 2014-03-21  Richard Biener  <rguenther@suse.de>
44110         PR tree-optimization/60577
44111         * tree-core.h (struct tree_base): Document nothrow_flag use
44112         in DECL_NONALIASED.
44113         * tree.h (DECL_NONALIASED): New.
44114         (may_be_aliased): Adjust.
44115         * coverage.c (build_var): Set DECL_NONALIASED.
44117 2014-03-20  Eric Botcazou  <ebotcazou@adacore.com>
44119         * expr.c (expand_expr_real_1): Remove outdated comment.
44121 2014-03-20  Jakub Jelinek  <jakub@redhat.com>
44123         PR middle-end/60597
44124         * ira.c (adjust_cleared_regs): Call copy_rtx on
44125         *reg_equiv[REGNO (loc)].src_p before passing it to
44126         simplify_replace_fn_rtx.
44128         PR target/60568
44129         * config/i386/i386.c (x86_output_mi_thunk): Surround UNSPEC_GOT
44130         into CONST, put pic register as first operand of PLUS.  Use
44131         gen_const_mem for both 32-bit and 64-bit PIC got loads.
44133 2014-03-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
44135         * config/aarch64/aarch64.c (MEMORY_MOVE_COST): Delete.
44137 2014-03-20  Eric Botcazou  <ebotcazou@adacore.com>
44139         * config/sparc/sparc.c (sparc_do_work_around_errata): Implement work
44140         around for store forwarding issue in the FPU on the UT699.
44141         * config/sparc/sparc.md (in_branch_delay): Return false for single FP
44142         loads and operations if -mfix-ut699 is specified.
44143         (divtf3_hq): Tweak attribute.
44144         (sqrttf2_hq): Likewise.
44146 2014-03-20  Eric Botcazou  <ebotcazou@adacore.com>
44148         * calls.c (store_one_arg): Remove incorrect const qualification on the
44149         type of the temporary.
44150         * cfgexpand.c (expand_return): Likewise.
44151         * expr.c (expand_constructor): Likewise.
44152         (expand_expr_real_1): Likewise.
44154 2014-03-20  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
44156         * config/arm/arm.c (arm_dwarf_register_span): Update the element number
44157         of parts.
44159 2014-03-19  Kaz Kojima  <kkojima@gcc.gnu.org>
44161         PR target/60039
44162         * config/sh/sh.md (udivsi3_i1): Clobber R1 register.
44164 2014-03-19  James Greenhalgh  <james.greenhalgh@arm.com>
44166         * config/arm/aarch-common-protos.h
44167         (alu_cost_table): Fix spelling of "extend".
44168         * config/arm/arm.c (arm_new_rtx_costs): Fix spelling of "extend".
44170 2014-03-19  Richard Biener  <rguenther@suse.de>
44172         PR middle-end/60553
44173         * tree-core.h (tree_type_common): Re-order pointer members
44174         to reduce recursion depth during GC walks.
44176 2014-03-19  Marek Polacek  <polacek@redhat.com>
44178         PR sanitizer/60569
44179         * ubsan.c (ubsan_type_descriptor): Check that DECL_NAME is nonnull
44180         before accessing it.
44182 2014-03-19  Richard Biener  <rguenther@suse.de>
44184         PR lto/59543
44185         * lto-streamer-in.c (input_function): In WPA stage do not drop
44186         debug stmts.
44188 2014-03-19  Jakub Jelinek  <jakub@redhat.com>
44190         PR tree-optimization/60559
44191         * vectorizable_mask_load_store): Replace scalar MASK_LOAD
44192         with build_zero_cst assignment.
44194 2014-03-18  Kai Tietz  <ktietz@redhat.com>
44196         PR rtl-optimization/56356
44197         * sdbout.c (sdbout_parms): Verify that parms'
44198         incoming argument is valid.
44199         (sdbout_reg_parms): Likewise.
44201 2014-03-18  Richard Henderson  <rth@redhat.com>
44203         PR target/60562
44204         * config/i386/i386.md (*float<SWI48x><MODEF>2_i387): Move down to
44205         be shadowed by *float<SWI48><MODEF>2_sse.  Test X87_ENABLE_FLOAT.
44206         (*float<SWI48><MODEF>2_sse): Check X87_ENABLE_FLOAT for alternative 0.
44208 2014-03-18  Basile Starynkevitch  <basile@starynkevitch.net>
44210         * plugin.def: Improve comment for PLUGIN_INCLUDE_FILE.
44211         * doc/plugins.texi (Plugin callbacks): Mention PLUGIN_INCLUDE_FILE.
44212         Italicize plugin event names in description.  Explain that
44213         PLUGIN_PRAGMAS has no sense for lto1.  Explain PLUGIN_INCLUDE_FILE.
44214         Remind that no GCC functions should be called after PLUGIN_FINISH.
44215         Explain what pragmas with expansion are.
44217 2014-03-18  Martin Liska  <mliska@suse.cz>
44219         * cgraph.c (cgraph_update_edges_for_call_stmt_node): Added case when
44220         gimple call statement is update.
44221         * gimple-fold.c (gimple_fold_call): Changed order for GIMPLE_ASSIGN and
44222         GIMPLE_CALL, where gsi iterator still points to GIMPLE CALL.
44224 2014-03-18  Jakub Jelinek  <jakub@redhat.com>
44226         PR sanitizer/60557
44227         * ubsan.c (ubsan_instrument_unreachable): Call
44228         initialize_sanitizer_builtins.
44229         (ubsan_pass): Likewise.
44231         PR sanitizer/60535
44232         * ubsan.c (ubsan_type_descriptor, ubsan_create_data): Call
44233         varpool_finalize_decl instead of rest_of_decl_compilation.
44235 2014-03-18  Richard Biener  <rguenther@suse.de>
44237         * df-problems.c (df_rd_confluence_n): Avoid bitmap_copy
44238         by using bitmap_and_compl instead of bitmap_and_compl_into.
44239         (df_rd_transfer_function): Likewise.
44241 2014-03-18  Richard Biener  <rguenther@suse.de>
44243         * doc/lto.texi (fresolution): Fix typo.
44245 2014-03-18  Richard Biener  <rguenther@suse.de>
44247         * doc/invoke.texi (flto): Update for changes in 4.9.
44249 2014-03-18  Richard Biener  <rguenther@suse.de>
44251         * doc/loop.texi: Remove section on the removed lambda framework.
44252         Update loop docs with recent changes in preserving loop structure.
44254 2014-03-18  Richard Biener  <rguenther@suse.de>
44256         * doc/lto.texi (-fresolution): Document.
44258 2014-03-18  Richard Biener  <rguenther@suse.de>
44260         * doc/contrib.texi: Adjust my name.
44262 2014-03-18  Jakub Jelinek  <jakub@redhat.com>
44264         PR ipa/58721
44265         * internal-fn.c: Include diagnostic-core.h.
44266         (expand_BUILTIN_EXPECT): New function.
44267         * gimplify.c (gimplify_call_expr): Use false instead of FALSE.
44268         (gimplify_modify_expr): Gimplify 3 argument __builtin_expect into
44269         IFN_BUILTIN_EXPECT call instead of __builtin_expect builtin call.
44270         * ipa-inline-analysis.c (find_foldable_builtin_expect): Handle
44271         IFN_BUILTIN_EXPECT.
44272         * predict.c (expr_expected_value_1): Handle IFN_BUILTIN_EXPECT.
44273         Revert 3 argument __builtin_expect code.
44274         (strip_predict_hints): Handle IFN_BUILTIN_EXPECT.
44275         * gimple-fold.c (gimple_fold_call): Likewise.
44276         * tree.h (fold_builtin_expect): New prototype.
44277         * builtins.c (build_builtin_expect_predicate): Add predictor
44278         argument, if non-NULL, create 3 argument __builtin_expect.
44279         (fold_builtin_expect): No longer static.  Add ARG2 argument,
44280         pass it through to build_builtin_expect_predicate.
44281         (fold_builtin_2): Adjust caller.
44282         (fold_builtin_3): Handle BUILT_IN_EXPECT.
44283         * internal-fn.def (BUILTIN_EXPECT): New.
44285 2014-03-18  Tobias Burnus  <burnus@net-b.de>
44287         PR ipa/58721
44288         * predict.def (PRED_FORTRAN_OVERFLOW, PRED_FORTRAN_FAIL_ALLOC,
44289         PRED_FORTRAN_FAIL_IO, PRED_FORTRAN_WARN_ONCE, PRED_FORTRAN_SIZE_ZERO,
44290         PRED_FORTRAN_INVALID_BOUND, PRED_FORTRAN_ABSENT_DUMMY): Add.
44292 2014-03-18  Jan Hubicka  <hubicka@ucw.cz>
44294         PR ipa/58721
44295         * predict.c (combine_predictions_for_bb): Fix up formatting.
44296         (expr_expected_value_1, expr_expected_value): Add predictor argument,
44297         fill what it points to if non-NULL.
44298         (tree_predict_by_opcode): Adjust caller, use the predictor.
44299         * predict.def (PRED_COMPARE_AND_SWAP): Add.
44301 2014-03-18  Eric Botcazou  <ebotcazou@adacore.com>
44303         * config/sparc/sparc.c (sparc_do_work_around_errata): Speed up and use
44304         proper constant for the store mode.
44306 2014-03-18  Ilya Enkovich  <ilya.enkovich@intel.com>
44308         * symtab.c (change_decl_assembler_name): Fix transparent alias
44309         chain construction.
44311 2014-03-16  Renlin Li  <Renlin.Li@arm.com>
44313         * config/aarch64/aarch64.c: Correct the comments about the
44314         aarch64 stack layout.
44316 2014-03-18  Thomas Schwinge  <thomas@codesourcery.com>
44318         * omp-low.c (lower_rec_input_clauses) <build_omp_barrier>: Restore
44319         check for GF_OMP_FOR_KIND_FOR.
44321 2013-03-18  Kirill Yukhin  <kirill.yukhin@intel.com>
44323         * config/i386/i386.h (ADDITIONAL_REGISTER_NAMES): Add
44324         ymm and zmm register names.
44326 2014-03-17  Jakub Jelinek  <jakub@redhat.com>
44328         PR target/60516
44329         * config/i386/i386.c (ix86_expand_epilogue): Adjust REG_CFA_ADJUST_CFA
44330         note creation for the 2010-08-31 changes.
44332 2014-03-17  Marek Polacek  <polacek@redhat.com>
44334         PR middle-end/60534
44335         * omp-low.c (omp_max_vf): Treat -fno-tree-loop-optimize the same
44336         as -fno-tree-loop-vectorize.
44337         (expand_omp_simd): Likewise.
44339 2014-03-15  Eric Botcazou  <ebotcazou@adacore.com>
44341         * config/sparc/sparc-protos.h (tls_call_delay): Delete.
44342         (eligible_for_call_delay): New prototype.
44343         * config/sparc/sparc.c (tls_call_delay): Rename into...
44344         (eligible_for_call_delay): ...this.  Return false if the instruction
44345         cannot be put in the delay slot of a branch.
44346         (eligible_for_restore_insn): Simplify.
44347         (eligible_for_return_delay): Return false if the instruction cannot be
44348         put in the delay slot of a branch and simplify.
44349         (eligible_for_sibcall_delay): Return false if the instruction cannot be
44350         put in the delay slot of a branch.
44351         * config/sparc/sparc.md (fix_ut699): New attribute.
44352         (tls_call_delay): Delete.
44353         (in_call_delay): Reimplement.
44354         (eligible_for_sibcall_delay): Rename into...
44355         (in_sibcall_delay): ...this.
44356         (eligible_for_return_delay): Rename into...
44357         (in_return_delay): ...this.
44358         (in_branch_delay): Reimplement.
44359         (in_uncond_branch_delay): Delete.
44360         (in_annul_branch_delay): Delete.
44362 2014-03-14  Richard Henderson  <rth@redhat.com>
44364         PR target/60525
44365         * config/i386/i386.md (floathi<X87MODEF>2): Delete expander; rename
44366         define_insn from *floathi<X87MODEF>2_i387; allow nonimmediate_operand.
44367         (*floathi<X87MODEF>2_i387_with_temp): Remove.
44368         (floathi splitters): Remove.
44369         (float<SWI48x>xf2): New pattern.
44370         (float<SWI48><MODEF>2): Rename from float<SWI48x><X87MODEF>2.  Drop
44371         code that tried to handle DImode for 32-bit, but which was excluded
44372         by the pattern's condition.  Drop allocation of stack temporary.
44373         (*floatsi<MODEF>2_vector_mixed_with_temp): Remove.
44374         (*float<SWI48><MODEF>2_mixed_with_temp): Remove.
44375         (*float<SWI48><MODEF>2_mixed_interunit): Remove.
44376         (*float<SWI48><MODEF>2_mixed_nointerunit): Remove.
44377         (*floatsi<MODEF>2_vector_sse_with_temp): Remove.
44378         (*float<SWI48><MODEF>2_sse_with_temp): Remove.
44379         (*float<SWI48><MODEF>2_sse_interunit): Remove.
44380         (*float<SWI48><MODEF>2_sse_nointerunit): Remove.
44381         (*float<SWI48x><X87MODEF>2_i387_with_temp): Remove.
44382         (*float<SWI48x><X87MODEF>2_i387): Remove.
44383         (all float _with_temp splitters): Remove.
44384         (*float<SWI48x><MODEF>2_i387): New pattern.
44385         (*float<SWI48><MODEF>2_sse): New pattern.
44386         (float TARGET_USE_VECTOR_CONVERTS splitters): Merge them.
44387         (float TARGET_SSE_PARTIAL_REG_DEPENDENCY splitters): Merge them.
44389 2014-03-14  Jakub Jelinek  <jakub@redhat.com>
44390             Marek Polacek  <polacek@redhat.com>
44392         PR middle-end/60484
44393         * common.opt (dump_base_name_prefixed): New Variable.
44394         * opts.c (finish_options): Don't prepend directory to x_dump_base_name
44395         if x_dump_base_name_prefixed is already set, set it at the end.
44397 2014-03-14  Vladimir Makarov  <vmakarov@redhat.com>
44399         PR rtl-optimization/60508
44400         * lra-constraints.c (get_reload_reg): Add new parameter
44401         in_subreg_p.
44402         (process_addr_reg, simplify_operand_subreg, curr_insn_transform):
44403         Pass the new parameter values.
44405 2014-03-14  Richard Biener  <rguenther@suse.de>
44407         * common.opt: Revert unintented changes from r205065.
44408         * opts.c: Likewise.
44410 2014-03-14  Richard Biener  <rguenther@suse.de>
44412         PR middle-end/60518
44413         * cfghooks.c (split_block): Properly adjust all loops the
44414         block was a latch of.
44416 2014-03-14  Martin Jambor  <mjambor@suse.cz>
44418         PR lto/60461
44419         * ipa-prop.c (ipa_modify_call_arguments): Fix iteration condition
44420         and simplify it.
44422 2014-03-14  Georg-Johann Lay  <avr@gjlay.de>
44424         PR target/59396
44425         * config/avr/avr.c (avr_set_current_function): Pass function name
44426         through default_strip_name_encoding before sanity checking instead
44427         of skipping the first char of the assembler name.
44429 2014-03-13  Richard Henderson  <rth@redhat.com>
44431         PR debug/60438
44432         * config/i386/i386.c (ix86_split_fp_branch): Remove pushed argument.
44433         (ix86_force_to_memory, ix86_free_from_memory): Remove.
44434         * config/i386/i386-protos.h: Likewise.
44435         * config/i386/i386.md (floathi<X87MODEF>2): Use assign_386_stack_local
44436         in the expander instead of a splitter.
44437         (float<SWI48x><X87MODEF>2): Use assign_386_stack_local if there is
44438         any possibility of requiring a memory.
44439         (*floatsi<MODEF>2_vector_mixed): Remove, and the splitters.
44440         (*floatsi<MODEF>2_vector_sse): Remove, and the splitters.
44441         (fp branch splitters): Update for ix86_split_fp_branch.
44442         (*jcc<X87MODEF>_<SWI24>_i387): Remove r/f alternative.
44443         (*jcc<X87MODEF>_<SWI24>_r_i387): Likewise.
44444         (splitter for jcc<X87MODEF>_<SWI24>_i387 r/f): Remove.
44445         (*fop_<MODEF>_2_i387): Remove f/r alternative.
44446         (*fop_<MODEF>_3_i387): Likewise.
44447         (*fop_xf_2_i387, *fop_xf_3_i387): Likewise.
44448         (splitters for the fop_* register patterns): Remove.
44449         (fscalexf4_i387): Rename from *fscalexf4_i387.
44450         (ldexpxf3): Use gen_floatsixf2 and gen_fscalexf4_i387.
44452 2014-03-13  Jakub Jelinek  <jakub@redhat.com>
44454         PR tree-optimization/59779
44455         * tree-dfa.c (get_ref_base_and_extent): Use double_int
44456         type for bitsize and maxsize instead of HOST_WIDE_INT.
44458 2014-03-13  Steven Bosscher  <steven@gcc.gnu.org>
44460         PR rtl-optimization/57320
44461         * function.c (rest_of_handle_thread_prologue_and_epilogue): Cleanup
44462         the CFG after thread_prologue_and_epilogue_insns.
44464 2014-03-13  Vladimir Makarov  <vmakarov@redhat.com>
44466         PR rtl-optimization/57189
44467         * lra-constraints.c (process_alt_operands): Disfavor spilling
44468         vector pseudos.
44470 2014-03-13  Cesar Philippidis  <cesar@codesourcery.com>
44472         * lto-wrapper.c (maybe_unlink_file): Suppress diagnostic messages.
44474 2014-03-13  Jakub Jelinek  <jakub@redhat.com>
44476         PR tree-optimization/59025
44477         PR middle-end/60418
44478         * tree-ssa-reassoc.c (sort_by_operand_rank): For SSA_NAMEs with the
44479         same rank, sort by bb_rank and gimple_uid of SSA_NAME_DEF_STMT first.
44481 2014-03-13  Georg-Johann Lay  <avr@gjlay.de>
44483         PR target/60486
44484         * config/avr/avr.c (avr_out_plus): Swap cc_plus and cc_minus in
44485         calls of avr_out_plus_1.
44487 2014-03-13  Bin Cheng  <bin.cheng@arm.com>
44489         * tree-cfgcleanup.c (remove_forwarder_block_with_phi): Record
44490         BB's single pred and update the father loop's latch info later.
44492 2014-03-12  Michael Meissner  <meissner@linux.vnet.ibm.com>
44494         * config/rs6000/vector.md (VEC_L): Add V1TI mode to vector types.
44495         (VEC_M): Likewise.
44496         (VEC_N): Likewise.
44497         (VEC_R): Likewise.
44498         (VEC_base): Likewise.
44499         (mov<MODE>, VEC_M modes): If we are loading TImode into VSX
44500         registers, we need to swap double words in little endian mode.
44502         * config/rs6000/rs6000-modes.def (V1TImode): Add new vector mode
44503         to be a container mode for 128-bit integer operations added in ISA
44504         2.07.  Unlike TImode and PTImode, the preferred register set is
44505         the Altivec/VMX registers for the 128-bit operations.
44507         * config/rs6000/rs6000-protos.h (rs6000_move_128bit_ok_p): Add
44508         declarations.
44509         (rs6000_split_128bit_ok_p): Likewise.
44511         * config/rs6000/rs6000-builtin.def (BU_P8V_AV_3): Add new support
44512         macros for creating ISA 2.07 normal and overloaded builtin
44513         functions with 3 arguments.
44514         (BU_P8V_OVERLOAD_3): Likewise.
44515         (VPERM_1T): Add support for V1TImode in 128-bit vector operations
44516         for use as overloaded functions.
44517         (VPERM_1TI_UNS): Likewise.
44518         (VSEL_1TI): Likewise.
44519         (VSEL_1TI_UNS): Likewise.
44520         (ST_INTERNAL_1ti): Likewise.
44521         (LD_INTERNAL_1ti): Likewise.
44522         (XXSEL_1TI): Likewise.
44523         (XXSEL_1TI_UNS): Likewise.
44524         (VPERM_1TI): Likewise.
44525         (VPERM_1TI_UNS): Likewise.
44526         (XXPERMDI_1TI): Likewise.
44527         (SET_1TI): Likewise.
44528         (LXVD2X_V1TI): Likewise.
44529         (STXVD2X_V1TI): Likewise.
44530         (VEC_INIT_V1TI): Likewise.
44531         (VEC_SET_V1TI): Likewise.
44532         (VEC_EXT_V1TI): Likewise.
44533         (EQV_V1TI): Likewise.
44534         (NAND_V1TI): Likewise.
44535         (ORC_V1TI): Likewise.
44536         (VADDCUQ): Add support for 128-bit integer arithmetic instructions
44537         added in ISA 2.07.  Add both normal 'altivec' builtins, and the
44538         overloaded builtin.
44539         (VADDUQM): Likewise.
44540         (VSUBCUQ): Likewise.
44541         (VADDEUQM): Likewise.
44542         (VADDECUQ): Likewise.
44543         (VSUBEUQM): Likewise.
44544         (VSUBECUQ): Likewise.
44546         * config/rs6000/rs6000-c.c (__int128_type): New static to hold
44547         __int128_t and __uint128_t types.
44548         (__uint128_type): Likewise.
44549         (altivec_categorize_keyword): Add support for vector __int128_t,
44550         vector __uint128_t, vector __int128, and vector unsigned __int128
44551         as a container type for TImode operations that need to be done in
44552         VSX/Altivec registers.
44553         (rs6000_macro_to_expand): Likewise.
44554         (altivec_overloaded_builtins): Add ISA 2.07 overloaded functions
44555         to support 128-bit integer instructions vaddcuq, vadduqm,
44556         vaddecuq, vaddeuqm, vsubcuq, vsubuqm, vsubecuq, vsubeuqm.
44557         (altivec_resolve_overloaded_builtin): Add support for V1TImode.
44559         * config/rs6000/rs6000.c (rs6000_hard_regno_mode_ok): Add support
44560         for V1TImode, and set up preferences to use VSX/Altivec registers.
44561         Setup VSX reload handlers.
44562         (rs6000_debug_reg_global): Likewise.
44563         (rs6000_init_hard_regno_mode_ok): Likewise.
44564         (rs6000_preferred_simd_mode): Likewise.
44565         (vspltis_constant): Do not allow V1TImode as easy altivec constants.
44566         (easy_altivec_constant): Likewise.
44567         (output_vec_const_move): Likewise.
44568         (rs6000_expand_vector_set): Convert V1TImode set and extract to
44569         simple move.
44570         (rs6000_expand_vector_extract): Likewise.
44571         (reg_offset_addressing_ok_p): Setup V1TImode to use VSX reg+reg
44572         addressing.
44573         (rs6000_const_vec): Add support for V1TImode.
44574         (rs6000_emit_le_vsx_load): Swap double words when loading or
44575         storing TImode/V1TImode.
44576         (rs6000_emit_le_vsx_store): Likewise.
44577         (rs6000_emit_le_vsx_move): Likewise.
44578         (rs6000_emit_move): Add support for V1TImode.
44579         (altivec_expand_ld_builtin): Likewise.
44580         (altivec_expand_st_builtin): Likewise.
44581         (altivec_expand_vec_init_builtin): Likewise.
44582         (altivec_expand_builtin): Likewise.
44583         (rs6000_init_builtins): Add support for V1TImode type.  Add
44584         support for ISA 2.07 128-bit integer builtins.  Define type names
44585         for the VSX/Altivec vector types.
44586         (altivec_init_builtins): Add support for overloaded vector
44587         functions with V1TImode type.
44588         (rs6000_preferred_reload_class): Prefer Altivec registers for V1TImode.
44589         (rs6000_move_128bit_ok_p): Move 128-bit move/split validation to
44590         external function.
44591         (rs6000_split_128bit_ok_p): Likewise.
44592         (rs6000_handle_altivec_attribute): Create V1TImode from vector
44593         __int128_t and vector __uint128_t.
44595         * config/rs6000/vsx.md (VSX_L): Add V1TImode to vector iterators
44596         and mode attributes.
44597         (VSX_M): Likewise.
44598         (VSX_M2): Likewise.
44599         (VSm): Likewise.
44600         (VSs): Likewise.
44601         (VSr): Likewise.
44602         (VSv): Likewise.
44603         (VS_scalar): Likewise.
44604         (VS_double): Likewise.
44605         (vsx_set_v1ti): New builtin function to create V1TImode from TImode.
44607         * config/rs6000/rs6000.h (TARGET_VADDUQM): New macro to say whether
44608         we support the ISA 2.07 128-bit integer arithmetic instructions.
44609         (ALTIVEC_OR_VSX_VECTOR_MODE): Add V1TImode.
44610         (enum rs6000_builtin_type_index): Add fields to hold V1TImode
44611         and TImode types for use with the builtin functions.
44612         (V1TI_type_node): Likewise.
44613         (unsigned_V1TI_type_node): Likewise.
44614         (intTI_type_internal_node): Likewise.
44615         (uintTI_type_internal_node): Likewise.
44617         * config/rs6000/altivec.md (UNSPEC_VADDCUQ): New unspecs for ISA 2.07
44618         128-bit builtin functions.
44619         (UNSPEC_VADDEUQM): Likewise.
44620         (UNSPEC_VADDECUQ): Likewise.
44621         (UNSPEC_VSUBCUQ): Likewise.
44622         (UNSPEC_VSUBEUQM): Likewise.
44623         (UNSPEC_VSUBECUQ): Likewise.
44624         (VM): Add V1TImode to vector mode iterators.
44625         (VM2): Likewise.
44626         (VI_unit): Likewise.
44627         (altivec_vadduqm): Add ISA 2.07 128-bit binary builtins.
44628         (altivec_vaddcuq): Likewise.
44629         (altivec_vsubuqm): Likewise.
44630         (altivec_vsubcuq): Likewise.
44631         (altivec_vaddeuqm): Likewise.
44632         (altivec_vaddecuq): Likewise.
44633         (altivec_vsubeuqm): Likewise.
44634         (altivec_vsubecuq): Likewise.
44636         * config/rs6000/rs6000.md (FMOVE128_GPR): Add V1TImode to vector
44637         mode iterators.
44638         (BOOL_128): Likewise.
44639         (BOOL_REGS_OUTPUT): Likewise.
44640         (BOOL_REGS_OP1): Likewise.
44641         (BOOL_REGS_OP2): Likewise.
44642         (BOOL_REGS_UNARY): Likewise.
44643         (BOOL_REGS_AND_CR0): Likewise.
44645         * config/rs6000/altivec.h (vec_vaddcuq): Add support for ISA 2.07
44646         128-bit integer builtin support.
44647         (vec_vadduqm): Likewise.
44648         (vec_vaddecuq): Likewise.
44649         (vec_vaddeuqm): Likewise.
44650         (vec_vsubecuq): Likewise.
44651         (vec_vsubeuqm): Likewise.
44652         (vec_vsubcuq): Likewise.
44653         (vec_vsubuqm): Likewise.
44655         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
44656         Document vec_vaddcuq, vec_vadduqm, vec_vaddecuq, vec_vaddeuqm,
44657         vec_subecuq, vec_subeuqm, vec_vsubcuq, vec_vsubeqm builtins adding
44658         128-bit integer add/subtract to ISA 2.07.
44660 2014-03-12  Joern Rennecke  <joern.rennecke@embecosm.com>
44662         * config/arc/arc.c (arc_predicate_delay_insns):
44663         Fix third argument passed to conditionalize_nonjump.
44665 2014-03-12  Yufeng Zhang  <yufeng.zhang@arm.com>
44667         * config/aarch64/aarch64-builtins.c
44668         (aarch64_builtin_vectorized_function): Add BUILT_IN_LFLOORF,
44669         BUILT_IN_LLFLOOR, BUILT_IN_LCEILF and BUILT_IN_LLCEIL.
44670         * config/aarch64/arm_neon.h (vcvtaq_u64_f64): Call __builtin_llfloor
44671         instead of __builtin_lfloor.
44672         (vcvtnq_u64_f64): Call __builtin_llceil instead of __builtin_lceil.
44674 2014-03-12  Jakub Jelinek  <jakub@redhat.com>
44676         * tree-ssa-ifcombine.c (forwarder_block_to): New function.
44677         (tree_ssa_ifcombine_bb_1): New function.
44678         (tree_ssa_ifcombine_bb): Use it.  Handle also cases where else_bb
44679         is an empty forwarder block to then_bb or vice versa and then_bb
44680         and else_bb are effectively swapped.
44682 2014-03-12  Christian Bruel  <christian.bruel@st.com>
44684         PR target/60264
44685         * config/arm/arm.c (arm_emit_vfp_multi_reg_pop): Emit a
44686         REG_CFA_DEF_CFA note.
44687         (arm_expand_epilogue_apcs_frame): call arm_add_cfa_adjust_cfa_note.
44688         (arm_unwind_emit): Allow REG_CFA_DEF_CFA.
44690 2014-03-12  Thomas Preud'homme  <thomas.preudhomme@arm.com>
44692         PR tree-optimization/60454
44693         * tree-ssa-math-opts.c (find_bswap_1): Fix bswap detection.
44695 2014-03-12  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
44697         * config.gcc (aarch64*-*-*): Use ISA flags from aarch64-arches.def.
44698         Do not define target_cpu_default2 to generic.
44699         * config/aarch64/aarch64.h (TARGET_CPU_DEFAULT): Use generic cpu.
44700         * config/aarch64/aarch64.c (aarch64_override_options): Update comment.
44701         * config/aarch64/aarch64-arches.def (armv8-a): Use generic cpu.
44703 2014-03-12  Jakub Jelinek  <jakub@redhat.com>
44704             Marc Glisse  <marc.glisse@inria.fr>
44706         PR tree-optimization/60502
44707         * tree-ssa-reassoc.c (eliminate_not_pairs): Use build_all_ones_cst
44708         instead of build_low_bits_mask.
44710 2014-03-12  Jakub Jelinek  <jakub@redhat.com>
44712         PR middle-end/60482
44713         * tree-vrp.c (register_edge_assert_for_1): Don't add assert
44714         if there are multiple uses, but op doesn't live on E edge.
44715         * tree-cfg.c (assert_unreachable_fallthru_edge_p): Also ignore
44716         clobber stmts before __builtin_unreachable.
44718 2014-03-11  Richard Sandiford  <rdsandiford@googlemail.com>
44720         * builtins.c (expand_builtin_setjmp_receiver): Use and clobber
44721         hard_frame_pointer_rtx.
44722         * cse.c (cse_insn): Remove volatile check.
44723         * cselib.c (cselib_process_insn): Likewise.
44724         * dse.c (scan_insn): Likewise.
44726 2014-03-11  Joern Rennecke  <joern.rennecke@embecosm.com>
44728         * config/arc/arc.c (conditionalize_nonjump): New function,
44729         broken out of ...
44730         (arc_ifcvt): ... this.
44731         (arc_predicate_delay_insns): Use it.
44733 2014-03-11  Joern Rennecke  <joern.rennecke@embecosm.com>
44735         * config/arc/predicates.md (extend_operand): During/after reload,
44736         allow const_int_operand.
44737         * config/arc/arc.md (mulsidi3_700): Use extend_operand predicate.
44738         (umulsidi3_700): Likewise.  Change operand 2 constraint back to "cL".
44739         (mulsi3_highpart): Change operand 2 constraint alternatives 2 and 3
44740         to "i".
44741         (umulsi3_highpart_i): Likewise.
44743 2014-03-11  Richard Biener  <rguenther@suse.de>
44745         * tree-ssa-structalias.c (get_constraint_for_ptr_offset):
44746         Add asserts to guard possible wrong-code bugs.
44748 2014-03-11  Richard Biener  <rguenther@suse.de>
44750         PR tree-optimization/60429
44751         PR tree-optimization/60485
44752         * tree-ssa-structalias.c (set_union_with_increment): Properly
44753         take into account all fields that overlap the shifted vars.
44754         (do_sd_constraint): Likewise.
44755         (do_ds_constraint): Likewise.
44756         (get_constraint_for_ptr_offset): Likewise.
44758 2014-03-11  Chung-Lin Tang  <cltang@codesourcery.com>
44760         * config/nios2/nios2.c (machine_function): Add fp_save_offset field.
44761         (nios2_compute_frame_layout):
44762         Add calculation of cfun->machine->fp_save_offset.
44763         (nios2_expand_prologue): Correct setting of frame pointer register
44764         in prologue.
44765         (nios2_expand_epilogue): Update recovery of stack pointer from
44766         frame pointer accordingly.
44767         (nios2_initial_elimination_offset): Update calculation of offset
44768         for eliminating to HARD_FRAME_POINTER_REGNUM.
44770 2014-03-10  Jakub Jelinek  <jakub@redhat.com>
44772         PR ipa/60457
44773         * ipa.c (symtab_remove_unreachable_nodes): Don't call
44774         cgraph_get_create_node on VAR_DECLs.
44776 2014-03-10  Richard Biener  <rguenther@suse.de>
44778         PR middle-end/60474
44779         * tree.c (signed_or_unsigned_type_for): Handle OFFSET_TYPEs.
44781 2014-03-08  Douglas B Rupp  <rupp@gnat.com>
44783         * config/vms/vms.opt (vms_float_format): New variable.
44785 2014-03-08  Tobias Burnus  <burnus@net-b.de>
44787         * doc/invoke.texi (-fcilkplus): Update implementation status.
44789 2014-03-08  Paulo Matos  <paulo@matos-sorge.com>
44790             Richard Biener  <rguenther@suse.de>
44792         * lto-wrapper.c (merge_and_complain): Ensure -fshort-double is used
44793         consistently accross all TUs.
44794         (run_gcc): Enable -fshort-double automatically at link at link-time
44795         and disallow override.
44797 2014-03-08  Richard Sandiford  <rdsandiford@googlemail.com>
44799         PR target/58271
44800         * config/mips/mips.c (mips_option_override): Promote -mpaired-single
44801         warning to an error.  Disable TARGET_PAIRED_SINGLE and TARGET_MIPS3D
44802         if they can't be used.
44804 2014-03-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
44806         * configure.ac (HAVE_AS_IX86_TLSLDMPLT): Improve test
44807         for Solaris 11/x86 ld.
44808         * configure: Regenerate.
44810 2014-03-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
44812         * configure.ac (TLS_SECTION_ASM_FLAG): Save as tls_section_flag.
44813         (LIB_TLS_SPEC): Save as ld_tls_libs.
44814         (HAVE_AS_IX86_TLSLDMPLT): Define as 1/0.
44815         (HAVE_AS_IX86_TLSLDM): New test.
44816         * configure, config.in: Regenerate.
44817         * config/i386/i386.c (legitimize_tls_address): Fall back to
44818         TLS_MODEL_GLOBAL_DYNAMIC on 32-bit Solaris/x86 if tool chain
44819         cannot support TLS_MODEL_LOCAL_DYNAMIC.
44820         * config/i386/i386.md (*tls_local_dynamic_base_32_gnu): Use if
44821         instead of #ifdef in HAVE_AS_IX86_TLSLDMPLT test.
44823 2014-03-07  Paulo Matos  <paulo@matos-sorge.com>
44825         * common.opt (fira-loop-pressure): Mark as optimization.
44827 2014-03-07  Thomas Schwinge  <thomas@codesourcery.com>
44829         * langhooks.c (lhd_omp_mappable_type): The error_mark_node is not
44830         an OpenMP mappable type.
44832 2014-03-06  Matthias Klose  <doko@ubuntu.com>
44834         * Makefile.in (s-mlib): Only pass MULTIARCH_DIRNAME if
44835         MULTILIB_OSDIRNAMES is not defined.
44837 2014-03-06  Jakub Jelinek  <jakub@redhat.com>
44838             Meador Inge  <meadori@codesourcery.com>
44840         PR target/58595
44841         * config/arm/arm.c (arm_tls_symbol_p): Remove.
44842         (arm_legitimize_address): Call legitimize_tls_address for any
44843         arm_tls_referenced_p expression, handle constant addend.  Call it
44844         before testing for !TARGET_ARM.
44845         (thumb_legitimize_address): Don't handle arm_tls_symbol_p here.
44847 2014-03-06  Richard Biener  <rguenther@suse.de>
44849         PR middle-end/60445
44850         PR lto/60424
44851         PR lto/60427
44852         Revert
44853         2014-03-04  Paulo Matos  <paulo@matos-sorge.com>
44855         * tree-streamer.c (record_common_node): Assert we don't record
44856         nodes with type double.
44857         (preload_common_node): Skip type double, complex double and double
44858         pointer since it is now frontend dependent due to fshort-double option.
44860 2014-03-06  Richard Biener  <rguenther@suse.de>
44862         * gcc.c (PLUGIN_COND): Always enable unless -fno-use-linker-plugin
44863         or -fno-lto is specified and the linker has full plugin support.
44864         * collect2.c (lto_mode): Default to LTO_MODE_WHOPR if LTO is enabled.
44865         (main): Remove -flto processing, adjust lto_mode using use_plugin late.
44866         * lto-wrapper.c (merge_and_complain): Merge compile-time
44867         optimization levels.
44868         (run_gcc): And pass it through to the link options.
44870 2014-03-06  Alexandre Oliva  <aoliva@redhat.com>
44872         PR debug/60381
44873         Revert:
44874         2014-02-28  Alexandre Oliva  <aoliva@redhat.com>
44875         PR debug/59992
44876         * cselib.c (remove_useless_values): Skip to avoid quadratic
44877         behavior if the condition moved from...
44878         (cselib_process_insn): ... here holds.
44880 2014-03-05  Jakub Jelinek  <jakub@redhat.com>
44882         PR plugins/59335
44883         * Makefile.in (PLUGIN_HEADERS): Add tree-phinodes.h, stor-layout.h,
44884         ssa-iterators.h, $(RESOURCE_H) and tree-cfgcleanup.h.
44886         PR plugins/59335
44887         * config/i386/t-i386 (OPTIONS_H_EXTRA): Add stringop.def.
44888         (TM_H): Add x86-tune.def.
44890 2014-03-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
44892         * config/aarch64/aarch64.c (generic_tunings):
44893         Use cortexa57_extra_costs.
44895 2014-03-05  Jakub Jelinek  <jakub@redhat.com>
44897         PR lto/60404
44898         * cfgexpand.c (expand_used_vars): Do not assume all SSA_NAMEs
44899         of PARM/RESULT_DECLs must be coalesced with optimize && in_lto_p.
44900         * tree-ssa-coalesce.c (coalesce_ssa_name): Use MUST_COALESCE_COST - 1
44901         cost for in_lto_p.
44903 2014-03-04  Heiher  <r@hev.cc>
44905         * config/mips/mips-cpus.def (loongson3a): Mark as a MIPS64r2 processor.
44906         * config/mips/mips.h (MIPS_ISA_LEVEL_SPEC): Adjust accordingly.
44908 2014-03-04  Uros Bizjak  <ubizjak@gmail.com>
44910         * config/i386/predicates.md (const2356_operand): Change to ...
44911         (const2367_operand): ... this.
44912         * config/i386/sse.md (avx512pf_scatterpf<mode>sf): Use
44913         const2367_operand.
44914         (*avx512pf_scatterpf<mode>sf_mask): Ditto.
44915         (*avx512pf_scatterpf<mode>sf): Ditto.
44916         (avx512pf_scatterpf<mode>df): Ditto.
44917         (*avx512pf_scatterpf<mode>df_mask): Ditto.
44918         (*avx512pf_scatterpf<mode>df): Ditto.
44919         * config/i386/i386.c (ix86_expand_builtin): Update
44920         incorrect hint operand error message.
44922 2014-03-04  Richard Biener  <rguenther@suse.de>
44924         * lto-section-in.c (lto_get_section_data): Fix const cast.
44926 2014-03-04  Paulo Matos  <paulo@matos-sorge.com>
44928         * tree-streamer.c (record_common_node): Assert we don't record
44929         nodes with type double.
44930         (preload_common_node): Skip type double, complex double and double
44931         pointer since it is now frontend dependent due to fshort-double option.
44933 2014-03-04  Richard Biener  <rguenther@suse.de>
44935         PR lto/60405
44936         * lto-streamer-in.c (lto_read_body): Remove LTO bytecode version check.
44937         (lto_input_toplevel_asms): Likewise.
44938         * lto-section-in.c (lto_get_section_data): Instead do it here
44939         for every section.
44941 2014-03-04  Richard Biener  <rguenther@suse.de>
44943         PR tree-optimization/60382
44944         * tree-vect-loop.c (vect_is_simple_reduction_1): Do not consider
44945         dead PHIs a reduction.
44947 2014-03-03  Uros Bizjak  <ubizjak@gmail.com>
44949         * config/i386/xmmintrin.h (enum _mm_hint) <_MM_HINT_ET0>: Correct
44950         hint value.
44951         (_mm_prefetch): Move out of GCC target("sse") pragma.
44952         * config/i386/prfchwintrin.h (_m_prefetchw): Move out of
44953         GCC target("prfchw") pragma.
44954         * config/i386/i386.md (prefetch): Emit prefetchwt1 only
44955         for locality <= 2.
44956         * config/i386/i386.c (ix86_option_override_internal): Enable
44957         -mprfchw with -mprefetchwt1.
44959 2014-03-03  Joern Rennecke  <joern.rennecke@embecosm.com>
44961         * config/arc/arc.md (casesi_load) <length attribute alternative 0>:
44962         Mark as varying.
44964 2014-03-03  Joern Rennecke  <joern.rennecke@embecosm.com>
44966         * opts.h (CL_PCH_IGNORE): Define.
44967         * targhooks.c (option_affects_pch_p):
44968         Return false for options that have CL_PCH_IGNORE set.
44969         * opt-functions.awk: Process PchIgnore.
44970         * doc/options.texi: Document PchIgnore.
44972         * config/arc/arc.opt (misize): Add PchIgnore property.
44974 2014-03-03  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
44976         * config/rs6000/rs6000.c (rs6000_preferred_reload_class): Disallow
44977         reload of PLUS rtx's outside of GENERAL_REGS or BASE_REGS; relax
44978         constraint on constants to permit them being loaded into
44979         GENERAL_REGS or BASE_REGS.
44981 2014-03-03  Nick Clifton  <nickc@redhat.com>
44983         * config/rl78/rl78-real.md (cbranchsi4_real_signed): Add
44984         anti-cacnonical alternatives.
44985         (negandhi3_real): New pattern.
44986         * config/rl78/rl78-virt.md (negandhi3_virt): New pattern.
44988 2014-03-03  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
44990         * config/avr/avr-mcus.def: Remove atxmega16x1.
44991         * config/avr/avr-tables.opt: Regenerate.
44992         * config/avr/t-multilib: Regenerate.
44993         * doc/avr-mmcu.texi: Regenerate.
44995 2014-03-03  Tobias Grosser  <tobias@grosser.es>
44996             Mircea Namolaru  <mircea.namolaru@inria.fr>
44998         PR tree-optimization/58028
44999         * graphite-clast-to-gimple.c (set_cloog_options): Don't remove
45000         scalar dimensions.
45002 2014-03-03  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
45004         * config/arm/neon.md (*movmisalign<mode>): Legitimize addresses
45005         not handled by recognizers.
45007 2014-03-03  Jakub Jelinek  <jakub@redhat.com>
45009         PR middle-end/60175
45010         * function.c (expand_function_end): Don't emit
45011         clobber_return_register sequence if clobber_after is a BARRIER.
45012         * cfgexpand.c (construct_exit_block): Append instructions before
45013         return_label to prev_bb.
45015 2014-03-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45017         * config/rs6000/constraints.md: Document reserved use of "wc".
45019 2014-03-02  Jan Hubicka  <hubicka@ucw.cz>
45021         PR ipa/60150
45022         * ipa.c (function_and_variable_visibility): When dissolving comdat
45023         group, also set all symbols to local.
45025 2014-03-02  Jan Hubicka  <hubicka@ucw.cz>
45027         PR ipa/60306
45029         Revert:
45030         2013-12-14  Jan Hubicka  <jh@suse.cz>
45031         PR middle-end/58477
45032         * ipa-prop.c (stmt_may_be_vtbl_ptr_store): Skip clobbers.
45034 2014-03-02  Jon Beniston  <jon@beniston.com>
45036         PR bootstrap/48230
45037         PR bootstrap/50927
45038         PR bootstrap/52466
45039         PR target/46898
45040         * config/lm32/lm32.c (lm32_legitimate_constant_p): Remove, as incorrect.
45041         (TARGET_LEGITIMATE_CONSTANT_P): Undefine, as not needed.
45042         * config/lm32/lm32.md (movsi_insn): Add 32-bit immediate support.
45043         (simple_return, *simple_return): New patterns
45044         * config/lm32/predicates.md (movsi_rhs_operand): Remove as obsolete.
45045         * configure.ac (force_sjlj_exceptions): Force sjlj exceptions for lm32.
45047 2014-03-01  Paolo Carlini  <paolo.carlini@oracle.com>
45049         * dwarf2out.c (gen_subprogram_die): Tidy.
45051 2014-03-01  Oleg Endo  <olegendo@gcc.gnu.org>
45053         PR target/60071
45054         * config/sh/sh.md (*mov_t_msb_neg): Split into ...
45055         (*mov_t_msb_neg_negc): ... this new insn.
45057 2014-02-28  Jason Merrill  <jason@redhat.com>
45059         PR c++/58678
45060         * ipa-devirt.c (ipa_devirt): Don't choose an implicitly-declared
45061         function.
45063 2014-02-28  Paolo Carlini  <paolo.carlini@oracle.com>
45065         PR c++/60314
45066         * dwarf2out.c (decltype_auto_die): New static.
45067         (gen_subprogram_die): Handle 'decltype(auto)' like 'auto'.
45068         (gen_type_die_with_usage): Handle 'decltype(auto)'.
45069         (is_cxx_auto): Likewise.
45071 2014-02-28  Ian Bolton  <ian.bolton@arm.com>
45073         * config/aarch64/aarch64.h: Define __ARM_NEON by default if
45074         we are not using general regs only.
45076 2014-02-28  Richard Biener  <rguenther@suse.de>
45078         PR target/60280
45079         * tree-cfgcleanup.c (tree_forwarder_block_p): Restrict
45080         previous fix and only allow to remove trivial pre-headers
45081         and latches.  Also honor LOOPS_MAY_HAVE_MULTIPLE_LATCHES.
45082         (remove_forwarder_block): Properly update the latch of a loop.
45084 2014-02-28  Alexandre Oliva  <aoliva@redhat.com>
45086         PR debug/59992
45087         * cselib.c (cselib_hasher::equal): Special-case VALUE lookup.
45088         (cselib_preserved_hash_table): New.
45089         (preserve_constants_and_equivs): Move preserved vals to it.
45090         (cselib_find_slot): Look it up first.
45091         (cselib_init): Initialize it.
45092         (cselib_finish): Release it.
45093         (dump_cselib_table): Dump it.
45095 2014-02-28  Alexandre Oliva  <aoliva@redhat.com>
45097         PR debug/59992
45098         * cselib.c (remove_useless_values): Skip to avoid quadratic
45099         behavior if the condition moved from...
45100         (cselib_process_insn): ... here holds.
45102 2014-02-28  Alexandre Oliva  <aoliva@redhat.com>
45104         PR debug/57232
45105         * var-tracking.c (vt_initialize): Apply the same condition to
45106         preserve the CFA base value.
45108 2014-02-28  Joey Ye  <joey.ye@arm.com>
45110         PR target/PR60169
45111         * config/arm/arm.c (thumb_far_jump_used_p): Don't change
45112         if reload in progress or completed.
45114 2014-02-28  Tobias Burnus  <burnus@net-b.de>
45116         PR middle-end/60147
45117         * tree-pretty-print.c (dump_generic_node, print_declaration): Handle
45118         NAMELIST_DECL.
45120 2014-02-27  H.J. Lu  <hongjiu.lu@intel.com>
45122         * doc/tm.texi.in (Condition Code Status): Update documention for
45123         relative locations of cc0-setter and cc0-user.
45125 2014-02-27  Jeff Law  <law@redhat.com>
45127         PR rtl-optimization/52714
45128         * combine.c (try_combine): When splitting an unrecognized PARALLEL
45129         into two independent simple sets, if I3 is a jump, ensure the
45130         pattern we place into I3 is a (set (pc) ...).
45132 2014-02-27  Mikael Pettersson  <mikpe@it.uu.se>
45133             Jeff Law  <law@redhat.com>
45135         PR rtl-optimization/49847
45136         * cse.c (fold_rtx) Handle case where cc0 setter and cc0 user
45137         are in different blocks.
45138         * doc/tm.texi (Condition Code Status): Update documention for
45139         relative locations of cc0-setter and cc0-user.
45141 2014-02-27  Vladimir Makarov  <vmakarov@redhat.com>
45143         PR target/59222
45144         * lra.c (lra_emit_add): Check SUBREG too.
45146 2014-02-27  Andreas Schwab  <schwab@suse.de>
45148         * config/m68k/m68k.c (m68k_option_override): Disable
45149         -flive-range-shrinkage for classic m68k.
45150         (m68k_override_options_after_change): Likewise.
45152 2014-02-27  Marek Polacek  <polacek@redhat.com>
45154         PR middle-end/59223
45155         * tree-ssa-uninit.c (gate_warn_uninitialized): Run the pass even for
45156         -Wmaybe-uninitialized.
45158 2014-02-27  Alan Modra  <amodra@gmail.com>
45160         PR target/57936
45161         * reload1.c (emit_input_reload_insns): When reload_override_in,
45162         set old to rl->in_reg when rl->in_reg is a subreg.
45164 2014-02-26  Richard Biener  <rguenther@suse.de>
45166         PR bootstrap/60343
45167         * lra-assigns.c (spill_for): Avoid mixed-sign comparison.
45169 2014-02-25  Ilya Tocar  <ilya.tocar@intel.com>
45171         * common/config/i386/predicates.md (const1256_operand): Remove.
45172         (const2356_operand): New.
45173         (const_1_to_2_operand): Remove.
45174         * config/i386/sse.md (avx512pf_gatherpf<mode>sf): Change hint value.
45175         (*avx512pf_gatherpf<mode>sf_mask): Ditto.
45176         (*avx512pf_gatherpf<mode>sf): Ditto.
45177         (avx512pf_gatherpf<mode>df): Ditto.
45178         (*avx512pf_gatherpf<mode>df_mask): Ditto.
45179         (*avx512pf_gatherpf<mode>df): Ditto.
45180         (avx512pf_scatterpf<mode>sf): Ditto.
45181         (*avx512pf_scatterpf<mode>sf_mask): Ditto.
45182         (*avx512pf_scatterpf<mode>sf): Ditto.
45183         (avx512pf_scatterpf<mode>df): Ditto.
45184         (*avx512pf_scatterpf<mode>df_mask): Ditto.
45185         (*avx512pf_scatterpf<mode>df): Ditto.
45186         * common/config/i386/xmmintrin.h (_mm_hint): Add _MM_HINT_ET0.
45188 2014-02-26  Ilya Tocar  <ilya.tocar@intel.com>
45190         * config/i386/avx512fintrin.h (_mm512_testn_epi32_mask),
45191         (_mm512_mask_testn_epi32_mask), (_mm512_testn_epi64_mask),
45192         (_mm512_mask_testn_epi64_mask): Move to ...
45193         * config/i386/avx512cdintrin.h: Here.
45194         * config/i386/i386.c (bdesc_args): Change MASK_ISA for testnm.
45195         * config/i386/sse.md (avx512f_vmscalef<mode><round_name>): Remove %.
45196         (avx512f_scalef<mode><mask_name><round_name>): Ditto.
45197         (avx512f_testnm<mode>3<mask_scalar_merge_name>): Change conditon to
45198         TARGET_AVX512F from TARGET_AVX512CD.
45200 2014-02-26  Richard Biener  <rguenther@suse.de>
45202         PR ipa/60327
45203         * ipa.c (walk_polymorphic_call_targets): Properly guard
45204         call to inline_update_overall_summary.
45206 2014-02-26  Bin Cheng  <bin.cheng@arm.com>
45208         PR target/60280
45209         * tree-cfgcleanup.c (tree_forwarder_block_p): Protect loop preheaders
45210         and latches only if requested.  Fix latch if it is removed.
45211         * tree-ssa-dom.c (tree_ssa_dominator_optimize): Set
45212         LOOPS_HAVE_PREHEADERS.
45214 2014-02-25  Andrew Pinski  <apinski@cavium.com>
45216         * builtins.c (expand_builtin_thread_pointer): Create a new target
45217         when the target is NULL.
45219 2014-02-25  Vladimir Makarov  <vmakarov@redhat.com>
45221         PR rtl-optimization/60317
45222         * params.def (PARAM_LRA_MAX_CONSIDERED_RELOAD_PSEUDOS): New.
45223         * params.h (LRA_MAX_CONSIDERED_RELOAD_PSEUDOS): New.
45224         * lra-assigns.c: Include params.h.
45225         (spill_for): Use LRA_MAX_CONSIDERED_RELOAD_PSEUDOS as guard for
45226         other reload pseudos considerations.
45228 2014-02-25  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45230         * config/rs6000/vector.md (*vector_unordered<mode>): Change split
45231         to use canonical form for nor<mode>3.
45233 2014-02-25  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
45235         PR target/55426
45236         * config/arm/arm.h (CANNOT_CHANGE_MODE_CLASS): Allow 128 to 64-bit
45237         conversions.
45239 2014-02-25  Ilya Tocar  <ilya.tocar@intel.com>
45241         * common/config/i386/i386-common.c (OPTION_MASK_ISA_PREFETCHWT1_SET),
45242         (OPTION_MASK_ISA_PREFETCHWT1_UNSET): New.
45243         (ix86_handle_option): Handle OPT_mprefetchwt1.
45244         * config/i386/cpuid.h (bit_PREFETCHWT1): New.
45245         * config/i386/driver-i386.c (host_detect_local_cpu): Detect
45246         PREFETCHWT1 CPUID.
45247         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
45248         OPTION_MASK_ISA_PREFETCHWT1.
45249         * config/i386/i386.c (ix86_target_string): Handle mprefetchwt1.
45250         (PTA_PREFETCHWT1): New.
45251         (ix86_option_override_internal): Handle PTA_PREFETCHWT1.
45252         (ix86_valid_target_attribute_inner_p): Handle OPT_mprefetchwt1.
45253         * config/i386/i386.h (TARGET_PREFETCHWT1, TARGET_PREFETCHWT1_P): New.
45254         * config/i386/i386.md (prefetch): Check TARGET_PREFETCHWT1
45255         (*prefetch_avx512pf_<mode>_: Change into ...
45256         (*prefetch_prefetchwt1_<mode>: This.
45257         * config/i386/i386.opt (mprefetchwt1): New.
45258         * config/i386/xmmintrin.h (_mm_hint): Add _MM_HINT_ET1.
45259         (_mm_prefetch): Handle intent to write.
45260         * doc/invoke.texi (mprefetchwt1), (mno-prefetchwt1): Doccument.
45262 2014-02-25  Richard Biener  <rguenther@suse.de>
45264         PR middle-end/60291
45265         * emit-rtl.c (mem_attrs_htab): Remove.
45266         (mem_attrs_htab_hash): Likewise.
45267         (mem_attrs_htab_eq): Likewise.
45268         (set_mem_attrs): Always allocate new mem-attrs when something changed.
45269         (init_emit_once): Do not allocate mem_attrs_htab.
45271 2014-02-25  Richard Biener  <rguenther@suse.de>
45273         PR lto/60319
45274         * lto-opts.c (lto_write_options): Output non-explicit conservative
45275         -fwrapv, -fno-trapv and -fno-strict-overflow.
45276         * lto-wrapper.c (merge_and_complain): Handle merging those options.
45277         (run_gcc): And pass them through.
45279 2014-02-25  Andrey Belevantsev  <abel@ispras.ru>
45281         * sel-sched.c (calculate_new_fences): New parameter ptime.
45282         Calculate it as a maximum over all fence cycles.
45283         (sel_sched_region_2): Adjust the call to calculate_new_fences.
45284         Print the final schedule timing when sched_verbose.
45286 2014-02-25  Andrey Belevantsev  <abel@ispras.ru>
45288         PR rtl-optimization/60292
45289         * sel-sched.c (fill_vec_av_set): Do not reset target availability
45290         bit fot the fence instruction.
45292 2014-02-24  Alangi Derick  <alangiderick@gmail.com>
45294         * calls.h: Fix typo in comment.
45296 2014-02-24  John David Anglin  <danglin@gcc.gnu.org>
45298         * config/pa/pa.c (pa_output_move_double): Don't valididate when
45299         adjusting offsetable addresses.
45301 2014-02-24  Guozhi Wei  <carrot@google.com>
45303         * sparseset.h (sparseset_pop): Fix the wrong index.
45305 2014-02-24  Walter Lee  <walt@tilera.com>
45307         * config.gcc (tilepro-*-*): Change to tilepro*-*-*.
45308         (tilegx-*-linux*): Change to tilegx*-*-linux*; Support tilegxbe
45309         triplet.
45310         * common/config/tilegx/tilegx-common.c
45311         (TARGET_DEFAULT_TARGET_FLAGS): Define.
45312         * config/tilegx/linux.h (ASM_SPEC): Add endian_spec.
45313         (LINK_SPEC): Ditto.
45314         * config/tilegx/sync.md (atomic_test_and_set): Handle big endian.
45315         * config/tilegx/tilegx.c (tilegx_return_in_msb): New.
45316         (tilegx_gimplify_va_arg_expr): Handle big endian.
45317         (tilegx_expand_unaligned_load): Ditto.
45318         (tilegx_expand_unaligned_store): Ditto.
45319         (TARGET_RETURN_IN_MSB): New.
45320         * config/tilegx/tilegx.h (TARGET_DEFAULT): New.
45321         (TARGET_ENDIAN_DEFAULT): New.
45322         (TARGET_BIG_ENDIAN): Handle big endian.
45323         (BYTES_BIG_ENDIAN): Ditto.
45324         (WORDS_BIG_ENDIAN): Ditto.
45325         (FLOAT_WORDS_BIG_ENDIAN): Ditto.
45326         (ENDIAN_SPEC): New.
45327         (EXTRA_SPECS): New.
45328         * config/tilegx/tilegx.md (extv): Handle big endian.
45329         (extzv): Ditto.
45330         (insn_st<n>): Ditto.
45331         (insn_st<n>_add<bitsuffix>): Ditto.
45332         (insn_stnt<n>): Ditto.
45333         (insn_stnt<n>_add<bitsuffix>):Ditto.
45334         (vec_interleave_highv8qi): Handle big endian.
45335         (vec_interleave_highv8qi_be): New.
45336         (vec_interleave_highv8qi_le): New.
45337         (insn_v1int_h): Handle big endian.
45338         (vec_interleave_lowv8qi): Handle big endian.
45339         (vec_interleave_lowv8qi_be): New.
45340         (vec_interleave_lowv8qi_le): New.
45341         (insn_v1int_l): Handle big endian.
45342         (vec_interleave_highv4hi): Handle big endian.
45343         (vec_interleave_highv4hi_be): New.
45344         (vec_interleave_highv4hi_le): New.
45345         (insn_v2int_h): Handle big endian.
45346         (vec_interleave_lowv4hi): Handle big endian.
45347         (vec_interleave_lowv4hi_be): New.
45348         (vec_interleave_lowv4hi_le): New.
45349         (insn_v2int_l): Handle big endian.
45350         (vec_interleave_highv2si): Handle big endian.
45351         (vec_interleave_highv2si_be): New.
45352         (vec_interleave_highv2si_le): New.
45353         (insn_v4int_h): Handle big endian.
45354         (vec_interleave_lowv2si): Handle big endian.
45355         (vec_interleave_lowv2si_be): New.
45356         (vec_interleave_lowv2si_le): New.
45357         (insn_v4int_l): Handle big endian.
45358         * config/tilegx/tilegx.opt (mbig-endian): New option.
45359         (mlittle-endian): New option.
45360         * doc/install.texi: Document tilegxbe-linux.
45361         * doc/invoke.texi: Document -mbig-endian and -mlittle-endian.
45363 2014-02-24  Martin Jambor  <mjambor@suse.cz>
45365         PR ipa/60266
45366         * ipa-cp.c (propagate_constants_accross_call): Bail out early if
45367         there are no parameter descriptors.
45369 2014-02-24  Andrey Belevantsev  <abel@ispras.ru>
45371         PR rtl-optimization/60268
45372         * sched-rgn.c (haifa_find_rgns): Move the nr_regions_initial variable
45373         initialization to ...
45374         (sched_rgn_init): ... here.
45375         (schedule_region): Check for SCHED_PRESSURE_NONE earlier.
45377 2014-02-23  David Holsgrove  <david.holsgrove@xilinx.com>
45379         * config/microblaze/microblaze.md: Correct ashrsi_reg / lshrsi_reg
45380         names.
45382 2014-02-23  Edgar E. Iglesias  <edgar.iglesias@xilinx.com>
45384         * config/microblaze/microblaze.h: Remove SECONDARY_MEMORY_NEEDED
45385         definition.
45387 2014-02-23  David Holsgrove  <david.holsgrove@xilinx.com>
45389         * /config/microblaze/microblaze.c: Add microblaze_asm_output_mi_thunk,
45390         define TARGET_ASM_OUTPUT_MI_THUNK and TARGET_ASM_CAN_OUTPUT_MI_THUNK.
45392 2014-02-23  David Holsgrove  <david.holsgrove@xilinx.com>
45394         * config/microblaze/predicates.md: Add cmp_op predicate.
45395         * config/microblaze/microblaze.md: Add branch_compare instruction
45396         which uses cmp_op predicate and emits cmp insn before branch.
45397         * config/microblaze/microblaze.c (microblaze_emit_compare): Rename
45398         to microblaze_expand_conditional_branch and consolidate logic.
45399         (microblaze_expand_conditional_branch): emit branch_compare
45400         insn instead of handling cmp op separate from branch insn.
45402 2014-02-23  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45404         * config/rs6000/rs6000.c (rs6000_emit_le_vsx_move): Relax assert
45405         to permit subregs.
45407 2014-02-23  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45409         * config/rs6000/altivec.md (altivec_lve<VI_char>x): Replace
45410         define_insn with define_expand and new define_insn
45411         *altivec_lve<VI_char>x_internal.
45412         (altivec_stve<VI_char>x): Replace define_insn with define_expand
45413         and new define_insn *altivec_stve<VI_char>x_internal.
45414         * config/rs6000/rs6000-protos.h (altivec_expand_stvex_be): New
45415         prototype.
45416         * config/rs6000/rs6000.c (altivec_expand_lvx_be): Document use by
45417         lve*x built-ins.
45418         (altivec_expand_stvex_be): New function.
45420 2014-02-22  Joern Rennecke  <joern.rennecke@embecosm.com>
45422         * config/avr/avr.c (avr_can_eliminate): Allow elimination from
45423         ARG_POINTER_REGNUM to STACK_POINTER_REGNUM if !frame_pointer_needed.
45424         * config/avr/avr.c (ELIMINABLE_REGS): Add elimination from
45425         ARG_POINTER_REGNUM to STACK_POINTER_REGNUM.
45427 2014-02-21  Vladimir Makarov  <vmakarov@redhat.com>
45429         PR target/60298
45430         * lra-constraints.c (inherit_reload_reg): Use lra_emit_move
45431         instead of emit_move_insn.
45433 2014-02-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45435         * config/rs6000/altivec.md (altivec_vsumsws): Replace second
45436         vspltw with vsldoi.
45437         (reduc_uplus_v16qi): Use gen_altivec_vsumsws_direct instead of
45438         gen_altivec_vsumsws.
45440 2014-02-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45442         * config/rs6000/altivec.md (altivec_lvxl): Rename as
45443         *altivec_lvxl_<mode>_internal and use VM2 iterator instead of V4SI.
45444         (altivec_lvxl_<mode>): New define_expand incorporating
45445         -maltivec=be semantics where needed.
45446         (altivec_lvx): Rename as *altivec_lvx_<mode>_internal.
45447         (altivec_lvx_<mode>): New define_expand incorporating -maltivec=be
45448         semantics where needed.
45449         (altivec_stvx): Rename as *altivec_stvx_<mode>_internal.
45450         (altivec_stvx_<mode>): New define_expand incorporating
45451         -maltivec=be semantics where needed.
45452         (altivec_stvxl): Rename as *altivec_stvxl_<mode>_internal and use
45453         VM2 iterator instead of V4SI.
45454         (altivec_stvxl_<mode>): New define_expand incorporating
45455         -maltivec=be semantics where needed.
45456         * config/rs6000/rs6000-builtin.def: Add new built-in definitions
45457         LVXL_V2DF, LVXL_V2DI, LVXL_V4SF, LVXL_V4SI, LVXL_V8HI, LVXL_V16QI,
45458         LVX_V2DF, LVX_V2DI, LVX_V4SF, LVX_V4SI, LVX_V8HI, LVX_V16QI, STVX_V2DF,
45459         STVX_V2DI, STVX_V4SF, STVX_V4SI, STVX_V8HI, STVX_V16QI, STVXL_V2DF,
45460         STVXL_V2DI, STVXL_V4SF, STVXL_V4SI, STVXL_V8HI, STVXL_V16QI.
45461         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Replace
45462         ALTIVEC_BUILTIN_LVX with ALTIVEC_BUILTIN_LVX_<MODE> throughout;
45463         similarly for ALTIVEC_BUILTIN_LVXL, ALTIVEC_BUILTIN_STVX, and
45464         ALTIVEC_BUILTIN_STVXL.
45465         * config/rs6000/rs6000-protos.h (altivec_expand_lvx_be): New prototype.
45466         (altivec_expand_stvx_be): Likewise.
45467         * config/rs6000/rs6000.c (swap_selector_for_mode): New function.
45468         (altivec_expand_lvx_be): Likewise.
45469         (altivec_expand_stvx_be): Likewise.
45470         (altivec_expand_builtin): Add cases for
45471         ALTIVEC_BUILTIN_STVX_<MODE>, ALTIVEC_BUILTIN_STVXL_<MODE>,
45472         ALTIVEC_BUILTIN_LVXL_<MODE>, and ALTIVEC_BUILTIN_LVX_<MODE>.
45473         (altivec_init_builtins): Add definitions for
45474         __builtin_altivec_lvxl_<mode>, __builtin_altivec_lvx_<mode>,
45475         __builtin_altivec_stvx_<mode>, and __builtin_altivec_stvxl_<mode>.
45477 2014-02-21  Catherine Moore  <clm@codesourcery.com>
45479         * doc/invoke.texi (mvirt, mno-virt): Document.
45480         * config/mips/mips.opt (mvirt): New option.
45481         * config/mips/mips.h (ASM_SPEC): Pass mvirt to the assembler.
45483 2014-02-21  Richard Biener  <rguenther@suse.de>
45485         PR tree-optimization/60276
45486         * tree-vectorizer.h (struct _stmt_vec_info): Add min_neg_dist field.
45487         (STMT_VINFO_MIN_NEG_DIST): New macro.
45488         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence): Record
45489         STMT_VINFO_MIN_NEG_DIST.
45490         * tree-vect-stmts.c (vectorizable_load): Verify if assumptions
45491         made for negative dependence distances still hold.
45493 2014-02-21  Richard Biener  <rguenther@suse.de>
45495         PR middle-end/60291
45496         * tree-ssa-live.c (mark_all_vars_used_1): Do not walk
45497         DECL_INITIAL for globals not in the current function context.
45499 2014-02-21  Jakub Jelinek  <jakub@redhat.com>
45501         PR tree-optimization/56490
45502         * params.def (PARAM_UNINIT_CONTROL_DEP_ATTEMPTS): New param.
45503         * tree-ssa-uninit.c: Include params.h.
45504         (compute_control_dep_chain): Add num_calls argument, return false
45505         if it exceed PARAM_UNINIT_CONTROL_DEP_ATTEMPTS param, pass
45506         num_calls to recursive call.
45507         (find_predicates): Change dep_chain into normal array,
45508         cur_chain into auto_vec<edge, MAX_CHAIN_LEN + 1>, add num_calls
45509         variable and adjust compute_control_dep_chain caller.
45510         (find_def_preds): Likewise.
45512 2014-02-21  Thomas Schwinge  <thomas@codesourcery.com>
45514         * gimple-pretty-print.c (dump_gimple_omp_for) [flags & TDF_RAW]
45515         <case GF_OMP_FOR_KIND_CILKSIMD>: Add missing break statement.
45517 2014-02-21  Nick Clifton  <nickc@redhat.com>
45519         * config/stormy16/stormy16.md (pushdqi1): Add mode to post_inc.
45520         (pushhi1): Likewise.
45521         (popqi1): Add mode to pre_dec.
45522         (pophi1): Likewise.
45524 2014-02-21  Jakub Jelinek  <jakub@redhat.com>
45526         * config/i386/i386.c (ix86_expand_vec_perm): Use V8SImode
45527         mode for mask of V8SFmode permutation.
45529 2014-02-20  Richard Henderson  <rth@redhat.com>
45531         PR c++/60272
45532         * builtins.c (expand_builtin_atomic_compare_exchange): Always make
45533         a new pseudo for OLDVAL.
45535 2014-02-20  Jakub Jelinek  <jakub@redhat.com>
45537         PR target/57896
45538         * config/i386/i386.c (expand_vec_perm_interleave2): Don't call
45539         gen_reg_rtx if d->testing_p.
45540         (expand_vec_perm_pshufb2, expand_vec_perm_broadcast_1): Return early
45541         if d->testing_p and we will certainly return true.
45542         (expand_vec_perm_even_odd_1): Likewise.  Don't call gen_reg_rtx
45543         if d->testing_p.
45545 2014-02-20  Uros Bizjak  <ubizjak@gmail.com>
45547         * emit-rtl.c (gen_reg_rtx): Assert that
45548         crtl->emit.regno_pointer_align_length is non-zero.
45550 2014-02-20  Richard Henderson  <rth@redhat.com>
45552         PR c++/60272
45553         * builtins.c (expand_builtin_atomic_compare_exchange): Conditionalize
45554         on failure the store back into EXPECT.
45556 2014-02-20  Chung-Lin Tang  <cltang@codesourcery.com>
45557             Sandra Loosemore  <sandra@codesourcery.com>
45559         * config/nios2/nios2.md (unspec): Add UNSPEC_PIC_GOTOFF_SYM enum.
45560         * config/nios2/nios2.c (nios2_function_profiler): Add
45561         -fPIC (flag_pic == 2) support.
45562         (nios2_handle_custom_fpu_cfg): Fix warning parameter.
45563         (nios2_large_offset_p): New function.
45564         (nios2_unspec_reloc_p): Move up position, update to use
45565         nios2_large_offset_p.
45566         (nios2_unspec_address): Remove function.
45567         (nios2_unspec_offset): New function.
45568         (nios2_large_got_address): New function.
45569         (nios2_got_address): Add large offset support.
45570         (nios2_legitimize_tls_address): Update usage of removed and new
45571         functions.
45572         (nios2_symbol_binds_local_p): New function.
45573         (nios2_load_pic_address): Add -fPIC (flag_pic == 2) support.
45574         (nios2_legitimize_address): Update to use nios2_large_offset_p.
45575         (nios2_emit_move_sequence): Avoid legitimizing (const (unspec ...)).
45576         (nios2_print_operand): Merge H/L processing, add hiadj/lo
45577         processing for (const (unspec ...)).
45578         (nios2_unspec_reloc_name): Add UNSPEC_PIC_GOTOFF_SYM case.
45580 2014-02-20  Richard Biener  <rguenther@suse.de>
45582         * tree-cfg.c (replace_uses_by): Mark altered BBs before
45583         doing the substitution.
45584         (verify_gimple_assign_single): Also verify bare MEM_REFs on the lhs.
45586 2014-02-20  Martin Jambor  <mjambor@suse.cz>
45588         PR ipa/55260
45589         * ipa-cp.c (cgraph_edge_brings_all_agg_vals_for_node): Uce correct
45590         info when checking whether lattices are bottom.
45592 2014-02-20  Richard Biener  <rguenther@suse.de>
45594         PR middle-end/60221
45595         * tree-eh.c (execute_cleanup_eh_1): Also cleanup empty EH
45596         regions at -O0.
45598 2014-02-20  Jan Hubicka  <hubicka@ucw.cz>
45600         PR ipa/58555
45601         * ipa-inline-transform.c (clone_inlined_nodes): Add freq_scale
45602         parameter specifying the scaling.
45603         (inline_call): Update.
45604         (want_inline_recursively): Guard division by zero.
45605         (recursive_inlining): Update.
45606         * ipa-inline.h (clone_inlined_nodes): Update.
45608 2014-02-20  Ilya Tocar  <ilya.tocar@intel.com>
45610         PR target/60204
45611         * config/i386/i386.c (classify_argument): Pass structures of size
45612         64 bytes or less in register.
45614 2014-02-20  Ilya Tocar  <ilya.tocar@intel.com>
45615             Kirill Yukhin  <kirill.yukhin@intel.com>
45617         * config/i386/avx512erintrin.h (_mm_rcp28_round_sd): Swap operands.
45618         (_mm_rcp28_round_ss): Ditto.
45619         (_mm_rsqrt28_round_sd): Ditto.
45620         (_mm_rsqrt28_round_ss): Ditto.
45621         * config/i386/avx512erintrin.h (_mm_rcp14_round_sd): Ditto.
45622         (_mm_rcp14_round_ss): Ditto.
45623         (_mm_rsqrt14_round_sd): Ditto.
45624         (_mm_rsqrt14_round_ss): Ditto.
45625         * config/i386/sse.md (rsqrt14<mode>): Put nonimmediate operand as
45626         the first input operand, get rid of match_dup.
45627         (avx512er_exp2<mode><mask_name><round_saeonly_name>): Set type
45628         attribute to sse.
45629         (<mask_codefor>avx512er_rcp28<mode><mask_name><round_saeonly_name>):
45630         Ditto.
45631         (avx512er_vmrcp28<mode><round_saeonly_name>): Put nonimmediate
45632         operand as the first input operand, set type attribute.
45633         (<mask_codefor>avx512er_rsqrt28<mode><mask_name><round_saeonly_name>):
45634         Set type attribute.
45635         (avx512er_vmrsqrt28<mode><round_saeonly_name>): Put nonimmediate
45636         operand as the first input operand, set type attribute.
45638 2014-02-19  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45640         * config/rs6000/rs6000.c (vspltis_constant): Fix most significant
45641         bit of zero.
45643 2014-02-19  H.J. Lu  <hongjiu.lu@intel.com>
45645         PR target/60207
45646         * config/i386/i386.c (construct_container): Remove TFmode check
45647         for X86_64_INTEGER_CLASS.
45649 2014-02-19  Uros Bizjak  <ubizjak@gmail.com>
45651         PR target/59794
45652         * config/i386/i386.c (type_natural_mode): Warn for ABI changes
45653         only when -Wpsabi is enabled.
45655 2014-02-19  Michael Hudson-Doyle  <michael.hudson@linaro.org>
45657         PR target/59799
45658         * config/aarch64/aarch64.c (aarch64_pass_by_reference): The rules for
45659         passing arrays in registers are the same as for structs, so remove the
45660         special case for them.
45662 2014-02-19  Eric Botcazou  <ebotcazou@adacore.com>
45664         * expr.c (expand_expr_real_1) <case VIEW_CONVERT_EXPR>: For a bit-field
45665         destination type, extract only the valid bits if the source type is not
45666         integral and has a different mode.
45668 2014-02-19  Richard Biener  <rguenther@suse.de>
45670         PR ipa/60243
45671         * tree-inline.c (estimate_num_insns): Avoid calling cgraph_get_node
45672         for all calls.
45674 2014-02-19  Richard Biener  <rguenther@suse.de>
45676         PR ipa/60243
45677         * ipa-prop.c: Include stringpool.h and tree-ssanames.h.
45678         (ipa_modify_call_arguments): Emit an argument load explicitely and
45679         preserve virtual SSA form there and for the replacement call.
45680         Do not update SSA form nor free dominance info.
45682 2014-02-18  Jan Hubicka  <hubicka@ucw.cz>
45684         * ipa.c (function_and_variable_visibility): Also clear WEAK
45685         flag when disolving COMDAT_GROUP.
45687 2014-02-18  Jan Hubicka  <hubicka@ucw.cz>
45689         * ipa-prop.h (ipa_ancestor_jf_data): Update ocmment.
45690         * ipa-prop.c (ipa_set_jf_known_type): Return early when
45691         not devirtualizing.
45692         (ipa_set_ancestor_jf): Set type to NULL hwen it is not preserved;
45693         do more sanity checks.
45694         (detect_type_change): Return true when giving up early.
45695         (compute_complex_assign_jump_func): Fix type parameter of
45696         ipa_set_ancestor_jf.
45697         (compute_complex_ancestor_jump_func): Likewise.
45698         (update_jump_functions_after_inlining): Fix updating of
45699         ancestor function.
45700         * ipa-cp.c (ipa_get_jf_ancestor_result): Be ready for type to be NULL.
45702 2014-02-18  Jan Hubicka  <hubicka@ucw.cz>
45704         * cgraph.c (cgraph_update_edges_for_call_stmt_node): Also remove
45705         inline clones when edge disappears.
45707 2014-02-18  Michael Meissner  <meissner@linux.vnet.ibm.com>
45709         PR target/60203
45710         * config/rs6000/rs6000.md (mov<mode>_64bit, TF/TDmode moves):
45711         Split 64-bit moves into 2 patterns.  Do not allow the use of
45712         direct move for TDmode in little endian, since the decimal value
45713         has little endian bytes within a word, but the 64-bit pieces are
45714         ordered in a big endian fashion, and normal subreg's of TDmode are
45715         not allowed.
45716         (mov<mode>_64bit_dm): Likewise.
45717         (movtd_64bit_nodm): Likewise.
45719 2014-02-18  Eric Botcazou  <ebotcazou@adacore.com>
45721         PR tree-optimization/60174
45722         * tree-ssa-reassoc.c (init_range_entry): Do not look into the defining
45723         statement of an SSA_NAME that occurs in an abnormal PHI node.
45725 2014-02-18  Jakub Jelinek  <jakub@redhat.com>
45727         PR sanitizer/60142
45728         * final.c (SEEN_BB): Remove.
45729         (SEEN_NOTE, SEEN_EMITTED): Renumber.
45730         (final_scan_insn): Don't force_source_line on second
45731         NOTE_INSN_BASIC_BLOCK.
45733 2014-02-18  Uros Bizjak  <ubizjak@gmail.com>
45735         PR target/60205
45736         * config/i386/i386.h (struct ix86_args): Add warn_avx512f.
45737         * config/i386/i386.c (init_cumulative_args): Initialize warn_avx512f.
45738         (type_natural_mode): Warn ABI change when %zmm register is not
45739         available for AVX512F vector value passing.
45741 2014-02-18  Kai Tietz  <ktietz@redhat.com>
45743         PR target/60193
45744         * config/i386/i386.c (ix86_expand_prologue): Use value in
45745         rax register as displacement when restoring %r10 or %rax.
45746         Fix wrong offset when restoring both registers.
45748 2014-02-18  Eric Botcazou  <ebotcazou@adacore.com>
45750         * ipa-prop.c (compute_complex_ancestor_jump_func): Replace overzealous
45751         assertion with conditional return.
45753 2014-02-18  Jakub Jelinek  <jakub@redhat.com>
45754             Uros Bizjak  <ubizjak@gmail.com>
45756         PR driver/60233
45757         * config/i386/driver-i386.c (host_detect_local_cpu): If
45758         YMM state is not saved by the OS, also clear has_f16c.  Move
45759         CPUID 0x80000001 handling before YMM state saving checking.
45761 2014-02-18  Andrey Belevantsev  <abel@ispras.ru>
45763         PR rtl-optimization/58960
45764         * haifa-sched.c (alloc_global_sched_pressure_data): New,
45765         factored out from ...
45766         (sched_init): ... here.
45767         (free_global_sched_pressure_data): New, factored out from ...
45768         (sched_finish): ... here.
45769         * sched-int.h (free_global_sched_pressure_data): Declare.
45770         * sched-rgn.c (nr_regions_initial): New static global.
45771         (haifa_find_rgns): Initialize it.
45772         (schedule_region): Disable sched-pressure for the newly
45773         generated regions.
45775 2014-02-17  Richard Biener  <rguenther@suse.de>
45777         * tree-vect-stmts.c (free_stmt_vec_info): Clear BB and
45778         release SSA defs of pattern stmts.
45780 2014-02-17  Richard Biener  <rguenther@suse.de>
45782         * tree-inline.c (expand_call_inline): Release the virtual
45783         operand defined by the call we are about to inline.
45785 2014-02-17  Richard Biener  <rguenther@suse.de>
45787         * tree-ssa.c (verify_ssa): If verify_def found an error, ICE.
45789 2014-02-17  Kirill Yukhin  <kirill.yukhin@intel.com>
45790             Ilya Tocar  <ilya.tocar@intel.com>
45792         * config/i386/avx512fintrin.h (_mm512_maskz_permutexvar_epi64): Swap
45793         arguments order in builtin.
45794         (_mm512_permutexvar_epi64): Ditto.
45795         (_mm512_mask_permutexvar_epi64): Ditto
45796         (_mm512_maskz_permutexvar_epi32): Ditto
45797         (_mm512_permutexvar_epi32): Ditto
45798         (_mm512_mask_permutexvar_epi32): Ditto
45800 2014-02-16  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45802         * config/rs6000/altivec.md (p8_vmrgew): Handle little endian targets.
45803         (p8_vmrgow): Likewise.
45805 2014-02-16  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45807         * config/rs6000/vsx.md (vsx_xxpermdi_<mode>): Handle little
45808         endian targets.
45810 2014-02-15  Michael Meissner  <meissner@linux.vnet.ibm.com>
45812         PR target/60203
45813         * config/rs6000/rs6000.md (rreg): Add TFmode, TDmode constraints.
45814         (mov<mode>_internal, TFmode/TDmode): Split TFmode/TDmode moves
45815         into 64-bit and 32-bit moves.  On 64-bit moves, add support for
45816         using direct move instructions on ISA 2.07.  Also adjust
45817         instruction length for 64-bit.
45818         (mov<mode>_64bit, TFmode/TDmode): Likewise.
45819         (mov<mode>_32bit, TFmode/TDmode): Likewise.
45821 2014-02-15  Alan Modra  <amodra@gmail.com>
45823         PR target/58675
45824         PR target/57935
45825         * config/rs6000/rs6000.c (rs6000_secondary_reload_inner): Use
45826         find_replacement on parts of insn rtl that might be reloaded.
45828 2014-02-15  Richard Biener  <rguenther@suse.de>
45830         PR tree-optimization/60183
45831         * tree-ssa-phiprop.c (propagate_with_phi): Avoid speculating loads.
45832         (tree_ssa_phiprop): Calculate and free post-dominators.
45834 2014-02-14  Jeff Law  <law@redhat.com>
45836         PR rtl-optimization/60131
45837         * ree.c (get_extended_src_reg): New function.
45838         (combine_reaching_defs): Use it rather than assuming location of REG.
45839         (find_and_remove_re): Verify first operand of extension is
45840         a REG before adding the insns to the copy list.
45842 2014-02-14  Roland McGrath  <mcgrathr@google.com>
45844         * configure.ac (HAVE_AS_IX86_UD2): New test for 'ud2' mnemonic.
45845         * configure: Regenerated.
45846         * config.in: Regenerated.
45847         * config/i386/i386.md (trap) [HAVE_AS_IX86_UD2]: Use the mnemonic
45848         instead of ASM_SHORT.
45850 2014-02-14  Vladimir Makarov  <vmakarov@redhat.com>
45851             Richard Earnshaw  <rearnsha@arm.com>
45853         PR rtl-optimization/59535
45854         * lra-constraints.c (process_alt_operands): Encourage alternative
45855         when unassigned pseudo class is superset of the alternative class.
45856         (inherit_reload_reg): Don't inherit when optimizing for code size.
45857         * config/arm/arm.h (MODE_BASE_REG_CLASS): Add version for LRA
45858         returning CORE_REGS for anything but Thumb1 and BASE_REGS for
45859         modes not less than 4 for Thumb1.
45861 2014-02-14  Kyle McMartin  <kyle@redhat.com>
45863         PR pch/60010
45864         * config/host-linux.c (TRY_EMPTY_VM_SPACE): Define for AArch64.
45866 2014-02-14  Richard Biener  <rguenther@suse.de>
45868         * cilk-common.c (cilk_arrow): Build a MEM_REF, not an INDIRECT_REF.
45869         (get_frame_arg): Drop the assert with langhook types_compatible_p.
45870         Do not strip INDIRECT_REFs.
45872 2014-02-14  Richard Biener  <rguenther@suse.de>
45874         PR lto/60179
45875         * lto-streamer-out.c (DFS_write_tree_body): Do not follow
45876         DECL_FUNCTION_SPECIFIC_TARGET.
45877         (hash_tree): Do not hash DECL_FUNCTION_SPECIFIC_TARGET.
45878         * tree-streamer-out.c (pack_ts_target_option): Remove.
45879         (streamer_pack_tree_bitfields): Do not stream TS_TARGET_OPTION.
45880         (write_ts_function_decl_tree_pointers): Do not stream
45881         DECL_FUNCTION_SPECIFIC_TARGET.
45882         * tree-streamer-in.c (unpack_ts_target_option): Remove.
45883         (unpack_value_fields): Do not stream TS_TARGET_OPTION.
45884         (lto_input_ts_function_decl_tree_pointers): Do not stream
45885         DECL_FUNCTION_SPECIFIC_TARGET.
45887 2014-02-14  Jakub Jelinek  <jakub@redhat.com>
45889         * tree-vect-loop.c (vect_is_slp_reduction): Don't set use_stmt twice.
45890         (get_initial_def_for_induction, vectorizable_induction): Ignore
45891         debug stmts when looking for exit_phi.
45892         (vectorizable_live_operation): Fix up condition.
45894 2014-02-14  Chung-Ju Wu  <jasonwucj@gmail.com>
45896         * config/nds32/nds32.c (nds32_asm_function_prologue): Do not use
45897         nreverse() because it changes the content of original tree list.
45899 2014-02-14  Chung-Ju Wu  <jasonwucj@gmail.com>
45901         * config/nds32/t-mlibs (MULTILIB_OPTIONS): Fix typo in comment.
45902         * config/nds32/nds32.c (nds32_merge_decl_attributes): Likewise.
45904 2014-02-14  Chung-Ju Wu  <jasonwucj@gmail.com>
45906         * config/nds32/nds32.c (nds32_naked_function_p): Follow the
45907         GNU coding standards.
45909 2014-02-13  Jakub Jelinek  <jakub@redhat.com>
45911         PR debug/60152
45912         * dwarf2out.c (gen_subprogram_die): Don't call
45913         add_calling_convention_attribute if subr_die is old_die.
45915 2014-02-13  Sharad Singhai  <singhai@google.com>
45917         * doc/optinfo.texi: Fix order of nodes.
45919 2014-02-13  Uros Bizjak  <ubizjak@gmail.com>
45921         * config/i386/sse.md (xop_vmfrcz<mode>2): Generate const0 in
45922         operands[2], not operands[3].
45924 2014-02-13  Richard Biener  <rguenther@suse.de>
45926         PR bootstrap/59878
45927         * doc/install.texi (ISL): Update recommended version to 0.12.2,
45928         mention the possibility of an in-tree build.
45929         (CLooG): Update recommended version to 0.18.1, mention the
45930         possibility of an in-tree build and clarify that the ISL
45931         bundled with CLooG does not work.
45933 2014-02-13  Jakub Jelinek  <jakub@redhat.com>
45935         PR target/43546
45936         * expr.c (compress_float_constant): If x is a hard register,
45937         extend into a pseudo and then move to x.
45939 2014-02-13  Dominik Vogt  <vogt@linux.vnet.ibm.com>
45941         * config/s390/s390.c (s390_asm_output_function_label): Fix crash
45942         caused by bad second argument to warning_at() with -mhotpatch and
45943         nested functions (e.g. with gfortran).
45945 2014-02-13  Richard Sandiford  <rdsandiford@googlemail.com>
45947         * opts.c (option_name): Remove "enabled by default" rider.
45949 2014-02-12  John David Anglin  <danglin@gcc.gnu.org>
45951         * config/pa/pa.c (pa_option_override): Remove auto increment FIXME.
45953 2014-02-12  H.J. Lu  <hongjiu.lu@intel.com>
45954             Uros Bizjak  <ubizjak@gmail.com>
45956         PR target/60151
45957         * configure.ac (HAVE_AS_GOTOFF_IN_DATA): Pass --32 to GNU assembler.
45958         * configure: Regenerated.
45960 2014-02-12  Richard Biener  <rguenther@suse.de>
45962         * vec.c (vec_prefix::calculate_allocation): Move as
45963         inline variant to vec.h.
45964         (vec_prefix::calculate_allocation_1): New out-of-line version.
45965         * vec.h (vec_prefix::calculate_allocation_1): Declare.
45966         (vec_prefix::m_has_auto_buf): Rename to ...
45967         (vec_prefix::m_using_auto_storage): ... this.
45968         (vec_prefix::calculate_allocation): Inline the easy cases
45969         and dispatch to calculate_allocation_1 which doesn't need the
45970         prefix address.
45971         (va_heap::reserve): Use gcc_checking_assert.
45972         (vec<T, A, vl_embed>::embedded_init): Add argument to initialize
45973         m_using_auto_storage.
45974         (auto_vec): Change m_vecpfx member to a vec<T, va_heap, vl_embed>
45975         member and adjust.
45976         (vec<T, va_heap, vl_ptr>::reserve): Remove redundant check.
45977         (vec<T, va_heap, vl_ptr>::release): Avoid casting.
45978         (vec<T, va_heap, vl_ptr>::using_auto_storage): Simplify.
45980 2014-02-12  Richard Biener  <rguenther@suse.de>
45982         * gcse.c (compute_transp): break from loop over canon_modify_mem_list
45983         when we found a dependence.
45985 2014-02-12  Thomas Schwinge  <thomas@codesourcery.com>
45987         * gimplify.c (gimplify_call_expr, gimplify_modify_expr): Move
45988         common code...
45989         (maybe_fold_stmt): ... into this new function.
45990         * omp-low.c (lower_omp): Update comment.
45992         * omp-low.c (lower_omp_target): Add clobber for sizes array, after
45993         last use.
45995         * omp-low.c (diagnose_sb_0): Make sure label_ctx is valid to
45996         dereference.
45998 2014-02-12  James Greenhalgh  <james.greenhalgh@arm.com>
46000         * config/arm/aarch-cost-tables.h (generic_extra_costs): Fix
46001         identifiers in comments.
46002         (cortexa53_extra_costs): Likewise.
46003         * config/arm/arm.c (cortexa9_extra_costs): Fix identifiers in comments.
46004         (cortexa7_extra_costs): Likewise.
46005         (cortexa12_extra_costs): Likewise.
46006         (cortexa15_extra_costs): Likewise.
46007         (v7m_extra_costs): Likewise.
46009 2014-02-12  Richard Biener  <rguenther@suse.de>
46011         PR middle-end/60092
46012         * gimple-low.c (lower_builtin_posix_memalign): Lower conditional
46013         of posix_memalign being successful.
46014         (lower_stmt): Restrict lowering of posix_memalign to when
46015         -ftree-bit-ccp is enabled.
46017 2014-02-12  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
46019         * config/avr/avr-c.c (avr_resolve_overloaded_builtin): Pass vNULL for
46020         arg_loc.
46021         * config/spu/spu-c.c (spu_resolve_overloaded_builtin): Likewise.
46023 2014-02-12  Eric Botcazou  <ebotcazou@adacore.com>
46025         PR rtl-optimization/60116
46026         * combine.c (try_combine): Also remove dangling REG_DEAD notes on the
46027         other_insn once the combination has been validated.
46029 2014-02-11  Jan Hubicka  <hubicka@ucw.cz>
46031         PR lto/59468
46032         * ipa-utils.h (possible_polymorphic_call_targets): Update prototype
46033         and wrapper.
46034         * ipa-devirt.c: Include demangle.h
46035         (odr_violation_reported): New static variable.
46036         (add_type_duplicate): Update odr_violations.
46037         (maybe_record_node): Add completep parameter; update it.
46038         (record_target_from_binfo): Add COMPLETEP parameter;
46039         update it as needed.
46040         (possible_polymorphic_call_targets_1): Likewise.
46041         (struct polymorphic_call_target_d): Add nonconstruction_targets;
46042         rename FINAL to COMPLETE.
46043         (record_targets_from_bases): Sanity check we found the binfo;
46044         fix COMPLETEP updating.
46045         (possible_polymorphic_call_targets): Add NONCONSTRUTION_TARGETSP
46046         parameter, fix computing of COMPLETEP.
46047         (dump_possible_polymorphic_call_targets): Imrove readability of dump;
46048         at LTO time do demangling.
46049         (ipa_devirt): Use nonconstruction_targets; Improve dumps.
46050         * gimple-fold.c (gimple_get_virt_method_for_vtable): Add can_refer
46051         parameter.
46052         (gimple_get_virt_method_for_binfo): Likewise.
46053         * gimple-fold.h (gimple_get_virt_method_for_binfo,
46054         gimple_get_virt_method_for_vtable): Update prototypes.
46056 2014-02-11  Vladimir Makarov  <vmakarov@redhat.com>
46058         PR target/49008
46059         * genautomata.c (add_presence_absence): Fix typo with
46060         {final_}presence_list.
46062 2014-02-11  Michael Meissner  <meissner@linux.vnet.ibm.com>
46064         PR target/60137
46065         * config/rs6000/rs6000.md (128-bit GPR splitter): Add a splitter
46066         for VSX/Altivec vectors that land in GPR registers.
46068 2014-02-11  Richard Henderson  <rth@redhat.com>
46069             Jakub Jelinek  <jakub@redhat.com>
46071         PR debug/59776
46072         * tree-sra.c (load_assign_lhs_subreplacements): Add VIEW_CONVERT_EXPR
46073         around drhs if type conversion to lacc->type is not useless.
46075 2014-02-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46077         * config/aarch64/aarch64-cores.def (cortex-a57): Use cortexa57
46078         tuning struct.
46079         (cortex-a57.cortex-a53): Likewise.
46080         * config/aarch64/aarch64.c (cortexa57_tunings): New tuning struct.
46082 2014-02-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46084         * config/arm/thumb2.md (*thumb2_movhi_insn): Add alternatives for
46085         arm_restrict_it.
46087 2014-02-11  Renlin Li  <Renlin.Li@arm.com>
46089         * doc/sourcebuild.texi: Document check_effective_target_arm_vfp3_ok and
46090         add_options_for_arm_vfp3.
46092 2014-02-11  Jeff Law  <law@redhat.com>
46094         PR middle-end/54041
46095         * expr.c (expand_expr_addr_expr_1): Handle expand_expr returning an
46096         object with an undesirable mode.
46098 2014-02-11  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
46100         PR libgomp/60107
46101         * config/i386/sol2-9.h: New file.
46102         * config.gcc (i[34567]86-*-solaris2* | x86_64-*-solaris2.1[0-9]*,
46103         *-*-solaris2.9*): Use it.
46105 2014-02-10  Nagaraju Mekala  <nagaraju.mekala@xilinx.com>
46107         * config/microblaze/microblaze.md: Add movsi4_rev insn pattern.
46108         * config/microblaze/predicates.md: Add reg_or_mem_operand predicate.
46110 2014-02-10  Nagaraju Mekala  <nagaraju.mekala@xilinx.com>
46112         * config/microblaze/microblaze.c: Extend mcpu version format
46114 2014-02-10  David Holsgrove  <david.holsgrove@xilinx.com>
46116         * config/microblaze/microblaze.h: Define SIZE_TYPE and PTRDIFF_TYPE.
46118 2014-02-10  Richard Henderson  <rth@redhat.com>
46120         PR target/59927
46121         * calls.c (expand_call): Don't double-push for reg_parm_stack_space.
46122         * config/i386/i386.c (init_cumulative_args): Remove sorry for 64-bit
46123         ms-abi vs -mno-accumulate-outgoing-args.
46124         (ix86_expand_prologue): Unconditionally call ix86_eax_live_at_start_p.
46125         * config/i386/i386.h (ACCUMULATE_OUTGOING_ARGS): Fix comment with
46126         respect to ms-abi.
46128 2014-02-10  Bernd Edlinger  <bernd.edlinger@hotmail.de>
46130         PR middle-end/60080
46131         * cfgexpand.c (expand_asm_operands): Attach source location to
46132         ASM_INPUT rtx objects.
46133         * print-rtl.c (print_rtx): Check for UNKNOWN_LOCATION.
46135 2014-02-10  Nick Clifton  <nickc@redhat.com>
46137         * config/mn10300/mn10300.c (popcount): New function.
46138         (mn10300_expand_prologue): Include saved registers in stack usage
46139         count.
46141 2014-02-10  Jeff Law  <law@redhat.com>
46143         PR middle-end/52306
46144         * reload1.c (emit_input_reload_insns): Do not create invalid RTL
46145         when changing the SET_DEST of a prior insn to avoid an input reload.
46147 2014-02-10  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
46149         * config/rs6000/sysv4.h (ENDIAN_SELECT): Do not attempt to enforce
46150         big-endian mode for -mcall-aixdesc, -mcall-freebsd, -mcall-netbsd,
46151         -mcall-openbsd, or -mcall-linux.
46152         (CC1_ENDIAN_BIG_SPEC): Remove.
46153         (CC1_ENDIAN_LITTLE_SPEC): Remove.
46154         (CC1_ENDIAN_DEFAULT_SPEC): Remove.
46155         (CC1_SPEC): Remove (always empty) %cc1_endian_... spec.
46156         (SUBTARGET_EXTRA_SPECS): Remove %cc1_endian_big, %cc1_endian_little,
46157         and %cc1_endian_default.
46158         * config/rs6000/sysv4le.h (CC1_ENDIAN_DEFAULT_SPEC): Remove.
46160 2014-02-10  Richard Biener  <rguenther@suse.de>
46162         PR tree-optimization/60115
46163         * tree-eh.c (tree_could_trap_p): Unify TARGET_MEM_REF and
46164         MEM_REF handling.  Properly verify that the accesses are not
46165         out of the objects bound.
46167 2014-02-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46169         * config/aarch64/aarch64.c (aarch64_override_options): Fix typo from
46170         coretex to cortex.
46172 2014-02-10  Eric Botcazou  <ebotcazou@adacore.com>
46174         * ipa-devirt.c (get_polymorphic_call_info_from_invariant): Return
46175         proper constants and fix formatting.
46176         (possible_polymorphic_call_targets): Fix formatting.
46178 2014-02-10  Kirill Yukhin  <kirill.yukhin@intel.com>
46179             Ilya Tocar  <ilya.tocar@intel.com>
46181         * config/i386/avx512fintrin.h (_mm512_storeu_epi64): Removed.
46182         (_mm512_loadu_epi32): Renamed into...
46183         (_mm512_loadu_si512): This.
46184         (_mm512_storeu_epi32): Renamed into...
46185         (_mm512_storeu_si512): This.
46186         (_mm512_maskz_ceil_ps): Removed.
46187         (_mm512_maskz_ceil_pd): Ditto.
46188         (_mm512_maskz_floor_ps): Ditto.
46189         (_mm512_maskz_floor_pd): Ditto.
46190         (_mm512_floor_round_ps): Ditto.
46191         (_mm512_floor_round_pd): Ditto.
46192         (_mm512_ceil_round_ps): Ditto.
46193         (_mm512_ceil_round_pd): Ditto.
46194         (_mm512_mask_floor_round_ps): Ditto.
46195         (_mm512_mask_floor_round_pd): Ditto.
46196         (_mm512_mask_ceil_round_ps): Ditto.
46197         (_mm512_mask_ceil_round_pd): Ditto.
46198         (_mm512_maskz_floor_round_ps): Ditto.
46199         (_mm512_maskz_floor_round_pd): Ditto.
46200         (_mm512_maskz_ceil_round_ps): Ditto.
46201         (_mm512_maskz_ceil_round_pd): Ditto.
46202         (_mm512_expand_pd): Ditto.
46203         (_mm512_expand_ps): Ditto.
46204         * config/i386/i386.c (ix86_builtins): Remove
46205         IX86_BUILTIN_EXPANDPD512_NOMASK, IX86_BUILTIN_EXPANDPS512_NOMASK.
46206         (bdesc_args): Ditto.
46207         * config/i386/predicates.md (const1256_operand): New.
46208         (const_1_to_2_operand): Ditto.
46209         * config/i386/sse.md (avx512pf_gatherpf<mode>sf): Change hint value.
46210         (*avx512pf_gatherpf<mode>sf_mask): Ditto.
46211         (*avx512pf_gatherpf<mode>sf): Ditto.
46212         (avx512pf_gatherpf<mode>df): Ditto.
46213         (*avx512pf_gatherpf<mode>df_mask): Ditto.
46214         (*avx512pf_gatherpf<mode>df): Ditto.
46215         (avx512pf_scatterpf<mode>sf): Ditto.
46216         (*avx512pf_scatterpf<mode>sf_mask): Ditto.
46217         (*avx512pf_scatterpf<mode>sf): Ditto.
46218         (avx512pf_scatterpf<mode>df): Ditto.
46219         (*avx512pf_scatterpf<mode>df_mask): Ditto.
46220         (*avx512pf_scatterpf<mode>df): Ditto.
46221         (avx512f_expand<mode>): Removed.
46222         (<shift_insn><mode>3<mask_name>): Change predicate type.
46224 2014-02-08  Jakub Jelinek  <jakub@redhat.com>
46226         * tree-vect-data-refs.c (vect_analyze_data_refs): For clobbers
46227         not at the end of datarefs vector use ordered_remove to avoid
46228         reordering datarefs vector.
46230         PR c/59984
46231         * gimplify.c (gimplify_bind_expr): In ORT_SIMD region
46232         mark local addressable non-static vars as GOVD_PRIVATE
46233         instead of GOVD_LOCAL.
46234         * omp-low.c (lower_omp_for): Move gimple_bind_vars
46235         and BLOCK_VARS of gimple_bind_block to new_stmt rather
46236         than copying them.
46238         PR middle-end/60092
46239         * tree-ssa-ccp.c (surely_varying_stmt_p): Don't return true
46240         if TYPE_ATTRIBUTES (gimple_call_fntype ()) contain
46241         assume_aligned or alloc_align attributes.
46242         (bit_value_assume_aligned): Add ATTR, PTRVAL and ALLOC_ALIGN
46243         arguments.  Handle also assume_aligned and alloc_align attributes.
46244         (evaluate_stmt): Adjust bit_value_assume_aligned caller.  Handle
46245         calls to functions with assume_aligned or alloc_align attributes.
46246         * doc/extend.texi: Document assume_aligned and alloc_align attributes.
46248 2014-02-08  Terry Guo  <terry.guo@arm.com>
46250         * doc/invoke.texi: Document ARM -march=armv7e-m.
46252 2014-02-08  Jakub Jelinek  <jakub@redhat.com>
46254         * cilk-common.c (cilk_init_builtins): Clear TREE_NOTHROW
46255         flag on __cilkrts_rethrow builtin.
46257         PR ipa/60026
46258         * ipa-cp.c (determine_versionability): Fail at -O0
46259         or __attribute__((optimize (0))) or -fno-ipa-cp functions.
46260         * tree-sra.c (ipa_sra_preliminary_function_checks): Similarly.
46262         Revert:
46263         2014-02-04  Jakub Jelinek  <jakub@redhat.com>
46265         PR ipa/60026
46266         * tree-inline.c (copy_forbidden): Fail for
46267         __attribute__((optimize (0))) functions.
46269 2014-02-07  Jan Hubicka  <hubicka@ucw.cz>
46271         * varpool.c: Include pointer-set.h.
46272         (varpool_remove_unreferenced_decls): Variables in other partitions
46273         will not be output; be however careful to not lose information
46274         about partitioning.
46276 2014-02-07  Jan Hubicka  <hubicka@ucw.cz>
46278         * gimple-fold.c (gimple_get_virt_method_for_vtable): Do O(1)
46279         lookup in the vtable constructor.
46281 2014-02-07  Jeff Law  <law@redhat.com>
46283         PR target/40977
46284         * config/m68k/m68k.md (ashldi_extsi): Turn into a
46285         define_insn_and_split.
46287         * ipa-inline.c (inline_small_functions): Fix typos.
46289 2014-02-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
46291         * config/s390/s390-protos.h (s390_can_use_simple_return_insn)
46292         (s390_can_use_return_insn): Declare.
46293         * config/s390/s390.h (EPILOGUE_USES): Define.
46294         * config/s390/s390.c (s390_mainpool_start): Allow two main_pool
46295         instructions.
46296         (s390_chunkify_start): Handle return JUMP_LABELs.
46297         (s390_early_mach): Emit a main_pool instruction on the entry edge.
46298         (s300_set_up_by_prologue, s390_can_use_simple_return_insn)
46299         (s390_can_use_return_insn): New functions.
46300         (s390_fix_long_loop_prediction): Handle conditional returns.
46301         (TARGET_SET_UP_BY_PROLOGUE): Define.
46302         * config/s390/s390.md (ANY_RETURN): New code iterator.
46303         (*creturn, *csimple_return, return, simple_return): New patterns.
46305 2014-02-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
46307         * config/s390/s390.c (s390_restore_gprs_from_fprs): Add REG_CFA_RESTORE
46308         notes to each restore.  Also add REG_CFA_DEF_CFA when restoring %r15.
46309         (s390_optimize_prologue): Don't clear RTX_FRAME_RELATED_P.  Update the
46310         REG_CFA_RESTORE list when deciding not to restore a register.
46312 2014-02-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
46314         * config/s390/s390.c: Include tree-pass.h and context.h.
46315         (s390_early_mach): New function, split out from...
46316         (s390_emit_prologue): ...here.
46317         (pass_data_s390_early_mach): New pass structure.
46318         (pass_s390_early_mach): New class.
46319         (s390_option_override): Create and register early_mach pass.
46320         Move to end of file.
46322 2014-02-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
46324         * var-tracking.c (vt_stack_adjustments): Don't require stack_adjusts
46325         to match for the exit block.
46327 2014-02-07  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
46329         * config/s390/s390.md ("atomic_load<mode>", "atomic_store<mode>")
46330         ("atomic_compare_and_swap<mode>", "atomic_fetch_<atomic><mode>"):
46331         Reject misaligned operands.
46333 2014-02-07  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
46335         * optabs.c (expand_atomic_compare_and_swap): Allow expander to fail.
46337 2014-02-07  Richard Biener  <rguenther@suse.de>
46339         PR middle-end/60092
46340         * gimple-low.c (lower_builtin_posix_memalign): New function.
46341         (lower_stmt): Call it to lower posix_memalign in a way
46342         to make alignment info accessible.
46344 2014-02-07  Jakub Jelinek  <jakub@redhat.com>
46346         PR c++/60082
46347         * tree.c (build_common_builtin_nodes): Set ECF_LEAF for
46348         __builtin_setjmp_receiver.
46350 2014-02-07  Richard Biener  <rguenther@suse.de>
46352         PR middle-end/60092
46353         * builtin-types.def (BT_FN_INT_PTRPTR_SIZE_SIZE): Add.
46354         * builtins.def (BUILT_IN_POSIX_MEMALIGN): Likewise.
46355         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
46356         Handle BUILT_IN_POSIX_MEMALIGN.
46357         (find_func_clobbers): Likewise.
46358         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Likewise.
46359         (call_may_clobber_ref_p_1): Likewise.
46361 2014-02-06  Jan Hubicka  <hubicka@ucw.cz>
46363         PR ipa/59918
46364         * ipa-devirt.c (record_target_from_binfo): Remove overactive
46365         sanity check.
46367 2014-02-06  Jan Hubicka  <hubicka@ucw.cz>
46369         PR ipa/59469
46370         * lto-cgraph.c (lto_output_node): Use
46371         symtab_get_symbol_partitioning_class.
46372         (lto_output_varpool_node): likewise.
46373         (symtab_get_symbol_partitioning_class): Move here from
46374         lto/lto-partition.c
46375         * cgraph.h (symbol_partitioning_class): Likewise.
46376         (symtab_get_symbol_partitioning_class): Declare.
46378 2014-02-06  Jan Hubicka  <hubicka@ucw.cz>
46380         * ggc.h (ggc_internal_cleared_alloc): New macro.
46381         * vec.h (vec_safe_copy): Handle memory stats.
46382         * omp-low.c (simd_clone_struct_alloc): Use ggc_internal_cleared_alloc.
46383         * target-globals.c (save_target_globals): Likewise.
46385 2014-02-06  Jan Hubicka  <hubicka@ucw.cz>
46387         PR target/60077
46388         * expr.c (emit_move_resolve_push): Export; be bit more selective
46389         on when to clear alias set.
46390         * expr.h (emit_move_resolve_push): Declare.
46391         * function.h (struct function): Add tail_call_marked.
46392         * tree-tailcall.c (optimize_tail_call): Set tail_call_marked.
46393         * config/i386/i386-protos.h (ix86_expand_push): Remove.
46394         * config/i386/i386.md (TImode move expander): De not call
46395         ix86_expand_push.
46396         (FP push expanders): Preserve memory attributes.
46397         * config/i386/sse.md (push<mode>1): Remove.
46398         * config/i386/i386.c (ix86_expand_vector_move): Handle push operation.
46399         (ix86_expand_push): Remove.
46400         * config/i386/mmx.md (push<mode>1): Remove.
46402 2014-02-06  Jakub Jelinek  <jakub@redhat.com>
46404         PR rtl-optimization/60030
46405         * internal-fn.c (ubsan_expand_si_overflow_mul_check): Surround
46406         lopart with paradoxical subreg before shifting it up by hprec.
46408 2014-02-06  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46410         * config/arm/aarch-cost-tables.h (cortexa57_extra_costs): New table.
46411         Remove extra newline at end of file.
46412         * config/arm/arm.c (arm_cortex_a57_tune): New tuning struct.
46413         (arm_issue_rate): Handle cortexa57.
46414         * config/arm/arm-cores.def (cortex-a57): Use cortex_a57 tuning.
46415         (cortex-a57.cortex-a53): Likewise.
46417 2014-02-06  Jakub Jelinek  <jakub@redhat.com>
46419         PR target/59575
46420         * config/arm/arm.c (emit_multi_reg_push): Add dwarf_regs_mask argument,
46421         don't record in REG_FRAME_RELATED_EXPR registers not set in that
46422         bitmask.
46423         (arm_expand_prologue): Adjust all callers.
46424         (arm_unwind_emit_sequence): Allow saved, but not important for unwind
46425         info, registers also at the lowest numbered registers side.  Use
46426         gcc_assert instead of abort, and SET_SRC/SET_DEST macros instead of
46427         XEXP.
46429         PR debug/59992
46430         * var-tracking.c (adjust_mems): Before adding a SET to
46431         amd->side_effects, adjust it's SET_SRC using simplify_replace_fn_rtx.
46433 2014-02-06  Alan Modra  <amodra@gmail.com>
46435         PR target/60032
46436         * config/rs6000/rs6000.c (rs6000_secondary_memory_needed_mode): Only
46437         change SDmode to DDmode when lra_in_progress.
46439 2014-02-06  Jakub Jelinek  <jakub@redhat.com>
46441         PR middle-end/59150
46442         * tree-vect-data-refs.c (vect_analyze_data_refs): For clobbers, call
46443         free_data_ref on the dr first, and before goto again also set dr
46444         to the next dr.  For simd_lane_access, free old datarefs[i] before
46445         overwriting it.  For get_vectype_for_scalar_type failure, don't
46446         free_data_ref if simd_lane_access.
46448         * Makefile.in (prefix.o, cppbuiltin.o): Depend on $(BASEVER).
46450         PR target/60062
46451         * tree.h (opts_for_fn): New inline function.
46452         (opt_for_fn): Define.
46453         * config/i386/i386.c (ix86_function_regparm): Use
46454         opt_for_fn (decl, optimize) instead of optimize.
46456 2014-02-06  Marcus Shawcroft  <marcus.shawcroft@arm.com>
46458         * config/aarch64/aarch64.c (aarch64_classify_symbol): Fix logic
46459         for SYMBOL_REF in large memory model.
46461 2014-02-06  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46463         * config/aarch64/aarch64-cores.def (cortex-a53): Specify CRC32
46464         and crypto support.
46465         (cortex-a57): Likewise.
46466         (cortex-a57.cortex-a53): Likewise.
46468 2014-02-06  Yury Gribov  <y.gribov@samsung.com>
46469             Kugan Vivekanandarajah  <kuganv@linaro.org>
46471         * config/arm/arm.c (arm_vector_alignment_reachable): Check
46472         unaligned_access.
46473         * config/arm/arm.c (arm_builtin_support_vector_misalignment): Likewise.
46475 2014-02-06  Richard Biener  <rguenther@suse.de>
46477         * tree-cfg.c (gimple_duplicate_sese_region): Fix ordering of
46478         set_loop_copy and initialize_original_copy_tables.
46480 2014-02-06  Alex Velenko  <Alex.Velenko@arm.com>
46482         * config/aarch64/aarch64-simd.md
46483         (aarch64_ashr_simddi): Change QI to SI.
46485 2014-02-05  Jan Hubicka  <hubicka@ucw.cz>
46486             Jakub Jelinek  <jakub@redhat.com>
46488         PR middle-end/60013
46489         * ipa-inline-analysis.c (compute_bb_predicates): Ensure monotonicity
46490         of the dataflow.
46492 2014-02-05  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46494         * config/rs6000/rs6000.c (altivec_expand_vec_perm_const): Change
46495         CODE_FOR_altivec_vpku[hw]um to
46496         CODE_FOR_altivec_vpku[hw]um_direct.
46497         * config/rs6000/altivec.md (vec_unpacks_hi_<VP_small_lc>): Change
46498         UNSPEC_VUNPACK_HI_SIGN to UNSPEC_VUNPACK_HI_SIGN_DIRECT.
46499         (vec_unpacks_lo_<VP_small_lc>): Change UNSPEC_VUNPACK_LO_SIGN to
46500         UNSPEC_VUNPACK_LO_SIGN_DIRECT.
46502 2014-02-05  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46504         * config/rs6000/altivec.md (altivec_vsum2sws): Adjust code
46505         generation for -maltivec=be.
46506         (altivec_vsumsws): Simplify redundant test.
46508 2014-02-05  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46510         * altivec.md (UNSPEC_VPACK_UNS_UNS_MOD_DIRECT): New unspec.
46511         (UNSPEC_VUNPACK_HI_SIGN_DIRECT): Likewise.
46512         (UNSPEC_VUNPACK_LO_SIGN_DIRECT): Likewise.
46513         (mulv8hi3): Use gen_altivec_vpkuwum_direct instead of
46514         gen_altivec_vpkuwum.
46515         (altivec_vpkpx): Test for VECTOR_ELT_ORDER_BIG instead of for
46516         BYTES_BIG_ENDIAN.
46517         (altivec_vpks<VI_char>ss): Likewise.
46518         (altivec_vpks<VI_char>us): Likewise.
46519         (altivec_vpku<VI_char>us): Likewise.
46520         (altivec_vpku<VI_char>um): Likewise.
46521         (altivec_vpku<VI_char>um_direct): New (copy of
46522         altivec_vpku<VI_char>um that still relies on BYTES_BIG_ENDIAN, for
46523         internal use).
46524         (altivec_vupkhs<VU_char>): Emit vupkls* instead of vupkhs* when
46525         target is little endian and -maltivec=be is not specified.
46526         (*altivec_vupkhs<VU_char>_direct): New (copy of
46527         altivec_vupkhs<VU_char> that always emits vupkhs*, for internal use).
46528         (altivec_vupkls<VU_char>): Emit vupkhs* instead of vupkls* when
46529         target is little endian and -maltivec=be is not specified.
46530         (*altivec_vupkls<VU_char>_direct): New (copy of
46531         altivec_vupkls<VU_char> that always emits vupkls*, for internal use).
46532         (altivec_vupkhpx): Emit vupklpx instead of vupkhpx when target is
46533         little endian and -maltivec=be is not specified.
46534         (altivec_vupklpx): Emit vupkhpx instead of vupklpx when target is
46535         little endian and -maltivec=be is not specified.
46537 2014-02-05  Richard Henderson  <rth@redhat.com>
46539         PR debug/52727
46540         * combine-stack-adj.c: Revert r206943.
46541         * sched-int.h (struct deps_desc): Add last_args_size.
46542         * sched-deps.c (init_deps): Initialize it.
46543         (sched_analyze_insn): Add OUTPUT dependencies between insns that
46544         contain REG_ARGS_SIZE notes.
46546 2014-02-05  Jan Hubicka  <hubicka@ucw.cz>
46548         * lto-cgraph.c (asm_nodes_output): Make global.
46549         * lto-wrapper.c (run_gcc): Pass down paralelizm to WPA.
46550         * gcc.c (AS_NEEDS_DASH_FOR_PIPED_INPUT): Allow WPA parameter
46551         (driver_handle_option): Handle OPT_fwpa.
46553 2014-02-05  Jakub Jelinek  <jakub@redhat.com>
46555         PR ipa/59947
46556         * ipa-devirt.c (possible_polymorphic_call_targets): Fix
46557         a comment typo and formatting issue.  If odr_hash hasn't been
46558         created, return vNULL and set *completep to false.
46560         PR middle-end/57499
46561         * tree-eh.c (cleanup_empty_eh): Bail out on totally empty
46562         bb with no successors.
46564 2014-02-05  James Greenhalgh  <james.greenhalgh@arm.com>
46566         PR target/59718
46567         * doc/invoke.texi (-march): Clarify documentation for ARM.
46568         (-mtune): Likewise.
46569         (-mcpu): Likewise.
46571 2014-02-05  Richard Biener  <rguenther@suse.de>
46573         * tree-vect-loop.c (vect_analyze_loop_2): Be more informative
46574         when not vectorizing because of too many alias checks.
46575         * tree-vect-data-refs.c (vect_prune_runtime_alias_test_list):
46576         Add more verboseness, avoid duplicate MSG_MISSED_OPTIMIZATION.
46578 2014-02-05  Nick Clifton  <nickc@redhat.com>
46580         * config/mn10300/mn10300.c (mn10300_hard_regno_mode_ok): Do not
46581         accept extended registers in any mode when compiling for the MN10300.
46583 2014-02-05  Yury Gribov  <y.gribov@samsung.com>
46585         * cif-code.def (ATTRIBUTE_MISMATCH): New CIF code.
46586         * ipa-inline.c (report_inline_failed_reason): Handle mismatched
46587         sanitization attributes.
46588         (can_inline_edge_p): Likewise.
46589         (sanitize_attrs_match_for_inline_p): New function.
46591 2014-02-04  Jan Hubicka  <hubicka@ucw.cz>
46593         * ipa-prop.c (detect_type_change): Shor circuit testing of
46594         type changes on THIS pointer.
46596 2014-02-04  John David Anglin  <danglin@gcc.gnu.org>
46598         PR target/59777
46599         * config/pa/pa.c (legitimize_tls_address): Return original address
46600         if not passed a SYMBOL_REF rtx.
46601         (hppa_legitimize_address): Call legitimize_tls_address for all TLS
46602         addresses.
46603         (pa_emit_move_sequence): Simplify TLS source operands.
46604         (pa_legitimate_constant_p): Reject all TLS constants.
46605         * config/pa/pa.h (PA_SYMBOL_REF_TLS_P): Correct comment.
46606         (CONSTANT_ADDRESS_P): Reject TLS CONST addresses.
46608 2014-02-04  Jan Hubicka  <hubicka@ucw.cz>
46610         * ipa.c (function_and_variable_visibility): Decompose DECL_ONE_ONLY
46611         groups when we know they are controlled by LTO.
46612         * varasm.c (default_binds_local_p_1): If object is in other partition,
46613         it will be resolved locally.
46615 2014-02-04  Bernd Edlinger  <bernd.edlinger@hotmail.de>
46617         * config/host-linux.c (linux_gt_pch_use_address): Don't
46618         use SSIZE_MAX because it is not always defined.
46620 2014-02-04  Vladimir Makarov  <vmakarov@redhat.com>
46622         PR bootstrap/59913
46623         * lra-constraints.c (need_for_split_p): Use more 3 reloads as
46624         threshold for pseudo splitting.
46625         (update_ebb_live_info): Process call argument hard registers and
46626         hard registers from insn definition too.
46627         (max_small_class_regs_num): New constant.
46628         (inherit_in_ebb): Update live hard regs through EBBs.  Update
46629         reloads_num only for small register classes.  Don't split for
46630         outputs of jumps.
46632 2014-02-04  Markus Trippelsdorf  <markus@trippelsdorf.de>
46634         PR ipa/60058
46635         * ipa-cp.c (ipa_get_indirect_edge_target_1): Check that target
46636         is non-null.
46638 2014-02-04  Jan Hubicka  <hubicka@ucw.cz>
46640         * gimple-fold.c (can_refer_decl_in_current_unit_p): Default
46641         visibility is safe.
46643 2014-02-04  Marek Polacek  <polacek@redhat.com>
46645         * gdbinit.in (pel): Define.
46647 2014-02-04  Bernd Edlinger  <bernd.edlinger@hotmail.de>
46649         * doc/invoke.texi (fstrict-volatile-bitfields): Clarify current
46650         behavior.
46652 2014-02-04  Richard Biener  <rguenther@suse.de>
46654         PR lto/59723
46655         * lto-streamer-out.c (tree_is_indexable): Force NAMELIST_DECLs
46656         in function context local.
46657         (lto_output_tree_ref): Do not write trees from lto_output_tree_ref.
46658         * lto-streamer-in.c (lto_input_tree_ref): Handle LTO_namelist_decl_ref
46659         similar to LTO_imported_decl_ref.
46661 2014-02-04  Jakub Jelinek  <jakub@redhat.com>
46663         PR tree-optimization/60002
46664         * cgraphclones.c (build_function_decl_skip_args): Clear
46665         DECL_LANG_SPECIFIC.
46667         PR tree-optimization/60023
46668         * tree-if-conv.c (predicate_mem_writes): Pass true instead of
46669         false to gsi_replace.
46670         * tree-vect-stmts.c (vect_finish_stmt_generation): If stmt
46671         has been in some EH region and vec_stmt could throw, add
46672         vec_stmt into the same EH region.
46673         * tree-data-ref.c (get_references_in_stmt): If IFN_MASK_LOAD
46674         has no lhs, ignore it.
46675         * internal-fn.c (expand_MASK_LOAD): Likewise.
46677         PR ipa/60026
46678         * tree-inline.c (copy_forbidden): Fail for
46679         __attribute__((optimize (0))) functions.
46681         PR other/58712
46682         * omp-low.c (simd_clone_struct_copy): If from->inbranch
46683         is set, copy one less argument.
46684         (expand_simd_clones): Don't subtract clone_info->inbranch
46685         from simd_clone_struct_alloc argument.
46687         PR rtl-optimization/57915
46688         * recog.c (simplify_while_replacing): If all unary/binary/relational
46689         operation arguments are constant, attempt to simplify those.
46691         PR middle-end/59261
46692         * expmed.c (expand_mult): For MODE_VECTOR_INT multiplication
46693         if there is no vashl<mode>3 or ashl<mode>3 insn, skip_synth.
46695 2014-02-04  Richard Biener  <rguenther@suse.de>
46697         PR tree-optimization/60012
46698         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence): Apply
46699         TBAA disambiguation to all DDRs.
46701 2014-02-04  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
46703         PR target/59788
46704         * config/sol2.h (LINK_LIBGCC_MAPFILE_SPEC): Define.
46705         (LINK_SPEC): Use it for -shared, -shared-libgcc.
46707 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46709         PR ipa/59882
46710         * tree.c (get_binfo_at_offset): Do not get confused by empty classes;
46712 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46714         * gimple-fold.c (gimple_extract_devirt_binfo_from_cst): Remove.
46715         * gimple-fold.h (gimple_extract_devirt_binfo_from_cst): Remove.
46717 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46719         PR ipa/59831
46720         * ipa-cp.c (ipa_get_indirect_edge_target_1): Use ipa-devirt
46721         to figure out targets of polymorphic calls with known decl.
46722         * ipa-prop.c (try_make_edge_direct_virtual_call): Likewise.
46723         * ipa-utils.h (get_polymorphic_call_info_from_invariant): Declare.
46724         * ipa-devirt.c (get_polymorphic_call_info_for_decl): Break out from ...
46725         (get_polymorphic_call_info): ... here.
46726         (get_polymorphic_call_info_from_invariant): New function.
46728 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46730         * ipa-cp.c (ipa_get_indirect_edge_target_1): Do direct
46731         lookup via vtable pointer; check for type consistency
46732         and turn inconsitent facts into UNREACHABLE.
46733         * ipa-prop.c (try_make_edge_direct_virtual_call): Likewise.
46734         * gimple-fold.c (gimple_get_virt_method_for_vtable): Do not ICE on
46735         type inconsistent querries; return UNREACHABLE instead.
46737 2014-02-03  Richard Henderson  <rth@twiddle.net>
46739         PR tree-opt/59924
46740         * tree-ssa-uninit.c (push_to_worklist): Don't re-push if we've
46741         already processed this node.
46742         (normalize_one_pred_1): Pass along mark_set.
46743         (normalize_one_pred): Create and destroy a pointer_set_t.
46744         (normalize_one_pred_chain): Likewise.
46746 2014-02-03  Laurent Aflonsi  <laurent.alfonsi@st.com>
46748         PR gcov-profile/58602
46749         * gcc/gcov-io.c (gcov_open): Open with truncation when mode < 0.
46751 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46753         PR ipa/59831
46754         * ipa-cp.c (ipa_get_indirect_edge_target_1): Give up on
46755         -fno-devirtualize; try to devirtualize by the knowledge of
46756         virtual table pointer given by aggregate propagation.
46757         * ipa-prop.c (try_make_edge_direct_virtual_call): Likewise.
46758         (ipa_print_node_jump_functions): Dump also offset that
46759         is relevant for polymorphic calls.
46760         (determine_known_aggregate_parts): Add arg_type parameter; use it
46761         instead of determining the type from pointer type.
46762         (ipa_compute_jump_functions_for_edge): Update call of
46763         determine_known_aggregate_parts.
46764         * gimple-fold.c (gimple_get_virt_method_for_vtable): Break out from ...
46765         (gimple_get_virt_method_for_binfo): ... here; simplify using
46766         vtable_pointer_value_to_vtable.
46767         * gimple-fold.h (gimple_get_virt_method_for_vtable): Declare.
46768         * ipa-devirt.c (subbinfo_with_vtable_at_offset): Turn OFFSET parameter
46769         to unsigned HOST_WIDE_INT; use vtable_pointer_value_to_vtable.
46770         (vtable_pointer_value_to_vtable): Break out from ...; handle also
46771         POINTER_PLUS_EXPR.
46772         (vtable_pointer_value_to_binfo): ... here.
46773         * ipa-utils.h (vtable_pointer_value_to_vtable): Declare.
46775 2014-02-03  Teresa Johnson  <tejohnson@google.com>
46777         * tree-vect-slp.c (vect_supported_load_permutation_p): Avoid
46778         redef of outer loop index variable.
46780 2014-02-03  Marc Glisse  <marc.glisse@inria.fr>
46782         PR c++/53017
46783         PR c++/59211
46784         * doc/extend.texi (Function Attributes): Typo.
46786 2014-02-03  Cong Hou  <congh@google.com>
46788         PR tree-optimization/60000
46789         * tree-vect-loop.c (vect_transform_loop): Set pattern_def_seq to NULL
46790         if the vectorized statement is a store.  A store statement can only
46791         appear at the end of pattern statements.
46793 2014-02-03  H.J. Lu  <hongjiu.lu@intel.com>
46795         * config/i386/i386.c (flag_opts): Add -mlong-double-128.
46796         (ix86_option_override_internal): Default long double to 64-bit for
46797         32-bit Bionic and to 128-bit for 64-bit Bionic.
46799         * config/i386/i386.h (LONG_DOUBLE_TYPE_SIZE): Use 128 if
46800         TARGET_LONG_DOUBLE_128 is true.
46801         (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Likewise.
46803         * config/i386/i386.opt (mlong-double-80): Negate -mlong-double-64.
46804         (mlong-double-64): Negate -mlong-double-128.
46805         (mlong-double-128): New option.
46807         * config/i386/i386-c.c (ix86_target_macros): Define
46808         __LONG_DOUBLE_128__ for TARGET_LONG_DOUBLE_128.
46810         * doc/invoke.texi: Document -mlong-double-128.
46812 2014-02-03  H.J. Lu  <hongjiu.lu@intel.com>
46814         PR rtl-optimization/60024
46815         * sel-sched.c (init_regs_for_mode): Check if mode is OK first.
46817 2014-02-03  Markus Trippelsdorf  <markus@trippelsdorf.de>
46819         * doc/invoke.texi (fprofile-reorder-functions): Fix typo.
46821 2014-02-03  Andrey Belevantsev  <abel@ispras.ru>
46823         PR rtl-optimization/57662
46824         * sel-sched.c (code_motion_path_driver): Do not mark already not
46825         existing blocks in the visiting bitmap.
46827 2014-02-03  Andrey Belevantsev  <abel@ispras.ru>
46829         * sel-sched-ir.c (sel_gen_insn_from_expr_after): Reset INSN_DELETED_P
46830         on the insn being emitted.
46832 2014-02-03  James Greenhalgh  <james.greenhalgh@arm.com>
46833             Will Deacon  <will.deacon@arm.com>
46835         * doc/gimple.texi (gimple_asm_clear_volatile): Remove.
46837 2014-02-03  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46839         * config/arm/arm-tables.opt: Regenerate.
46841 2014-02-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46843         * config/rs6000/rs6000.c (altivec_expand_vec_perm_le): Generalize
46844         for vector types other than V16QImode.
46845         * config/rs6000/altivec.md (altivec_vperm_<mode>): Change to a
46846         define_expand, and call altivec_expand_vec_perm_le when producing
46847         code with little endian element order.
46848         (*altivec_vperm_<mode>_internal): New insn having previous
46849         behavior of altivec_vperm_<mode>.
46850         (altivec_vperm_<mode>_uns): Change to a define_expand, and call
46851         altivec_expand_vec_perm_le when producing code with little endian
46852         element order.
46853         (*altivec_vperm_<mode>_uns_internal): New insn having previous
46854         behavior of altivec_vperm_<mode>_uns.
46856 2014-02-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46858         * config/rs6000/altivec.md (UNSPEC_VSUMSWS_DIRECT): New unspec.
46859         (altivec_vsumsws): Add handling for -maltivec=be with a little
46860         endian target.
46861         (altivec_vsumsws_direct): New.
46862         (reduc_splus_<mode>): Call gen_altivec_vsumsws_direct instead of
46863         gen_altivec_vsumsws.
46865 2014-02-02  Jan Hubicka  <hubicka@ucw.cz>
46867         * ipa-devirt.c (subbinfo_with_vtable_at_offset,
46868         vtable_pointer_value_to_binfo): New functions.
46869         * ipa-utils.h (vtable_pointer_value_to_binfo): Declare.
46870         * ipa-prop.c (extr_type_from_vtbl_ptr_store): Use it.
46872 2014-02-02  Sandra Loosemore  <sandra@codesourcery.com>
46874         * config/nios2/nios2.md (load_got_register): Initialize GOT
46875         pointer from _gp_got instead of _GLOBAL_OFFSET_TABLE_.
46876         * config/nios2/nios2.c (nios2_function_profiler): Likewise.
46878 2014-02-02  Jan Hubicka  <hubicka@ucw.cz>
46880         * ipa-prop.c (update_jump_functions_after_inlining): When type is not
46881         preserverd by passthrough, do not propagate the type.
46883 2014-02-02  Richard Sandiford  <rdsandiford@googlemail.com>
46885         * config/mips/mips.c (MIPS_GET_FCSR, MIPS_SET_FCSR): New macros.
46886         (mips_atomic_assign_expand_fenv): New function.
46887         (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): Define.
46889 2014-02-02  Richard Sandiford  <rdsandiford@googlemail.com>
46891         * doc/extend.texi (__builtin_mips_get_fcsr): Document.
46892         (__builtin_mips_set_fcsr): Likewise.
46893         * config/mips/mips-ftypes.def: Add MIPS_VOID_FTYPE_USI and
46894         MIPS_USI_FTYPE_VOID.
46895         * config/mips/mips-protos.h (mips16_expand_get_fcsr): Declare
46896         (mips16_expand_set_fcsr): Likewise.
46897         * config/mips/mips.c (mips16_get_fcsr_stub): New variable.
46898         (mips16_set_fcsr_stub): Likewise.
46899         (mips16_get_fcsr_one_only_stub): New class.
46900         (mips16_set_fcsr_one_only_stub): Likewise.
46901         (mips16_expand_get_fcsr, mips16_expand_set_fcsr): New functions.
46902         (mips_code_end): Output the get_fcsr and set_fcsr stubs, if needed.
46903         (BUILTIN_AVAIL_MIPS16, AVAIL_ALL): New macros.
46904         (hard_float): New availability predicate.
46905         (mips_builtins): Add get_fcsr and set_fcsr.
46906         (mips_expand_builtin): Check BUILTIN_AVAIL_MIPS16.
46907         * config/mips/mips.md (UNSPEC_GET_FCSR, UNSPEC_SET_FCSR): New unspecs.
46908         (GET_FCSR_REGNUM, SET_FCSR_REGNUM): New constants.
46909         (mips_get_fcsr, *mips_get_fcsr, mips_get_fcsr_mips16_<mode>)
46910         (mips_set_fcsr, *mips_set_fcsr, mips_set_fcsr_mips16_<mode>): New
46911         patterns.
46913 2014-02-02  Richard Sandiford  <rdsandiford@googlemail.com>
46915         * config/mips/mips.c (mips_one_only_stub): New class.
46916         (mips_need_mips16_rdhwr_p): Replace with...
46917         (mips16_rdhwr_stub): ...this new variable.
46918         (mips16_stub_call_address): New function.
46919         (mips16_rdhwr_one_only_stub): New class.
46920         (mips_expand_thread_pointer): Use mips16_stub_call_address.
46921         (mips_output_mips16_rdhwr): Delete.
46922         (mips_finish_stub): New function.
46923         (mips_code_end): Use it to handle rdhwr stubs.
46925 2014-02-02  Uros Bizjak  <ubizjak@gmail.com>
46927         PR target/60017
46928         * config/i386/i386.c (classify_argument): Fix handling of bit_offset
46929         when calculating size of integer atomic types.
46931 2014-02-02  H.J. Lu  <hongjiu.lu@intel.com>
46933         * ipa-inline-analysis.c (true_predicate_p): Fix a typo in comments.
46935 2014-02-01  Jakub Jelinek  <jakub@redhat.com>
46937         PR tree-optimization/60003
46938         * gimple-low.c (lower_builtin_setjmp): Set cfun->has_nonlocal_label.
46939         * profile.c (branch_prob): Use gimple_call_builtin_p
46940         to check for BUILT_IN_SETJMP_RECEIVER.
46941         * tree-inline.c (copy_bb): Call notice_special_calls.
46943 2014-01-31  Vladimir Makarov  <vmakarov@redhat.com>
46945         PR bootstrap/59985
46946         * lra-constraints.c (process_alt_operands): Update reload_sum only
46947         on the first pass.
46949 2014-01-31  Richard Henderson  <rth@redhat.com>
46951         PR middle-end/60004
46952         * tree-eh.c (lower_try_finally_switch): Delay lowering finally block
46953         until after else_eh is processed.
46955 2014-01-31  Ilya Tocar  <ilya.tocar@intel.com>
46957         * config/i386/avx512fintrin.h (_MM_FROUND_TO_NEAREST_INT),
46958         (_MM_FROUND_TO_NEG_INF), (_MM_FROUND_TO_POS_INF),
46959         (_MM_FROUND_TO_ZERO), (_MM_FROUND_CUR_DIRECTION): Are already defined
46960         in smmintrin.h, remove them.
46961         (_MM_FROUND_NO_EXC): Same as above, bit also wrong value.
46962         * config/i386/i386.c (ix86_print_operand): Split sae and rounding.
46963         * config/i386/i386.md (ROUND_SAE): Fix value.
46964         * config/i386/predicates.md (const_4_or_8_to_11_operand): New.
46965         (const48_operand): New.
46966         * config/i386/subst.md (round), (round_expand): Use
46967         const_4_or_8_to_11_operand.
46968         (round_saeonly), (round_saeonly_expand): Use const48_operand.
46970 2014-01-31  Ilya Tocar  <ilya.tocar@intel.com>
46972         * config/i386/constraints.md (Yk): Swap meaning with k.
46973         * config/i386/i386.md (movhi_internal): Change Yk to k.
46974         (movqi_internal): Ditto.
46975         (*k<logic><mode>): Ditto.
46976         (*andhi_1): Ditto.
46977         (*andqi_1): Ditto.
46978         (kandn<mode>): Ditto.
46979         (*<code>hi_1): Ditto.
46980         (*<code>qi_1): Ditto.
46981         (kxnor<mode>): Ditto.
46982         (kortestzhi): Ditto.
46983         (kortestchi): Ditto.
46984         (kunpckhi): Ditto.
46985         (*one_cmplhi2_1): Ditto.
46986         (*one_cmplqi2_1): Ditto.
46987         * config/i386/sse.md (): Change k to Yk.
46988         (avx512f_load<mode>_mask): Ditto.
46989         (avx512f_blendm<mode>): Ditto.
46990         (avx512f_store<mode>_mask): Ditto.
46991         (avx512f_storeu<ssemodesuffix>512_mask): Ditto.
46992         (avx512f_storedqu<mode>_mask): Ditto.
46993         (avx512f_cmp<mode>3<mask_scalar_merge_name><round_saeonly_name>):
46994         Ditto.
46995         (avx512f_ucmp<mode>3<mask_scalar_merge_name>): Ditto.
46996         (avx512f_vmcmp<mode>3<round_saeonly_name>): Ditto.
46997         (avx512f_vmcmp<mode>3_mask<round_saeonly_name>): Ditto.
46998         (avx512f_maskcmp<mode>3): Ditto.
46999         (avx512f_fmadd_<mode>_mask<round_name>): Ditto.
47000         (avx512f_fmadd_<mode>_mask3<round_name>): Ditto.
47001         (avx512f_fmsub_<mode>_mask<round_name>): Ditto.
47002         (avx512f_fmsub_<mode>_mask3<round_name>): Ditto.
47003         (avx512f_fnmadd_<mode>_mask<round_name>): Ditto.
47004         (avx512f_fnmadd_<mode>_mask3<round_name>): Ditto.
47005         (avx512f_fnmsub_<mode>_mask<round_name>): Ditto.
47006         (avx512f_fnmsub_<mode>_mask3<round_name>): Ditto.
47007         (avx512f_fmaddsub_<mode>_mask<round_name>): Ditto.
47008         (avx512f_fmaddsub_<mode>_mask3<round_name>): Ditto.
47009         (avx512f_fmsubadd_<mode>_mask<round_name>): Ditto.
47010         (avx512f_fmsubadd_<mode>_mask3<round_name>): Ditto.
47011         (avx512f_vextract<shuffletype>32x4_1_maskm): Ditto.
47012         (vec_extract_lo_<mode>_maskm): Ditto.
47013         (vec_extract_hi_<mode>_maskm): Ditto.
47014         (avx512f_vternlog<mode>_mask): Ditto.
47015         (avx512f_fixupimm<mode>_mask<round_saeonly_name>): Ditto.
47016         (avx512f_sfixupimm<mode>_mask<round_saeonly_name>): Ditto.
47017         (avx512f_<code><pmov_src_lower><mode>2_mask): Ditto.
47018         (avx512f_<code>v8div16qi2_mask): Ditto.
47019         (avx512f_<code>v8div16qi2_mask_store): Ditto.
47020         (avx512f_eq<mode>3<mask_scalar_merge_name>_1): Ditto.
47021         (avx512f_gt<mode>3<mask_scalar_merge_name>): Ditto.
47022         (avx512f_testm<mode>3<mask_scalar_merge_name>): Ditto.
47023         (avx512f_testnm<mode>3<mask_scalar_merge_name>): Ditto.
47024         (*avx512pf_gatherpf<mode>sf_mask): Ditto.
47025         (*avx512pf_gatherpf<mode>df_mask): Ditto.
47026         (*avx512pf_scatterpf<mode>sf_mask): Ditto.
47027         (*avx512pf_scatterpf<mode>df_mask): Ditto.
47028         (avx512cd_maskb_vec_dupv8di): Ditto.
47029         (avx512cd_maskw_vec_dupv16si): Ditto.
47030         (avx512f_vpermi2var<mode>3_maskz): Ditto.
47031         (avx512f_vpermi2var<mode>3_mask): Ditto.
47032         (avx512f_vpermi2var<mode>3_mask): Ditto.
47033         (avx512f_vpermt2var<mode>3_maskz): Ditto.
47034         (*avx512f_gathersi<mode>): Ditto.
47035         (*avx512f_gathersi<mode>_2): Ditto.
47036         (*avx512f_gatherdi<mode>): Ditto.
47037         (*avx512f_gatherdi<mode>_2): Ditto.
47038         (*avx512f_scattersi<mode>): Ditto.
47039         (*avx512f_scatterdi<mode>): Ditto.
47040         (avx512f_compress<mode>_mask): Ditto.
47041         (avx512f_compressstore<mode>_mask): Ditto.
47042         (avx512f_expand<mode>_mask): Ditto.
47043         * config/i386/subst.md (mask): Change k to Yk.
47044         (mask_scalar_merge): Ditto.
47045         (sd): Ditto.
47047 2014-01-31  Marc Glisse  <marc.glisse@inria.fr>
47049         * doc/extend.texi (Vector Extensions): Document ?: in C++.
47051 2014-01-31  Richard Biener  <rguenther@suse.de>
47053         PR middle-end/59990
47054         * builtins.c (fold_builtin_memory_op): Make sure to not
47055         use a floating-point mode or a boolean or enumeral type for
47056         the copy operation.
47058 2014-01-30  DJ Delorie  <dj@redhat.com>
47060         * config/msp430/msp430.h (LIB_SPEC): Add -lcrt
47061         * config/msp430/msp430.md (msp430_refsym_need_exit): New.
47062         * config/msp430/msp430.c (msp430_expand_epilogue): Call it
47063         whenever main() has an epilogue.
47065 2014-01-30  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
47067         * config/rs6000/rs6000.c (rs6000_expand_vector_init): Remove
47068         unused variable "field".
47069         * config/rs6000/vsx.md (vsx_mergel_<mode>): Add missing DONE.
47070         (vsx_mergeh_<mode>): Likewise.
47071         * config/rs6000/altivec.md (altivec_vmrghb): Likewise.
47072         (altivec_vmrghh): Likewise.
47073         (altivec_vmrghw): Likewise.
47074         (altivec_vmrglb): Likewise.
47075         (altivec_vmrglh): Likewise.
47076         (altivec_vmrglw): Likewise.
47077         (altivec_vspltb): Add missing uses.
47078         (altivec_vsplth): Likewise.
47079         (altivec_vspltw): Likewise.
47080         (altivec_vspltsf): Likewise.
47082 2014-01-30  Jakub Jelinek  <jakub@redhat.com>
47084         PR target/59923
47085         * ifcvt.c (cond_exec_process_insns): Don't conditionalize
47086         frame related instructions.
47088 2014-01-30  Vladimir Makarov  <vmakarov@redhat.com>
47090         PR rtl-optimization/59959
47091         * lra-constrains.c (simplify_operand_subreg): Assign NO_REGS to
47092         any reload of register whose subreg is invalid.
47094 2014-01-30  Jakub Jelinek  <jakub@redhat.com>
47096         * config/i386/f16cintrin.h (_cvtsh_ss): Avoid -Wnarrowing warning.
47097         * config/i386/avx512fintrin.h (_mm512_mask_cvtusepi64_storeu_epi32):
47098         Add missing return type - void.
47100 2014-01-30  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
47102         * gcc/config/rs6000/rs6000.c (rs6000_expand_vector_init): Use
47103         gen_vsx_xxspltw_v4sf_direct instead of gen_vsx_xxspltw_v4sf;
47104         remove element index adjustment for endian (now handled in vsx.md
47105         and altivec.md).
47106         (altivec_expand_vec_perm_const): Use
47107         gen_altivec_vsplt[bhw]_direct instead of gen_altivec_vsplt[bhw].
47108         * gcc/config/rs6000/vsx.md (UNSPEC_VSX_XXSPLTW): New unspec.
47109         (vsx_xxspltw_<mode>): Adjust element index for little endian.
47110         * gcc/config/rs6000/altivec.md (altivec_vspltb): Divide into a
47111         define_expand and a new define_insn *altivec_vspltb_internal;
47112         adjust for -maltivec=be on a little endian target.
47113         (altivec_vspltb_direct): New.
47114         (altivec_vsplth): Divide into a define_expand and a new
47115         define_insn *altivec_vsplth_internal; adjust for -maltivec=be on a
47116         little endian target.
47117         (altivec_vsplth_direct): New.
47118         (altivec_vspltw): Divide into a define_expand and a new
47119         define_insn *altivec_vspltw_internal; adjust for -maltivec=be on a
47120         little endian target.
47121         (altivec_vspltw_direct): New.
47122         (altivec_vspltsf): Divide into a define_expand and a new
47123         define_insn *altivec_vspltsf_internal; adjust for -maltivec=be on
47124         a little endian target.
47126 2014-01-30  Richard Biener  <rguenther@suse.de>
47128         PR tree-optimization/59993
47129         * tree-ssa-forwprop.c (associate_pointerplus): Check we
47130         can propagate form the earlier stmt and avoid the transform
47131         when the intermediate result is needed.
47133 2014-01-30  Alangi Derick  <alangiderick@gmail.com>
47135         * README.Portability: Fix typo.
47137 2014-01-30  David Holsgrove  <david.holsgrove@xilinx.com>
47139         * config/microblaze/microblaze.md(cstoresf4, cbranchsf4): Replace
47140         comparison_operator with ordered_comparison_operator.
47142 2014-01-30  Nick Clifton  <nickc@redhat.com>
47144         * config/mn10300/mn10300-protos.h (mn10300_store_multiple_operation_p):
47145         Rename to mn10300_store_multiple_regs.
47146         * config/mn10300/mn10300.c: Likewise.
47147         * config/mn10300/mn10300.md (store_movm): Fix typo: call
47148         store_multiple_regs.
47149         * config/mn10300/predicates.md (mn10300_store_multiple_operation):
47150         Call mn10300_store_multiple_regs.
47152 2014-01-30  Nick Clifton  <nickc@redhat.com>
47153             DJ Delorie  <dj@redhat.com>
47155         * config/rl78/rl78.c (register_sizes): Make the "upper half" of
47156         %fp 2 to keep registers after it properly word-aligned.
47157         (rl78_alloc_physical_registers_umul): Handle the case where both
47158         input operands are the same.
47160 2014-01-30  Richard Biener  <rguenther@suse.de>
47162         PR tree-optimization/59903
47163         * tree-vect-loop.c (vect_transform_loop): Guard multiple-types
47164         check properly.
47166 2014-01-30  Jason Merrill  <jason@redhat.com>
47168         PR c++/59633
47169         * tree.c (walk_type_fields): Handle VECTOR_TYPE.
47171         PR c++/59645
47172         * cgraphunit.c (expand_thunk): Copy volatile arg to a temporary.
47174 2014-01-30  Richard Biener  <rguenther@suse.de>
47176         PR tree-optimization/59951
47177         * tree-vect-slp.c (vect_bb_slp_scalar_cost): Skip uses in debug insns.
47179 2014-01-30  Savin Zlobec  <savin.zlobec@gmail.com>
47181         PR target/59784
47182         * config/nios2/nios2.c (nios2_fpu_insn_asm): Fix asm output of
47183         SFmode to DFmode case.
47185 2014-01-29  DJ Delorie  <dj@redhat.com>
47187         * config/msp430/msp430.opt (-minrt): New.
47188         * config/msp430/msp430.h (STARTFILE_SPEC): Link alternate runtime
47189         if -minrt given.
47190         (ENDFILE_SPEC): Likewise.
47192 2014-01-29  Jan Hubicka  <hubicka@ucw.cz>
47194         * ipa-inline-analysis.c (clobber_only_eh_bb_p): New function.
47195         (estimate_function_body_sizes): Use it.
47197 2014-01-29  Paolo Carlini  <paolo.carlini@oracle.com>
47199         PR c++/58561
47200         * dwarf2out.c (is_cxx_auto): New.
47201         (is_base_type): Use it.
47202         (gen_type_die_with_usage): Likewise.
47204 2014-01-29  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
47206         * config/rs6000/rs6000.c (altivec_expand_vec_perm_const):  Use
47207         CODE_FOR_altivec_vmrg*_direct rather than CODE_FOR_altivec_vmrg*.
47208         * config/rs6000/vsx.md (vsx_mergel_<mode>): Adjust for
47209         -maltivec=be with LE targets.
47210         (vsx_mergeh_<mode>): Likewise.
47211         * config/rs6000/altivec.md (UNSPEC_VMRG[HL]_DIRECT): New unspecs.
47212         (mulv8hi3): Use gen_altivec_vmrg[hl]w_direct.
47213         (altivec_vmrghb): Replace with define_expand and new
47214         *altivec_vmrghb_internal insn; adjust for -maltivec=be with LE targets.
47215         (altivec_vmrghb_direct): New define_insn.
47216         (altivec_vmrghh): Replace with define_expand and new
47217         *altivec_vmrghh_internal insn; adjust for -maltivec=be with LE targets.
47218         (altivec_vmrghh_direct): New define_insn.
47219         (altivec_vmrghw): Replace with define_expand and new
47220         *altivec_vmrghw_internal insn; adjust for -maltivec=be with LE targets.
47221         (altivec_vmrghw_direct): New define_insn.
47222         (*altivec_vmrghsf): Adjust for endianness.
47223         (altivec_vmrglb): Replace with define_expand and new
47224         *altivec_vmrglb_internal insn; adjust for -maltivec=be with LE targets.
47225         (altivec_vmrglb_direct): New define_insn.
47226         (altivec_vmrglh): Replace with define_expand and new
47227         *altivec_vmrglh_internal insn; adjust for -maltivec=be with LE targets.
47228         (altivec_vmrglh_direct): New define_insn.
47229         (altivec_vmrglw): Replace with define_expand and new
47230         *altivec_vmrglw_internal insn; adjust for -maltivec=be with LE targets.
47231         (altivec_vmrglw_direct): New define_insn.
47232         (*altivec_vmrglsf): Adjust for endianness.
47233         (vec_widen_umult_hi_v16qi): Use gen_altivec_vmrghh_direct.
47234         (vec_widen_umult_lo_v16qi): Use gen_altivec_vmrglh_direct.
47235         (vec_widen_smult_hi_v16qi): Use gen_altivec_vmrghh_direct.
47236         (vec_widen_smult_lo_v16qi): Use gen_altivec_vmrglh_direct.
47237         (vec_widen_umult_hi_v8hi): Use gen_altivec_vmrghw_direct.
47238         (vec_widen_umult_lo_v8hi): Use gen_altivec_vmrglw_direct.
47239         (vec_widen_smult_hi_v8hi): Use gen_altivec_vmrghw_direct.
47240         (vec_widen_smult_lo_v8hi): Use gen_altivec_vmrglw_direct.
47242 2014-01-29  Marcus Shawcroft  <marcus.shawcroft@arm.com>
47244         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate)
47245         (aarch64_legitimate_address_p, aarch64_class_max_nregs): Adjust
47246         whitespace.
47248 2014-01-29  Richard Biener  <rguenther@suse.de>
47250         PR tree-optimization/58742
47251         * tree-ssa-forwprop.c (associate_pointerplus): Rename to
47252         associate_pointerplus_align.
47253         (associate_pointerplus_diff): New function.
47254         (associate_pointerplus): Likewise.  Call associate_pointerplus_align
47255         and associate_pointerplus_diff.
47257 2014-01-29  Richard Biener  <rguenther@suse.de>
47259         * lto-streamer.h (LTO_major_version): Bump to 3.
47260         (LTO_minor_version): Reset to 0.
47262 2014-01-29  Renlin Li  <Renlin.Li@arm.com>
47264         * config/arm/arm-arches.def (ARM_ARCH): Add armv7ve arch.
47265         * config/arm/arm.c (FL_FOR_ARCH7VE): New.
47266         (arm_file_start): Generate correct asm header for armv7ve.
47267         * config/arm/bpabi.h: Add multilib support for armv7ve.
47268         * config/arm/driver-arm.c: Change the architectures of cortex-a7
47269         and cortex-a15 to armv7ve.
47270         * config/arm/t-aprofile: Add multilib support for armv7ve.
47271         * doc/invoke.texi: Document -march=armv7ve.
47273 2014-01-29  Richard Biener  <rguenther@suse.de>
47275         PR tree-optimization/58742
47276         * tree-ssa-forwprop.c (associate_plusminus): Return true
47277         if we changed sth, defer EH cleanup to ...
47278         (ssa_forward_propagate_and_combine): ... here.  Call simplify_mult.
47279         (simplify_mult): New function.
47281 2014-01-29  Jakub Jelinek  <jakub@redhat.com>
47283         PR middle-end/59917
47284         PR tree-optimization/59920
47285         * tree.c (build_common_builtin_nodes): Remove
47286         __builtin_setjmp_dispatcher initialization.
47287         * omp-low.h (make_gimple_omp_edges): Add a new int * argument.
47288         * profile.c (branch_prob): Use gsi_start_nondebug_after_labels_bb
47289         instead of gsi_after_labels + manually skipping debug stmts.
47290         Don't ignore bbs with BUILT_IN_SETJMP_DISPATCHER, instead
47291         ignore bbs with IFN_ABNORMAL_DISPATCHER.
47292         * tree-inline.c (copy_edges_for_bb): Remove
47293         can_make_abnormal_goto argument, instead add abnormal_goto_dest
47294         argument.  Ignore computed_goto_p stmts.  Don't call
47295         make_abnormal_goto_edges.  If a call might need abnormal edges
47296         for non-local gotos, see if it already has an edge to
47297         IFN_ABNORMAL_DISPATCHER or if it is IFN_ABNORMAL_DISPATCHER
47298         with true argument, don't do anything then, otherwise add
47299         EDGE_ABNORMAL from the call's bb to abnormal_goto_dest.
47300         (copy_cfg_body): Compute abnormal_goto_dest, adjust copy_edges_for_bb
47301         caller.
47302         * gimple-low.c (struct lower_data): Remove calls_builtin_setjmp.
47303         (lower_function_body): Don't emit __builtin_setjmp_dispatcher.
47304         (lower_stmt): Don't set data->calls_builtin_setjmp.
47305         (lower_builtin_setjmp): Adjust comment.
47306         * builtins.def (BUILT_IN_SETJMP_DISPATCHER): Remove.
47307         * tree-cfg.c (found_computed_goto): Remove.
47308         (factor_computed_gotos): Remove.
47309         (make_goto_expr_edges): Return bool, true for computed gotos.
47310         Don't call make_abnormal_goto_edges.
47311         (build_gimple_cfg): Don't set found_computed_goto, don't call
47312         factor_computed_gotos.
47313         (computed_goto_p): No longer static.
47314         (make_blocks): Don't set found_computed_goto.
47315         (get_abnormal_succ_dispatcher, handle_abnormal_edges): New functions.
47316         (make_edges): If make_goto_expr_edges returns true, push bb
47317         into ab_edge_goto vector, for stmt_can_make_abnormal_goto calls
47318         instead of calling make_abnormal_goto_edges push bb into ab_edge_call
47319         vector.  Record mapping between bbs and OpenMP regions if there
47320         are any, adjust make_gimple_omp_edges caller.  Call
47321         handle_abnormal_edges.
47322         (make_abnormal_goto_edges): Remove.
47323         * tree-cfg.h (make_abnormal_goto_edges): Remove.
47324         (computed_goto_p, get_abnormal_succ_dispatcher): New prototypes.
47325         * internal-fn.c (expand_ABNORMAL_DISPATCHER): New function.
47326         * builtins.c (expand_builtin): Don't handle BUILT_IN_SETJMP_DISPATCHER.
47327         * internal-fn.def (ABNORMAL_DISPATCHER): New.
47328         * omp-low.c (make_gimple_omp_edges): Add region_idx argument, when
47329         filling *region also set *region_idx to (*region)->entry->index.
47331         PR other/58712
47332         * read-rtl.c (read_rtx_code): Clear all of RTX_CODE_SIZE (code).
47333         For REGs set ORIGINAL_REGNO.
47335 2014-01-29  Bingfeng Mei  <bmei@broadcom.com>
47337         * doc/md.texi: Mention that a target shouldn't implement
47338         vec_widen_(s|u)mul_even/odd pair if it is less efficient
47339         than hi/lo pair.
47341 2014-01-29  Jakub Jelinek  <jakub@redhat.com>
47343         PR tree-optimization/59594
47344         * tree-vect-data-refs.c (vect_analyze_data_ref_accesses): Sort
47345         a copy of the datarefs vector rather than the vector itself.
47347 2014-01-28  Jason Merrill  <jason@redhat.com>
47349         PR c++/53756
47350         * dwarf2out.c (auto_die): New static.
47351         (gen_type_die_with_usage): Handle C++1y 'auto'.
47352         (gen_subprogram_die): If in-class DIE had 'auto', emit type again
47353         on definition.
47355 2014-01-28  H.J. Lu  <hongjiu.lu@intel.com>
47357         PR target/59672
47358         * config/i386/gnu-user64.h (SPEC_32): Add "m16|" to "m32".
47359         (SPEC_X32): Likewise.
47360         (SPEC_64): Likewise.
47361         * config/i386/i386.c (ix86_option_override_internal): Turn off
47362         OPTION_MASK_ISA_64BIT, OPTION_MASK_ABI_X32 and OPTION_MASK_ABI_64
47363         for TARGET_16BIT.
47364         (x86_file_start): Output .code16gcc for TARGET_16BIT.
47365         * config/i386/i386.h (TARGET_16BIT): New macro.
47366         (TARGET_16BIT_P): Likewise.
47367         * config/i386/i386.opt: Add m16.
47368         * doc/invoke.texi: Document -m16.
47370 2014-01-28  Jakub Jelinek  <jakub@redhat.com>
47372         PR preprocessor/59935
47373         * input.c (location_get_source_line): Bail out on when line number
47374         is zero, and test the return value of lookup_or_add_file_to_cache_tab.
47376 2014-01-28  Richard Biener  <rguenther@suse.de>
47378         PR tree-optimization/58742
47379         * tree-ssa-forwprop.c (associate_plusminus): Handle
47380         pointer subtraction of the form (T)(P + A) - (T)P.
47382 2014-01-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
47384         * config/arm/arm.c (arm_new_rtx_costs): Remove useless statement
47385         at const_int_cost.
47387 2014-01-28  Richard Biener  <rguenther@suse.de>
47389         Revert
47390         2014-01-28  Richard Biener  <rguenther@suse.de>
47392         PR rtl-optimization/45364
47393         PR rtl-optimization/59890
47394         * var-tracking.c (local_get_addr_clear_given_value): Handle
47395         already cleared slot.
47396         (val_reset): Handle not allocated local_get_addr_cache.
47397         (vt_find_locations): Use post-order on the inverted CFG.
47399 2014-01-28  Richard Biener  <rguenther@suse.de>
47401         * tree-data-ref.h (ddr_is_anti_dependent, ddrs_have_anti_deps): Remove.
47403 2014-01-28  Richard Biener  <rguenther@suse.de>
47405         PR rtl-optimization/45364
47406         PR rtl-optimization/59890
47407         * var-tracking.c (local_get_addr_clear_given_value): Handle
47408         already cleared slot.
47409         (val_reset): Handle not allocated local_get_addr_cache.
47410         (vt_find_locations): Use post-order on the inverted CFG.
47412 2014-01-28  Alan Modra  <amodra@gmail.com>
47414         * Makefile.in (BUILD_CPPFLAGS): Do not use ALL_CPPFLAGS.
47415         * configure.ac <recursive call for build != host>: Define
47416         GENERATOR_FILE.  Comment.  Use CXX_FOR_BUILD, CXXFLAGS_FOR_BUILD
47417         and LD_FOR_BUILD too.
47418         * configure: Regenerate.
47420 2014-01-27  Allan Sandfeld Jensen  <sandfeld@kde.org>
47422         * config/i386/i386.c (get_builtin_code_for_version): Separate
47423         Westmere from Nehalem, Ivy Bridge from Sandy Bridge and
47424         Broadwell from Haswell.
47426 2014-01-27  Steve Ellcey  <sellcey@mips.com>
47428         * common/config/mips/mips-common.c (TARGET_DEFAULT_TARGET_FLAGS):
47429         Remove TARGET_FP_EXCEPTIONS_DEFAULT and MASK_FUSED_MADD.
47430         * config/mips/mips.c (mips_option_override): Change setting
47431         of TARGET_DSP.
47432         * config/mips/mips.h (TARGET_FP_EXCEPTIONS_DEFAULT): Remove.
47433         * config/mips/mips.opt (DSP, DSPR2, FP_EXCEPTIONS, FUSED_MADD, MIPS3D):
47434         Change from Mask to Var.
47436 2014-01-27  Jeff Law  <law@redhat.com>
47438         * ipa-inline.c (inline_small_functions): Fix typo.
47440 2014-01-27  Ilya Tocar  <ilya.tocar@intel.com>
47442         * config/i386/avx512fintrin.h (_mm512_mask_cvtepi32_storeu_epi8): New.
47443         (_mm512_mask_cvtsepi32_storeu_epi8): Ditto.
47444         (_mm512_mask_cvtusepi32_storeu_epi8): Ditto.
47445         (_mm512_mask_cvtepi32_storeu_epi16): Ditto.
47446         (_mm512_mask_cvtsepi32_storeu_epi16): Ditto.
47447         (_mm512_mask_cvtusepi32_storeu_epi16): Ditto.
47448         (_mm512_mask_cvtepi64_storeu_epi32): Ditto.
47449         (_mm512_mask_cvtsepi64_storeu_epi32): Ditto.
47450         (_mm512_mask_cvtusepi64_storeu_epi32): Ditto.
47451         (_mm512_mask_cvtepi64_storeu_epi16): Ditto.
47452         (_mm512_mask_cvtsepi64_storeu_epi16): Ditto.
47453         (_mm512_mask_cvtusepi64_storeu_epi16): Ditto.
47454         (_mm512_mask_cvtepi64_storeu_epi8): Ditto.
47455         (_mm512_mask_cvtsepi64_storeu_epi8): Ditto.
47456         (_mm512_mask_cvtusepi64_storeu_epi8): Ditto.
47457         (_mm512_storeu_epi64): Ditto.
47458         (_mm512_cmpge_epi32_mask): Ditto.
47459         (_mm512_cmpge_epu32_mask): Ditto.
47460         (_mm512_cmpge_epi64_mask): Ditto.
47461         (_mm512_cmpge_epu64_mask): Ditto.
47462         (_mm512_cmple_epi32_mask): Ditto.
47463         (_mm512_cmple_epu32_mask): Ditto.
47464         (_mm512_cmple_epi64_mask): Ditto.
47465         (_mm512_cmple_epu64_mask): Ditto.
47466         (_mm512_cmplt_epi32_mask): Ditto.
47467         (_mm512_cmplt_epu32_mask): Ditto.
47468         (_mm512_cmplt_epi64_mask): Ditto.
47469         (_mm512_cmplt_epu64_mask): Ditto.
47470         (_mm512_cmpneq_epi32_mask): Ditto.
47471         (_mm512_cmpneq_epu32_mask): Ditto.
47472         (_mm512_cmpneq_epi64_mask): Ditto.
47473         (_mm512_cmpneq_epu64_mask): Ditto.
47474         (_mm512_expand_pd): Ditto.
47475         (_mm512_expand_ps): Ditto.
47476         * config/i386/i386-builtin-types.def: Add PV16QI, PV16QI, PV16HI,
47477         VOID_PV8SI_V8DI_QI, VOID_PV8HI_V8DI_QI, VOID_PV16QI_V8DI_QI,
47478         VOID_PV16QI_V16SI_HI, VOID_PV16HI_V16SI_HI.
47479         * config/i386/i386.c (ix86_builtins): Add
47480         IX86_BUILTIN_EXPANDPD512_NOMASK, IX86_BUILTIN_EXPANDPS512_NOMASK,
47481         IX86_BUILTIN_PMOVDB512_MEM, IX86_BUILTIN_PMOVDW512_MEM,
47482         IX86_BUILTIN_PMOVQB512_MEM, IX86_BUILTIN_PMOVQD512_MEM,
47483         IX86_BUILTIN_PMOVQW512_MEM, IX86_BUILTIN_PMOVSDB512_MEM,
47484         IX86_BUILTIN_PMOVSDW512_MEM, IX86_BUILTIN_PMOVSQB512_MEM,
47485         IX86_BUILTIN_PMOVSQD512_MEM, IX86_BUILTIN_PMOVSQW512_MEM,
47486         IX86_BUILTIN_PMOVUSDB512_MEM, IX86_BUILTIN_PMOVUSDW512_MEM,
47487         IX86_BUILTIN_PMOVUSQB512_MEM, IX86_BUILTIN_PMOVUSQD512_MEM,
47488         IX86_BUILTIN_PMOVUSQW512_MEM.
47489         (bdesc_special_args): Add __builtin_ia32_pmovusqd512mem_mask,
47490         __builtin_ia32_pmovsqd512mem_mask,
47491         __builtin_ia32_pmovqd512mem_mask,
47492         __builtin_ia32_pmovusqw512mem_mask,
47493         __builtin_ia32_pmovsqw512mem_mask,
47494         __builtin_ia32_pmovqw512mem_mask,
47495         __builtin_ia32_pmovusdw512mem_mask,
47496         __builtin_ia32_pmovsdw512mem_mask,
47497         __builtin_ia32_pmovdw512mem_mask,
47498         __builtin_ia32_pmovqb512mem_mask,
47499         __builtin_ia32_pmovusqb512mem_mask,
47500         __builtin_ia32_pmovsqb512mem_mask,
47501         __builtin_ia32_pmovusdb512mem_mask,
47502         __builtin_ia32_pmovsdb512mem_mask,
47503         __builtin_ia32_pmovdb512mem_mask.
47504         (bdesc_args): Add __builtin_ia32_expanddf512,
47505         __builtin_ia32_expandsf512.
47506         (ix86_expand_special_args_builtin): Handle VOID_FTYPE_PV8SI_V8DI_QI,
47507         VOID_FTYPE_PV8HI_V8DI_QI, VOID_FTYPE_PV16HI_V16SI_HI,
47508         VOID_FTYPE_PV16QI_V8DI_QI, VOID_FTYPE_PV16QI_V16SI_HI.
47509         * config/i386/sse.md (unspec): Add UNSPEC_EXPAND_NOMASK.
47510         (avx512f_<code><pmov_src_lower><mode>2_mask_store): New.
47511         (*avx512f_<code>v8div16qi2_store_mask): Renamed to ...
47512         (avx512f_<code>v8div16qi2_mask_store): This.
47513         (avx512f_expand<mode>): New.
47515 2014-01-27  Kirill Yukhin  <kirill.yukhin@intel.com>
47517         * config/i386/avx512pfintrin.h (_mm512_mask_prefetch_i32gather_pd):
47518         New.
47519         (_mm512_mask_prefetch_i64gather_pd): Ditto.
47520         (_mm512_prefetch_i32scatter_pd): Ditto.
47521         (_mm512_mask_prefetch_i32scatter_pd): Ditto.
47522         (_mm512_prefetch_i64scatter_pd): Ditto.
47523         (_mm512_mask_prefetch_i64scatter_pd): Ditto.
47524         (_mm512_mask_prefetch_i32gather_ps): Fix operand type.
47525         (_mm512_mask_prefetch_i64gather_ps): Ditto.
47526         (_mm512_prefetch_i32scatter_ps): Ditto.
47527         (_mm512_mask_prefetch_i32scatter_ps): Ditto.
47528         (_mm512_prefetch_i64scatter_ps): Ditto.
47529         (_mm512_mask_prefetch_i64scatter_ps): Ditto.
47530         * config/i386/i386-builtin-types.def: Define
47531         VOID_FTYPE_QI_V8SI_PCINT64_INT_INT
47532         and VOID_FTYPE_QI_V8DI_PCINT64_INT_INT.
47533         * config/i386/i386.c (ix86_builtins): Define IX86_BUILTIN_GATHERPFQPD,
47534         IX86_BUILTIN_GATHERPFDPD, IX86_BUILTIN_SCATTERPFDPD,
47535         IX86_BUILTIN_SCATTERPFQPD.
47536         (ix86_init_mmx_sse_builtins): Define __builtin_ia32_gatherpfdpd,
47537         __builtin_ia32_gatherpfdps, __builtin_ia32_gatherpfqpd,
47538         __builtin_ia32_gatherpfqps, __builtin_ia32_scatterpfdpd,
47539         __builtin_ia32_scatterpfdps, __builtin_ia32_scatterpfqpd,
47540         __builtin_ia32_scatterpfqps.
47541         (ix86_expand_builtin): Expand new built-ins.
47542         * config/i386/sse.md (avx512pf_gatherpf<mode>): Add SF suffix,
47543         fix memory access data type.
47544         (*avx512pf_gatherpf<mode>_mask): Ditto.
47545         (*avx512pf_gatherpf<mode>): Ditto.
47546         (avx512pf_scatterpf<mode>): Ditto.
47547         (*avx512pf_scatterpf<mode>_mask): Ditto.
47548         (*avx512pf_scatterpf<mode>): Ditto.
47549         (GATHER_SCATTER_SF_MEM_MODE): New.
47550         (avx512pf_gatherpf<mode>df): Ditto.
47551         (*avx512pf_gatherpf<mode>df_mask): Ditto.
47552         (*avx512pf_scatterpf<mode>df): Ditto.
47554 2014-01-27  Jakub Jelinek  <jakub@redhat.com>
47556         PR bootstrap/59934
47557         * expmed.h (expmed_mode_index): Rework so that analysis and optimziers
47558         know when the MODE_PARTIAL_INT and MODE_VECTOR_INT cases can never be
47559         reached.
47561 2014-01-27  James Greenhalgh  <james.greenhalgh@arm.com>
47563         * common/config/arm/arm-common.c
47564         (arm_rewrite_mcpu): Handle multiple names.
47565         * config/arm/arm.h
47566         (BIG_LITTLE_SPEC): Do not discard mcpu switches.
47568 2014-01-27  James Greenhalgh  <james.greenhalgh@arm.com>
47570         * gimple-builder.h (create_gimple_tmp): Delete.
47572 2014-01-27  Christian Bruel  <christian.bruel@st.com>
47574         * config/sh/sh-mem.cc (sh_expand_cmpnstr): Fix remaining bytes after
47575         words comparisons.
47577 2014-01-26  John David Anglin  <danglin@gcc.gnu.org>
47579         * config/pa/pa.md (call): Generate indirect long calls to non-local
47580         functions when outputing 32-bit code.
47581         (call_value): Likewise except for special call to buggy powf function.
47583         * config/pa/pa.c (pa_attr_length_indirect_call): Adjust length of
47584         portable runtime and PIC indirect calls.
47585         (pa_output_indirect_call): Remove unnecessary nop from portable runtime
47586         and PIC call sequences.  Use ldo instead of blr to set return register
47587         in PIC call sequence.
47589 2014-01-25  Walter Lee  <walt@tilera.com>
47591         * config/tilegx/sync.md (atomic_fetch_sub): Fix negation and
47592         avoid clobbering a live register.
47594 2014-01-25  Walter Lee  <walt@tilera.com>
47596         * config/tilegx/tilegx-c.c (tilegx_cpu_cpp_builtins):
47597         Define __GCC_HAVE_SYNC_COMPARE_AND_SWAP_{1,2}.
47598         * config/tilegx/tilepro-c.c (tilepro_cpu_cpp_builtins):
47599         Define __GCC_HAVE_SYNC_COMPARE_AND_SWAP_{1,2,4,8}.
47601 2014-01-25  Walter Lee  <walt@tilera.com>
47603         * config/tilegx/tilegx.c (tilegx_function_arg): Start 16-byte
47604         arguments on even registers.
47605         (tilegx_gimplify_va_arg_expr): Align 16-byte var args to
47606         STACK_BOUNDARY.
47607         * config/tilegx/tilegx.h (STACK_BOUNDARY): Change to 16 bytes.
47608         (BIGGEST_ALIGNMENT): Ditto.
47609         (BIGGEST_FIELD_ALIGNMENT): Ditto.
47611 2014-01-25  Walter Lee  <walt@tilera.com>
47613         * config/tilegx/tilegx.c (tilegx_gen_bundles): Delete barrier
47614         insns before bundling.
47615         * config/tilegx/tilegx.md (tile_network_barrier): Update comment.
47617 2014-01-25  Walter Lee  <walt@tilera.com>
47619         * config/tilegx/tilegx.c (tilegx_expand_builtin): Set
47620         PREFETCH_SCHEDULE_BARRIER_P to true for prefetches.
47621         * config/tilepro/tilepro.c (tilepro_expand_builtin): Ditto.
47623 2014-01-25  Richard Sandiford  <rdsandiford@googlemail.com>
47625         * config/mips/constraints.md (kl): Delete.
47626         * config/mips/mips.md (divmod<mode>4, udivmod<mode>4): Turn into
47627         define expands, using...
47628         (divmod<mode>4_mips16, udivmod<mode>4_mips16): ...these new
47629         instructions for MIPS16.
47630         (*divmod<mode>4, *udivmod<mode>4): New patterns, taken from the
47631         non-MIPS16 version of the old divmod<mode>4 and udivmod<mode>4.
47633 2014-01-25  Walter Lee  <walt@tilera.com>
47635         * config/tilepro/tilepro.md (ctzdi2): Use register_operand predicate.
47636         (clzdi2): Ditto.
47637         (ffsdi2): Ditto.
47639 2014-01-25  Walter Lee  <walt@tilera.com>
47641         * config/tilegx/tilegx.c (tilegx_expand_to_rtl_hook): New.
47642         (TARGET_EXPAND_TO_RTL_HOOK): Define.
47644 2014-01-25  Richard Sandiford  <rdsandiford@googlemail.com>
47646         * rtlanal.c (canonicalize_condition): Split out duplicated mode check.
47647         Handle XOR.
47649 2014-01-25  Jakub Jelinek  <jakub@redhat.com>
47651         * print-rtl.c (in_call_function_usage): New var.
47652         (print_rtx): When in CALL_INSN_FUNCTION_USAGE, always print
47653         EXPR_LIST mode as mode and not as reg note name.
47655         PR middle-end/59561
47656         * cfgloopmanip.c (copy_loop_info): If
47657         loop->warned_aggressive_loop_optimizations, make sure
47658         the flag is set in target loop too.
47660 2014-01-24  Balaji V. Iyer  <balaji.v.iyer@intel.com>
47662         * builtins.c (is_builtin_name): Renamed flag_enable_cilkplus to
47663         flag_cilkplus.
47664         * builtins.def: Likewise.
47665         * cilk.h (fn_contains_cilk_spawn_p): Likewise.
47666         * cppbuiltin.c (define_builtin_macros_for_compilation_flags): Likewise.
47667         * ira.c (ira_setup_eliminable_regset): Likewise.
47668         * omp-low.c (gate_expand_omp): Likewise.
47669         (execute_lower_omp): Likewise.
47670         (diagnose_sb_0): Likewise.
47671         (gate_diagnose_omp_blocks): Likewise.
47672         (simd_clone_clauses_extract): Likewise.
47673         (gate): Likewise.
47675 2014-01-24  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
47677         * config/rs6000/rs6000.c (rs6000_expand_vec_perm_const_1): Remove
47678         correction for little endian...
47679         * config/rs6000/vsx.md (vsx_xxpermdi2_<mode>_1): ...and move it to
47680         here.
47682 2014-01-24  Jeff Law  <law@redhat.com>
47684         PR tree-optimization/59919
47685         * tree-vrp.c (find_assert_locations_1): Do not register asserts
47686         for non-returning calls.
47688 2014-01-24  James Greenhalgh  <james.greenhalgh@arm.com>
47690         * common/config/aarch64/aarch64-common.c
47691         (aarch64_rewrite_mcpu): Handle multiple names.
47692         * config/aarch64/aarch64.h
47693         (BIG_LITTLE_SPEC): Do not discard mcpu switches.
47695 2014-01-24  Dodji Seketeli  <dodji@redhat.com>
47697         * input.c (add_file_to_cache_tab): Handle the case where fopen
47698         returns NULL.
47700 2014-01-23  H.J. Lu  <hongjiu.lu@intel.com>
47702         PR target/59929
47703         * config/i386/i386.md (pushsf splitter): Get stack adjustment
47704         from push operand if code of push isn't PRE_DEC.
47706 2014-01-23  Michael Meissner  <meissner@linux.vnet.ibm.com>
47708         PR target/59909
47709         * doc/invoke.texi (RS/6000 and PowerPC Options): Document
47710         -mquad-memory-atomic.  Update -mquad-memory documentation to say
47711         it is only used for non-atomic loads/stores.
47713         * config/rs6000/predicates.md (quad_int_reg_operand): Allow either
47714         -mquad-memory or -mquad-memory-atomic switches.
47716         * config/rs6000/rs6000-cpus.def (ISA_2_7_MASKS_SERVER): Add
47717         -mquad-memory-atomic to ISA 2.07 support.
47719         * config/rs6000/rs6000.opt (-mquad-memory-atomic): Add new switch
47720         to separate support of normal quad word memory operations (ldq, stq)
47721         from the atomic quad word memory operations.
47723         * config/rs6000/rs6000.c (rs6000_option_override_internal): Add
47724         support to separate non-atomic quad word operations from atomic
47725         quad word operations.  Disable non-atomic quad word operations in
47726         little endian mode so that we don't have to swap words after the
47727         load and before the store.
47728         (quad_load_store_p): Add comment about atomic quad word support.
47729         (rs6000_opt_masks): Add -mquad-memory-atomic to the list of
47730         options printed with -mdebug=reg.
47732         * config/rs6000/rs6000.h (TARGET_SYNC_TI): Use
47733         -mquad-memory-atomic as the test for whether we have quad word
47734         atomic instructions.
47735         (TARGET_SYNC_HI_QI): If either -mquad-memory-atomic, -mquad-memory,
47736         or -mp8-vector are used, allow byte/half-word atomic operations.
47738         * config/rs6000/sync.md (load_lockedti): Insure that the address
47739         is a proper indexed or indirect address for the lqarx instruction.
47740         On little endian systems, swap the hi/lo registers after the lqarx
47741         instruction.
47742         (load_lockedpti): Use indexed_or_indirect_operand predicate to
47743         insure the address is valid for the lqarx instruction.
47744         (store_conditionalti): Insure that the address is a proper indexed
47745         or indirect address for the stqcrx. instruction.  On little endian
47746         systems, swap the hi/lo registers before doing the stqcrx.
47747         instruction.
47748         (store_conditionalpti): Use indexed_or_indirect_operand predicate to
47749         insure the address is valid for the stqcrx. instruction.
47751         * gcc/config/rs6000/rs6000-c.c (rs6000_target_modify_macros):
47752         Define __QUAD_MEMORY__ and __QUAD_MEMORY_ATOMIC__ based on what
47753         type of quad memory support is available.
47755 2014-01-23  Vladimir Makarov  <vmakarov@redhat.com>
47757         PR regression/59915
47758         * lra-constraints.c (simplify_operand_subreg): Spill pseudo if
47759         there is a danger of looping.
47761 2014-01-23  Pat Haugen  <pthaugen@us.ibm.com>
47763         * config/rs6000/rs6000.c (rs6000_option_override_internal): Don't
47764         force flag_ira_loop_pressure if set via command line.
47766 2014-01-23  Alex Velenko  <Alex.Velenko@arm.com>
47768         * config/aarch64/aarch64-simd-builtins.def (ashr): DI mode removed.
47769         (ashr_simd): New builtin handling DI mode.
47770         * config/aarch64/aarch64-simd.md (aarch64_ashr_simddi): New pattern.
47771         (aarch64_sshr_simddi): New match pattern.
47772         * config/aarch64/arm_neon.h (vshr_n_s32): Builtin call modified.
47773         (vshrd_n_s64): Likewise.
47774         * config/aarch64/predicates.md (aarch64_shift_imm64_di): New predicate.
47776 2014-01-23  Nick Clifton  <nickc@redhat.com>
47778         * config/msp430/msp430.h (ASM_SPEC): Pass the -mcpu as -mcpu.
47779         (LIB_SPEC): Drop use of memory.ld and peripherals.ld scripts in
47780         favour of mcu specific scripts.
47781         * config/msp430/t-msp430 (MULTILIB_MATCHES): Add more matches for
47782         430x multilibs.
47784 2014-01-23  James Greenhalgh  <james.greenhalgh@arm.com>
47785             Alex Velenko  <Alex.Velenko@arm.com>
47787         * config/aarch64/arm_neon.h (vaddv_s8): __LANE0 cleanup.
47788         (vaddv_s16): Likewise.
47789         (vaddv_s32): Likewise.
47790         (vaddv_u8): Likewise.
47791         (vaddv_u16): Likewise.
47792         (vaddv_u32): Likewise.
47793         (vaddvq_s8): Likewise.
47794         (vaddvq_s16): Likewise.
47795         (vaddvq_s32): Likewise.
47796         (vaddvq_s64): Likewise.
47797         (vaddvq_u8): Likewise.
47798         (vaddvq_u16): Likewise.
47799         (vaddvq_u32): Likewise.
47800         (vaddvq_u64): Likewise.
47801         (vaddv_f32): Likewise.
47802         (vaddvq_f32): Likewise.
47803         (vaddvq_f64): Likewise.
47804         (vmaxv_f32): Likewise.
47805         (vmaxv_s8): Likewise.
47806         (vmaxv_s16): Likewise.
47807         (vmaxv_s32): Likewise.
47808         (vmaxv_u8): Likewise.
47809         (vmaxv_u16): Likewise.
47810         (vmaxv_u32): Likewise.
47811         (vmaxvq_f32): Likewise.
47812         (vmaxvq_f64): Likewise.
47813         (vmaxvq_s8): Likewise.
47814         (vmaxvq_s16): Likewise.
47815         (vmaxvq_s32): Likewise.
47816         (vmaxvq_u8): Likewise.
47817         (vmaxvq_u16): Likewise.
47818         (vmaxvq_u32): Likewise.
47819         (vmaxnmv_f32): Likewise.
47820         (vmaxnmvq_f32): Likewise.
47821         (vmaxnmvq_f64): Likewise.
47822         (vminv_f32): Likewise.
47823         (vminv_s8): Likewise.
47824         (vminv_s16): Likewise.
47825         (vminv_s32): Likewise.
47826         (vminv_u8): Likewise.
47827         (vminv_u16): Likewise.
47828         (vminv_u32): Likewise.
47829         (vminvq_f32): Likewise.
47830         (vminvq_f64): Likewise.
47831         (vminvq_s8): Likewise.
47832         (vminvq_s16): Likewise.
47833         (vminvq_s32): Likewise.
47834         (vminvq_u8): Likewise.
47835         (vminvq_u16): Likewise.
47836         (vminvq_u32): Likewise.
47837         (vminnmv_f32): Likewise.
47838         (vminnmvq_f32): Likewise.
47839         (vminnmvq_f64): Likewise.
47841 2014-01-23  James Greenhalgh  <james.greenhalgh@arm.com>
47843         * config/aarch64/aarch64-simd.md
47844         (aarch64_dup_lane<mode>): Correct lane number on big-endian.
47845         (aarch64_dup_lane_<vswap_widthi_name><mode>): Likewise.
47846         (*aarch64_mul3_elt<mode>): Likewise.
47847         (*aarch64_mul3_elt<vswap_width_name><mode>): Likewise.
47848         (*aarch64_mul3_elt_to_64v2df): Likewise.
47849         (*aarch64_mla_elt<mode>): Likewise.
47850         (*aarch64_mla_elt_<vswap_width_name><mode>): Likewise.
47851         (*aarch64_mls_elt<mode>): Likewise.
47852         (*aarch64_mls_elt_<vswap_width_name><mode>): Likewise.
47853         (*aarch64_fma4_elt<mode>): Likewise.
47854         (*aarch64_fma4_elt_<vswap_width_name><mode>): Likewise.
47855         (*aarch64_fma4_elt_to_64v2df): Likewise.
47856         (*aarch64_fnma4_elt<mode>): Likewise.
47857         (*aarch64_fnma4_elt_<vswap_width_name><mode>): Likewise.
47858         (*aarch64_fnma4_elt_to_64v2df): Likewise.
47859         (aarch64_sq<r>dmulh_lane<mode>): Likewise.
47860         (aarch64_sq<r>dmulh_laneq<mode>): Likewise.
47861         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal): Likewise.
47862         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal): Likewise.
47863         (aarch64_sqdml<SBINQOPS:as>l2_lane<mode>_internal): Likewise.
47864         (aarch64_sqdmull_lane<mode>_internal): Likewise.
47865         (aarch64_sqdmull2_lane<mode>_internal): Likewise.
47867 2013-01-23  Alex Velenko  <Alex.Velenko@arm.com>
47869         * config/aarch64/aarch64-simd.md
47870         (aarch64_be_checked_get_lane<mode>): New define_expand.
47871         * config/aarch64/aarch64-simd-builtins.def
47872         (BUILTIN_VALL (GETLANE, be_checked_get_lane, 0)):
47873         New builtin definition.
47874         * config/aarch64/arm_neon.h: (__aarch64_vget_lane_any):
47875         Use new safe be builtin.
47877 2014-01-23  Alex Velenko  <Alex.Velenko@arm.com>
47879         * config/aarch64/aarch64-simd.md (aarch64_be_ld1<mode>):
47880         New define_insn.
47881         (aarch64_be_st1<mode>): Likewise.
47882         (aarch_ld1<VALL:mode>): Define_expand modified.
47883         (aarch_st1<VALL:mode>): Likewise.
47884         * config/aarch64/aarch64.md (UNSPEC_LD1): New unspec definition.
47885         (UNSPEC_ST1): Likewise.
47887 2014-01-23  David Holsgrove  <david.holsgrove@xilinx.com>
47889         * config/microblaze/microblaze.md: Add trap insn and attribute
47891 2014-01-23  Dodji Seketeli  <dodji@redhat.com>
47893         PR preprocessor/58580
47894         * input.h (location_get_source_line): Take an additional line_size
47895         parameter.
47896         (void diagnostics_file_cache_fini): Declare new function.
47897         * input.c (struct fcache): New type.
47898         (fcache_tab_size, fcache_buffer_size, fcache_line_record_size):
47899         New static constants.
47900         (diagnostic_file_cache_init, total_lines_num)
47901         (lookup_file_in_cache_tab, evicted_cache_tab_entry)
47902         (add_file_to_cache_tab, lookup_or_add_file_to_cache_tab)
47903         (needs_read, needs_grow, maybe_grow, read_data, maybe_read_data)
47904         (get_next_line, read_next_line, goto_next_line, read_line_num):
47905         New static function definitions.
47906         (diagnostic_file_cache_fini): New function.
47907         (location_get_source_line): Take an additional output line_len
47908         parameter.  Re-write using lookup_or_add_file_to_cache_tab and
47909         read_line_num.
47910         * diagnostic.c (diagnostic_finish): Call
47911         diagnostic_file_cache_fini.
47912         (adjust_line): Take an additional input parameter for the length
47913         of the line, rather than calculating it with strlen.
47914         (diagnostic_show_locus): Adjust the use of
47915         location_get_source_line and adjust_line with respect to their new
47916         signature.  While displaying a line now, do not stop at the first
47917         null byte.  Rather, display the zero byte as a space and keep
47918         going until we reach the size of the line.
47919         * Makefile.in: Add vec.o to OBJS-libcommon
47921 2014-01-23  Kirill Yukhin  <kirill.yukhin@intel.com>
47922             Ilya Tocar  <ilya.tocar@intel.com>
47924         * config/i386/avx512fintrin.h (_mm512_kmov): New.
47925         * config/i386/i386.c (IX86_BUILTIN_KMOV16): Ditto.
47926         (__builtin_ia32_kmov16): Ditto.
47927         * config/i386/i386.md (UNSPEC_KMOV): New.
47928         (kmovw): Ditto.
47930 2014-01-23  Kirill Yukhin  <kirill.yukhin@intel.com>
47932         * config/i386/avx512fintrin.h (_mm512_loadu_si512): Rename.
47933         (_mm512_storeu_si512): Ditto.
47935 2014-01-23  Richard Sandiford  <rdsandiford@googlemail.com>
47937         PR target/52125
47938         * rtl.h (get_referenced_operands): Declare.
47939         * recog.c (get_referenced_operands): New function.
47940         * config/mips/mips.c (mips_reorg_process_insns): Check which asm
47941         operands have been referenced when recording LO_SUM references.
47943 2014-01-22  David Holsgrove  <david.holsgrove@xilinx.com>
47945         * config/microblaze/microblaze.md: Correct bswaphi2 insn.
47947 2014-01-22  Jan Hubicka  <hubicka@ucw.cz>
47949         * config/i386/x86-tune.def (X86_TUNE_ACCUMULATE_OUTGOING_ARGS):
47950         Enable for generic and recent AMD targets.
47952 2014-01-22  Jan Hubicka  <hubicka@ucw.cz>
47954         * combine-stack-adj.c (combine_stack_adjustments_for_block): Remove
47955         ARG_SIZE note when adjustment was eliminated.
47957 2014-01-22  Jeff Law  <law@redhat.com>
47959         PR tree-optimization/59597
47960         * tree-ssa-threadupdate.c (dump_jump_thread_path): Move to earlier
47961         in file.  Accept new argument REGISTERING and use it to modify
47962         dump output appropriately.
47963         (register_jump_thread): Corresponding changes.
47964         (mark_threaded_blocks): Reinstate code to cancel unprofitable
47965         thread paths involving joiner blocks.  Add code to dump cancelled
47966         jump threading paths.
47968 2014-01-22  Vladimir Makarov  <vmakarov@redhat.com>
47970         PR rtl-optimization/59477
47971         * lra-constraints.c (inherit_in_ebb): Process call for living hard
47972         regs.  Update reloads_num and potential_reload_hard_regs for all insns.
47974 2014-01-22  Tom Tromey  <tromey@redhat.com>
47976         * config/i386/i386-interix.h (i386_pe_unique_section): Don't use
47977         PARAMS.
47978         * config/cr16/cr16-protos.h (notice_update_cc): Don't use PARAMS.
47980 2014-01-21  Vladimir Makarov  <vmakarov@redhat.com>
47982         PR rtl-optimization/59896
47983         * lra-constraints.c (process_alt_operands): Check unused note for
47984         matched operands of insn with no output reloads.
47986 2014-01-21  Richard Sandiford  <rdsandiford@googlemail.com>
47988         * config/mips/mips.c (mips_move_to_gpr_cost): Add M16_REGS case.
47989         (mips_move_from_gpr_cost): Likewise.
47991 2014-01-21  Vladimir Makarov  <vmakarov@redhat.com>
47993         PR rtl-optimization/59858
47994         * lra-constraints.c (SMALL_REGISTER_CLASS_P): Use
47995         ira_class_hard_regs_num.
47996         (process_alt_operands): Increase reject for dying matched operand.
47998 2014-01-21  Jakub Jelinek  <jakub@redhat.com>
48000         PR target/59003
48001         * config/i386/i386.c (expand_small_movmem_or_setmem): If mode is
48002         smaller than size, perform several stores or loads and stores
48003         at dst + count - size to store or copy all of size bytes, rather
48004         than just last modesize bytes.
48006 2014-01-20  DJ Delorie  <dj@redhat.com>
48008         * config/rl78/rl78.c (rl78_propogate_register_origins): Verify
48009         that CLOBBERs are REGs before propogating their values.
48011 2014-01-20  H.J. Lu  <hongjiu.lu@intel.com>
48013         PR middle-end/59789
48014         * cgraph.c (cgraph_inline_failed_string): Add type to DEFCIFCODE.
48015         (cgraph_inline_failed_type): New function.
48016         * cgraph.h (DEFCIFCODE): Add type.
48017         (cgraph_inline_failed_type_t): New enum.
48018         (cgraph_inline_failed_type): New prototype.
48019         * cif-code.def: Add CIF_FINAL_NORMAL to OK, FUNCTION_NOT_CONSIDERED,
48020         FUNCTION_NOT_OPTIMIZED, REDEFINED_EXTERN_INLINE,
48021         FUNCTION_NOT_INLINE_CANDIDATE, LARGE_FUNCTION_GROWTH_LIMIT,
48022         LARGE_STACK_FRAME_GROWTH_LIMIT, MAX_INLINE_INSNS_SINGLE_LIMIT,
48023         MAX_INLINE_INSNS_AUTO_LIMIT, INLINE_UNIT_GROWTH_LIMIT,
48024         RECURSIVE_INLINING, UNLIKELY_CALL, NOT_DECLARED_INLINED,
48025         OPTIMIZING_FOR_SIZE, ORIGINALLY_INDIRECT_CALL,
48026         INDIRECT_UNKNOWN_CALL, USES_COMDAT_LOCAL.
48027         Add CIF_FINAL_ERROR to UNSPECIFIED, BODY_NOT_AVAILABLE,
48028         FUNCTION_NOT_INLINABLE, OVERWRITABLE, MISMATCHED_ARGUMENTS,
48029         EH_PERSONALITY, NON_CALL_EXCEPTIONS, TARGET_OPTION_MISMATCH,
48030         OPTIMIZATION_MISMATCH.
48031         * tree-inline.c (expand_call_inline): Emit errors during
48032         early_inlining if cgraph_inline_failed_type returns CIF_FINAL_ERROR.
48034 2014-01-20  Uros Bizjak  <ubizjak@gmail.com>
48036         PR target/59685
48037         * config/i386/sse.md (*andnot<mode>3<mask_name>): Handle MODE_V16SF
48038         mode attribute in insn output.
48040 2014-01-20  Eric Botcazou  <ebotcazou@adacore.com>
48042         * output.h (output_constant): Delete.
48043         * varasm.c (output_constant): Make private.
48045 2014-01-20  Alex Velenko  <Alex.Velenko@arm.com>
48047         * config/aarch64/aarch64-simd.md (vec_perm<mode>): Add BE check.
48049 2014-01-20  Jakub Jelinek  <jakub@redhat.com>
48051         PR middle-end/59860
48052         * tree.h (fold_builtin_strcat): New prototype.
48053         * builtins.c (fold_builtin_strcat): No longer static.  Add len
48054         argument, if non-NULL, don't call c_strlen.  Optimize
48055         directly into __builtin_memcpy instead of __builtin_strcpy.
48056         (fold_builtin_2): Adjust fold_builtin_strcat caller.
48057         * gimple-fold.c (gimple_fold_builtin): Handle BUILT_IN_STRCAT.
48059 2014-01-20  Uros Bizjak  <ubizjak@gmail.com>
48061         * config/i386/i386.c (ix86_avoid_lea_for_addr): Return false
48062         for SImode_address_operand operands, having only a REG argument.
48064 2014-01-20  Marcus Shawcroft  <marcus.shawcroft@arm.com>
48066         * config/aarch64/aarch64-linux.h (GLIBC_DYNAMIC_LINKER): Expand
48067         loader name using mbig-endian.
48068         (LINUX_TARGET_LINK_SPEC): Pass linker -m flag.
48070 2014-01-20  James Greenhalgh  <james.greenhalgh@arm.com>
48072         * doc/invoke.texi (-march): Clarify documentation for AArch64.
48073         (-mtune): Likewise.
48074         (-mcpu): Likewise.
48076 2014-01-20  Tejas Belagod  <tejas.belagod@arm.com>
48078         * config/aarch64/aarch64-protos.h
48079         (aarch64_cannot_change_mode_class_ptr): Declare.
48080         * config/aarch64/aarch64.c (aarch64_cannot_change_mode_class,
48081         aarch64_cannot_change_mode_class_ptr): New.
48082         * config/aarch64/aarch64.h (CANNOT_CHANGE_MODE_CLASS): Change to call
48083         backend hook aarch64_cannot_change_mode_class.
48085 2014-01-20  James Greenhalgh  <james.greenhalgh@arm.com>
48087         * common/config/aarch64/aarch64-common.c
48088         (aarch64_handle_option): Don't handle any option order logic here.
48089         * config/aarch64/aarch64.c (aarch64_parse_arch): Do not override
48090         selected_cpu, warn on architecture version mismatch.
48091         (aarch64_override_options): Fix parsing order for option strings.
48093 2014-01-20  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
48094             Iain Sandoe  <iain@codesourcery.com>
48096         PR bootstrap/59496
48097         * config/rs6000/darwin.h (ADJUST_FIELD_ALIGN): Fix unused variable
48098         warning.  Amend comment to reflect current functionality.
48100 2014-01-20  Richard Biener  <rguenther@suse.de>
48102         PR middle-end/59860
48103         * builtins.c (fold_builtin_strcat): Remove case better handled
48104         by tree-ssa-strlen.c.
48106 2014-01-20  Alan Lawrence  <alan.lawrence@arm.com>
48108         * config/aarch64/aarch64.opt
48109         (mcpu, march, mtune): Make case-insensitive.
48111 2014-01-20  Jakub Jelinek  <jakub@redhat.com>
48113         PR target/59880
48114         * config/i386/i386.c (ix86_avoid_lea_for_addr): Return false
48115         if operands[1] is a REG or ZERO_EXTEND of a REG.
48117 2014-01-19  Jan Hubicka  <hubicka@ucw.cz>
48119         * varasm.c (compute_reloc_for_constant): Use targetm.binds_local_p.
48121 2014-01-19  John David Anglin  <danglin@gcc.gnu.org>
48123         * config/pa/pa.c (pa_attr_length_millicode_call): Correct length of
48124         long non-pic millicode calls.
48126 2014-01-19  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
48128         * config/vax/vax.h (FUNCTION_ARG_REGNO_P): Fix unused variable warning.
48130 2014-01-19  Kito Cheng  <kito@0xlab.org>
48132         * builtins.c (expand_movstr): Check movstr expand done or fail.
48134 2014-01-18  Uros Bizjak  <ubizjak@gmail.com>
48135             H.J. Lu  <hongjiu.lu@intel.com>
48137         PR target/59379
48138         * config/i386/i386.md (*lea<mode>): Zero-extend return register
48139         to DImode for zero-extended addresses.
48141 2014-01-19  Jakub Jelinek  <jakub@redhat.com>
48143         PR rtl-optimization/57763
48144         * bb-reorder.c (fix_crossing_unconditional_branches): Set JUMP_LABEL
48145         on the new indirect jump_insn and increment LABEL_NUSES (label).
48147 2014-01-18  H.J. Lu  <hongjiu.lu@intel.com>
48149         PR bootstrap/59580
48150         PR bootstrap/59583
48151         * config.gcc (x86_archs): New variable.
48152         (x86_64_archs): Likewise.
48153         (x86_cpus): Likewise.
48154         Use $x86_archs, $x86_64_archs and $x86_cpus to check valid
48155         --with-arch/--with-cpu= options.
48156         Support --with-arch=/--with-cpu={nehalem,westmere,
48157         sandybridge,ivybridge,haswell,broadwell,bonnell,silvermont}.
48159 2014-01-18  Uros Bizjak  <ubizjak@gmail.com>
48161         * config/i386/i386.c (ix86_adjust_cost): Reorder PROCESSOR_K8
48162         and PROCESSOR_ATHLON to simplify code.  Move "memory" calculation.
48164 2014-01-18  Uros Bizjak  <ubizjak@gmail.com>
48166         * config/i386/i386.md (*swap<mode>): Rename from swap<mode>.
48168 2014-01-18  Jakub Jelinek  <jakub@redhat.com>
48170         PR target/58944
48171         * config/i386/i386-c.c (ix86_pragma_target_parse): Temporarily
48172         clear cpp_get_options (parse_in)->warn_unused_macros for
48173         ix86_target_macros_internal with cpp_define.
48175 2014-01-18  Richard Sandiford  <rdsandiford@googlemail.com>
48177         * jump.c (delete_related_insns): Keep (use (insn))s.
48178         * reorg.c (redundant_insn): Check for barriers too.
48180 2014-01-17  H.J. Lu  <hongjiu.lu@intel.com>
48182         * config/i386/i386.c (ix86_split_lea_for_addr): Fix a comment typo.
48184 2014-01-17  John David Anglin  <danglin@gcc.gnu.org>
48186         * config/pa/pa.c (pa_attr_length_indirect_call): Don't output a short
48187         call to $$dyncall when TARGET_LONG_CALLS is true.
48189 2014-01-17  Jeff Law  <law@redhat.com>
48191         * ree.c (combine_set_extension): Temporarily disable test for
48192         changing number of hard registers.
48194 2014-01-17  Jan Hubicka  <hubicka@ucw.cz>
48196         PR middle-end/58125
48197         * ipa-inline-analysis.c (inline_free_summary):
48198         Do not free summary of aliases.
48200 2014-01-17  Jakub Jelinek  <jakub@redhat.com>
48202         PR middle-end/59706
48203         * gimplify.c (gimplify_expr): Use create_tmp_var
48204         instead of create_tmp_var_raw.  If cond doesn't have
48205         integral type, don't add the IFN_ANNOTATE builtin at all.
48207 2014-01-17  Martin Jambor  <mjambor@suse.cz>
48209         PR ipa/59736
48210         * ipa-cp.c (prev_edge_clone): New variable.
48211         (grow_next_edge_clone_vector): Renamed to grow_edge_clone_vectors.
48212         Also resize prev_edge_clone vector.
48213         (ipcp_edge_duplication_hook): Also update prev_edge_clone.
48214         (ipcp_edge_removal_hook): New function.
48215         (ipcp_driver): Register ipcp_edge_removal_hook.
48217 2014-01-17  Andrew Pinski  <apinski@cavium.com>
48218             Steve Ellcey  <sellcey@mips.com>
48220         PR target/59462
48221         * config/mips/mips.c (mips_print_operand): Check operand mode instead
48222         of operator mode.
48224 2014-01-17  Jeff Law  <law@redhat.com>
48226         PR middle-end/57904
48227         * passes.def: Reorder pass_copy_prop, pass_unrolli, pass_ccp sequence
48228         so that pass_ccp runs first.
48230 2014-01-17  H.J. Lu  <hongjiu.lu@intel.com>
48232         * config/i386/i386.c (ix86_lea_outperforms): Use TARGET_XXX.
48233         (ix86_adjust_cost): Use !TARGET_XXX.
48234         (do_reorder_for_imul): Likewise.
48235         (swap_top_of_ready_list): Likewise.
48236         (ix86_sched_reorder): Likewise.
48238 2014-01-17  H.J. Lu  <hongjiu.lu@intel.com>
48240         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
48241         PROCESSOR_INTEL.  Treat like PROCESSOR_GENERIC.
48242         * config/i386/i386.c (intel_memcpy): New.  Duplicate slm_memcpy.
48243         (intel_memset): New.  Duplicate slm_memset.
48244         (intel_cost): New.  Duplicate slm_cost.
48245         (m_INTEL): New macro.
48246         (processor_target_table): Add "intel".
48247         (ix86_option_override_internal): Replace PROCESSOR_SILVERMONT
48248         with PROCESSOR_INTEL for "intel".
48249         (ix86_lea_outperforms): Support PROCESSOR_INTEL.  Duplicate
48250         PROCESSOR_SILVERMONT.
48251         (ix86_issue_rate): Likewise.
48252         (ix86_adjust_cost): Likewise.
48253         (ia32_multipass_dfa_lookahead): Likewise.
48254         (swap_top_of_ready_list): Likewise.
48255         (ix86_sched_reorder): Likewise.
48256         (ix86_avoid_lea_for_addr): Check TARGET_AVOID_LEA_FOR_ADDR
48257         instead of TARGET_OPT_AGU.
48258         * config/i386/i386.h (TARGET_INTEL): New.
48259         (TARGET_AVOID_LEA_FOR_ADDR): Likewise.
48260         (processor_type): Add PROCESSOR_INTEL.
48261         * config/i386/x86-tune.def: Support m_INTEL. Duplicate m_SILVERMONT.
48262         Add X86_TUNE_AVOID_LEA_FOR_ADDR.
48264 2014-01-17  Marek Polacek  <polacek@redhat.com>
48266         PR c/58346
48267         * gimple-fold.c (fold_array_ctor_reference): Don't fold if element
48268         size is zero.
48270 2014-01-17  Richard Biener  <rguenther@suse.de>
48272         PR tree-optimization/46590
48273         * opts.c (default_options_table): Add entries for
48274         OPT_fbranch_count_reg, OPT_fmove_loop_invariants and OPT_ftree_pta,
48275         all enabled at -O1 but not for -Og.
48276         * common.opt (fbranch-count-reg): Remove Init(1).
48277         (fmove-loop-invariants): Likewise.
48278         (ftree-pta): Likewise.
48280 2014-01-17  Jakub Jelinek  <jakub@redhat.com>
48282         * config/i386/i386.c (ix86_data_alignment): For compatibility with
48283         (incorrect) GCC 4.8 and earlier alignment assumptions ensure we align
48284         decls to at least the GCC 4.8 used alignments.
48286         PR fortran/59440
48287         * tree-nested.c (convert_nonlocal_reference_stmt,
48288         convert_local_reference_stmt): For NAMELIST_DECLs in gimple_bind_vars
48289         of GIMPLE_BIND stmts, adjust associated decls.
48291 2014-01-17  Richard Biener  <rguenther@suse.de>
48293         PR tree-optimization/46590
48294         * vec.h (vec<>::bseach): New member function implementing
48295         binary search according to C89 bsearch.
48296         (vec<>::qsort): Avoid calling ::qsort for vectors with sizes 0 or 1.
48297         * tree-ssa-loop-im.c (struct mem_ref): Make stored member a
48298         bitmap pointer again.  Make accesses_in_loop a flat array.
48299         (mem_ref_obstack): New global.
48300         (outermost_indep_loop): Adjust for mem_ref->stored changes.
48301         (mark_ref_stored): Likewise.
48302         (ref_indep_loop_p_2): Likewise.
48303         (set_ref_stored_in_loop): New helper function.
48304         (mem_ref_alloc): Allocate mem_refs on the mem_ref_obstack obstack.
48305         (memref_free): Adjust.
48306         (record_mem_ref_loc): Simplify.
48307         (gather_mem_refs_stmt): Adjust.
48308         (sort_locs_in_loop_postorder_cmp): New function.
48309         (analyze_memory_references): Sort accesses_in_loop after
48310         loop postorder number.
48311         (find_ref_loc_in_loop_cmp): New function.
48312         (for_all_locs_in_loop): Find relevant cluster of locs in
48313         accesses_in_loop and iterate without recursion.
48314         (execute_sm): Avoid uninit warning.
48315         (struct ref_always_accessed): Simplify.
48316         (ref_always_accessed::operator ()): Likewise.
48317         (ref_always_accessed_p): Likewise.
48318         (tree_ssa_lim_initialize): Initialize mem_ref_obstack, compute
48319         loop postorder numbers here.
48320         (tree_ssa_lim_finalize): Free mem_ref_obstack and loop postorder
48321         numbers.
48323 2014-01-17  Jan Hubicka  <hubicka@ucw.cz>
48325         PR c++/57945
48326         * passes.c (rest_of_decl_compilation): Don't call varpool_finalize_decl
48327         on decls for which assemble_alias has been called.
48329 2014-01-17  Nick Clifton  <nickc@redhat.com>
48331         * config/msp430/msp430.opt: (mcpu): New option.
48332         * config/msp430/msp430.c (msp430_mcu_name): Use target_mcu.
48333         (msp430_option_override): Parse target_cpu.  If the MCU name
48334         matches a generic string, clear target_mcu.
48335         (msp430_attr): Allow numeric interrupt values up to 63.
48336         (msp430_expand_epilogue): No longer invert operand 1 of gen_popm.
48337         * config/msp430/msp430.h (ASM_SPEC): Convert -mcpu into a -mmcu
48338         option.
48339         * config/msp430/t-msp430: (MULTILIB_MATCHES): Remove mcu matches.
48340         Add mcpu matches.
48341         * config/msp430/msp430.md (popm): Use %J rather than %I.
48342         (addsi3): Use msp430_nonimmediate_operand for operand 2.
48343         (addhi_cy_i): Use immediate_operand for operand 2.
48344         * doc/invoke.texi: Document -mcpu option.
48346 2014-01-17  Richard Biener  <rguenther@suse.de>
48348         PR rtl-optimization/38518
48349         * df.h (df_analyze_loop): Declare.
48350         * df-core.c: Include cfgloop.h.
48351         (df_analyze_1): Split out main part of df_analyze.
48352         (df_analyze): Adjust.
48353         (loop_inverted_post_order_compute): New function.
48354         (loop_post_order_compute): Likewise.
48355         (df_analyze_loop): New function avoiding whole-function
48356         postorder computes.
48357         * loop-invariant.c (find_defs): Use df_analyze_loop.
48358         (find_invariants): Adjust.
48359         * loop-iv.c (iv_analysis_loop_init): Use df_analyze_loop.
48361 2014-01-17  Zhenqiang Chen  <zhenqiang.chen@arm.com>
48363         * config/arm/arm.c (arm_v7m_tune): Set max_insns_skipped to 2.
48364         (thumb2_final_prescan_insn): Set max to MAX_INSN_PER_IT_BLOCK.
48366 2014-01-16  Ilya Enkovich  <ilya.enkovich@intel.com>
48368         * ipa-ref.c (ipa_remove_stmt_references): Fix references
48369         traversal when removing references.
48371 2014-01-16  Jan Hubicka  <hubicka@ucw.cz>
48373         PR ipa/59775
48374         * tree.c (get_binfo_at_offset): Look harder for virtual bases.
48376 2014-01-16  Bernd Schmidt  <bernds@codesourcery.com>
48378         PR middle-end/56791
48379         * reload.c (find_reloads_address_1): Do not use RELOAD_OTHER when
48380         pushing a reload for an autoinc when we had previously reloaded an
48381         inner part of the address.
48383 2014-01-16  Jakub Jelinek  <jakub@redhat.com>
48385         * tree-vectorizer.h (struct _loop_vec_info): Add no_data_dependencies
48386         field.
48387         (LOOP_VINFO_NO_DATA_DEPENDENCIES): Define.
48388         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence): Clear it
48389         when not giving up or versioning for alias only because of
48390         loop->safelen.
48391         (vect_analyze_data_ref_dependences): Set to true.
48392         * tree-vect-stmts.c (hoist_defs_of_uses): Return false if def_stmt
48393         is a GIMPLE_PHI.
48394         (vectorizable_load): Use LOOP_VINFO_NO_DATA_DEPENDENCIES instead of
48395         LOOP_REQUIRES_VERSIONING_FOR_ALIAS, add && !nested_in_vect_loop
48396         to the condition.
48398         PR middle-end/58344
48399         * expr.c (expand_expr_real_1): Handle init == NULL_TREE.
48401         PR target/59839
48402         * config/i386/i386.c (ix86_expand_builtin): If target doesn't satisfy
48403         operand 0 predicate for gathers, use a new pseudo as subtarget.
48405 2014-01-16  Vladimir Makarov  <vmakarov@redhat.com>
48407         PR middle-end/59609
48408         * lra-constraints.c (process_alt_operands): Add printing debug info.
48409         Check absence of input/output reloads for matched operands too.
48411 2014-01-16  Vladimir Makarov  <vmakarov@redhat.com>
48413         PR rtl-optimization/59835
48414         * ira.c (ira_init_register_move_cost): Increase cost for
48415         impossible modes.
48417 2014-01-16  Alan Lawrence  <alan.lawrence@arm.com>
48419         * config/arm/arm.opt (mcpu, march, mtune): Make case-insensitive.
48421 2014-01-16  Richard Earnshaw  <rearnsha@arm.com>
48423         PR target/59780
48424         * aarch64.c (aarch64_split_128bit_move): Don't lookup REGNO on
48425         non-register objects.  Use gen_(high/low)part more consistently.
48426         Fix assertions.
48428 2014-01-16  Michael Meissner  <meissner@linux.vnet.ibm.com>
48430         PR target/59844
48431         * config/rs6000/rs6000.md (reload_vsx_from_gprsf): Add little
48432         endian support, remove tests for WORDS_BIG_ENDIAN.
48433         (p8_mfvsrd_3_<mode>): Likewise.
48434         (reload_gpr_from_vsx<mode>): Likewise.
48435         (reload_gpr_from_vsxsf): Likewise.
48436         (p8_mfvsrd_4_disf): Likewise.
48438 2014-01-16  Richard Biener  <rguenther@suse.de>
48440         PR rtl-optimization/46590
48441         * lcm.c (compute_antinout_edge): Use postorder iteration.
48442         (compute_laterin): Use inverted postorder iteration.
48444 2014-01-16  Nick Clifton  <nickc@redhat.com>
48446         PR middle-end/28865
48447         * varasm.c (output_constant): Return the number of bytes actually
48448         emitted.
48449         (output_constructor_array_range): Update the field size with the
48450         number of bytes emitted by output_constant.
48451         (output_constructor_regular_field): Likewise.  Also do not
48452         complain if the total number of bytes emitted is now greater
48453         than the expected fieldpos.
48454         * output.h (output_constant): Update prototype and descriptive comment.
48456 2014-01-16  Marek Polacek  <polacek@redhat.com>
48458         PR middle-end/59827
48459         * cgraph.c (gimple_check_call_args): Don't use DECL_ARG_TYPE if
48460         it is error_mark_node.
48462 2014-01-15  Uros Bizjak  <ubizjak@gmail.com>
48464         * config/i386/i386.c (ix86_hard_regno_mode_ok): Use
48465         VALID_AVX256_REG_OR_OI_MODE.
48467 2014-01-15  Pat Haugen  <pthaugen@us.ibm.com>
48469         * config/rs6000/rs6000.c (rs6000_output_function_prologue): Check if
48470         current procedure should be profiled.
48472 2014-01-15  Andrew Pinski  <apinski@cavium.com>
48474         * config/aarch64/aarch64.c (aarch64_register_move_cost): Correct cost
48475         of moving from/to the STACK_REG register class.
48477 2014-01-15  Richard Henderson  <rth@redhat.com>
48479         PR debug/54694
48480         * reginfo.c (global_regs_decl): Globalize.
48481         * rtl.h (global_regs_decl): Declare.
48482         * ira.c (do_reload): Diagnose frame_pointer_needed and it
48483         reserved via global_regs.
48485 2014-01-15  Teresa Johnson  <tejohnson@google.com>
48487         * tree-ssa-sccvn.c (visit_reference_op_call): Handle NULL vdef.
48489 2014-01-15  Bill Schmidt  <wschmidt@vnet.linux.ibm.com>
48491         * config/rs6000/altivec.md (mulv8hi3): Explicitly generate vmulesh
48492         and vmulosh rather than call gen_vec_widen_smult_*.
48493         (vec_widen_umult_even_v16qi): Test VECTOR_ELT_ORDER_BIG rather
48494         than BYTES_BIG_ENDIAN to determine use of even or odd instruction.
48495         (vec_widen_smult_even_v16qi): Likewise.
48496         (vec_widen_umult_even_v8hi): Likewise.
48497         (vec_widen_smult_even_v8hi): Likewise.
48498         (vec_widen_umult_odd_v16qi): Likewise.
48499         (vec_widen_smult_odd_v16qi): Likewise.
48500         (vec_widen_umult_odd_v8hi): Likewise.
48501         (vec_widen_smult_odd_v8hi): Likewise.
48502         (vec_widen_umult_hi_v16qi): Explicitly generate vmuleub and
48503         vmuloub rather than call gen_vec_widen_umult_*.
48504         (vec_widen_umult_lo_v16qi): Likewise.
48505         (vec_widen_smult_hi_v16qi): Explicitly generate vmulesb and
48506         vmulosb rather than call gen_vec_widen_smult_*.
48507         (vec_widen_smult_lo_v16qi): Likewise.
48508         (vec_widen_umult_hi_v8hi): Explicitly generate vmuleuh and vmulouh
48509         rather than call gen_vec_widen_umult_*.
48510         (vec_widen_umult_lo_v8hi): Likewise.
48511         (vec_widen_smult_hi_v8hi): Explicitly gnerate vmulesh and vmulosh
48512         rather than call gen_vec_widen_smult_*.
48513         (vec_widen_smult_lo_v8hi): Likewise.
48515 2014-01-15  Jeff Law  <law@redhat.com>
48517         PR tree-optimization/59747
48518         * ree.c (find_and_remove_re): Properly handle case where a second
48519         eliminated extension requires widening a copy created for elimination
48520         of a prior extension.
48521         (combine_set_extension): Ensure that the number of hard regs needed
48522         for a destination register does not change when we widen it.
48524 2014-01-15  Sebastian Huber  <sebastian.huber@embedded-brains.de>
48526         * config.gcc (*-*-rtems*): Add t-rtems to tmake_file.
48527         (arm*-*-uclinux*eabi*): Do not override an existing tmake_file.
48528         (arm*-*-eabi* | arm*-*-symbianelf* | arm*-*-rtems*): Likwise.
48529         (arm*-*-rtems*): Use t-rtems from existing tmake_file.
48530         (avr-*-rtems*): Likewise.
48531         (bfin*-rtems*): Likewise.
48532         (moxie-*-rtems*): Likewise.
48533         (h8300-*-rtems*): Likewise.
48534         (i[34567]86-*-rtems*): Likewise.
48535         (lm32-*-rtems*): Likewise.
48536         (m32r-*-rtems*): Likewise.
48537         (m68k-*-rtems*): Likewise.
48538         (microblaze*-*-rtems*): Likewise.
48539         (mips*-*-rtems*): Likewise.
48540         (powerpc-*-rtems*): Likewise.
48541         (sh-*-rtems*): Likewise.
48542         (sparc-*-rtems*): Likewise.
48543         (sparc64-*-rtems*): Likewise.
48544         (v850-*-rtems*): Likewise.
48545         (m32c-*-rtems*): Likewise.
48547 2014-01-15  Vladimir Makarov  <vmakarov@redhat.com>
48549         PR rtl-optimization/59511
48550         * ira.c (ira_init_register_move_cost): Use memory costs for some
48551         cases of register move cost calculations.
48552         * lra-constraints.c (lra_constraints): Use REG_FREQ_FROM_BB
48553         instead of BB frequency.
48554         * lra-coalesce.c (move_freq_compare_func, lra_coalesce): Ditto.
48555         * lra-assigns.c (find_hard_regno_for): Ditto.
48557 2014-01-15  Richard Biener  <rguenther@suse.de>
48559         PR tree-optimization/59822
48560         * tree-vect-stmts.c (hoist_defs_of_uses): New function.
48561         (vectorizable_load): Use it to hoist defs of uses of invariant
48562         loads out of the loop.
48564 2014-01-15  Matthew Gretton-Dann  <matthew.gretton-dann@linaro.org>
48565             Kugan Vivekanandarajah  <kuganv@linaro.org>
48567         PR target/59695
48568         * config/aarch64/aarch64.c (aarch64_build_constant): Fix incorrect
48569         truncation.
48571 2014-01-15  Richard Biener  <rguenther@suse.de>
48573         PR rtl-optimization/59802
48574         * lcm.c (compute_available): Use inverted postorder to seed
48575         the initial worklist.
48577 2014-01-15  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
48579         PR target/59803
48580         * config/s390/s390.c (s390_preferred_reload_class): Don't return
48581         ADDR_REGS for invalid symrefs in non-PIC code.
48583 2014-01-15  Jakub Jelinek  <jakub@redhat.com>
48585         PR other/58712
48586         * builtins.c (determine_block_size): Initialize *probable_max_size
48587         even if len_rtx is CONST_INT.
48589 2014-01-14  Andrew Pinski  <apinski@cavium.com>
48591         * config/aarch64/aarch64-protos.h (tune_params): Add issue_rate.
48592         * config/aarch64/aarch64.c (generic_tunings): Add issue rate of 2.
48593         (cortexa53_tunings): Likewise.
48594         (aarch64_sched_issue_rate): New function.
48595         (TARGET_SCHED_ISSUE_RATE): Define.
48597 2014-01-14  Vladimir Makarov  <vmakarov@redhat.com>
48599         * ira-costs.c (find_costs_and_classes): Add missed
48600         ira_init_register_move_cost_if_necessary.
48602 2014-01-14  Vladimir Makarov  <vmakarov@redhat.com>
48604         PR target/59787
48605         * config/arm/arm.c (arm_coproc_mem_operand): Add lra_in_progress.
48607 2014-01-14  H.J. Lu  <hongjiu.lu@intel.com>
48609         PR target/59794
48610         * config/i386/i386.c (type_natural_mode): Add a bool parameter
48611         to indicate if type is used for function return value.  Warn ABI
48612         change if the vector mode isn't available for function return value.
48613         (ix86_function_arg_advance): Pass false to type_natural_mode.
48614         (ix86_function_arg): Likewise.
48615         (ix86_gimplify_va_arg): Likewise.
48616         (function_arg_32): Don't warn ABI change.
48617         (ix86_function_value): Pass true to type_natural_mode.
48618         (ix86_return_in_memory): Likewise.
48619         (ix86_struct_value_rtx): Removed.
48620         (TARGET_STRUCT_VALUE_RTX): Likewise.
48622 2014-01-14  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
48624         * jump.c (redirect_jump_2): Remove REG_CROSSING_JUMP notes when
48625         converting a conditional jump into a conditional return.
48627 2014-01-14  Richard Biener  <rguenther@suse.de>
48629         PR tree-optimization/58921
48630         PR tree-optimization/59006
48631         * tree-vect-loop-manip.c (vect_loop_versioning): Remove code
48632         hoisting invariant stmts.
48633         * tree-vect-stmts.c (vectorizable_load): Insert the splat of
48634         invariant loads on the preheader edge if possible.
48636 2014-01-14  Joey Ye  <joey.ye@arm.com>
48638         * doc/plugin.texi (Building GCC plugins): Update to C++.
48640 2014-01-14  Kirill Yukhin  <kirill.yukhin@intel.com>
48642         * config/i386/avx512erintrin.h (_mm_rcp28_round_sd): New.
48643         (_mm_rcp28_round_ss): Ditto.
48644         (_mm_rsqrt28_round_sd): Ditto.
48645         (_mm_rsqrt28_round_ss): Ditto.
48646         (_mm_rcp28_sd): Ditto.
48647         (_mm_rcp28_ss): Ditto.
48648         (_mm_rsqrt28_sd): Ditto.
48649         (_mm_rsqrt28_ss): Ditto.
48650         * config/i386/avx512fintrin.h (_mm512_stream_load_si512): Ditto.
48651         * config/i386/i386-builtin-types.def (V8DI_FTYPE_PV8DI): Ditto.
48652         * config/i386/i386.c (IX86_BUILTIN_MOVNTDQA512): Ditto.
48653         (IX86_BUILTIN_RCP28SD): Ditto.
48654         (IX86_BUILTIN_RCP28SS): Ditto.
48655         (IX86_BUILTIN_RSQRT28SD): Ditto.
48656         (IX86_BUILTIN_RSQRT28SS): Ditto.
48657         (bdesc_special_args): Define __builtin_ia32_movntdqa512,
48658         __builtin_ia32_rcp28sd_round, __builtin_ia32_rcp28ss_round,
48659         __builtin_ia32_rsqrt28sd_round, __builtin_ia32_rsqrt28ss_round.
48660         (ix86_expand_special_args_builtin): Expand new FTYPE.
48661         * config/i386/sse.md (define_mode_attr "sse4_1_avx2"): Expand to V8DI.
48662         (srcp14<mode>): Make insn unary.
48663         (avx512f_vmscalef<mode><round_name>): Use substed predicate.
48664         (avx512f_sgetexp<mode><round_saeonly_name>): Ditto.
48665         (avx512f_rndscale<mode><round_saeonly_name>): Ditto.
48666         (<sse4_1_avx2>_movntdqa): Extend to 512 bits.
48667         (avx512er_exp2<mode><mask_name><round_saeonly_name>):
48668         Fix rounding: make it SAE only.
48669         (<mask_codefor>avx512er_rcp28<mode><mask_name><round_saeonly_name>):
48670         Ditto.
48671         (<mask_codefor>avx512er_rsqrt28<mode><mask_name><round_saeonly_name>):
48672         Ditto.
48673         (avx512er_vmrcp28<mode><round_saeonly_name>): Ditto.
48674         (avx512er_vmrsqrt28<mode><round_saeonly_name>): Ditto.
48675         (avx512f_getmant<mode><mask_name><round_saeonly_name>): Ditto.
48676         * config/i386/subst.md (round_saeonly_mask_scalar_operand3): Remove.
48677         (round_saeonly_mask_scalar_operand4): Ditto.
48678         (round_saeonly_mask_scalar_op3): Ditto.
48679         (round_saeonly_mask_scalar_op4): Ditto.
48681 2014-01-13  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
48683         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
48684         Implement -maltivec=be for vec_insert and vec_extract.
48686 2014-01-10  DJ Delorie  <dj@redhat.com>
48688         * config/msp430/msp430.md (call_internal): Don't allow memory
48689         references with SP as the base register.
48690         (call_value_internal): Likewise.
48691         * config/msp430/constraints.md (Yc): New.  For memory references
48692         that don't use SP as a base register.
48694         * config/msp430/msp430.c (msp430_print_operand): Add 'J' to mean
48695         "an integer without a # prefix"
48696         * config/msp430/msp430.md (epilogue_helper): Use it.
48698 2014-01-13  Jakub Jelinek  <jakub@redhat.com>
48700         PR target/59617
48701         * config/i386/i386.c (ix86_vectorize_builtin_gather): Uncomment
48702         AVX512F gather builtins.
48703         * tree-vect-stmts.c (vectorizable_mask_load_store): For now punt
48704         on gather decls with INTEGER_TYPE masktype.
48705         (vectorizable_load): For INTEGER_TYPE masktype, put the INTEGER_CST
48706         directly into the builtin rather than hoisting it before loop.
48708         PR tree-optimization/59387
48709         * tree-scalar-evolution.c: Include gimple-fold.h and gimplify-me.h.
48710         (scev_const_prop): If folded_casts and type has undefined overflow,
48711         use force_gimple_operand instead of force_gimple_operand_gsi and
48712         for each added stmt if it is assign with
48713         arith_code_with_undefined_signed_overflow, call
48714         rewrite_to_defined_overflow.
48715         * tree-ssa-loop-im.c: Don't include gimplify-me.h, include
48716         gimple-fold.h instead.
48717         (arith_code_with_undefined_signed_overflow,
48718         rewrite_to_defined_overflow): Moved to ...
48719         * gimple-fold.c (arith_code_with_undefined_signed_overflow,
48720         rewrite_to_defined_overflow): ... here.  No longer static.
48721         Include gimplify-me.h.
48722         * gimple-fold.h (arith_code_with_undefined_signed_overflow,
48723         rewrite_to_defined_overflow): New prototypes.
48725 2014-01-13  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
48727         * config/arm/arm.h (MAX_CONDITIONAL_EXECUTE): Fix typo in description.
48729 2014-01-13  Eric Botcazou  <ebotcazou@adacore.com>
48731         * builtins.c (get_object_alignment_2): Minor tweak.
48732         * tree-ssa-loop-ivopts.c (may_be_unaligned_p): Rewrite.
48734 2014-01-13  Christian Bruel  <christian.bruel@st.com>
48736         * config/sh/sh-mem.cc (sh_expand_cmpnstr): Unroll small sizes and
48737         optimized non constant lengths.
48739 2014-01-13  Jakub Jelinek  <jakub@redhat.com>
48741         PR libgomp/59194
48742         * omp-low.c (expand_omp_atomic_pipeline): Expand the initial
48743         load as __atomic_load_N if possible.
48745 2014-01-11  David Edelsohn  <dje.gcc@gmail.com>
48747         * config/rs6000/rs6000.c (rs6000_expand_mtfsf_builtin): Remove
48748         target parameter.
48749         (rs6000_expand_builtin): Adjust call.
48751 2014-01-11  David Edelsohn  <dje.gcc@gmail.com>
48753         PR target/58115
48754         * config/rs6000/rs6000.h (SWITCHABLE_TARGET): Define.
48755         * config/rs6000/rs6000.c: Include target-globals.h.
48756         (rs6000_set_current_function): Instead of doing target_reinit
48757         unconditionally, use save_target_globals_default_opts and
48758         restore_target_globals.
48760         * config/rs6000/rs6000-builtin.def (mffs, mtfsf): Add builtins for
48761         FPSCR.
48762         * config/rs6000/rs6000.c (rs6000_expand_mtfsf_builtin): New.
48763         (rs6000_expand_builtin): Handle mffs and mtfsf.
48764         (rs6000_init_builtins): Define mffs and mtfsf.
48765         * config/rs6000/rs6000.md (UNSPECV_MFFS, UNSPECV_MTFSF): New constants.
48766         (rs6000_mffs): New pattern.
48767         (rs6000_mtfsf): New pattern.
48769 2014-01-11  Bin Cheng  <bin.cheng@arm.com>
48771         * tree-ssa-loop-ivopts.c (iv_ca_narrow): New parameter.
48772         Start narrowing with START.  Apply candidate-use pair
48773         and check overall cost in narrowing.
48774         (iv_ca_prune): Pass new argument.
48776 2014-01-10  Jeff Law  <law@redhat.com>
48778         PR middle-end/59743
48779         * ree.c (combine_reaching_defs): Ensure the defining statement
48780         occurs before the extension when optimizing extensions with
48781         different source and destination hard registers.
48783 2014-01-10  Jan Hubicka  <hubicka@ucw.cz>
48785         PR ipa/58585
48786         * ipa-devirt.c (build_type_inheritance_graph): Also add types of
48787         vtables into the type inheritance graph.
48789 2014-01-10  Jakub Jelinek  <jakub@redhat.com>
48791         PR rtl-optimization/59754
48792         * ree.c (combine_reaching_defs): Disallow !SCALAR_INT_MODE_P
48793         modes in the REGNO != REGNO case.
48795 2014-01-10  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
48797         * config/rs6000/rs6000-builtin.def: Fix pasto for VPKSDUS.
48799 2014-01-10  Jakub Jelinek  <jakub@redhat.com>
48801         PR tree-optimization/59745
48802         * tree-predcom.c (tree_predictive_commoning_loop): Call
48803         free_affine_expand_cache if giving up because components is NULL.
48805         * target-globals.c (save_target_globals): Allocate < 4KB structs using
48806         GC in payload of target_globals struct instead of allocating them on
48807         the heap and the larger structs separately using GC.
48808         * target-globals.h (struct target_globals): Make regs, hard_regs,
48809         reload, expmed, ira, ira_int and lra_fields GTY((atomic)) instead
48810         of GTY((skip)) and change type to void *.
48811         (reset_target_globals): Cast loads from those fields to corresponding
48812         types.
48814 2014-01-10  Steve Ellcey  <sellcey@mips.com>
48816         PR plugins/59335
48817         * Makefile.in (PLUGIN_HEADERS): Add gimplify.h, gimple-iterator.h,
48818         gimple-ssa.h, fold-const.h, tree-cfg.h, tree-into-ssa.h,
48819         tree-ssanames.h, print-tree.h, varasm.h, and context.h.
48821 2014-01-10  Richard Earnshaw  <rearnsha@arm.com>
48823         PR target/59744
48824         * aarch64-modes.def (CC_Zmode): New flags mode.
48825         * aarch64.c (aarch64_select_cc_mode): Only allow NEG when the condition
48826         represents an equality.
48827         (aarch64_get_condition_code): Handle CC_Zmode.
48828         * aarch64.md (compare_neg<mode>): Restrict to equality operations.
48830 2014-01-10  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
48832         * config/s390/s390.c (s390_expand_tbegin): Remove jump over CC
48833         extraction in good case.
48835 2014-01-10  Richard Biener  <rguenther@suse.de>
48837         PR tree-optimization/59374
48838         * tree-vect-slp.c (vect_slp_analyze_bb_1): Move dependence
48839         checking after SLP discovery.  Mark stmts not participating
48840         in any SLP instance properly.
48842 2014-01-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
48844         * config/arm/arm.c (arm_new_rtx_costs): Use destination mode
48845         when handling a SET rtx.
48847 2014-01-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
48849         * config/arm/arm-cores.def (cortex-a53): Specify FL_CRC32.
48850         (cortex-a57): Likewise.
48851         (cortex-a57.cortex-a53): Likewise. Remove redundant flags.
48853 2014-01-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
48855         * config/arm/arm.c (arm_init_iwmmxt_builtins): Skip
48856         non-iwmmxt builtins.
48858 2014-01-10  Jan Hubicka  <hubicka@ucw.cz>
48860         PR ipa/58252
48861         PR ipa/59226
48862         * ipa-devirt.c record_target_from_binfo): Take as argument
48863         stack of binfos and lookup matching one for virtual inheritance.
48864         (possible_polymorphic_call_targets_1): Update.
48866 2014-01-10  Huacai Chen  <chenhc@lemote.com>
48868         * config/mips/driver-native.c (host_detect_local_cpu): Handle new
48869         kernel strings for Loongson-2E/2F/3A.
48871 2014-01-10  Jakub Jelinek  <jakub@redhat.com>
48873         PR middle-end/59670
48874         * tree-vect-data-refs.c (vect_analyze_data_refs): Check
48875         is_gimple_call before calling gimple_call_internal_p.
48877 2014-01-09  Steve Ellcey  <sellcey@mips.com>
48879         * Makefile.in (TREE_FLOW_H): Remove.
48880         (TREE_SSA_H): Add file names from tree-flow.h.
48881         * doc/tree-ssa.texi (Annotations): Remove reference to tree-flow.h
48882         * tree.h: Remove tree-flow.h reference.
48883         * hash-table.h: Remove tree-flow.h reference.
48884         * tree-ssa-loop-niter.c (dump_affine_iv): Replace tree-flow.h
48885         reference with tree-ssa-loop.h.
48887 2014-01-09  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
48889         * doc/invoke.texi: Add -maltivec={be,le} options, and document
48890         default element-order behavior for -maltivec.
48891         * config/rs6000/rs6000.opt: Add -maltivec={be,le} options.
48892         * config/rs6000/rs6000.c (rs6000_option_override_internal): Ensure
48893         that -maltivec={le,be} implies -maltivec; disallow -maltivec=le
48894         when targeting big endian, at least for now.
48895         * config/rs6000/rs6000.h: Add #define of VECTOR_ELT_ORDER_BIG.
48897 2014-01-09  Jakub Jelinek  <jakub@redhat.com>
48899         PR middle-end/47735
48900         * cfgexpand.c (expand_one_var): For SSA_NAMEs, if the underlying
48901         var satisfies use_register_for_decl, just take into account type
48902         alignment, rather than decl alignment.
48904         PR tree-optimization/59622
48905         * gimple-fold.c (gimple_fold_call): Fix a typo in message.  For
48906         __builtin_unreachable replace the OBJ_TYPE_REF call with a call to
48907         __builtin_unreachable and add if needed a setter of the lhs SSA_NAME.
48908         Don't devirtualize for inplace at all.  For targets.length () == 1,
48909         if the call is noreturn and cfun isn't in SSA form yet, clear lhs.
48911 2014-01-09  H.J. Lu  <hongjiu.lu@intel.com>
48913         * config/i386/i386.md (cpu): Remove the unused btver1.
48915 2014-01-09  H.J. Lu  <hongjiu.lu@intel.com>
48917         * gdbasan.in: Put a breakpoint on __sanitizer::Report.
48919 2014-01-09  Jakub Jelinek  <jakub@redhat.com>
48921         PR target/58115
48922         * tree-core.h (struct target_globals): New forward declaration.
48923         (struct tree_target_option): Add globals field.
48924         * tree.h (TREE_TARGET_GLOBALS): Define.
48925         (prepare_target_option_nodes_for_pch): New prototype.
48926         * target-globals.h (struct target_globals): Define even if
48927         !SWITCHABLE_TARGET.
48928         * tree.c (prepare_target_option_node_for_pch,
48929         prepare_target_option_nodes_for_pch): New functions.
48930         * config/i386/i386.h (SWITCHABLE_TARGET): Define.
48931         * config/i386/i386.c: Include target-globals.h.
48932         (ix86_set_current_function): Instead of doing target_reinit
48933         unconditionally, use save_target_globals_default_opts and
48934         restore_target_globals.
48936 2014-01-09  Richard Biener  <rguenther@suse.de>
48938         PR tree-optimization/59715
48939         * tree-cfg.h (split_critical_edges): Declare.
48940         * tree-cfg.c (split_critical_edges): Export.
48941         * tree-ssa-sink.c (execute_sink_code): Split critical edges.
48943 2014-01-09  Max Ostapenko  <m.ostapenko@partner.samsung.com>
48945         * cfgexpand.c (expand_stack_vars): Optionally disable
48946         asan stack protection.
48947         (expand_used_vars): Likewise.
48948         (partition_stack_vars): Likewise.
48949         * asan.c (asan_emit_stack_protection): Optionally disable
48950         after return stack usage.
48951         (instrument_derefs): Optionally disable memory access instrumentation.
48952         (instrument_builtin_call): Likewise.
48953         (instrument_strlen_call): Likewise.
48954         (asan_protect_global): Optionally disable global variables protection.
48955         * doc/invoke.texi: Added doc for new options.
48956         * params.def: Added new options.
48957         * params.h: Likewise.
48959 2014-01-09  Jakub Jelinek  <jakub@redhat.com>
48961         PR rtl-optimization/59724
48962         * ifcvt.c (cond_exec_process_if_block): Don't call
48963         flow_find_head_matching_sequence with 0 longest_match.
48964         * cfgcleanup.c (flow_find_head_matching_sequence): Count even
48965         non-active insns if !stop_after.
48966         (try_head_merge_bb): Revert 2014-01-07 changes.
48968 2014-01-08  Jeff Law  <law@redhat.com>
48970         * ree.c (get_sub_rtx): New function, extracted from...
48971         (merge_def_and_ext): Here.
48972         (combine_reaching_defs): Use get_sub_rtx.
48974 2014-01-08  Eric Botcazou  <ebotcazou@adacore.com>
48976         * cgraph.h (varpool_variable_node): Do not choke on null node.
48978 2014-01-08  Catherine Moore  <clm@codesourcery.com>
48980         * config/mips/mips.md (simple_return): Attempt to use JRC
48981         for microMIPS.
48982         * config/mips/mips.h (MIPS_CALL): Attempt to use JALS for microMIPS.
48984 2014-01-08  Richard Sandiford  <rdsandiford@googlemail.com>
48986         PR rtl-optimization/59137
48987         * reorg.c (steal_delay_list_from_target): Call update_block for
48988         elided insns.
48989         (steal_delay_list_from_fallthrough, relax_delay_slots): Likewise.
48991 2014-01-08  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
48993         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Remove
48994         two duplicate entries.
48996 2014-01-08  Richard Sandiford  <rdsandiford@googlemail.com>
48998         Revert:
48999         2012-10-07  Richard Sandiford  <rdsandiford@googlemail.com>
49001         * config/mips/mips.c (mips_truncated_op_cost): New function.
49002         (mips_rtx_costs): Adjust test for BADDU.
49003         * config/mips/mips.md (*baddu_di<mode>): Push truncates to operands.
49005         2012-10-02  Richard Sandiford  <rdsandiford@googlemail.com>
49007         * config/mips/mips.md (*baddu_si_eb, *baddu_si_el): Merge into...
49008         (*baddu_si): ...this new pattern.
49010 2014-01-08  Jakub Jelinek  <jakub@redhat.com>
49012         PR ipa/59722
49013         * ipa-prop.c (ipa_analyze_params_uses): Ignore uses in debug stmts.
49015 2014-01-08  Bernd Edlinger  <bernd.edlinger@hotmail.de>
49017         PR middle-end/57748
49018         * expr.h (expand_expr_real, expand_expr_real_1): Add new parameter
49019         inner_reference_p.
49020         (expand_expr, expand_normal): Adjust.
49021         * expr.c (expand_expr_real, expand_expr_real_1): Add new parameter
49022         inner_reference_p. Use inner_reference_p to expand inner references.
49023         (store_expr): Adjust.
49024         * cfgexpand.c (expand_call_stmt): Adjust.
49026 2014-01-08  Rong Xu  <xur@google.com>
49028         * gcov-io.c (gcov_var): Move from gcov-io.h.
49029         (gcov_position): Ditto.
49030         (gcov_is_error): Ditto.
49031         (gcov_rewrite): Ditto.
49032         * gcov-io.h: Refactor. Move gcov_var to gcov-io.h, and libgcov
49033         only part to libgcc/libgcov.h.
49035 2014-01-08  Marek Polacek  <polacek@redhat.com>
49037         PR middle-end/59669
49038         * omp-low.c (simd_clone_adjust): Don't crash if def is NULL.
49040 2014-01-08  Marek Polacek  <polacek@redhat.com>
49042         PR sanitizer/59667
49043         * ubsan.c (ubsan_type_descriptor): Call strip_array_types on type2.
49045 2014-01-08  Jakub Jelinek  <jakub@redhat.com>
49047         PR rtl-optimization/59649
49048         * stor-layout.c (get_mode_bounds): For BImode return
49049         0 and STORE_FLAG_VALUE.
49051 2014-01-08  Richard Biener  <rguenther@suse.de>
49053         PR middle-end/59630
49054         * gimple.h (is_gimple_builtin_call): Remove.
49055         (gimple_builtin_call_types_compatible_p): New.
49056         (gimple_call_builtin_p): New overload.
49057         * gimple.c (is_gimple_builtin_call): Remove.
49058         (validate_call): Rename to ...
49059         (gimple_builtin_call_types_compatible_p): ... this and export.  Also
49060         check return types.
49061         (validate_type): New static function.
49062         (gimple_call_builtin_p): New overload and adjust.
49063         * gimple-fold.c (gimple_fold_builtin): Fold the return value.
49064         (gimple_fold_call): Likewise.  Use gimple_call_builtin_p.
49065         (gimple_fold_stmt_to_constant_1): Likewise.
49066         * tsan.c (instrument_gimple): Use gimple_call_builtin_p.
49068 2014-01-08  Richard Biener  <rguenther@suse.de>
49070         PR middle-end/59471
49071         * gimplify.c (gimplify_expr): Gimplify register-register type
49072         VIEW_CONVERT_EXPRs to separate stmts.
49074 2014-01-07  Jeff Law  <law@redhat.com>
49076         PR middle-end/53623
49077         * ree.c (combine_set_extension): Handle case where source
49078         and destination registers in an extension insn are different.
49079         (combine_reaching_defs): Allow source and destination registers
49080         in extension to be different under limited circumstances.
49081         (add_removable_extension): Remove restriction that the
49082         source and destination registers in the extension are the same.
49083         (find_and_remove_re): Emit a copy from the extension's
49084         destination to its source after the defining insn if
49085         the source and destination registers are different.
49087         PR middle-end/59285
49088         * ifcvt.c (merge_if_block): If we are merging a block with more than
49089         one successor with a block with no successors, remove any BARRIER
49090         after the second block.
49092 2014-01-07  Dan Xio Qiang  <ziyan01@163.com>
49094         * hw-doloop.c (reorg_loops): Release the bitmap obstack.
49096 2014-01-07  John David Anglin  <danglin@gcc.gnu.org>
49098         PR target/59652
49099         * config/pa/pa.c (pa_legitimate_address_p): Return false before reload
49100         for 14-bit register offsets when INT14_OK_STRICT is false.
49102 2014-01-07  Roland Stigge  <stigge@antcom.de>
49103             Michael Meissner  <meissner@linux.vnet.ibm.com>
49105         PR 57386/target
49106         * config/rs6000/rs6000.c (rs6000_legitimate_offset_address_p):
49107         Only check TFmode for SPE constants.  Don't check TImode or TDmode.
49109 2014-01-07  James Greenhalgh  <james.greenhalgh@arm.com>
49111         * config/aarch64/aarch64-elf.h (ASM_SPEC): Remove identity spec for
49112         -mcpu.
49114 2014-01-07  Yufeng Zhang  <yufeng.zhang@arm.com>
49116         * config/arm/arm.c (arm_expand_neon_args): Call expand_expr
49117         with EXPAND_MEMORY for NEON_ARG_MEMORY; check if the returned
49118         rtx is const0_rtx or not.
49120 2014-01-07  Richard Sandiford  <rdsandiford@googlemail.com>
49122         PR target/58115
49123         * target-globals.c (save_target_globals): Remove this_fn_optab
49124         handling.
49125         * toplev.c: Include optabs.h.
49126         (target_reinit): Temporarily restore the global options if another
49127         set of options are in force.
49129 2014-01-07  Jakub Jelinek  <jakub@redhat.com>
49131         PR rtl-optimization/58668
49132         * cfgcleanup.c (flow_find_cross_jump): Don't count
49133         any jumps if dir_p is NULL.  Remove p1 variable, use active_insn_p
49134         to determine what is counted.
49135         (flow_find_head_matching_sequence): Use active_insn_p to determine
49136         what is counted.
49137         (try_head_merge_bb): Adjust for the flow_find_head_matching_sequence
49138         counting change.
49139         * ifcvt.c (count_bb_insns): Use active_insn_p && !JUMP_P to
49140         determine what is counted.
49142         PR tree-optimization/59643
49143         * tree-predcom.c (split_data_refs_to_components): If one dr is
49144         read and one write, determine_offset fails and the write isn't
49145         in the bad component, just put the read into the bad component.
49147 2014-01-07  Mike Stump  <mikestump@comcast.net>
49148             Jakub Jelinek  <jakub@redhat.com>
49150         PR pch/59436
49151         * tree-core.h (struct tree_optimization_option): Change optabs
49152         type from unsigned char * to void *.
49153         * optabs.c (init_tree_optimization_optabs): Adjust
49154         TREE_OPTIMIZATION_OPTABS initialization.
49156 2014-01-06  Jakub Jelinek  <jakub@redhat.com>
49158         PR target/59644
49159         * config/i386/i386.h (struct machine_function): Add
49160         no_drap_save_restore field.
49161         * config/i386/i386.c (ix86_save_reg): Use
49162         !cfun->machine->no_drap_save_restore instead of
49163         crtl->stack_realign_needed.
49164         (ix86_finalize_stack_realign_flags): Don't clear drap_reg unless
49165         this function clears frame_pointer_needed.  Set
49166         cfun->machine->no_drap_save_restore if clearing frame_pointer_needed
49167         and DRAP reg is needed.
49169 2014-01-06  Marek Polacek  <polacek@redhat.com>
49171         PR c/57773
49172         * doc/implement-c.texi: Mention that other integer types are
49173         permitted as bit-field types in strictly conforming mode.
49175 2014-01-06  Felix Yang  <fei.yang0953@gmail.com>
49177         * modulo-sched.c (schedule_reg_moves): Clear distance1_uses if it
49178         is newly allocated.
49180 2014-01-06  Richard Earnshaw  <rearnsha@arm.com>
49182         * aarch64.c (aarch64_rtx_costs): Fix cost calculation for MADD.
49184 2014-01-06  Martin Jambor  <mjambor@suse.cz>
49186         PR ipa/59008
49187         * ipa-cp.c (ipcp_discover_new_direct_edges): Changed param_index type
49188         to int.
49189         * ipa-prop.c (ipa_print_node_params): Fix indentation.
49191 2014-01-06  Eric Botcazou  <ebotcazou@adacore.com>
49193         PR debug/59350
49194         PR debug/59510
49195         * var-tracking.c (add_stores): Preserve the value of the source even if
49196         we don't record the store.
49198 2014-01-06  Terry Guo  <terry.guo@arm.com>
49200         * config.gcc (arm*-*-*): Check --with-arch against arm-arches.def.
49202 2014-01-05  Iain Sandoe  <iain@codesourcery.com>
49204         PR bootstrap/59541
49205         * config/darwin.c (darwin_function_section): Adjust return values to
49206         correspond to optimisation changes made in r206070.
49208 2014-01-05  Uros Bizjak  <ubizjak@gmail.com>
49210         * config/i386/i386.c (ix86_data_alignment): Calculate max_align
49211         from prefetch_block tune setting.
49212         (nocona_cost): Correct size of prefetch block to 64.
49214 2014-01-04  Eric Botcazou  <ebotcazou@adacore.com>
49216         * config/arm/arm.c (arm_get_frame_offsets): Revamp long lines.
49217         (arm_expand_epilogue_apcs_frame): Take into account the number of bytes
49218         used to save the static chain register in the computation of the offset
49219         from which the FP registers need to be restored.
49221 2014-01-04  Jakub Jelinek  <jakub@redhat.com>
49223         PR tree-optimization/59519
49224         * tree-vect-loop-manip.c (slpeel_update_phi_nodes_for_guard1): Don't
49225         ICE if get_current_def (current_new_name) is already non-NULL, as long
49226         as it is a phi result of some other phi in *new_exit_bb that has
49227         the same argument.
49229         * config/i386/sse.md (avx512f_load<mode>_mask): Emit vmovup{s,d}
49230         or vmovdqu* for misaligned_operand.
49231         (<sse>_loadu<ssemodesuffix><avxsizesuffix><mask_name>,
49232         <sse2_avx_avx512f>_loaddqu<mode><mask_name>): Handle <mask_applied>.
49233         * config/i386/i386.c (ix86_expand_special_args_builtin): Set
49234         aligned_mem for AVX512F masked aligned load and store builtins and for
49235         non-temporal moves.
49237 2014-01-03  Bingfeng Mei  <bmei@broadcom.com>
49239         PR tree-optimization/59651
49240         * tree-vect-loop-manip.c (vect_create_cond_for_alias_checks):
49241         Address range for negative step should be added by TYPE_SIZE_UNIT.
49243 2014-01-03  Andreas Schwab  <schwab@linux-m68k.org>
49245         * config/m68k/m68k.c (handle_move_double): Handle pushes with
49246         overlapping registers also for registers other than the stack pointer.
49248 2014-01-03  Marek Polacek  <polacek@redhat.com>
49250         PR other/59661
49251         * doc/extend.texi: Fix the return value of __builtin_FUNCTION and
49252         __builtin_FILE.
49254 2014-01-03  Jakub Jelinek  <jakub@redhat.com>
49256         PR target/59625
49257         * config/i386/i386.c (ix86_avoid_jump_mispredicts): Don't consider
49258         asm goto as jump.
49260         * config/i386/i386.md (MODE_SIZE): New mode attribute.
49261         (push splitter): Use <P:MODE_SIZE> instead of
49262         GET_MODE_SIZE (<P:MODE>mode).
49263         (lea splitter): Use <MODE_SIZE> instead of GET_MODE_SIZE (<MODE>mode).
49264         (mov -1, reg peephole2): Likewise.
49265         * config/i386/sse.md (*mov<mode>_internal,
49266         <sse>_storeu<ssemodesuffix><avxsizesuffix>,
49267         <sse2_avx_avx512f>_storedqu<mode>, <sse>_andnot<mode>3,
49268         *<code><mode>3, *andnot<mode>3<mask_name>,
49269         <mask_codefor><code><mode>3<mask_name>): Likewise.
49270         * config/i386/subst.md (mask_mode512bit_condition,
49271         sd_mask_mode512bit_condition): Likewise.
49273 2014-01-02  Xinliang David Li  <davidxl@google.com>
49275         PR tree-optimization/59303
49276         * tree-ssa-uninit.c (is_use_properly_guarded): Main cleanup.
49277         (dump_predicates): Better output format.
49278         (pred_equal_p): New function.
49279         (is_neq_relop_p): Ditto.
49280         (is_neq_zero_form_p): Ditto.
49281         (pred_expr_equal_p): Ditto.
49282         (pred_neg_p): Ditto.
49283         (simplify_pred): Ditto.
49284         (simplify_preds_2): Ditto.
49285         (simplify_preds_3): Ditto.
49286         (simplify_preds_4): Ditto.
49287         (simplify_preds): Ditto.
49288         (push_pred): Ditto.
49289         (push_to_worklist): Ditto.
49290         (get_pred_info_from_cmp): Ditto.
49291         (is_degenerated_phi): Ditto.
49292         (normalize_one_pred_1): Ditto.
49293         (normalize_one_pred): Ditto.
49294         (normalize_one_pred_chain): Ditto.
49295         (normalize_preds): Ditto.
49296         (normalize_cond_1): Remove function.
49297         (normalize_cond): Ditto.
49298         (is_gcond_subset_of): Ditto.
49299         (is_subset_of_any): Ditto.
49300         (is_or_set_subset_of): Ditto.
49301         (is_and_set_subset_of): Ditto.
49302         (is_norm_cond_subset_of): Ditto.
49303         (pred_chain_length_cmp): Ditto.
49304         (convert_control_dep_chain_into_preds): Type change.
49305         (find_predicates): Ditto.
49306         (find_def_preds): Ditto.
49307         (destroy_predicates_vecs): Ditto.
49308         (find_matching_predicates_in_rest_chains): Ditto.
49309         (use_pred_not_overlap_with_undef_path_pred): Ditto.
49310         (is_pred_expr_subset): Ditto.
49311         (is_pred_chain_subset_of): Ditto.
49312         (is_included_in): Ditto.
49313         (is_superset_of): Ditto.
49315 2014-01-02  Richard Sandiford  <rdsandiford@googlemail.com>
49317         Update copyright years.
49319 2014-01-02  Richard Sandiford  <rdsandiford@googlemail.com>
49321         * common/config/arc/arc-common.c, config/arc/arc-modes.def,
49322         config/arc/arc-protos.h, config/arc/arc.c, config/arc/arc.h,
49323         config/arc/arc.md, config/arc/arc.opt,
49324         config/arm/arm_neon_builtins.def, config/arm/crypto.def,
49325         config/i386/avx512cdintrin.h, config/i386/avx512erintrin.h,
49326         config/i386/avx512fintrin.h, config/i386/avx512pfintrin.h,
49327         config/i386/btver2.md, config/i386/shaintrin.h, config/i386/slm.md,
49328         config/linux-protos.h, config/linux.c, config/winnt-c.c,
49329         diagnostic-color.c, diagnostic-color.h, gimple-ssa-isolate-paths.c,
49330         vtable-verify.c, vtable-verify.h: Use the standard form for the
49331         copyright notice.
49333 2014-01-02  Tobias Burnus  <burnus@net-b.de>
49335         * gcc.c (process_command): Update copyright notice dates.
49336         * gcov-dump.c: Ditto.
49337         * gcov.c: Ditto.
49338         * doc/cpp.texi: Bump @copying's copyright year.
49339         * doc/cppinternals.texi: Ditto.
49340         * doc/gcc.texi: Ditto.
49341         * doc/gccint.texi: Ditto.
49342         * doc/gcov.texi: Ditto.
49343         * doc/install.texi: Ditto.
49344         * doc/invoke.texi: Ditto.
49346 2014-01-01  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
49348         * config/nios2/nios2.h (BITS_PER_UNIT): Don't define it.
49350 2014-01-01  Jakub Jelinek  <jakub@redhat.com>
49352         * config/i386/sse.md (*mov<mode>_internal): Guard
49353         EXT_REX_SSE_REGNO_P (REGNO ()) uses with REG_P.
49355         PR rtl-optimization/59647
49356         * cse.c (cse_process_notes_1): Don't substitute negative VOIDmode
49357         new_rtx into UNSIGNED_FLOAT rtxes.
49359 Copyright (C) 2014 Free Software Foundation, Inc.
49361 Copying and distribution of this file, with or without modification,
49362 are permitted in any medium without royalty provided the copyright
49363 notice and this notice are preserved.