Backport from GCC mainline.
[platform/upstream/linaro-gcc.git] / gcc / ChangeLog-2014
1 2014-12-31  Uros Bizjak  <ubizjak@gmail.com>
2
3         * diagnostic.c (build_message_string): Use xvasprintf.
4         * final.c (output_operand_lossage): Use xvasprintf and xasprintf.
5         * lto-wrapper.c (merge_and_complain): Use xasprintf.
6         * targhooks.c (pch_option_mismatch): Ditto.
7         * tree-ssa-structalias.c (create_function_info_for): Ditto.
8         (create_variable_info_for_1): Ditto.
9         * tree-vect-data-refs.c (vect_create_destination_var): Ditto.
10
11 2014-12-30  Anthony Green  <green@moxielogic.com>
12
13         * config/moxie/moxie.md (zero_extendqisi2, zero_extendhisi2):
14         Switch from define_insn_and_split to define_insn.  Fix instruction
15         length.
16
17 2014-12-30  Uros Bizjak  <ubizjak@gmail.com>
18
19         * config/i386/i386.c (ix86_legitimize_address): Declare
20         "changed" as bool.
21         (ix86_expand_unary_operator): Declare "matching_memory" as bool.
22         (ix86_avoid_jump_mispredicts): Declare "isjump" as bool.
23
24 2014-12-30  Uros Bizjak  <ubizjak@gmail.com>
25
26         * config/i386/i386.c (ix86_reassociation_width): Remove unneeded
27         variable "res".
28
29 2014-12-30  Jan Hubicka  <hubicka@ucw.cz>
30
31         * ipa-inline-analysis.c (estimate_function_body_sizes): Do not
32         free node params when called late with early=true.
33
34 2014-12-30  Uros Bizjak  <ubizjak@gmail.com>
35
36         * config/i386/i386.c (ix86_legitimize_address): Use std::swap.
37         (ix86_split_fp_branch): Ditto.
38         (ix86_expand_int_movcc): Ditto.
39         (ix86_expand_sse_compare): Ditto.
40
41 2014-12-30  Jan Hubicka  <hubicka@ucw.cz>
42
43         * ipa-inline-analysis.c (edge_set_predicate): Reset size/time when
44         target is UNREACHABLE.
45         (evaluate_properties_for_edge): If call statemet is available, use it
46         to determine compile time constants.
47         (estimate_function_body_sizes): Enable predicates for early inliner.
48         (estimate_calls_size_and_time): Speedup.
49         (inline_merge_summary): Evaluate properties for early inliner, too.
50
51 2014-12-29  Steve Ellcey  <sellcey@mips.com>
52
53         * config/mips/t-mti-linux (MULTILIB_EXCEPTIONS): Add exceptions
54         for mips32[r1] and mips64[r1] with -mnan=2008.
55         * config/mips/t-mti-elf (MULTILIB_EXCEPTIONS): Ditto.
56
57 2014-12-27  H.J. Lu  <hongjiu.lu@intel.com>
58
59         PR target/64409
60         * config/i386/i386.c (ix86_function_type_abi): Issue an error
61         when ms_abi attribute is used with x32.
62
63 2014-12-27  Anthony Green  <green@moxielogic.com>
64
65         * config/moxie/moxie-protos.h (moxie_offset_address_p): Define.
66         * config/moxie/constraints.md (B): Replace inline test with call
67         to moxie_offset_address_p.
68         * config/moxie/moxie.h (GO_IF_LEGITIMATE_ADDRESS): Limit offset
69         addressing to 16-bit offsets.
70         * config/moxie/moxie.c (moxie_asm_trampoline_template): Remove
71         nop, which is no longer needed for aligned write to trampoline.
72         (moxie_trampoline_init): Adjust for smaller trampoline.
73         (moxie_offset_address_p): New function.
74         * config/moxie/moxie.md (*movsi, *movhi, *movqi): Adjust length
75         attr for shorter ldo/sto instructions.
76         * config/moxie/predicates.md: Only allow REG+CONST_INT for offset
77         load/stores.
78
79 2014-12-27  Jan hubicka  <hubicka@ucw.cz>
80
81         * ipa-inline.c (max_count_real, max_relbenefit_real,
82         half_int_min_real): Remove.
83         (cgraph_freq_base_rec, percent_rec): New.
84         (compute_uninlined_call_time, compute_inlined_call_time,
85         big_speedup_p, relative_time_benefit, edge_badness): Use sreals.
86         (update_edge_key): Update dumping.
87         (inline_small_functions): Speedup maintainance of the heap.
88         (ipa_inline): Initialize cgraph_freq_base_rec and
89         percent_rec.
90
91 2014-12-27  Jan hubicka  <hubicka@ucw.cz>
92
93         * sreal.h (sreal::shift): Fix sanity check.
94
95 2014-12-27  Uros Bizjak  <ubizjak@gmail.com>
96
97         * config/i386/mmx.md (*vec_extractv2sf_1): Do not emit unpckhps.
98         Emit movshdup for SSE3 and shufps otherwise.
99         (*vec_extractv2si_1): Do not emit punpckhdq and unpckhps.
100         Emit pshufd for SSE2 and shufps otherwise.
101
102 2014-12-24  Oleg Endo  <olegendo@gcc.gnu.org>
103
104         PR target/51244
105         * config/sh/sh.md (*mov_t_msb_neg): Convert split into insn_and_split.
106
107 2014-12-24  Uros Bizjak  <ubizjak@gmail.com>
108
109         * gengtype.h (xasprintf): Remove declaration.
110         * gengtype.c (xasprintf): Remove.
111
112 2014-12-24  Nick Clifton  <nickc@redhat.com>
113
114         PR target/64160
115         * config/msp430/msp430.md (addsi splitter): Do not split when the
116         destination partially overlaps the source.
117
118 2014-12-24  Anthony Green  <green@moxielogic.com>
119
120         * config/moxie/moxie.opt (mul.x): New option.
121         * doc/invoke.texi (Moxie Options): Document -mmul.x.
122         * config/moxie/moxie.md (addsi3, mulsi3, subsi3, divsi3, udivs3):
123         Remove trailing ".l" from add, mul, sub, div and udiv
124         instructions.
125         (<mul>si3_highpart, <mul>sidi3): Add mul.x & umul.x instruction
126         support (high 32-bit result of multiply).
127         * config/moxie/moxie.c (moxie_option_override): Force availability
128         of mul.x instructions for moxiebox target.
129         * config/moxie/moxiebox.h (TARGET_MOXIEBOX): Define.
130
131 2014-12-22  Zhouyi Zhou <yizhouzhou@ict.ac.cn>
132
133         * ira-build.c (ira_flattening): Add the current
134         object to OBJECTS_LIVE after traversing OBJECTS_LIVE.
135
136 2014-12-23  Martin Liska  <mliska@suse.cz>
137
138         PR ipa/63851
139         PR ipa/63852
140         * ipa-icf.c (sem_function::merge): Ignore merge operation
141         for a thunk created from static chain.
142         * ipa-icf-gimple.c (func_checker::compatible_types_p): Verify that
143         types have same restrict flag.
144
145 2014-12-22  John David Anglin  <danglin@gcc.gnu.org>
146
147         PR target/55023
148         * dse.c (scan_insn): Treat sibling call as though it does a wild read.
149
150 2014-12-22  Bin Cheng  <bin.cheng@arm.com>
151
152         PR rtl-optimization/62151
153         * combine.c (try_combine): New local variables local_elim_i1
154         and local_elim_i0.  Set elim_i1 and elim_i0 using the local
155         version variables.  Distribute notes from i0notes or i1notes
156         using the local variables.
157
158 2014-12-22  Martin Liska  <mliska@suse.cz>
159
160         * cgraphunit.c (symbol_table::process_new_functions): New
161         inline_summaries is used.
162         * ipa-cp.c (ipcp_cloning_candidate_p): Likewise.
163         (devirtualization_time_bonus): Likewise.
164         (estimate_local_effects): Likewise.
165         (ipcp_propagate_stage): Likewise.
166         * ipa-inline-analysis.c (evaluate_conditions_for_known_args): Likewise.
167         (evaluate_properties_for_edge): Likewise.
168         (inline_summary_alloc): Likewise.
169         (reset_inline_summary): New inline_summary argument is introduced.
170         (inline_summary_t::remove): New function.
171         (inline_summary_t::duplicate): Likewise.
172         (dump_inline_edge_summary): New inline_summaries is used.
173         (dump_inline_summary): Likewise.
174         (estimate_function_body_sizes): Likewise.
175         (compute_inline_parameters): Likewise.
176         (estimate_edge_devirt_benefit): Likewise.
177         (estimate_node_size_and_time): Likewise.
178         (inline_update_callee_summaries): Likewise.
179         (inline_merge_summary): Likewise.
180         (inline_update_overall_summary): Likewise.
181         (simple_edge_hints): Likewise.
182         (do_estimate_edge_time): Likewise.
183         (estimate_time_after_inlining): Likewise.
184         (estimate_size_after_inlining): Likewise.
185         (do_estimate_growth): Likewise.
186         (growth_likely_positive): Likewise.
187         (inline_generate_summary): Likewise.
188         (inline_read_section): Likewise.
189         (inline_read_summary): Likewise.
190         (inline_write_summary): Likewise.
191         (inline_free_summary): Likewise.
192         * ipa-inline-transform.c (clone_inlined_nodes): Likewise.
193         (inline_call): Likewise.
194         * ipa-inline.c (caller_growth_limits): Likewise.
195         (can_inline_edge_p): Likewise.
196         (want_early_inline_function_p): Likewise.
197         (compute_uninlined_call_time): Likewise.
198         (compute_inlined_call_time): Likewise.
199         (big_speedup_p): Likewise.
200         (want_inline_small_function_p): Likewise.
201         (edge_badness): Likewise.
202         (update_caller_keys): Likewise.
203         (update_callee_keys): Likewise.
204         (recursive_inlining): Likewise.
205         (inline_small_functions): Likewise.
206         (inline_to_all_callers): Likewise.
207         (dump_overall_stats): Likewise.
208         (early_inline_small_functions): Likewise.
209         * ipa-inline.h: New class inline_summary_t replaces
210         vec<inline_summary_t>.
211         * ipa-split.c (execute_split_functions): New inline_summaries is used.
212         * ipa.c (walk_polymorphic_call_targets): Likewise.
213         * tree-sra.c (ipa_sra_preliminary_function_checks): Likewise.
214
215 2014-12-22  Martin Liska  <mliska@suse.cz>
216
217         * auto-profile.c: Include of symbol-summary.h is added.
218         * cgraph.c: Likewise.
219         * cgraphbuild.c: Likewise.
220         * cgraphclones.c: Likewise.
221         * cgraphunit.c: Likewise.
222         * ipa-cp.c: Likewise.
223         * ipa-devirt.c: Likewise.
224         * ipa-icf.c: Likewise.
225         * ipa-inline-analysis.c (evaluate_properties_for_edge): New
226         ipa_node_params_sum data structure is used.
227         (inline_node_duplication_hook): Likewise.
228         (estimate_function_body_sizes): Likewise.
229         (remap_edge_change_prob): Likewise.
230         (inline_merge_summary): Likewise.
231         * ipa-inline-transform.c: Include of symbol-summary.h is added.
232         * ipa-inline.c (early_inliner): New ipa_node_params_sum data structure
233         is used.
234         * ipa-polymorphic-call.c: Include of symbol-summary.h is added.
235         * ipa-profile.c: Include of symbol-summary.h is added.
236         * ipa-prop.c (ipa_propagate_indirect_call_infos): New
237         ipa_node_params_sum data structure is used.
238         (ipa_node_params::~ipa_node_params): New function.
239         (ipa_free_all_node_params): Destruction is simplified.
240         (ipa_node_removal_hook): Removed.
241         (ipa_add_new_function): Renamed from ipa_node_duplication_hook.
242         (ipa_node_params_t::duplicate): New function.
243         (ipa_register_cgraph_hooks): Few hooks are removed.
244         (ipa_unregister_cgraph_hooks): Likewise.
245         (ipa_prop_write_jump_functions): New ipa_node_params_sum is used.
246         * ipa-prop.h (struct ipa_node_params): Destructor introduced for
247         the structure.
248         (ipa_check_create_node_params): Vector for ipa_node_params is replaced
249         with function_summary.
250         * ipa-split.c: Include of symbol-summary.h is added.
251         * ipa-utils.c: Include of symbol-summary.h is added.
252         * ipa.c: Include of symbol-summary.h is added.
253         * omp-low.c: Include of symbol-summary.h is added.
254         * tree-inline.c: Include of symbol-summary.h is added.
255         * tree-sra.c: Include of symbol-summary.h is added.
256         * tree-ssa-pre.c: Include of symbol-summary.h is added.
257
258 2014-12-22  Martin Liska  <mliska@suse.cz>
259
260         * cgraph.h (symbol_table::allocate_cgraph_symbol): Summary UID
261         is filled up.
262         * symbol-summary.h: New file.
263         * gengtype.c (open_base_files): Add symbol-summary.h.
264         * toplev.c (general_init): Call constructor of symbol_table.
265
266 2014-12-17  Oleg Endo  <olegendo@gcc.gnu.org>
267
268         PR target/55212
269         * config/sh/sh.md (*addsi3_compact): Add parentheses around &&
270         condition.  Add comments.
271
272 2014-12-20  Segher Boessenkool  <segher@kernel.crashing.org>
273
274         PR target/64358
275         * config/rs6000/rs6000.c (rs6000_split_logical_inner): Swap the
276         input operands if only the second is inverted.
277         * config/rs6000/rs6000.md (*boolc<mode>3_internal1 for BOOL_128):
278         Swap BOOL_REGS_OP1 and BOOL_REGS_OP2.  Correct arguments to
279         rs6000_split_logical.
280         (*boolc<mode>3_internal2 for TI2): Swap operands[1] and operands[2].
281
282 2014-12-20  Martin Uecker <uecker@eecs.berkeley.edu>
283
284         * doc/invoke.texi: Document -Wdiscarded-array-qualifiers.
285         * doc/extend.texi: Document new behavior for pointers to arrays
286         with qualifiers.
287
288 2014-12-19  Jan Hubicka  <hubicka@ucw.cz>
289
290         * hash-table.h (struct pointer_hash): Fix formating.
291         (hash_table_higher_prime_index): Declare pure.
292         (hash_table_mod2, hash_table_mod1, mul_mod): Move inline;
293         assume that uint64_t always exists.
294         (hash_table<Descriptor, Allocator, false>): Use gcc_checking_assert.
295         (hash_table<Descriptor, Allocator, false>::expand ()): Fix formating.
296         (hash_table<Descriptor, Allocator, false>::clear_slot (value_type **slot)):
297         Use checking assert.
298         * hash-table.c: Remove #if 0 code.
299         (hash_table_higher_prime_index): Use gcc_assert.
300         (mul_mod, hash-table_mod1, hash_table_mod2): move to hash-table.h
301
302 2014-12-19  Matthew Fortune  <matthew.fortune@imgtec.com>
303
304         * config.gcc: Support mips*-img-linux* and mips*-img-elf*.
305         * config/mips/mti-linux.h: Support mips32r6 as being the default arch.
306         * config/mips/t-img-elf: New.
307         * config/mips/t-img-linux: New.
308
309 2014-12-19  Matthew Fortune  <matthew.fortune@imgtec.com>
310
311         * config.gcc: Add mipsisa64r6 and mipsisa32r6 cpu support.
312         * config/mips/constraints.md (ZD): Add r6 restrictions.
313         * config/mips/gnu-user.h (DRIVER_SELF_SPECS): Add MIPS_ISA_LEVEL_SPEC.
314         * config/mips/loongson.md
315         (<u>div<mode>3, <u>mod<mode>3): Move to mips.md.
316         * config/mips/mips-cpus.def (mips32r6, mips64r6): Define.
317         * config/mips/mips-modes.def (CCF): New mode.
318         * config/mips/mips-protos.h
319         (mips_9bit_offset_address_p): New prototype.
320         * config/mips/mips-tables.opt: Regenerate.
321         * config/mips/mips.c (MIPS_JR): Use JALR $, <reg> for R6.
322         (mips_rtx_cost_data): Add pseudo-processors W32 and W64.
323         (mips_9bit_offset_address_p): New function.
324         (mips_rtx_costs): Account for R6 multiply and FMA instructions.
325         (mips_emit_compare): Implement R6 FPU comparisons.
326         (mips_expand_conditional_move): Implement R6 selects.
327         (mips_expand_conditional_trap): Account for removed trap immediate.
328         (mips_expand_block_move): Disable inline move when LWL/LWR are removed.
329         (mips_print_float_branch_condition): Update for R6 FPU branches.
330         (mips_print_operand): Handle CCF mode compares.
331         (mips_interrupt_extra_call_saved_reg_p): Do not attempt to callee-save
332         MD_REGS for R6.
333         (mips_hard_regno_mode_ok_p): Support CCF mode.
334         (mips_mode_ok_for_mov_fmt_p): Likewise.
335         (mips_secondary_reload_class): CCFmode can be loaded directly.
336         (mips_set_fast_mult_zero_zero_p): Account for R6 multiply instructions.
337         (mips_option_override): Ensure R6 is used with fp64.  Set default
338         mips_nan modes.  Check for mips_nan support.  Prevent DSP with R6.
339         (mips_conditional_register_usage): Disable MD_REGS for R6. Disable
340         FPSW for R6.
341         (mips_mulsidi3_gen_fn): Support R6 multiply instructions.
342         * config/mips/mips.h (ISA_MIPS32R6, ISA_MIPS64R6): Define.
343         (TARGET_CPU_CPP_BUILTINS): Rework for mips32/mips64.
344         (ISA_HAS_JR): New macro.
345         (ISA_HAS_HILO): New macro.
346         (ISA_HAS_R6MUL): Likewise.
347         (ISA_HAS_R6DMUL): Likewise.
348         (ISA_HAS_R6DIV): Likewise.
349         (ISA_HAS_R6DDIV): Likewise.
350         (ISA_HAS_CCF): Likewise.
351         (ISA_HAS_SEL): Likewise.
352         (ISA_HAS_COND_TRAPI): Likewise.
353         (ISA_HAS_FP_MADDF_MSUBF): Likewise.
354         (ISA_HAS_LWL_LWR): Likewise.
355         (ISA_HAS_IEEE_754_LEGACY): Likewise.
356         (ISA_HAS_IEEE_754_2008): Likewise.
357         (ISA_HAS_PREFETCH_9BIT): Likewise.
358         (MIPSR6_9BIT_OFFSET_P): New macro.
359         (BASE_DRIVER_SELF_SPECS): Use MIPS_ISA_DRIVER_SELF_SPECS.
360         (DRIVER_SELF_SPECS): Use MIPS_ISA_LEVEL_SPEC.
361         (MULTILIB_ISA_DEFAULT): Handle mips32r6 and mips64r6.
362         (MIPS_ISA_LEVEL_SPEC): Likewise.
363         (MIPS_ISA_SYNCI_SPEC): Likewise.
364         (ISA_HAS_64BIT_REGS): Likewise.
365         (ISA_HAS_BRANCHLIKELY): Likewise.
366         (ISA_HAS_MUL3): Likewise.
367         (ISA_HAS_DMULT): Likewise.
368         (ISA_HAS_DDIV): Likewise.
369         (ISA_HAS_DIV): Likewise.
370         (ISA_HAS_MULT): Likewise.
371         (ISA_HAS_FP_CONDMOVE): Likewise.
372         (ISA_HAS_8CC): Likewise.
373         (ISA_HAS_FP4): Likewise.
374         (ISA_HAS_PAIRED_SINGLE): Likewise.
375         (ISA_HAS_MADD_MSUB): Likewise.
376         (ISA_HAS_FP_RECIP_RSQRT): Likewise.
377         * config/mips/mips.md (processor): Add w32 and w64.
378         (FPCC): New mode iterator.
379         (reg): Add CCF mode.
380         (fpcmp): New mode attribute.
381         (fcond): Add ordered, ltgt and ne codes.
382         (fcond): Update code attribute.
383         (sel): New code attribute.
384         (selinv): Likewise.
385         (ctrap<mode>4): Update condition.
386         (*conditional_trap_reg<mode>): New define_insn.
387         (*conditional_trap<mode>): Update condition.
388         (mul<mode>3): Expand R6 multiply instructions.
389         (<su>mulsi3_highpart): Likewise.
390         (<su>muldi3_highpart): Likewise.
391         (mul<mode>3_mul3_loongson): Rename...
392         (mul<mode>3_mul3_hilo): To this.  Add R6 mul instruction.
393         (<u>mulsidi3_32bit_r6): New expander.
394         (<u>mulsidi3_32bit): Restrict to pre-r6 multiplies.
395         (<u>mulsidi3_32bit_r4000): Likewise.
396         (<u>mulsidi3_64bit): Likewise.
397         (<su>mulsi3_highpart_internal): Likewise.
398         (mulsidi3_64bit_r6dmul): New instruction.
399         (<su>mulsi3_highpart_r6): Likewise.
400         (<su>muldi3_highpart_r6): Likewise.
401         (fma<mode>4): Likewise.
402         (movccf): Likewise.
403         (*sel<code><GPR:mode>_using_<GPR2:mode>): Likewise.
404         (*sel<mode>): Likewise.
405         (<u>div<mode>3): Moved from loongson.md.  Add R6 instructions.
406         (<u>mod<mode>3): Likewise.
407         (extvmisalign<mode>): Require ISA_HAS_LWL_LWR.
408         (extzvmisalign<mode>): Likewise.
409         (insvmisalign<mode>): Likewise.
410         (mips_cache): Account for R6 displacement field sizes.
411         (*branch_fp): Rename...
412         (*branch_fp_<mode>): To this.  Add CCFmode support.
413         (*branch_fp_inverted): Rename...
414         (*branch_fp_inverted_<mode>): To this.  Add CCFmode support.
415         (s<code>_<mode>): Rename...
416         (s<code>_<SCALARF:mode>_using_<FPCC:mode>): To this.  Add FCCmode
417         condition support.
418         (s<code>_<mode> swapped): Rename...
419         (s<code>_<SCALARF:mode>_using_<FPCC:mode> swapped): To this. Add
420         CCFmode condition support.
421         (mov<mode>cc GPR): Expand R6 selects.
422         (mov<mode>cc FPR): Expand R6 selects.
423         (*tls_get_tp_<mode>_split): Do not .set push for >= mips32r2.
424         * config/mips/netbsd.h (TARGET_CPU_CPP_BUILTINS): Update similarly to
425         mips.h.
426         (ASM_SPEC): Add mips32r6, mips64r6.
427         * config/mips/t-isa3264 (MULTILIB_OPTIONS, MULTILIB_DIRNAMES): Update
428         for mips32r6/mips64r6.
429         * doc/invoke.texi: Document -mips32r6,-mips64r6.
430         * doc/md.texi: Update comment for ZD constraint.
431
432 2014-12-19  Segher Boessenkool  <segher@kernel.crashing.org>
433
434         PR target/64268
435         * combine.c (try_combine): Immediately return if any of I0,I1,I2
436         are the same insn.
437
438 2014-12-19  Alan Lawrence  <alan.lawrence@arm.com>
439
440         * config/aarch64/aarch64.c (<LOGICAL:optab>_one_cmpl<mode>3):
441         Reparameterize to...
442         (<NLOGICAL:optab>_one_cmpl<mode>3): with extra SIMD-register variant.
443         (xor_one_cmpl<mode>3): New define_insn_and_split.
444
445         * config/aarch64/iterators.md (NLOGICAL): New define_code_iterator.
446
447 2014-12-19  Alan Lawrence  <alan.lawrence@arm.com>
448
449         * config/aarch64/aarch64.md (<optab><mode>3, one_cmpl<mode>2):
450         Add SIMD-register variant.
451         * config/aarch64/iterators.md (Vbtype): Add value for SI.
452
453 2014-12-19  Alan Lawrence  <alan.lawrence@arm.com>
454
455         * config/aarch64/aarch64.md (subdi3, adddi3_aarch64): Don't penalize
456         SIMD reg variant.
457
458 2014-12-19  Martin Liska  <mliska@suse.cz>
459
460         PR ipa/63569
461         * ipa-icf-gimple.c (func_checker::compare_operand): Add missing
462         comparison for volatile flag.
463
464 2014-12-19  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
465
466         * doc/invoke.texi (ARM options): Remove mention of Advanced RISC
467         Machines.
468
469 2014-12-19  Xingxing Pan  <xxingpan@marvell.com>
470
471         * config/arm/cortex-a9-neon.md (cortex_a9_neon_vmov): Change
472         reservation to cortex_a9_neon_dp.
473
474 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
475
476         * config/sh/sh.c (prepare_move_operands): Split HI/QImode load/store
477         to two move insns via r0.
478
479 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
480
481         * config/sh/predicates.md (arith_or_int_operand): New predicate.
482         * config/sh/sh.md (addsi3): Use arith_or_int_operand for operand 2.
483         Return fail if operands[0] and operands[1] are overlap when
484         operands[2] is integer constant.
485         (*addsi3_compact): Make it define_insn_and_split which splits
486         reg0 := reg1 + constant to reg0 = constant and reg0 := reg0 + reg1.
487
488 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
489
490         * config/sh/sh-protos.h (sh_movsf_ie_ra_split_p): Declare.
491         * config/sh/sh.c (sh_movsf_ie_ra_split_p): New function.
492         * config/sh/sh.md (movsi_ie): Use "mr" constraint for the 8-th
493         altarnative of operand 0.
494         (movesf_ie): Use "X" constraint instead of "Bsc".
495         (movsf_ie_ra): New insn_and_split.
496         (movsf): Use movsfie_ra when lra_in_progress is true.
497
498 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
499
500         * config/sh/predicates.md (general_movsrc_operand): Allow only
501         valid plus address expressions.
502         (general_movdst_operand): Likewise.
503         (t_reg_operand): Allow (zero_extend (reg t)).
504         * config/sh/sh-protos.h (sh_hard_regno_caller_save_mode): Declare.
505         * config/sh/sh.c (sh_hard_regno_caller_save_mode): New function.
506         (sh_secondary_reload): Return NO_REGS instead of FPUL_REGS in one
507         case.
508         * config/sh/sh.h (HARD_REGNO_CALLER_SAVE_MODE): Define.
509         * config/sh/sh.md (untyped_call): Clobber function value
510         registers before call.
511
512 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
513
514         * config/sh/sh.c (sh_lra_p): New function.
515         (TARGET_LRA_P): Define.
516         (sh_legitimize_reload_address): Return false if sh_lra_p is true.
517         * config/sh/sh.opt (mlra): New option.
518
519 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
520
521         * lra-constraints.c (process_address_1): Try if target can split
522         displacement with targetm.legitimize_address_displacement.
523         * target.def (legitimize_address_displacement): New hook.
524         * targhooks.c (default_legitimize_address_displacement): New function.
525         * targhooks.h (default_legitimize_address_displacement): Declare.
526         * config/sh/sh.c (sh_legitimize_address_displacement): New function.
527         (TARGET_LEGITIMIZE_ADDRESS_DISPLACEMENT): Define.
528         * doc/tm.texi.in (TARGET_LEGITIMIZE_ADDRESS_DISPLACEMENT): New hook.
529         * doc/tm.texi: Regenerate.
530
531 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
532
533         * lra-constraints.c (get_equiv): Don't return memory equivalence
534         when targetm.cannot_substitute_mem_equiv_p is true.
535         * target.def (cannot_substitute_mem_equiv_p): New hook.
536         * config/sh/sh.c (sh_cannot_substitute_mem_equiv_p): New function.
537         (TARGET_CANNOT_SUBSTITUTE_MEM_EQUIV_P): Define.
538         * doc/tm.texi.in (TARGET_CANNOT_SUBSTITUTE_MEM_EQUIV_P): New hook.
539         * doc/tm.texi: Regenerate.
540
541 2014-12-19  Kaz Kojima  <kkojima@gcc.gnu.org>
542
543         * lra-constraints.c (process_address_1): Swap base_term and
544         index_term if INDEX_REG_CLASS is assigned to base_term already
545         when INDEX_REG_CLASS is a single register class.
546
547 2014-12-18  Vladimir Makarov  <vmakarov@redhat.com>
548
549         * lra-constraints.c (lra-constraints.c): Exchange places of sclass
550         and dclass.
551
552 2014-12-18  Vladimir Makarov  <vmakarov@redhat.com>
553
554         PR rtl-optimization/64291
555         * lra-remat.c (bad_for_rematerialization_p): Add UNPSEC_VLOATILE.
556         (create_cands): Process only output reload insn with potential
557         cands.
558
559 2014-12-18  H.J. Lu  <hongjiu.lu@intel.com>
560
561         * config/i386/i386.c (ix86_expand_call): Skip setting up RAX
562         register for -mskip-rax-setup when there are no parameters
563         passed in vector registers.
564         * config/i386/i386.opt (mskip-rax-setup): New option.
565         * doc/invoke.texi: Document -mskip-rax-setup.
566
567 2014-12-18  Alan Lawrence  <alan.lawrence@arm.com>
568
569         * config/aarch64/aarch64-simd.md (aarch64_lshr_simddi): Handle shift
570         by 64 by moving const0_rtx.
571         (aarch64_ushr_simddi): Delete.
572
573         * config/aarch64/aarch64.md (enum unspec): Delete UNSPEC_USHR64.
574
575 2014-12-18  Alan Lawrence  <alan.lawrence@arm.com>
576
577         * config/aarch64/aarch64.md (enum "unspec"): Remove UNSPEC_SSHR64.
578
579         * config/aarch64/aarch64-simd.md (aarch64_ashr_simddi): Change shift
580         amount to 63 if was 64.
581         (aarch64_sshr_simddi): Remove.
582
583 2014-12-18  Wilco Dijkstra  <wilco.dijkstra@arm.com>
584
585         * gcc/config/aarch64/aarch64.c (TARGET_MIN_DIVISIONS_FOR_RECIP_MUL):
586         Define.
587         (aarch64_min_divisions_for_recip_mul): New function.
588
589 2014-12-18  Wilco Dijkstra  <wilco.dijkstra@arm.com>
590
591         * config/aarch64/aarch64-protos.h (tune-params): Add code alignment
592         tuning parameters.
593         * gcc/config/aarch64/aarch64.c (generic_tunings): Add code alignment
594         tuning parameters.
595         (cortexa53_tunings): Likewise.
596         (cortexa57_tunings): Likewise.
597         (thunderx_tunings): Likewise.
598         (aarch64_override_options): Use new alignment tunings.
599
600 2014-12-18  Martin Liska  <mliska@suse.cz>
601
602         PR tree-optimization/64330
603         * ipa-icf.c (sem_variable::parse): Add checking
604         for externally visible symbols and do not introduce
605         an alias for an external declaration.
606
607 2014-12-18  Jan Hubicka  <hubicka@ucw.cz>
608
609         PR bootstrap/63573
610         * tree-inline.c (remap_gimple_stmt): Handle gimple_call_from_thunk_p
611         predicate.
612
613 2014-12-18  Martin Liska  <mliska@suse.cz>
614
615         PR ipa/64146
616         * ipa-icf.c (sem_function::merge): Check for
617         decl_binds_to_current_def_p is newly added to merge operation.
618
619 2014-12-18  Bin Cheng  <bin.cheng@arm.com>
620
621         PR tree-optimization/62178
622         * tree-ssa-loop-ivopts.c (cheaper_cost_with_cand): New function.
623         (iv_ca_replace): New function.
624         (try_improve_iv_set): New parameter try_replace_p.
625         Break local optimal fixed-point by calling iv_ca_replace.
626         (find_optimal_iv_set_1): Pass new argument to try_improve_iv_set.
627
628 2014-12-17  Dehao Chen  <dehao@google.com>
629
630         * auto-profile.c (afdo_annotate_cfg): Invoke update_ssa in the right
631         place.
632         (auto_profile): Recompute inline summary after processing cgraph node.
633
634 2014-12-17  Oleg Endo  <olegendo@gcc.gnu.org>
635
636         PR target/51244
637         * config/sh/sh_treg_combine.cc (is_conditional_insn): New function.
638         (cbranch_trace): Add member rtx* condition_rtx_in_insn, initialize it
639         accordingly in constructor.
640         (cbranch_trace::branch_condition_rtx_ref): New function.
641         (cbranch_trace::branch_condition_rtx): Use branch_condition_rtx_ref.
642         (sh_treg_combine::try_invert_branch_condition): Invert condition rtx
643         in insn using reversed_comparison_code and validate_change instead of
644         invert_jump_1.
645         (sh_treg_combine::execute): Look for conditional insns in basic blocks
646         in addition to conditional branches.
647         * config/sh/sh.md (*movsicc_div0s): Remove combine patterns.
648
649 2014-12-17  Oleg Endo  <olegendo@gcc.gnu.org>
650
651         PR target/51244
652         * config/sh/sh_treg_combine.cc (sh_treg_combine::try_optimize_cbranch):
653         Combine ccreg inversion and cbranch into inverted cbranch.
654
655 2014-12-17  Vladimir Makarov  <vmakarov@redhat.com>
656
657         * lra-constraints.c (process_alt_operands): Remove non
658         allocatable hard regs when considering
659         ira_prohibited_class_mode_regs.
660
661 2014-12-17  Jan Hubicka  <hubicka@ucw.cz>
662
663         * sreal.h (sreal::normalize): Implement inline.
664         (sreal::normalize_up): New function.
665         (sreal::normalize_down): New function.
666         * sreal.c (sreal::normalize): Remove.
667
668 2014-12-17  James Greenhalgh  <james.greenhalgh@arm.com>
669
670         * config/aarch64/aarch64.md (generic_sched): Delete it.
671
672 2014-12-17  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
673
674         * config/msp430/msp430.c (msp430_asm_output_addr_const_extra): Fix
675         unused argument warning.
676
677 2014-12-17  Pierre-Marie de Rodat  <derodat@adacore.com>
678
679         * dwarf2out.h (struct array_descr_info): Remove the base_decl field.
680         * dwarf2out.c (enum dw_scalar_form): New.
681         (struct loc_descr_context): New.
682         (add_scalar_info): New.
683         (add_bound_info): Add a context parameter.  Use add_scalar_info.
684         (loc_list_from_tree): Add a context parameter.  Handle PLACEHOLDER_EXPR
685         nodes for type-related expressions.  Likewise for base declarations.
686         (loc_descriptor_from_tree): Add a context parameter.
687         (subrange_type_die): Update calls to add_bound_info.
688         (tls_mem_loc_descriptor): Likewise.
689         (loc_list_for_address_of_addr_expr_of_indirect_ref): Add a context
690         parameter.  Update calls to loc_list_from_tree.
691         (add_subscript_info): Update calls to add_bound_info.
692         (gen_array_type_die): Update calls to loc_list_from_tree and to
693         add_bound_info.
694         (descr_info_loc): Remove.
695         (add_descr_info_field): Remove.
696         (gen_descr_array_type_die): Switch add_descr_info_field calls into
697         add_scalar_info/add_bound_info ones.
698         (gen_subprogram_die): Update calls to loc_list_from_tree.
699         (gen_variable_die): Likewise.
700
701 2014-12-17  Pierre-Marie de Rodat  <derodat@adacore.com>
702
703         * dwarf2out.c (print_loc_descr): New.
704         (print_dw_val): New.
705         (print_attribute): New.
706         (print_loc_descr): New.
707         (print_die): Use print_dw_val.
708         (debug_dwarf_loc_descr): New.
709         * dwarf2out.h (debug_dwarf_loc_descr): New declaration.
710
711 2014-12-17  Pierre-Marie de Rodat  <derodat@adacore.com>
712
713         * dwarf2out.c (gen_type_die_with_usage): Enable the array lang-hook
714         even when (dwarf_version < 3 && dwarf_strict).
715         (gen_descr_array_die): Do not output DW_AT_data_locationn,
716         DW_AT_associated, DW_AT_allocated and DW_AT_byte_stride DWARF
717         attributes when (dwarf_version < 3 && dwarf_strict).
718
719 2014-12-17  Pierre-Marie de Rodat  <derodat@adacore.com>
720
721         * dwarf2out.h (enum array_descr_ordering): New.
722         (array_descr_dimen): Add a bounds_type structure field.
723         (struct array_descr_info): Add a field to hold index type information
724         and another one to hold ordering information.
725         * dwarf2out.c (gen_type_die_with_usage): Get the main variant before
726         invoking the array descriptor language hook.  Initialize the
727         array_descr_info structure before calling the lang-hook.
728         (gen_descr_array_type_die): Use gen_type_die if not processing the main
729         type variant.  Replace Fortran-specific code with generic one using
730         this new field.  Add a GNAT descriptive type, if any.  Output type
731         information for the array bound subrange, if any.
732
733 2014-12-17  H.J. Lu  <hongjiu.lu@intel.com>
734             Jakub Jelinek  <jakub@redhat.com>
735             Uros Bizjak  <ubizjak@gmail.com>
736
737         PR target/61296
738         * config/i386/i386-opts.h (ix86_align_data): New enum.
739         * config/i386/i386.c (ix86_data_alignment): Return the ABI
740         alignment value for -malign-data=abi, the cachine line size
741         for -malign-data=cacheline and the older GCC compatible
742         alignment value for for -malign-data=compat.
743         * config/i386/i386.opt (malign-data=): New.
744         * doc/invoke.texi: Document -malign-data=.
745
746 2014-12-17  Marek Polacek  <polacek@redhat.com>
747
748         PR middle-end/63568
749         * match.pd: Add (x & ~m) | (y & m) -> ((x ^ y) & m) ^ x pattern.
750
751 2014-12-17  Jakub Jelinek  <jakub@redhat.com>
752
753         PR tree-optimization/64322
754         * tree-vrp.c (extract_range_from_binary_expr_1): Attempt to derive
755         range for RSHIFT_EXPR even if vr0 range is not VR_RANGE or is symbolic.
756
757 2014-12-17  Tobias Burnus  <burnus@net-b.de>
758
759         PR fortran/54687
760         * flag-types.h (gfc_init_local_real, gfc_fcoarray,
761         gfc_convert): New enums; moved from fortran/.
762
763 2014-12-16  Jan Hubicka  <hubicka@ucw.cz>
764
765         * fibonacci_heap.h (min): Return m_data instead of non-existing data.
766
767 2014-12-16  Jan Hubicka  <hubicka@ucw.cz>
768
769         * ipa-inline-analysis.c (will_be_nonconstant_predicate): Consider
770         return values of const calls as constants.
771         (estimate_function_body_sizes): Expect calls to have false predicates.
772
773 2014-12-16  Jan Hubicka  <hubicka@ucw.cz>
774
775         * hwint.c (abs_hwi, absu_hwi): Move to ...
776         * hwint.h (abs_hwi, absu_hwi): ... here; make inline.
777
778 2014-12-16  Marek Polacek  <polacek@redhat.com>
779
780         PR middle-end/64309
781         * match.pd: Add ((1 << A) & 1) != 0 -> A == 0 and
782         ((1 << A) & 1) == 0 -> A != 0.
783
784 2014-12-16  Richard Biener  <rguenther@suse.de>
785
786         * genmatch.c (parser::parser): Initialize capture_ids.
787         (parser::parse_pattern): Properly allocate capture_ids before
788         using them.  Set capture_ids to zero when its lifetime is
789         supposed to finish.
790         (parser::parse_simplify): Allocate capture_ids only if required.
791
792 2014-12-16  Michael Haubenwallner <michael.haubenwallner@ssi-schaefer.com>
793
794         * sreal.c: Include math.h later.
795
796 2014-12-16  Felix Yang  <felix.yang@huawei.com>
797
798         PR rtl-optimization/64240
799         * ddg.c (mark_mem_use): Check *iter instead of *x.
800
801 2014-12-16  Martin Liska  <mliska@suse.cz>
802
803         PR ipa/64278
804         * sreal.c (sreal::operator*): Replace std::abs with absu_hwi.
805
806 2014-12-16  Igor Zamyatin  <igor.zamyatin@intel.com>
807
808         * config/i386/i386.c (ix86_address_cost): Add explicit restriction
809         to RTL level for the check for PIC register.
810
811 2014-12-16  Uros Bizjak  <ubizjak@gmail.com>
812
813         * config/i386/gnu-user.h (TARGET_CAN_SPLIT_STACK): Move from here ...
814         * config/i386/gnu-user64.h (TARGET_CAN_SPLIT_STACK): ... and here ...
815         * config/i386/gnu-user-common.h (TARGET_CAN_SPLIT_STACK): ... to here.
816
817 2014-12-16  Chung-Ju Wu  <jasonwucj@gmail.com>
818
819         PR target/64217
820         * config/nds32/nds32.md (casesi_internal): Add '=r' for clobber
821         register constraint.
822
823 2014-12-15  DJ Delorie  <dj@redhat.com>
824
825         * config/rl78/rl78.h: Remove SHORT_IMMEDIATES_SIGN_EXTEND.
826
827 2014-12-15  Jan Hubicka  <hubicka@ucw.cz>
828
829         PR lto/64043
830         * tree-streamer.c (preload_common_nodes): Skip preloading
831         of main_identifier_node, pid_type and optimization/option nodes.
832
833 2014-12-15  Vladimir Makarov  <vmakarov@redhat.com>
834
835         PR rtl-optimization/63397
836         * ira-int.h (ira_overall_cost, ira_reg_cost, ira_mem_cost): Use
837         int64_t.
838         (ira_load_cost, ira_store_cost, ira_shuffle_cost): Ditto.
839         * ira.c (ira_overall_cost, ira_overall_cost_before): Ditto.
840         (ira_reg_cost, ira_mem_cost): Ditto.
841         (ira_load_cost, ira_store_cost, ira_shuffle_cost): Ditto.
842         (calculate_allocation_cost, do_reload): Use the right
843         format for int64_t values.
844
845 2014-12-15  Jan Hubicka  <hubicka@ucw.cz>
846
847         * sreal.h (to_double): New method.
848         (shift): Do not ICE on 0.
849         * sreal.c: Include math.h
850         (sreal::to_double): New.
851
852 2014-12-15  Jakub Jelinek  <jakub@redhat.com>
853
854         PR rtl-optimization/64316
855         * simplify-rtx.c (simplify_relational_operation_1): For
856         (eq/ne (and x y) x) and (eq/ne (and x y) y) optimizations use
857         CONST0_RTX instead of const0_rtx.
858
859 2014-12-15  Vladimir Makarov  <vmakarov@redhat.com>
860
861         PR target/62642
862         * ira.c (rtx_moveable_p): Prevent UNSPEC_VOLATILE moves.
863
864 2014-12-15  Vladimir Makarov  <vmakarov@redhat.com>
865
866         * ira-int.h (ira_prohibited_class_mode_regs): Remove.
867         (struct target_ira_int): Move x_ira_prohibited_class_mode_regs to
868         ...
869         * ira.h (struct target_ira): ... here.
870         (ira_prohibited_class_mode_regs): Define.
871         * lra-constraints.c (process_alt_operands): Add one more condition
872         to refuse alternative when reload pseudo of given class can not
873         hold value of given mode.
874
875 2014-12-15  Richard Biener  <rguenther@suse.de>
876
877         PR tree-optimization/64312
878         * tree-ssa-sccvn.c (vn_reference_lookup_pieces): Use
879         vuse_ssa_val as callback to walk_non_aliased_vuses.
880         (vn_reference_lookup): Likewise.
881
882 2014-12-15  Segher Boessenkool  <segher@kernel.crashing.org>
883
884         * gcc/config/rs6000/rs6000.md (*add>mode>3_imm_dot,
885         *add<mode>3_imm_dot2): Change the constraint for the second
886         alternative for operand 1 from "r" to "b".
887
888 2014-12-15  Richard Biener  <rguenther@suse.de>
889
890         * vec.h (vec::safe_grow): Guard against a grow to zero size.
891
892 2014-12-15  Richard Biener  <rguenther@suse.de>
893
894         PR middle-end/64295
895         * match.pd (X / CST -> X * (1 / CST): Use const_binop instead of
896         fold_binary to compute the constant to multiply with.
897
898 2014-12-15  Richard Biener  <rguenther@suse.de>
899
900         PR middle-end/64246
901         * cfgloop.c (mark_loop_for_removal): Make safe against multiple
902         invocations on the same loop.
903
904 2014-12-15  Marek Polacek  <polacek@redhat.com>
905
906         PR middle-end/64292
907         * fold-const.c (negate_expr_p): Add INTEGRAL_TYPE_P check.
908
909 2014-12-15  Renlin Li  <renlin.li@arm.com>
910
911         * config/aarch64/aarch64.h (CLZ_DEFINED_VALUE_AT_ZERO): Return 2.
912         (CTZ_DEFINED_VALUE_AT_ZERO): Update to support more modes.
913
914 2014-12-15  Jakub Jelinek  <jakub@redhat.com>
915
916         PR sanitizer/64265
917         * tsan.c (instrument_func_entry): Insert __tsan_func_entry
918         call on edge from entry block to single succ instead
919         of after labels of single succ of entry block.
920
921 2014-12-15  Richard Biener  <rguenther@suse.de>
922
923         PR tree-optimization/64284
924         * tree-ssa-threadupdate.c (duplicate_seme_region): Mark
925         the loop for removal if we copied the loop header.
926
927 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
928
929         PR ipa/61602
930         * cgraph.h (ipa_discover_readonly_nonaddressable_vars): Return bool.
931         * ipa.c (set_writeonly_bit): Track if reference was removed.
932         (ipa_discover_readonly_nonaddressable_vars): Return true if any
933         references was removed.
934         * ipa-reference.c (propagate): Return TODO_remove_functions if
935         reference was removed.
936
937 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
938
939         * ipa.c (process_references): Fix conditoinal on flag_optimize
940
941 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
942
943         PR ipa/61558
944         * symtab.c (symbol_table::insert_to_assembler_name_hash
945         symbol_table::unlink_from_assembler_name_hash): Do not ICE when
946         DECL_ASSEMBLER_NAME is NULL.
947
948 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
949
950         * cgraphunit.c (analyze_functions): Always analyze targets of aliases.
951
952 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
953
954         PR lto/64043
955         * tree.c (virtual_method_call_p): Return false when OTR type has
956         no BINFO.
957
958 2014-12-14  Jan Hubicka  <hubicka@ucw.cz>
959
960         * cgraphunit.c (analyze_functions): Do not analyze extern inline
961         funtions when not optimizing; skip comdat locals.
962
963 2014-12-14  H.J. Lu  <hongjiu.lu@intel.com>
964
965         PR rtl-optimization/64037
966         * combine.c (setup_incoming_promotions): Pass the argument
967         before any promotions happen to promote_function_mode.
968
969 2014-12-12  Thomas Schwinge  <thomas@codesourcery.com>
970
971         * config/nvptx/nvptx.h (ASM_OUTPUT_ALIGN): Define as a C statment.
972
973 2014-12-12  Vladimir Makarov  <vmakarov@redhat.com>
974
975         PR target/64110
976         * lra-constraints.c (process_alt_operands): Refuse alternative
977         when reload pseudo of given class can not hold value of given
978         mode.
979
980 2014-12-12  Thomas Schwinge  <thomas@codesourcery.com>
981
982         * gimple-walk.c (walk_gimple_op) <GIMPLE_OMP_FOR>: Also check
983         intermediate walk_tree results for for_incr.
984         <GIMPLE_OMP_TARGET>: Walk child_fn and data_arg, too.
985         <GIMPLE_OMP_CRITICAL, GIMPLE_OMP_ATOMIC_STORE>: Pretty printing.
986
987 2014-12-12  Richard Sandiford  <richard.sandiford@arm.com>
988
989         PR middle-end/64182
990         * wide-int.h (wi::div_round, wi::mod_round): Fix rounding of tied
991         cases.
992         * double-int.c (div_and_round_double): Fix handling of unsigned
993         cases.  Use same rounding approach as wide-int.h.
994
995 2014-12-12  Marek Polacek  <polacek@redhat.com>
996
997         PR middle-end/64274
998         * fold-const.c (fold_binary_loc): Add ANY_INTEGRAL_TYPE_P check.
999
1000 2014-12-12  Jakub Jelinek  <jakub@redhat.com>
1001
1002         PR tree-optimization/64269
1003         * tree-ssa-forwprop.c (simplify_builtin_call): Bail out if
1004         len2 or diff are too large.
1005
1006 2014-12-12  Richard Biener  <rguenther@suse.de>
1007
1008         PR middle-end/64280
1009         * tree-cfg.c (replace_uses_by): Guard assert properly.
1010
1011 2014-12-12  Anthony Green  <green@moxielogic.com>
1012
1013         * config/moxie/moxie.md: Add use of zex instruction.
1014
1015 2014-12-12  Marc Glisse  <marc.glisse@inria.fr>
1016
1017         * real.h (HONOR_SNANS, HONOR_INFINITIES, HONOR_SIGNED_ZEROS,
1018         HONOR_SIGN_DEPENDENT_ROUNDING): Replace macros with 3 overloaded
1019         declarations.
1020         * real.c (HONOR_NANS): Fix indentation.
1021         (HONOR_SNANS, HONOR_INFINITIES, HONOR_SIGNED_ZEROS,
1022         HONOR_SIGN_DEPENDENT_ROUNDING): Define three overloads.
1023         * builtins.c (fold_builtin_cproj, fold_builtin_signbit,
1024         fold_builtin_fmin_fmax, fold_builtin_classify): Simplify argument
1025         of HONOR_*.
1026         * fold-const.c (operand_equal_p, fold_comparison, fold_binary_loc):
1027         Likewise.
1028         * gimple-fold.c (gimple_val_nonnegative_real_p): Likewise.
1029         * ifcvt.c (noce_try_move, noce_try_minmax, noce_try_abs): Likewise.
1030         * omp-low.c (omp_reduction_init): Likewise.
1031         * rtlanal.c (may_trap_p_1): Likewise.
1032         * simplify-rtx.c (simplify_const_relational_operation): Likewise.
1033         * tree-ssa-dom.c (record_equality, record_edge_info): Likewise.
1034         * tree-ssa-phiopt.c (value_replacement, abs_replacement): Likewise.
1035         * tree-ssa-reassoc.c (eliminate_using_constants): Likewise.
1036         * tree-ssa-uncprop.c (associate_equivalences_with_edges): Likewise.
1037
1038 2014-12-12  Jan Hubicka  <hubicka@ucw.cz>
1039
1040         * ipa-inline.c (ipa_inline): Fix condition on when
1041         TODO_remove_unreachable_functions is needed.
1042
1043 2014-12-12  Jan Hubicka  <hubicka@ucw.cz>
1044
1045         * ipa-devirt.c (possible_polymorphic_call_targets): Return early
1046         if otr_type has no BINFO.
1047
1048 2014-12-12  Zhenqiang Chen  <zhenqiang.chen@arm.com>
1049
1050         PR rtl-optimization/63917
1051         * ifcvt.c (cc_in_cond): New function.
1052         (end_ifcvt_sequence): Make sure new generated insns do not clobber CC.
1053         (noce_process_if_block, check_cond_move_block): Check CC references.
1054
1055 2014-12-11  Andrew Pinski  <apinski@cavium.com>
1056
1057         * config/aarch64/aarch64-protos.h (tune_params): Add align field.
1058         * config/aarch64/aarch64.c (generic_tunings): Specify align.
1059         (cortexa53_tunings): Likewise.
1060         (cortexa57_tunings): Likewise.
1061         (thunderx_tunings): Likewise.
1062         (aarch64_override_options): Set align_loops, align_jumps,
1063         align_functions based on what the tuning struct.
1064
1065 2014-12-11  Eric Botcazou  <ebotcazou@adacore.com>
1066
1067         * doc/md.texi (Insn Lengths): Fix description of (pc).
1068
1069 2014-12-11  Jan Hubicka  <hubicka@ucw.cz>
1070
1071         PR ipa/61324
1072         * passes.c (execute_todo): Update call of remove_unreachable_nodes.
1073         * ipa-chkp.c (chkp_produce_thunks): Use TODO_remove_functions.
1074         * cgraphunit.c (symbol_table::process_new_functions): Add
1075         IPA_SSA_AFTER_INLINING.
1076         (ipa_passes): Update call of remove_unreachable_nodes.
1077         (symbol_table::compile): Remove call of remove_unreachable_nodes.
1078         * ipa-inline.c (inline_small_functions): Do not ICE with
1079         -flto-partition=none
1080         (ipa_inline): Update symtab->state; fix formatting
1081         update call of remove_unreachable_nodes.
1082         * passes.c (execute_todo): Update call of remove_unreachable_nodes.
1083         * cgraphclones.c (symbol_table::materialize_all_clones): Likewise.
1084         * cgraph.h (enum symtab_state): Add IPA_SSA_AFTER_INLINING.
1085         (remove_unreachable_nodes): Update.
1086         * ipa.c (process_references): Keep external references only
1087         when optimizing.
1088         (walk_polymorphic_call_targets): Keep possible polymorphic call
1089         target only when devirtualizing.
1090         (symbol_table::remove_unreachable_nodes): Remove BEFORE_INLINING_P
1091         parameter.
1092         (ipa_single_use): Update comment.
1093         * ipa-pure-const.c (cdtor_p): New function.
1094         (propagate_pure_const): Track if some cdtor was turned pure/const.
1095         (execute): Return TODO_remove_functions if needed.
1096         * ipa-comdats.c (ipa_comdats): Update comment.
1097
1098 2014-12-11  Aldy Hernandez  <aldyh@redhat.com>
1099
1100         * dwarf2out.c (gen_lexical_block_die): Remove unused `depth'
1101         parameter.
1102         (gen_inlined_subroutine_die): Same.
1103         (gen_block_die): Same.
1104         (decls_for_scope): Same.
1105
1106 2014-12-11  Renlin Li  <renlin.li@arm.com>
1107
1108         * config/aarch64/aarch64-cores.def: Change all AARCH64_FL_FPSIMD to
1109         AARCH64_FL_FOR_ARCH8.
1110         * config/aarch64/aarch64.c (all_cores): Use FLAGS from
1111         aarch64-cores.def file only.
1112
1113 2014-12-11  Manuel López-Ibáñez  <manu@gcc.gnu.org>
1114
1115         PR fortran/44054
1116         * diagnostic.c (diagnostic_action_after_output): Make it extern.
1117         Take diagnostic_t argument instead of diagnostic_info. Count also
1118         DK_WERROR towards max_errors.
1119         (diagnostic_report_diagnostic): Update call according to the above.
1120         (error_recursion): Likewise.
1121         * diagnostic.h (diagnostic_action_after_output): Declare.
1122         * pretty-print.c (pp_formatted_text_data): Delete.
1123         (pp_append_r): Call output_buffer_append_r.
1124         (pp_formatted_text): Call output_buffer_formatted_text.
1125         (pp_last_position_in_text): Call output_buffer_last_position_in_text.
1126         * pretty-print.h (output_buffer_formatted_text): New.
1127         (output_buffer_append_r): New.
1128         (output_buffer_last_position_in_text): New.
1129
1130 2014-12-11  Kyrylo Tkachov  kyrylo.tkachov@arm.com
1131
1132         * config/aarch64/aarch64.c (aarch64_parse_extension): Update error
1133         message to say +no only when removing extension.
1134
1135 2014-12-11  Andrew MacLeod  <amacleod@redhat.com>
1136
1137         * config/tilepro/gen-mul-tables.cc: Add insn-codes.h to include list
1138         for generator file.  Add comment indicating it is a generated file.
1139         * config/tilepro/mul-tables.c: Update generated file.
1140         * config/tilegx/mul-tables.c: Likewise.
1141
1142 2014-12-11  Segher Boessenkool  <segher@kernel.crashing.org>
1143
1144         * combine.c (try_combine): Do not allow combining a PARALLEL I2
1145         with a register move I3 if that I2 is an asm.
1146
1147 2014-12-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
1148
1149         * config/arm/arm_neon.h (vrndqn_f32): Rename to...
1150         (vrndnq_f32): ... this.
1151         (vrndqa_f32): Rename to...
1152         (vrndaq_f32): ... this.
1153         (vrndqp_f32): Rename to...
1154         (vrndpq_f32): ... this.
1155         (vrndqm_f32): Rename to...
1156         (vrndmq_f32): ... this.
1157         (vrndx_f32): New intrinsic.
1158         (vrndxq_f32): Likewise.
1159
1160 2014-12-11  Marek Polacek  <polacek@redhat.com>
1161
1162         * fold-const.c (fold_negate_expr): Add ANY_INTEGRAL_TYPE_P check.
1163         (extract_muldiv_1): Likewise.
1164         (maybe_canonicalize_comparison_1): Likewise.
1165         (fold_comparison): Likewise.
1166         (tree_binary_nonnegative_warnv_p): Likewise.
1167         (tree_binary_nonzero_warnv_p): Likewise.
1168         * gimple-ssa-strength-reduction.c (legal_cast_p_1): Likewise.
1169         * tree-scalar-evolution.c (simple_iv): Likewise.
1170         (scev_const_prop): Likewise.
1171         * tree-ssa-loop-niter.c (expand_simple_operations): Likewise.
1172         * tree-vect-generic.c (expand_vector_operation): Likewise.
1173         * tree.h (ANY_INTEGRAL_TYPE_CHECK): Define.
1174         (ANY_INTEGRAL_TYPE_P): Define.
1175         (TYPE_OVERFLOW_WRAPS, TYPE_OVERFLOW_UNDEFINED, TYPE_OVERFLOW_TRAPS):
1176         Add ANY_INTEGRAL_TYPE_CHECK.
1177         (any_integral_type_check): New function.
1178
1179 2014-12-11  Tobias Burnus  <burnus@net-b.de>
1180             Manuel López-Ibáñez  <manu@gcc.gnu.org>
1181
1182         * error.c (gfc_get_terminal_width): Renamed from
1183         get_terminal_width and use same-named common function.
1184         (gfc_error_init_1): Update call.
1185
1186 2014-12-10  Aldy Hernandez  <aldyh@redhat.com>
1187
1188         * gdbhooks.py (class DWDieRefPrinter): New class.
1189         (build_pretty_printer): Register dw_die_ref's.
1190
1191 2014-12-10  Ilya Tocar  <ilya.tocar@intel.com>
1192
1193         * config.gcc: Support "knl".
1194         * config/i386/driver-i386.c (host_detect_local_cpu): Detect "knl".
1195         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
1196         PROCESSOR_KNL.
1197         * config/i386/i386.c (m_KNL): Define.
1198         (processor_target_table): Add "knl".
1199         (PTA_KNL): Define.
1200         (ix86_issue_rate): Add PROCESSOR_KNL.
1201         (ix86_adjust_cost): Ditto.
1202         (ia32_multipass_dfa_lookahead): Ditto.
1203         (get_builtin_code_for_version): Handle "knl".
1204         (fold_builtin_cpu): Ditto.
1205         * config/i386/i386.h (TARGET_KNL): Define.
1206         (processor_type): Add PROCESSOR_KNL.
1207         * config/i386/i386.md (attr "cpu"): Add knl.
1208         * config/i386/x86-tune.def: Add m_KNL.
1209
1210 2014-12-10  Jan Hubicka  <hubicka@ucw.cz>
1211
1212         * doc/invoke.texi: (-devirtualize-at-ltrans): Document.
1213         * lto-cgraph.c (lto_output_varpool_node): Mark initializer as removed
1214         when it is not streamed to the given ltrans.
1215         (compute_ltrans_boundary): Make code adding all polymorphic
1216         call targets conditional with !flag_wpa || flag_ltrans_devirtualize.
1217         * common.opt (fdevirtualize-at-ltrans): New flag.
1218
1219 2014-12-10  Ilya Verbin  <ilya.verbin@intel.com>
1220
1221         * varpool.c (varpool_node::get_create): Force output of vars with
1222         "omp declare target" attribute.
1223
1224 2014-12-10  Marc Glisse  <marc.glisse@inria.fr>
1225
1226         * real.h (HONOR_NANS): Replace macro with 3 overloaded declarations.
1227         * real.c: Include rtl.h and options.h.
1228         (HONOR_NANS): Define three overloads.
1229         * builtins.c (fold_builtin_classify, fold_builtin_unordered_cmp):
1230         Simplify argument of HONOR_NANS.
1231         * fold-const.c (combine_comparisons, fold_truth_not_expr,
1232         fold_cond_expr_with_comparison, merge_truthop_with_opposite_arm,
1233         fold_comparison, fold_binary_loc): Likewise.
1234         * ifcvt.c (noce_try_move, noce_try_minmax): Likewise.
1235         * ipa-inline-analysis.c (add_clause,
1236         set_cond_stmt_execution_predicate): Likewise.
1237         * match.pd: Likewise.
1238         * rtlanal.c (may_trap_p_1): Likewise.
1239         * simplify-rtx.c (simplify_const_relational_operation): Likewise.
1240         * tree-if-conv.c (parse_predicate): Likewise.
1241         * tree-ssa-ccp.c (valid_lattice_transition): Likewise.
1242         * tree-ssa-ifcombine.c (ifcombine_ifandif): Likewise.
1243         * tree-ssa-phiopt.c (minmax_replacement, neg_replacement): Likewise.
1244         * tree-ssa-reassoc.c (eliminate_using_constants): Likewise.
1245         * tree-ssa-tail-merge.c (gimple_equal_p): Likewise.
1246
1247 2014-12-10  Jakub Jelinek  <jakub@redhat.com>
1248
1249         PR tree-optimization/62021
1250         * omp-low.c (simd_clone_adjust_return_type): Use
1251         vector of pointer_sized_int_node types instead vector of pointer
1252         types.
1253         (simd_clone_adjust_argument_types): Likewise.
1254
1255 2014-12-10  Jakub Jelinek  <jakub@redhat.com>
1256             Evgeny Stupachenko  <evstupac@gmail.com>
1257
1258         PR target/64252
1259         * config/i386/i386.c (expand_vec_perm_pblendv): If not testing_p,
1260         set dcopy.target to a new pseudo.
1261
1262 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1263
1264         * config/rs6000/rs6000.md (*add<mode>3): Remove condition.
1265
1266 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1267
1268         * config/rs6000/40x.md (ppc403-compare): Remove "compare".
1269         config/rs6000/440.md (ppc440-compare): Remove "compare".
1270         config/rs6000/476.md (ppc476-compare): Remove "compare".
1271         config/rs6000/601.md (ppc601-compare): Remove "compare".
1272         config/rs6000/603.md (ppc603-compare): Remove "compare".
1273         config/rs6000/6xx.md (ppc604-compare): Remove "compare".
1274         config/rs6000/7450.md (ppc7450-compare): Remove "compare".
1275         config/rs6000/7xx.md (ppc750-compare): Remove "compare".
1276         config/rs6000/8540.md (ppc8540_su): Remove "compare".
1277         config/rs6000/cell.md (cell-fast-cmp, cell-cmp-microcoded): Remove
1278         "compare".
1279         config/rs6000/e300c2c3.md (ppce300c3_cmp): Remove "compare".
1280         config/rs6000/e500mc.md (e500mc_su): Remove "compare".
1281         config/rs6000/e500mc64.md (e500mc64_su2): Remove "compare".
1282         config/rs6000/e5500.md (e5500_sfx2): Remove "compare".
1283         config/rs6000/e6500.md (e6500_sfx2): Remove "compare".
1284         config/rs6000/mpc.md (mpccore-compare): Remove "compare".
1285         config/rs6000/power4.md (power4-compare): Remove "compare".
1286         config/rs6000/power5.md (power5-compare): Remove "compare".
1287         config/rs6000/power6.md (power6-compare): Remove "compare".
1288         config/rs6000/power7.md (power7-compare): Remove "compare".
1289         config/rs6000/power8.md (power8-compare): Remove "compare".  Update
1290         comment.
1291         config/rs6000/rs6000.c (rs6000_adjust_cost) <TYPE_COMPARE>: Remove
1292         (three times).
1293         (is_cracked_insn): Remove TYPE_COMPARE case.
1294         (insn_must_be_first_in_group) <TYPE_COMPARE>: Remove (twice).
1295         config/rs6000/rs6000.md (type): Remove "compare".
1296         (cell_micro): Remove "compare".
1297         config/rs6000/rs64.md (rs64a-compare): Remove "compare".
1298
1299 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1300
1301         * config/rs6000/rs6000.md (*anddi3_2rld_dot, *anddi3_rld_dot2):
1302         Change type from "compare" to "two".
1303
1304 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1305
1306         PR target/64180
1307         * config/rs6000/predicates.md (unsigned_comparison_operator): New.
1308         (signed_comparison_operator): New.
1309         * config/rs6000/rs6000-protos.h (rs6000_emit_eqne): Declare.
1310         * config/rs6000/rs6000.c (rs6000_emit_eqne): New function.
1311         (rs6000_emit_sCOND): Remove ISEL test (move it to the expander).
1312         * config/rs6000/rs6000.md (add<mode>3 for SDI): Expand DImode
1313         add to addc,adde directly, if !TARGET_POWERPC64.
1314         (sub<mode>3 for SDI): Expand DImode sub to subfc,subfe directly,
1315         if !TARGET_POWERPC64.
1316         (neg<mode>2): Delete expander.
1317         (*neg<mode>2): Rename to "neg<mode>2".
1318         (addti3, subti3): Delete.
1319         (addti3, subti3): New expanders.
1320         (*adddi3_noppc64, *subdi3_noppc64, *negdi2_noppc64): Delete.
1321         (cstore<mode>4_unsigned): New expander.
1322         (cstore<mode>4): Allow GPR as output (not just SI).  Rewrite.
1323         (cstore<mode>4 for FP): Remove superfluous quotes.
1324         (*eq<mode>, *eq<mode>_compare, *plus_eqsi and splitter,
1325         *compare_plus_eqsi and splitter, *plus_eqsi_compare and splitter,
1326         *neg_eq0<mode>, *neg_eq<mode>, *ne0_<mode>, plus_ne0_<mode>,
1327         compare_plus_ne0_<mode> and splitter, *compare_plus_ne0_<mode>_1 and
1328         splitter, *plus_ne0_<mode>_compare and splitter, *leu<mode>,
1329         *leu<mode>_compare and splitter, *plus_leu<mode>, *neg_leu<mode>,
1330         *and_neg_leu<mode>, *ltu<mode>, *ltu<mode>_compare, *plus_ltu<mode>,
1331         *plus_ltu<mode>_1, *plus_ltu<mode>compare, *neg_ltu<mode>, *geu<mode>,
1332         *geu<mode>_compare and splitter, *plus_geu<mode>, *neg_geu<mode>,
1333         *and_neg_geu<mode>, *plus_gt0<mode>, *gtu<mode>, *gtu<mode>_compare,
1334         *plus_gtu<mode>, *plus_gtu<mode>_1, *plus_gtu<mode>_compare,
1335         *neg_gtu<mode>, 12 anonymous insns, and 12 anonymous splitters):
1336         Delete.
1337         (eq<mode>3, ne<mode>3): New.
1338         (*neg_eq_<mode>, *neg_ne_<mode>): New.
1339         (*plus_eq_<mode>, *plus_ne_<mode>): New.
1340         (*minus_eq_<mode>, *minus_ne_<mode>): New.
1341
1342 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1343
1344         PR target/64180
1345         * config/rs6000/predicates.md (adde_operand): New.
1346         * config/rs6000/rs6000.md (add<mode>3_carry): New.
1347         (*add<mode>3_imm_carry_pos): New.
1348         (*add<mode>3_imm_carry_0): New.
1349         (*add<mode>3_imm_carry_m1): New.
1350         (*add<mode>3_imm_carry_neg): New.
1351         (add<mode>3_carry_in): New.
1352         (*add<mode>3_carry_in_internal): New.
1353         (add<mode>3_carry_in_0): New.
1354         (add<mode>3_carry_in_m1): New.
1355         (subf<mode>3_carry): New.
1356         (*subf<mode>3_imm_carry_0): New.
1357         (*subf<mode>3_imm_carry_m1): New.
1358         (subf<mode>3_carry_in): New.
1359         (*subf<mode>3_carry_in_internal): New.
1360         (subf<mode>3_carry_in_0): New.
1361         (subf<mode>3_carry_in_m1): New.
1362         (subf<mode>3_carry_in_xx): New.
1363
1364 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1365
1366         PR target/64180
1367         * config/rs6000/rs6000.md (*add<mode>3_internal1): Rename to
1368         "*add<mode>3".
1369         (*add<mode>3_internal2, *add<mode>3_internal3, and (their splitters):
1370         Delete.
1371         (*add<mode>3_dot, *add<mode>3_dot2): New.
1372         (*add<mode>3_imm_dot, *add<mode>3_imm_dot2): New.
1373
1374 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1375
1376         PR target/64180
1377         * config/rs6000/rs6000.md (*add<mode>3_internal1): Remove addic
1378         alternative.
1379
1380 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1381
1382         PR target/64180
1383         * config/rs6000/rs6000.md (*ctr<mode>_internal1, *ctr<mode>_internal2,
1384         *ctr<mode>_internal5, *ctr<mode>_internal6): Change "r" alternatives
1385         to "b".  Increase length.
1386         (splitters for these): Split to cmp+addi instead of addic.
1387
1388 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1389
1390         PR target/64180
1391         * config/rs6000/darwin.md (macho_low_si): Remove "r" alternative.
1392         (macho_low_di): Ditto.
1393         * config/rs6000/rs6000.md (*largetoc_low): Ditto.
1394         (tocref<mode>): Ditto.
1395         (elf_low): Ditto.
1396         * config/rs6000/spe.md (mov_si<mode>_e500_subreg0_elf_low_be): Ditto.
1397         (mov_si<mode>_e500_subreg0_elf_low_le): Ditto.
1398         (mov_si<mode>_e500_subreg4_elf_low_be): Ditto.  Reformat condition.
1399         (mov_si<mode>_e500_subreg4_elf_low_le): Ditto.
1400
1401 2014-12-10  Segher Boessenkool  <segher@kernel.crashing.org>
1402
1403         PR target/64180
1404         * config/rs6000/rs6000.c (TARGET_MD_ASM_CLOBBERS): Define.
1405         (rs6000_md_asm_clobbers): New function.
1406
1407 2014-12-10  Felix Yang  <felix.yang@huawei.com>
1408
1409         * config/aarch64/aarch64-protos.h (aarch64_function_profiler): Remove
1410         declaration of removed function.
1411
1412 2014-12-10  Richard Biener  <rguenther@suse.de>
1413
1414         * tree-ssa-loop-im.c
1415         (move_computations_dom_walker::before_dom_children): Clear
1416         SSA_NAME_RANGE_INFO on moved stmts.
1417
1418 2014-12-10  Martin Liska  <mliska@suse.cz>
1419
1420         * sreal.c (sreal::shift_right): New implementation
1421         for int64_t as m_sig.
1422         (sreal::normalize): Likewise.
1423         (sreal::to_int): Likewise.
1424         (sreal::operator+): Likewise.
1425         (sreal::operator-): Likewise.
1426         (sreal::operator*): Likewise.
1427         (sreal::operator/): Likewise.
1428         (sreal::signedless_minus): Removed.
1429         (sreal::signedless_plus): Removed.
1430         (sreal::debug): const keyword is added.
1431         * sreal.h (sreal::operator<): New implementation
1432         for int64_t as m_sig.
1433         * ipa-inline.c (recursive_inlining): LONG_MIN is replaced
1434         with sreal::min ().
1435
1436 2014-12-10  Martin Liska  <mliska@suse.cz>
1437
1438         * gimple-iterator.h (gsi_start_bb_nondebug): New function.
1439         * ipa-icf-gimple.c (func_checker::compare_bb): Correct iteration
1440         replaces loop based on precomputed number of non-debug statements.
1441
1442 2014-12-08  Alexander Ivchenko  <alexander.ivchenko@intel.com>
1443
1444         * config/linux.c (linux_has_ifunc_p): Remove.
1445         * config/linux.h (TARGET_HAS_IFUNC_P): Use default version.
1446
1447 2014-12-10  Mantas Mikaitis  <mantas.mikaitis@arm.com>
1448
1449         * contrib/check_GNU_style.sh (col): Got rid of cut operation
1450         from the pipe chain and instead added cut inside awk command.
1451
1452 2014-12-10  Richard Biener  <rguenther@suse.de>
1453
1454         PR tree-optimization/64191
1455         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Do not
1456         mark clobbers as necessary.
1457         (eliminate_unnecessary_stmts): Keep clobbers live if we can.
1458
1459 2014-12-10  Jakub Jelinek  <jakub@redhat.com>
1460
1461         PR target/63594
1462         * config/i386/sse.md (vec_dupv4sf): Move after
1463         <mask_codefor><avx512>_vec_dup_gpr<mode><mask_name> pattern.
1464         (*vec_dupv4si, *vec_dupv2di): Likewise.
1465         (<mask_codefor><avx512>_vec_dup_mem<mode><mask_name>): Merge into ...
1466         (<mask_codefor><avx512>_vec_dup_gpr<mode><mask_name>): ... this
1467         pattern.
1468         (*vec_dup<mode> AVX2_VEC_DUP_MODE splitter): Disable for
1469         TARGET_AVX512VL (for QI/HI scalar modes only if TARGET_AVX512BW
1470         is set too).
1471         * config/i386/i386.c (enum ix86_builtins): Remove
1472         IX86_BUILTIN_PBROADCASTQ256_MEM_MASK,
1473         IX86_BUILTIN_PBROADCASTQ128_MEM_MASK and
1474         IX86_BUILTIN_PBROADCASTQ512_MEM.
1475         (bdesc_args): Use __builtin_ia32_pbroadcastq512_gpr_mask,
1476         __builtin_ia32_pbroadcastq256_gpr_mask and
1477         __builtin_ia32_pbroadcastq128_gpr_mask instead of *_mem_mask
1478         regardless of OPTION_MASK_ISA_64BIT.
1479         * config/i386/avx512fintrin.h (_mm512_set1_epi64,
1480         _mm512_mask_set1_epi64, _mm512_maskz_set1_epi64): Use *_gpr_mask
1481         builtins regardless of whether TARGET_64BIT is defined or not.
1482         * config/i386/avx512vlintrin.h (_mm256_mask_set1_epi64,
1483         _mm256_maskz_set1_epi64, _mm_mask_set1_epi64, _mm_maskz_set1_epi64):
1484         Likewise.
1485
1486         * config/i386/sse.md (*mov<mode>_internal, *avx512f_gatherdi<mode>_2):
1487         Use <MODE_SIZE> instead of GET_MODE_SIZE (<MODE>mode).
1488
1489 2014-12-10  Oleg Endo  <olegendo@gcc.gnu.org>
1490
1491         PR target/53513
1492         * doc/extend.texi (__builtin_sh_set_fpscr): Fix typo.
1493
1494 2014-12-10  Marek Polacek  <polacek@redhat.com>
1495
1496         PR tree-optimization/61686
1497         * tree-ssa-reassoc.c (range_entry_cmp): Use q->high instead of
1498         p->high.
1499
1500 2014-12-10  Kito Cheng  <kito@0xlab.org>
1501
1502         * doc/libgcc.texi: Update text to match implementation in
1503         libgcc/libgcc2.c
1504
1505 2014-12-09  Trevor Saunders  <tsaunders@mozilla.com>
1506
1507         * plugin.c, plugin.def, ggc.h, ggc-common.c, gengtype.h, gengtype.c,
1508         gengtype-state.c, gengtype-parse.c, gentype-lex.l, gcc-plugin.h,
1509         doc/plugins.texi, doc/gty.texi: Remove support for if_marked and
1510         param_is.
1511
1512 2014-12-10  Oleg Endo  <olegendo@gcc.gnu.org>
1513
1514         PR target/53513
1515         * doc/extend.texi (__builtin_sh_get_fpscr, __builtin_sh_get_fpscr):
1516         Document it.
1517
1518 2014-12-09  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
1519
1520         PR middle-end/64225
1521         * tree-ssa-reassoc.c (acceptable_pow_call): Disable transformation
1522         for BUILT_IN_POW when flag_errno_math is present.
1523
1524 2014-12-09  Ilya Verbin  <ilya.verbin@intel.com>
1525
1526         * lto-wrapper.c (compile_offload_image): Start processing in_argv
1527         from 0 instead of 1.
1528         (run_gcc): Put offload objects into offload_argv, put LTO objects and
1529         possible preceding arguments into lto_argv.
1530         Pass offload_argv to compile_images_for_offload_targets instead of argv.
1531         Use lto_argv for LTO recompilation instead of argv.
1532
1533 2014-12-09  Michael Haubenwallner <michael.haubenwallner@ssi-schaefer.com>
1534
1535         * doc/install.texi: Describe --with-aix-soname option.
1536
1537 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1538
1539         * config/aarch64/aarch64-simd.md (aarch64_get_lanedi): Remove.
1540
1541 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1542
1543         PR target/63870
1544         * config/aarch64/aarch64-simd-builtins.def (be_checked_get_lane):
1545         Delete.
1546         * config/aarch64/aarch64-simd.md (aarch64_be_checked_get_lane<mode\>):
1547         Delete.
1548         * config/aarch64/arm_neon.h (aarch64_vget_lane_any): Use GCC
1549         vector extensions, __aarch64_lane, __builtin_aarch64_im_lane_boundsi.
1550         (__aarch64_vget_lane_f32, __aarch64_vget_lane_f64,
1551         __aarch64_vget_lane_p8, __aarch64_vget_lane_p16,
1552         __aarch64_vget_lane_s8, __aarch64_vget_lane_s16,
1553         __aarch64_vget_lane_s32, __aarch64_vget_lane_s64,
1554         __aarch64_vget_lane_u8, __aarch64_vget_lane_u16,
1555         __aarch64_vget_lane_u32, __aarch64_vget_lane_u64,
1556         __aarch64_vgetq_lane_f32, __aarch64_vgetq_lane_f64,
1557         __aarch64_vgetq_lane_p8, __aarch64_vgetq_lane_p16,
1558         __aarch64_vgetq_lane_s8, __aarch64_vgetq_lane_s16,
1559         __aarch64_vgetq_lane_s32, __aarch64_vgetq_lane_s64,
1560         __aarch64_vgetq_lane_u8, __aarch64_vgetq_lane_u16,
1561         __aarch64_vgetq_lane_u32, __aarch64_vgetq_lane_u64): Delete.
1562         (__aarch64_vdup_lane_any): Use __aarch64_vget_lane_any, remove
1563         'q2' argument.
1564         (__aarch64_vdup_lane_f32, __aarch64_vdup_lane_f64,
1565         __aarch64_vdup_lane_p8, __aarch64_vdup_lane_p16,
1566         __aarch64_vdup_lane_s8, __aarch64_vdup_lane_s16,
1567         __aarch64_vdup_lane_s32, __aarch64_vdup_lane_s64,
1568         __aarch64_vdup_lane_u8, __aarch64_vdup_lane_u16,
1569         __aarch64_vdup_lane_u32, __aarch64_vdup_lane_u64,
1570         __aarch64_vdup_laneq_f32, __aarch64_vdup_laneq_f64,
1571         __aarch64_vdup_laneq_p8, __aarch64_vdup_laneq_p16,
1572         __aarch64_vdup_laneq_s8, __aarch64_vdup_laneq_s16,
1573         __aarch64_vdup_laneq_s32, __aarch64_vdup_laneq_s64,
1574         __aarch64_vdup_laneq_u8, __aarch64_vdup_laneq_u16,
1575         __aarch64_vdup_laneq_u32, __aarch64_vdup_laneq_u64): Remove argument
1576         to __aarch64_vdup_lane_any.
1577         (vget_lane_f32, vget_lane_f64, vget_lane_p8, vget_lane_p16,
1578         vget_lane_s8, vget_lane_s16, vget_lane_s32, vget_lane_s64,
1579         vget_lane_u8, vget_lane_u16, vget_lane_u32, vget_lane_u64,
1580         vgetq_lane_f32, vgetq_lane_f64, vgetq_lane_p8, vgetq_lane_p16,
1581         vgetq_lane_s8, vgetq_lane_s16, vgetq_lane_s32, vgetq_lane_s64,
1582         vgetq_lane_u8, vgetq_lane_u16, vgetq_lane_u32, vgetq_lane_u64,
1583         vdupb_lane_p8, vdupb_lane_s8, vdupb_lane_u8, vduph_lane_p16,
1584         vduph_lane_s16, vduph_lane_u16, vdups_lane_f32, vdups_lane_s32,
1585         vdups_lane_u32, vdupb_laneq_p8, vdupb_laneq_s8, vdupb_laneq_u8,
1586         vduph_laneq_p16, vduph_laneq_s16, vduph_laneq_u16, vdups_laneq_f32,
1587         vdups_laneq_s32, vdups_laneq_u32, vdupd_laneq_f64, vdupd_laneq_s64,
1588         vdupd_laneq_u64, vfmas_lane_f32, vfma_laneq_f64, vfmad_laneq_f64,
1589         vfmas_laneq_f32, vfmss_lane_f32, vfms_laneq_f64, vfmsd_laneq_f64,
1590         vfmss_laneq_f32, vmla_lane_f32, vmla_lane_s16, vmla_lane_s32,
1591         vmla_lane_u16, vmla_lane_u32, vmla_laneq_f32, vmla_laneq_s16,
1592         vmla_laneq_s32, vmla_laneq_u16, vmla_laneq_u32, vmlaq_lane_f32,
1593         vmlaq_lane_s16, vmlaq_lane_s32, vmlaq_lane_u16, vmlaq_lane_u32,
1594         vmlaq_laneq_f32, vmlaq_laneq_s16, vmlaq_laneq_s32, vmlaq_laneq_u16,
1595         vmlaq_laneq_u32, vmls_lane_f32, vmls_lane_s16, vmls_lane_s32,
1596         vmls_lane_u16, vmls_lane_u32, vmls_laneq_f32, vmls_laneq_s16,
1597         vmls_laneq_s32, vmls_laneq_u16, vmls_laneq_u32, vmlsq_lane_f32,
1598         vmlsq_lane_s16, vmlsq_lane_s32, vmlsq_lane_u16, vmlsq_lane_u32,
1599         vmlsq_laneq_f32, vmlsq_laneq_s16, vmlsq_laneq_s32, vmlsq_laneq_u16,
1600         vmlsq_laneq_u32, vmul_lane_f32, vmul_lane_s16, vmul_lane_s32,
1601         vmul_lane_u16, vmul_lane_u32, vmuld_lane_f64, vmuld_laneq_f64,
1602         vmuls_lane_f32, vmuls_laneq_f32, vmul_laneq_f32, vmul_laneq_f64,
1603         vmul_laneq_s16, vmul_laneq_s32, vmul_laneq_u16, vmul_laneq_u32,
1604         vmulq_lane_f32, vmulq_lane_s16, vmulq_lane_s32, vmulq_lane_u16,
1605         vmulq_lane_u32, vmulq_laneq_f32, vmulq_laneq_f64, vmulq_laneq_s16,
1606         vmulq_laneq_s32, vmulq_laneq_u16, vmulq_laneq_u32) : Use
1607         __aarch64_vget_lane_any.
1608
1609 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1610
1611         PR target/63870
1612         * gcc/config/aarch64-builtins.c (aarch64_simd_expand_args): Update error
1613         message for SIMD_ARG_CONSTANT.
1614
1615 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1616
1617         PR target/63870
1618         * config/aarch64/aarch64-builtins.c (aarch64_types_binopv_qualifiers,
1619         TYPES_BINOPV): Delete.
1620         (enum aarch64_builtins): Add AARCH64_BUILTIN_SIMD_LANE_CHECK and
1621         AARCH64_SIMD_PATTERN_START.
1622         (aarch64_init_simd_builtins): Register
1623         __builtin_aarch64_im_lane_boundsi; use  AARCH64_SIMD_PATTERN_START.
1624         (aarch64_simd_expand_builtin): Handle AARCH64_BUILTIN_LANE_CHECK; use
1625         AARCH64_SIMD_PATTERN_START.
1626
1627         * config/aarch64/aarch64-simd.md (aarch64_im_lane_boundsi): Delete.
1628         * config/aarch64/aarch64-simd-builtins.def (im_lane_bound): Delete.
1629
1630         * config/aarch64/arm_neon.h (__AARCH64_LANE_CHECK): New.
1631         (__aarch64_vget_lane_f64, __aarch64_vget_lane_s64,
1632         __aarch64_vget_lane_u64, __aarch64_vset_lane_any, vdupd_lane_f64,
1633         vdupd_lane_s64, vdupd_lane_u64, vext_f32, vext_f64, vext_p8, vext_p16,
1634         vext_s8, vext_s16, vext_s32, vext_s64, vext_u8, vext_u16, vext_u32,
1635         vext_u64, vextq_f32, vextq_f64, vextq_p8, vextq_p16, vextq_s8,
1636         vextq_s16, vextq_s32, vextq_s64, vextq_u8, vextq_u16, vextq_u32,
1637         vextq_u64, vmulq_lane_f64): Use __AARCH64_LANE_CHECK.
1638
1639 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1640
1641         PR target/63950
1642         * config/aarch64/arm_neon.h (__AARCH64_NUM_LANES, __aarch64_lane *2):
1643         New.
1644         (aarch64_vset_lane_any): Redefine using previous, same for BE + LE.
1645         (vset_lane_f32, vset_lane_f64, vset_lane_p8, vset_lane_p16,
1646         vset_lane_s8, vset_lane_s16, vset_lane_s32, vset_lane_s64,
1647         vset_lane_u8, vset_lane_u16, vset_lane_u32, vset_lane_u64): Remove
1648         number of lanes.
1649         (vld1_lane_f32, vld1_lane_f64, vld1_lane_p8, vld1_lane_p16,
1650         vld1_lane_s8, vld1_lane_s16, vld1_lane_s32, vld1_lane_s64,
1651         vld1_lane_u8, vld1_lane_u16, vld1_lane_u32, vld1_lane_u64): Call
1652         __aarch64_vset_lane_any rather than vset_lane_xxx.
1653
1654 2014-12-09  Alan Lawrence  <alan.lawrence@arm.com>
1655
1656         * config/aarch64/aarch64.md (absdi2): Remove scratch operand by
1657         earlyclobbering result operand.
1658
1659         * config/aarch64/aarch64-builtins.c (aarch64_types_unop_qualifiers):
1660         Remove final qualifier_internal.
1661         (aarch64_fold_builtin): Stop folding abs builtins, except on floats.
1662
1663 2014-12-09  Wilco Dijkstra  <wilco.dijkstra@arm.com>
1664
1665         * gcc/config/aarch64/aarch64-protos.h (tune-params): Add reasociation
1666         tuning parameters.
1667         * gcc/config/aarch64/aarch64.c (TARGET_SCHED_REASSOCIATION_WIDTH):
1668         Define.
1669         (aarch64_reassociation_width): New function.
1670         (generic_tunings): Add reassociation tuning parameters.
1671         (cortexa53_tunings): Likewise.
1672         (cortexa57_tunings): Likewise.
1673         (thunderx_tunings): Likewise.
1674
1675 2014-12-09  Andrew Pinski  <apinski@cavium.com>
1676             Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
1677
1678         * config/aarch64/aarch64.c (AARCH64_FUSE_CMP_BRANCH): New define.
1679         (thunderx_tunings): Add AARCH64_FUSE_CMP_BRANCH to fuseable_ops.
1680         (aarch_macro_fusion_pair_p): Handle AARCH64_FUSE_CMP_BRANCH.
1681
1682 2014-12-09  David Malcolm  <dmalcolm@redhat.com>
1683
1684         PR jit/64166
1685         * dumpfile.c (gcc::dump_manager::get_dump_file_info_by_switch):
1686         New function.
1687         (gcc::dump_manager::get_dump_file_name): Split out bulk of
1688         implementation into a new overloaded variant taking a
1689         dump_file_info *.
1690         * dumpfile.h (gcc::dump_manager::get_dump_file_info_by_switch):
1691         New function.
1692         (gcc::dump_manager::get_dump_file_name): New overloaded variant of
1693         this function, taking a dump_file_info *.
1694
1695 2014-12-09  Uros Bizjak  <ubizjak@gmail.com>
1696
1697         PR bootstrap/64213
1698         Revert:
1699         2014-11-28  H.J. Lu  <hongjiu.lu@intel.com>
1700
1701         PR rtl-optimization/64037
1702         * combine.c (setup_incoming_promotions): Pass the argument
1703         before any promotions happen to promote_function_mode.
1704
1705 2014-12-09  Richard Biener  <rguenther@suse.de>
1706
1707         PR tree-optimization/64193
1708         * tree-ssa-alias.c (walk_non_aliased_vuses): Add valueize parameter
1709         and valueize the VUSE before looking up the def stmt.
1710         * tree-ssa-alias.h (walk_non_aliased_vuses): Adjust prototype.
1711         * tree-ssa-sccvn.c (vn_reference_lookup_pieces): Pass vn_valueize
1712         to walk_non_aliased_vuses.
1713         (vn_reference_lookup): Likewise.
1714         * tree-ssa-dom.c (lookup_avail_expr): Pass NULL as valueize
1715         callback to walk_non_aliased_vuses.
1716
1717 2014-12-09  Richard Biener  <rguenther@suse.de>
1718
1719         PR middle-end/64199
1720         * fold-const.c (fold_binary_loc): Use TREE_OVERFLOW_P.
1721
1722 2014-12-09  Richard Biener  <rguenther@suse.de>
1723
1724         PR tree-optimization/64191
1725         * tree-vect-stmts.c (vect_stmt_relevant_p): Clobbers are
1726         not relevant (nor are their uses).
1727
1728 2014-12-09  Ilya Enkovich  <ilya.enkovich@intel.com>
1729
1730         * lto/lto-partition.c (privatize_symbol_name): Correctly
1731         privatize instrumentation clones.
1732
1733 2014-12-09  Ilya Enkovich  <ilya.enkovich@intel.com>
1734
1735         * lto-cgraph.c (input_cgraph_1): Don't break existing
1736         instrumentation clone references.
1737         * lto/lto-symtab.c (lto_cgraph_replace_node): Redirect
1738         instrumented_version references appropriately.
1739
1740 2014-12-09  Ilya Enkovich  <ilya.enkovich@intel.com>
1741
1742         PR bootstrap/63995
1743         * tree-chkp.c (chkp_make_static_bounds): Share bounds var
1744         between nodes sharing assembler name.
1745
1746 2014-12-08  Michael Meissner  <meissner@linux.vnet.ibm.com>
1747
1748         PR target/64204
1749         * config/rs6000/rs6000.c (rs6000_emit_move): Do not split TFmode
1750         constant moves if -mupper-regs-df.
1751
1752         * config/rs6000/rs6000.md (mov<mode>_64bit_dm): Optimize moving
1753         0.0L to TFmode.
1754         (movtd_64bit_nodm): Likewise.
1755         (mov<mode>_32bit, FMOVE128 case): Likewise.
1756
1757 2014-12-08  Sandra Loosemore  <sandra@codesourcery.com>
1758
1759         * simplify-rtx.c (simplify_relational_operation_1): Handle
1760         simplification identities for BICS patterns.
1761
1762 2014-12-08  Trevor Saunders  <tsaunders@mozilla.com>
1763
1764         * config/nvptx/nvptx.c: Convert htabs to hash_table.
1765
1766 2014-12-08  David Edelsohn  <dje.gcc@gmail.com>
1767
1768         PR target/64226
1769         * config/rs6000/rs6000.c (rs6000_secondary_reload_inner)
1770         [SYMBOL_REF]: Do not explicitly call create_TOC_reference for
1771         TARGET_TOC. Always use rs6000_emit_move.
1772
1773 2014-12-08  Mark Wielaard  <mjw@redhat.com>
1774
1775         PR debug/60782
1776         * dwarf2out.c (modified_type_die): Handle TYPE_QUAL_ATOMIC.
1777
1778 2014-11-15  David Wohlferd <dw@LimeGreenSocks.com>
1779
1780         PR target/61692
1781         * cfgexpand.c (expand_asm_operands): Count all inline asm params.
1782
1783 2014-12-08  David Malcolm  <dmalcolm@redhat.com>
1784
1785         PR jit/63854
1786         * cgraph.h (xstrdup_for_dump): New function.
1787         * cgraph.c (cgraph_node::get_create): Replace use of xstrdup
1788         within fprintf with xstrdup_for_dump.
1789         (cgraph_edge::make_speculative): Likewise.
1790         (cgraph_edge::resolve_speculation): Likewise.
1791         (cgraph_edge::redirect_call_stmt_to_callee): Likewise.
1792         (cgraph_node::dump): Likewise.
1793         * cgraphclones.c (symbol_table::materialize_all_clones): Likewise.
1794         * ipa-cp.c (perhaps_add_new_callers): Likewise.
1795         * ipa-inline.c (report_inline_failed_reason): Likewise.
1796         (want_early_inline_function_p): Likewise.
1797         (edge_badness): Likewise.
1798         (update_edge_key): Likewise.
1799         (flatten_function): Likewise.
1800         (inline_always_inline_functions): Likewise.
1801         * ipa-profile.c (ipa_profile): Likewise.
1802         * ipa-prop.c (ipa_print_node_jump_functions): Likewise.
1803         (ipa_make_edge_direct_to_target): Likewise.
1804         (remove_described_reference): Likewise.
1805         (propagate_controlled_uses): Likewise.
1806         * ipa-utils.c (ipa_merge_profiles): Likewise.
1807
1808 2014-12-08  Bernd Edlinger  <bernd.edlinger@hotmail.de>
1809
1810         PR ipa/64049
1811         * ipa-polymorphic-call.c
1812         (pa_polymorphic_call_context::ipa_polymorphic_call): Allow RESULT_DECL.
1813
1814 2014-12-08  Alex Velenko  <Alex.Velenko@arm.com>
1815
1816         * config/aarch64/aarch64.md (and_one_cmpl<mode>3_compare0_no_reuse):
1817         New define_insn.
1818         * (and_one_cmpl_<SHIFT:optab><mode>3_compare0_no_reuse):
1819         Likewise.
1820
1821 2014-12-08  Felix Yang  <felix.yang@huawei.com>
1822             Haijian Zhang  <z.zhanghaijian@huawei.com>
1823             Jiji Jiang  <jiangjiji@huawei.com>
1824             Pengfei Sui  <suipengfei@huawei.com>
1825
1826         * config/aarch64/arm_neon.h (vrecpe_u32, vrecpeq_u32): Rewrite using
1827         builtin functions.
1828         (vfma_f32, vfmaq_f32, vfmaq_f64, vfma_n_f32, vfmaq_n_f32, vfmaq_n_f64,
1829         vfms_f32, vfmsq_f32, vfmsq_f64): Likewise.
1830         (vhsub_s8, vhsub_u8, vhsub_s16, vhsub_u16, vhsub_s32, vhsub_u32,
1831         vhsubq_s8, vhsubq_u8, vhsubq_s16, vhsubq_u16, vhsubq_s32, vhsubq_u32,
1832         vsubhn_s16, vsubhn_u16, vsubhn_s32, vsubhn_u32, vsubhn_s64, vsubhn_u66,
1833         vrsubhn_s16, vrsubhn_u16, vrsubhn_s32, vrsubhn_u32, vrsubhn_s64,
1834         vrsubhn_u64, vsubhn_high_s16, vsubhn_high_u16, vsubhn_high_s32,
1835         vsubhn_high_u32, vsubhn_high_s64, vsubhn_high_u64, vrsubhn_high_s16,
1836         vrsubhn_high_u16, vrsubhn_high_s32, vrsubhn_high_u32, vrsubhn_high_s64,
1837         vrsubhn_high_u64): Likewise.
1838         * config/aarch64/iterators.md (VDQ_SI): New mode iterator.
1839         * config/aarch64/aarch64.md (define_c_enum "unspec"): Add UNSPEC_URECPE.
1840         * config/aarch64/aarch64-simd.md (aarch64_urecpe<mode>): New pattern.
1841         * config/aarch64/aarch64-simd-builtins.def (shsub, uhsub, subhn, rsubhn,
1842         subhn2, rsubhn2, urecpe): New builtins.
1843
1844 2014-12-08  Ilya Tocar  <ilya.tocar@intel.com>
1845
1846         * config/i386/i386.c (ix86_expand_vec_perm_vpermi2): Handle v64qi.
1847         * config/i386/sse.md (VEC_PERM_AVX2): Add v64qi.
1848
1849 2014-12-08  Ilya Tocar  <ilya.tocar@intel.com>
1850
1851         * config/i386/i386.c (expand_vec_perm_broadcast_1): Handle v64qi.
1852         (expand_vec_perm_vpermi2_vpshub2): New.
1853         (ix86_expand_vec_perm_const_1): Use it.
1854         (ix86_vectorize_vec_perm_const_ok): Handle v64qi.
1855         * config/i386/sse.md (VEC_PERM_CONST): Add v64qi.
1856
1857 2014-12-08  Ilya Enkovich  <ilya.enkovich@intel.com>
1858
1859         * tree-chkp.c (chkp_build_returned_bound): Don't predict
1860         return bounds for strchr calls.
1861
1862 2014-12-08  Ilya Enkovich  <ilya.enkovich@intel.com>
1863
1864         * tree-chkp.c (chkp_call_returns_bounds_p): New.
1865         (chkp_build_returned_bound): Use zero bounds as
1866         returned by calls not returning bounds.
1867
1868 2014-12-08  Richard Biener  <rguenther@suse.de>
1869
1870         * builtins.c (fold_builtin_0): Remove unused ignore parameter.
1871         (fold_builtin_1): Likewise.
1872         (fold_builtin_3): Likewise.
1873         (fold_builtin_varargs): Likewise.
1874         (fold_builtin_2): Likewise.  Do not fold stpcpy here.
1875         (fold_builtin_n): Adjust.
1876         (fold_builtin_stpcpy): Move to gimple-fold.c.
1877         (gimple_fold_builtin_stpcpy): Moved and gimplified from builtins.c.
1878         (gimple_fold_builtin): Fold stpcpy here.
1879
1880 2014-12-07  Trevor Saunders  <tsaunders@mozilla.com>
1881
1882         * symtab.c (symtab_node::verify): Check for section attribute before
1883         asserting something isn't in a section and a comdat group.
1884
1885 2014-12-07  Oleg Endo  <olegendo@gcc.gnu.org>
1886
1887         PR target/50751
1888         * config/sh/sh.md (extendqihi2): Allow only for TARGET_SH1.
1889
1890 2014-12-07  Eric Botcazou  <ebotcazou@adacore.com>
1891
1892         * compare-elim.c: Fix head comment.
1893         (conforming_compare): Remove redundant test.
1894         (can_eliminate_compare): New function extracted from...
1895         (before_dom_children): ...here.  Use it, replace direct uses of
1896         flag_non_call_exceptions and tidy up.
1897         (maybe_select_cc_mode): Tidy up.
1898
1899 2014-12-07  Felix Yang  <felix.yang@huawei.com>
1900             Shanyao Chen  <chenshanyao@huawei.com>
1901
1902         * config/aarch64/aarch64-simd.md (clrsb<mode>2, popcount<mode>2): New
1903         patterns.
1904         * config/aarch64/aarch64-simd-builtins.def (clrsb, popcount): New
1905         builtins.
1906         * config/aarch64/arm_neon.h (vcls_s8, vcls_s16, vcls_s32, vclsq_s8,
1907         vclsq_s16, vclsq_s32, vcnt_p8, vcnt_s8, vcnt_u8, vcntq_p8, vcntq_s8,
1908         vcntq_u8): Rewrite using builtin functions.
1909
1910 2014-12-07  Jan Hubicka  <hubicka@ucw.cz>
1911
1912         * symtab.c (symtab_node::equal_address_to): New function.
1913         * cgraph.h (symtab_node::equal_address_to): Declare.
1914         * fold-const.c (fold_comparison, fold_binary_loc): Use it.
1915         * c-family/c-common.c: Refuse weaks for symbols that can not change
1916         visibility.
1917
1918 2014-12-07  Jonathan Wakely  <jwakely@redhat.com>
1919
1920         * doc/invoke.texi (Warning Options): Fix spelling and grammar.
1921
1922 2014-12-06  James Greenhalgh  <james.greenhalgh@arm.com>
1923             Sebastian Pop  <s.pop@samsung.com>
1924             Brian Rzycki  <b.rzycki@samsung.com>
1925
1926         PR tree-optimization/54742
1927         * params.def (max-fsm-thread-path-insns, max-fsm-thread-length,
1928         max-fsm-thread-paths): New.
1929
1930         * doc/invoke.texi (max-fsm-thread-path-insns, max-fsm-thread-length,
1931         max-fsm-thread-paths): Documented.
1932
1933         * tree-cfg.c (split_edge_bb_loc): Export.
1934         * tree-cfg.h (split_edge_bb_loc): Declared extern.
1935
1936         * tree-ssa-threadedge.c (simplify_control_stmt_condition): Restore the
1937         original value of cond when simplification fails.
1938         (fsm_find_thread_path): New.
1939         (fsm_find_control_statement_thread_paths): New.
1940         (thread_through_normal_block): Call find_control_statement_thread_paths.
1941
1942         * tree-ssa-threadupdate.c (dump_jump_thread_path): Pretty print
1943         EDGE_FSM_THREAD.
1944         (verify_seme): New.
1945         (duplicate_seme_region): New.
1946         (thread_through_all_blocks): Generate code for EDGE_FSM_THREAD edges
1947         calling duplicate_seme_region.
1948
1949         * tree-ssa-threadupdate.h (jump_thread_edge_type): Add EDGE_FSM_THREAD.
1950
1951 2014-12-06  H.J. Lu  <hongjiu.lu@intel.com>
1952
1953         PR target/64200
1954         * config/i386/i386.c (decide_alg): Don't assert "alg != libcall"
1955         for TARGET_INLINE_STRINGOPS_DYNAMICALLY.
1956
1957 2014-12-05  Jakub Jelinek  <jakub@redhat.com>
1958
1959         PR sanitizer/64170
1960         * sanopt.c (maybe_optimize_asan_check_ifn): If base_checks is
1961         non-NULL, call maybe_get_dominating_check on it even if g is
1962         non-NULL.
1963
1964 2014-12-05  Jeff Law  <law@redhat.com>
1965
1966         * doc/md.texi: Note problems using function calls to determine
1967         insn lengths and point readers to a potential workaround.
1968
1969 2014-12-05  Andreas Schwab  <schwab@linux-m68k.org>
1970
1971         * combine.c (is_parallel_of_n_reg_sets)
1972         (can_split_parallel_of_n_reg_sets): Only define if !HAVE_cc0.
1973
1974 2014-12-05  Andrew Pinski  <apinski@cavium.com>
1975
1976         * config/aarch64/aarch64-simd-builtins.def (bswap): Use CF2 rather
1977         than CF10 so 2 is appended on the code.
1978         * config/aarch64/aarch64-simd.md (bswap<mode>): Rename to ...
1979         (bswap<mode>2): This so it matches for the optabs.
1980
1981 2014-12-05  Thomas Preud'homme  <thomas.preudhomme@arm.com>
1982
1983         * regrename.c (find_best_rename_reg): Rename to ...
1984         (find_rename_reg): This. Also add a parameter to skip tick check.
1985         * regrename.h: Likewise.
1986         * config/c6x/c6x.c (try_rename_operands): Adapt to above renaming.
1987
1988 2014-12-05  Martin Jambor  <mjambor@suse.cz>
1989
1990         PR ipa/64192
1991         * ipa-prop.c (ipa_compute_jump_functions_for_edge): Convert alignment
1992         from bits to bytes after checking they are byte-aligned.
1993
1994 2014-12-05  Renlin Li  <renlin.li@arm.com>
1995
1996         * config/aarch64/aarch64-opts.h (AARCH64_CORE): Rename IDENT to SCHED.
1997         * config/aarch64/aarch64.h (AARCH64_CORE): Likewise.
1998         * config/aarch64/aarch64.c (AARCH64_CORE): Rename X to IDENT,
1999         IDENT to SCHED.
2000
2001 2014-12-05  Bin Cheng  <bin.cheng@arm.com>
2002
2003         * config/aarch64/aarch64.md (load_pair<mode>): Split to
2004         load_pairsi, load_pairdi, load_pairsf and load_pairdf.
2005         (load_pairsi, load_pairdi, load_pairsf, load_pairdf): Split
2006         from load_pair<mode>.  New alternative to support int/fp
2007         registers in fp/int mode patterns.
2008         (store_pair<mode>:): Split to store_pairsi, store_pairdi,
2009         store_pairsf and store_pairdi.
2010         (store_pairsi, store_pairdi, store_pairsf, store_pairdf): Split
2011         from store_pair<mode>.  New alternative to support int/fp
2012         registers in fp/int mode patterns.
2013         (*load_pair_extendsidi2_aarch64): New pattern.
2014         (*load_pair_zero_extendsidi2_aarch64): New pattern.
2015         (aarch64-ldpstp.md): Include.
2016         * config/aarch64/aarch64-ldpstp.md: New file.
2017         * config/aarch64/aarch64-protos.h (aarch64_gen_adjusted_ldpstp):
2018         New.
2019         (extract_base_offset_in_addr): New.
2020         (aarch64_operands_ok_for_ldpstp): New.
2021         (aarch64_operands_adjust_ok_for_ldpstp): New.
2022         * config/aarch64/aarch64.c (enum sched_fusion_type): New enum.
2023         (TARGET_SCHED_FUSION_PRIORITY): New hook.
2024         (fusion_load_store): New functon.
2025         (extract_base_offset_in_addr): New function.
2026         (aarch64_gen_adjusted_ldpstp): New function.
2027         (aarch64_sched_fusion_priority): New function.
2028         (aarch64_operands_ok_for_ldpstp): New function.
2029         (aarch64_operands_adjust_ok_for_ldpstp): New function.
2030
2031 2014-12-05  Olivier Hainque  <hainque@adacore.com>
2032
2033         * defaults.h: (DWARF_REG_TO_UNWIND_COLUMN): Define default.
2034         * dwarf2cfi.c (init_one_dwarf_reg_size): Honor
2035         DWARF_REG_TO_UNWIND_COLUMN.
2036
2037 2014-12-05  Olivier Hainque  <hainque@adacore.com>
2038
2039         * dwarf2cfi.c (init_one_dwarf_reg_size): New helper, processing
2040         one particular reg for expand_builtin_init_dwarf_reg_sizes.
2041         (expand_builtin_init_dwarf_reg_sizes): Rework to use helper and
2042         account for dwarf register spans.
2043
2044 2014-12-05  Ilya Enkovich  <ilya.enkovich@intel.com>
2045
2046         PR target/64003
2047         * config/i386/i386.md (*jcc_1_bnd): New.
2048         (*jcc_2_bnd): New.
2049         (jump_bnd): New.
2050         (*jcc_1): Remove bnd prefix.
2051         (*jcc_2): Likewise.
2052         (jump): Likewise.
2053
2054 2014-12-05  Renlin Li  <renlin.li@arm.com>
2055
2056         * config/aarch64/aarch64.c (aarch64_parse_cpu): Don't define
2057         selected_tune.
2058         (aarch64_override_options): Use selected_cpu's tuning.
2059
2060 2014-12-05  David Edelsohn  <dje.gcc@gmail.com>
2061
2062         * config/rs6000/xcoff.h (ASM_OUTPUT_ALIGNED_LOCAL): Append
2063         alignment to section name. Increase default alignment to word.
2064
2065 2014-12-05  Martin Jambor  <mjambor@suse.cz>
2066
2067         * cgraph.h (cgraph_node): New method expand_all_artificial_thunks.
2068         (cgraph_edge): New method redirect_callee_duplicating_thunks.
2069         * cgraphclones.c (duplicate_thunk_for_node): Donot expand newly
2070         created thunks.
2071         (redirect_edge_duplicating_thunks): Turned into edge method
2072         redirect_callee_duplicating_thunks.
2073         (cgraph_node::expand_all_artificial_thunks): New method.
2074         (create_clone): Call expand_all_artificial_thunks.
2075         * ipa-cp.c (perhaps_add_new_callers): Call
2076         redirect_callee_duplicating_thunks instead of redirect_callee.
2077         Also call expand_all_artificial_thunks.
2078
2079 2014-12-05  Ilya Enkovich  <ilya.enkovich@intel.com>
2080
2081         PR target/64056
2082         * doc/sourcebuild.texi: Add mempcpy and stpcpy for Effective-Target
2083         Keywords.
2084
2085 2014-12-05  Manuel López-Ibáñez  <manu@gcc.gnu.org>
2086
2087         * diagnostic.h (diagnostic_expand_location): New inline function.
2088         * diagnostic.c (diagnostic_build_prefix): Use it.
2089         (diagnostic_show_locus): Likewise.
2090
2091 2014-12-04  H.J. Lu  <hongjiu.lu@intel.com>
2092
2093         PR bootstrap/64189
2094         * configure.ac (HAVE_LD_PIE_COPYRELOC): Always define.
2095         * configure: Regenerated.
2096
2097 2014-12-04  Manuel López-Ibáñez  <manu@gcc.gnu.org>
2098
2099         * diagnostic.c (diagnostic_color_init): New.
2100         * diagnostic.h: Declare.
2101         * gcc.c (driver::global_initializations): Use it.
2102         (driver_handle_option): Handle -fdiagnostics-color_.
2103         * toplev.c: Do not include diagnostic-color.h.
2104         (process_options): Do not initialize color diagnostics here.
2105         * common.opt (fdiagnostics-color=): Add Driver.
2106         * opts-global.c (init_options_once): Initialize color here.
2107         * opts.c (common_handle_option): Use diagnostics_color_init.
2108         * diagnostic-color.h: Fix comment.
2109
2110 2014-12-04  David Malcolm  <dmalcolm@redhat.com>
2111
2112         * tree-pretty-print.c (INDENT): Rename "buffer" to "pp".
2113         (NIY): Likewise.
2114         (buffer): Rename this variable to...
2115         (tree_pp): ...this.
2116
2117         (do_niy): Rename param from "buffer" to "pp".
2118         (dump_decl_name): Likewise.
2119         (dump_function_name): Likewise.
2120         (dump_function_declaration): Likewise.
2121         (dump_array_domain): Likewise.
2122         (dump_omp_clause): Likewise.
2123         (dump_omp_clauses): Likewise.
2124         (dump_location): Likewise.
2125         (dump_block_node): Likewise.
2126         (dump_generic_node): Likewise.
2127         (print_declaration): Likewise.
2128         (print_struct_decl): Likewise.
2129         (print_call_name): Likewise.
2130         (pretty_print_string): Likewise.
2131         (newline_and_indent): Likewise.
2132
2133         (print_generic_decl): Update for renaming of "buffer" to
2134         "tree_pp".
2135         (print_generic_stmt): Likewise.
2136         (print_generic_stmt_indented): Likewise.
2137         (print_generic_expr): Likewise.
2138         (maybe_init_pretty_print): Likewise.
2139
2140 2014-12-04  David Malcolm  <dmalcolm@redhat.com>
2141
2142         PR jit/63854
2143         * tree-pretty-print.c: Eliminate include of <new>.
2144         (buffer): Convert this variable from a pretty_printer to a
2145         pretty_printer *.
2146         (initialized): Eliminate this variable in favor of the NULL-ness
2147         of "buffer".
2148         (print_generic_decl): Update for "buffer" becoming a pointer.
2149         (print_generic_stmt): Likewise.
2150         (print_generic_stmt_indented): Likewise.
2151         (print_generic_expr): Likewise.
2152         (maybe_init_pretty_print): Likewise, allocating "buffer" on the
2153         heap and using its non-NULL-ness to ensure idempotency.
2154
2155 2014-12-04  David Malcolm  <dmalcolm@redhat.com>
2156
2157         PR jit/63854
2158         * ipa-prop.c (ipa_register_cgraph_hooks): Guard insertion of
2159         ipa_add_new_function on function_insertion_hook_holder being
2160         non-NULL.
2161         * ipa-reference.c (ipa_reference_c_finalize): Remove
2162         node_removal_hook_holder and node_duplication_hook_holder if
2163         they've been added to symtab.
2164         * toplev.c (toplev::finalize): Call ipa_reference_c_finalize
2165         before cgraph_c_finalize so that the former can access "symtab".
2166
2167 2014-12-04  David Malcolm  <dmalcolm@redhat.com>
2168
2169         * doc/cfg.texi (GIMPLE statement iterators): Add note about
2170         gphi_iterator, and use one in the example.
2171         * doc/gimple.texi (Tuple specific accessors): Add missing
2172         GIMPLE_GOTO section and menu item.
2173         (gimple_build_asm, gimple gimple_build_assign_with_ops)
2174         gimple_call_mark_uninlinable, gimple_call_cannot_inline_p): Remove
2175         description of removed functions.
2176         (gimple_build_assign, gimple_build_bind, gimple_build_call,
2177         gimple_build_call_from_tree, gimple_build_call_vec,
2178         gimple_build_catch, gimple_build_cond,
2179         gimple_build_cond_from_tree, gimple_build_debug_bind,
2180         gimple_build_eh_filter, gimple_build_label, gimple_build_goto,
2181         gimple_build_omp_atomic_load, gimple_build_omp_atomic_store,
2182         gimple_build_omp_continue, gimple_build_omp_critical,
2183         gimple_build_omp_for, gimple_build_omp_parallel,
2184         gimple_build_omp_sections, gimple_build_omp_single,
2185         gimple_build_return, gimple_build_resx, gimple_build_switch,
2186         gimple_build_try): Update return type within description to
2187         reflect changes in gimple.h to using gimple subclasses.
2188         (gimple_build_asm_vec): Update return type, params and
2189         description.
2190         (gimple_asm_ninputs): Update param.
2191         (gimple_asm_noutputs, gimple_asm_nclobbers, gimple_asm_input_op
2192         gimple_asm_set_input_op, gimple_asm_output_op
2193         gimple_asm_set_output_op, gimple_asm_clobber_op,
2194         gimple_asm_set_clobber_op, gimple_asm_string,
2195         gimple_asm_volatile_p, gimple_asm_set_volatile, gimple_bind_vars,
2196         gimple_bind_set_vars, gimple_bind_append_vars, gimple_bind_body,
2197         gimple_bind_set_body, gimple_bind_add_stmt, gimple_bind_add_seq,
2198         gimple_bind_block, gimple_bind_set_block, gimple_call_set_fn,
2199         gimple_call_return_type, gimple_call_set_chain,
2200         gimple_call_set_tail, gimple_call_tail_p,
2201         gimple_call_copy_skip_args, gimple_catch_types,
2202         gimple_catch_types_ptr, gimple_catch_handler,
2203         gimple_catch_set_types, gimple_catch_set_handler,
2204         gimple_cond_set_code, gimple_cond_set_lhs, gimple_cond_set_rhs,
2205         gimple_cond_true_label, gimple_cond_set_true_label,
2206         gimple_cond_set_false_label, gimple_cond_false_label,
2207         gimple_cond_make_false, gimple_cond_make_true,
2208         gimple_eh_filter_set_types, gimple_eh_filter_set_failure,
2209         gimple_eh_must_not_throw_fndecl,
2210         gimple_eh_must_not_throw_set_fndecl, gimple_label_label,
2211         gimple_label_set_label, gimple_goto_set_dest,
2212         gimple_omp_atomic_load_set_lhs, gimple_omp_atomic_load_lhs,
2213         gimple_omp_atomic_load_set_rhs, gimple_omp_atomic_load_rhs,
2214         gimple_omp_atomic_store_set_val, gimple_omp_atomic_store_val,
2215         gimple_omp_continue_control_def,
2216         gimple_omp_continue_control_def_ptr,
2217         gimple_omp_continue_set_control_def,
2218         gimple_omp_continue_control_use,
2219         gimple_omp_continue_control_use_ptr,
2220         gimple_omp_continue_set_control_use, gimple_omp_critical_name,
2221         gimple_omp_critical_name_ptr, gimple_omp_critical_set_name,
2222         gimple_omp_parallel_clauses_ptr, gimple_omp_parallel_set_clauses,
2223         gimple_omp_parallel_child_fn, gimple_omp_parallel_child_fn_ptr,
2224         gimple_omp_parallel_set_child_fn, gimple_omp_parallel_data_arg,
2225         gimple_omp_parallel_data_arg_ptr,
2226         gimple_omp_parallel_set_data_arg, gimple_omp_single_set_clauses,
2227         gimple_phi_set_result, gimple_phi_set_arg, gimple_resx_region,
2228         gimple_resx_set_region, gimple_return_retval,
2229         gimple_return_set_retval, gimple_switch_num_labels,
2230         gimple_switch_set_num_labels, gimple_switch_index,
2231         gimple_switch_set_index, gimple_switch_label,
2232         gimple_switch_set_label, gimple_switch_default_label,
2233         gimple_switch_set_default_label, gimple_try_set_eval,
2234         gimple_try_set_cleanup): Update initial param within description
2235         to reflect changes in gimple.h to using gimple subclasses.
2236         (Adding a new GIMPLE statement code): Update to reflect gimple
2237         statement subclassing.
2238
2239 2014-12-04  Sriraman Tallam  <tmsriram@google.com>
2240             H.J. Lu  <hongjiu.lu@intel.com>
2241
2242         * configure.ac (HAVE_LD_PIE_COPYRELOC): Defined to 1 if
2243         Linux/x86-64 linker supports PIE with copy reloc.
2244         * config.in: Regenerated.
2245         * configure: Likewise.
2246
2247         * config/i386/i386.c (legitimate_pic_address_disp_p): Allow
2248         pc-relative address for undefined, non-weak, non-function
2249         symbol reference in 64-bit PIE if linker supports PIE with
2250         copy reloc.
2251
2252         * doc/sourcebuild.texi: Document pie_copyreloc target.
2253
2254 2014-12-04  Marek Polacek  <polacek@redhat.com>
2255
2256         PR middle-end/56917
2257         * fold-const.c (fold_unary_loc): Perform the negation in A's type
2258         when transforming ~ (A - 1) or ~ (A + -1) to -A.
2259
2260 2014-12-04  Tobias Burnus  <burnus@net-b.de>
2261
2262         * Makefile.in: Remove CLOOGLIB and CLOOGINC.
2263
2264 2014-12-04  Richard Biener  <rguenther@suse.de>
2265
2266         * doc/match-and-simplify.texi: Update for recent changes.
2267
2268 2014-12-04  Martin Jambor  <mjambor@suse.cz>
2269
2270         * ipa-prop.h (ipa_alignment): New type.
2271         (ipa_jump_func): New field alignment.
2272         (ipcp_transformation_summary) New type.
2273         (ipcp_grow_transformations_if_necessary): Declare.
2274         (ipa_node_agg_replacements): Removed.
2275         (ipcp_transformations): Declare.
2276         (ipcp_get_transformation_summary): New function.
2277         (ipa_get_agg_replacements_for_node): Use it.
2278         * ipa-cp.c (ipcp_param_lattices): New field alignment.
2279         (print_all_lattices): Also print alignment.
2280         (alignment_bottom_p): New function.
2281         (set_alignment_to_bottom): Likewise.
2282         (set_all_contains_variable): Also set alignment to bottom.
2283         (initialize_node_lattices): Likewise.
2284         (propagate_alignment_accross_jump_function): New function.
2285         (propagate_constants_accross_call): Call it.
2286         (ipcp_store_alignment_results): New function.
2287         (ipcp_driver): Call it.
2288         * ipa-prop.c (ipa_node_agg_replacements): Removed.
2289         (ipcp_transformations): New.
2290         (ipa_print_node_jump_functions_for_edge): Also print alignment.
2291         (ipa_set_jf_unknown): New function.
2292         (detect_type_change_from_memory_writes): Use ipa_set_jf_unknown.
2293         (ipa_compute_jump_functions_for_edge): Also calculate alignment.
2294         (update_jump_functions_after_inlining): Use ipa_set_jf_unknown.
2295         (ipcp_grow_transformations_if_necessary): New function.
2296         (ipa_set_node_agg_value_chain): Use ipcp_transformations.
2297         (ipa_node_removal_hook): Likewise.
2298         (ipa_node_duplication_hook): Also duplicate alignment results.
2299         (ipa_write_jump_function): Also stream alignments.
2300         (ipa_read_jump_function): Use ipa_set_jf_unknown, also stream
2301         alignments.
2302         (write_agg_replacement_chain): Renamed to
2303         write_ipcp_transformation_info, also stream alignments.
2304         (read_agg_replacement_chain): Renamed to
2305         read_ipcp_transformation_info, also stream alignments.
2306         (ipa_prop_write_all_agg_replacement): Renamed to
2307         ipcp_write_transformation_summaries. Stream always.
2308         (ipa_prop_read_all_agg_replacement): Renamed to
2309         ipcp_read_transformation_summaries.
2310         (ipcp_update_alignments): New function.
2311         (ipcp_transform_function): Call it, free also alignments.
2312
2313 2014-12-04  Richard Biener  <rguenther@suse.de>
2314
2315         * gimple-fold.c (replace_stmt_with_simplification): Properly
2316         fail when maybe_push_res_to_seq fails.
2317
2318 2014-12-04 Ganesh Gopalasubramanian  <Ganesh.Gopalasubramanian@amd.com>
2319
2320         * config/aarch64/aarch64.md (define_insn "prefetch"): New.
2321
2322 2014-12-04  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
2323
2324         * doc/install.texi: Remove mentions of cloog and ppl.
2325         * doc/invoke.texi: Likewise
2326
2327 2014-12-04  Jakub Jelinek  <jakub@redhat.com>
2328
2329         PR c++/56493
2330         * convert.c (convert_to_real, convert_to_expr, convert_to_complex):
2331         Handle COMPOUND_EXPR.
2332
2333 2014-12-04  Richard Biener  <rguenther@suse.de>
2334
2335         * builtins.c (target_newline): Export.
2336         (target_percent_s_newline): Likewise.
2337         (fold_builtin_1): Do not fold printf functions here.
2338         (fold_builtin_2): Likewise.
2339         (fold_builtin_3): Likewise, do not fold strncat.
2340         (fold_builtin_strncat): Move to gimple-fold.c.
2341         (fold_builtin_printf): Likewise.
2342         * builtins.h (target_newline): Declare.
2343         (target_percent_s_newline): Likewise.
2344         * gimple-fold.c (gimple_fold_builtin_strncat): Move from
2345         builtins.c and gimplify.
2346         (gimple_fold_builtin_printf): Likewise.
2347         (gimple_fold_builtin): Fold strncat, printf, printf_unlocked,
2348         vprintf, printf_chk and vprintf_chk here.
2349
2350 2014-12-03  David Edelsohn  <dje.gcc@gmail.com>
2351
2352         * config/rs6000/rs6000.md (floatsidf2_internal): Use std::swap.
2353         (floatunssidf2_internal): Same.
2354         * config/rs6000/rs6000.c (rs6000_emit_vector_compare): Same.
2355         (rs6000_emit_int_cmove): Same.
2356         (rs6000_sched_reorder): Same.
2357         (altivec_expand_vec_perm_const): Same.
2358         (rs6000_expand_vec_perm_const_1): Same.
2359
2360 2014-12-03  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
2361
2362         PR rtl-optimization/64010
2363         * reload.c (push_reload): Before reusing a register contained
2364         in an operand as input reload register, ensure that it is not
2365         used in CALL_INSN_FUNCTION_USAGE.
2366
2367 2014-12-03  Ulrich Drepper  <drepper@gmail.com>
2368
2369         * Makefile.in: Use $(LN_S) instead of $(LN) -s and remove file first
2370         if it exists.
2371
2372 2014-12-03  Jakub Jelinek  <jakub@redhat.com>
2373
2374         * expmed.c (expand_mult): Use std::swap.
2375
2376         PR c/59708
2377         * expmed.c (expand_widening_mult): Return const0_rtx if
2378         coeff is 0.
2379
2380         * doc/gimple.texi (gimple_build_assign_with_ops): Remove.
2381         (gimple_build_assign): Document the new overloads.
2382
2383 2014-12-03  Michael Meissner  <meissner@linux.vnet.ibm.com>
2384
2385         PR target/64019
2386         * config/rs6000/rs6000.c (rs6000_legitimize_reload_address): Do
2387         not create LO_SUM address for constant addresses if the type can
2388         go in Altivec registers.
2389
2390 2014-12-03  Manuel López-Ibáñez  <manu@gcc.gnu.org>
2391
2392         PR fortran/44054
2393         * pretty-print.c (output_buffer::output_buffer): Init flush_p to true.
2394         (pp_flush): Flush only if flush_p.
2395         (pp_really_flush): New.
2396         * pretty-print.h (struct output_buffer): Add flush_p.
2397         (pp_really_flush): Declare.
2398
2399 2014-12-03  Jakub Jelinek  <jakub@redhat.com>
2400
2401         * Makefile.in (ALL_HOST_BACKEND_OBJS): Add $(GENGTYPE_OBJS),
2402         gcc-ar.o, gcc-nm.o and gcc-ranlib.o.
2403         (GENGTYPE_OBJS): New.
2404         (gengtype-lex.o, gengtype-parse.o, gengtype-state.o, gengtype.o):
2405         Remove explicit dependencies.
2406         (CFLAGS-gengtype-lex.o, CFLAGS-gengtype-parse.o,
2407         CFLAGS-gengtype-state.o, CFLAGS-gengtype.o): Add -DHOST_GENERATOR_FILE
2408         instead of -DGENERATOR_FILE.
2409         (CFLAGS-errors.o): New.
2410         * gengtype.c: Instead of testing GENERATOR_FILE define, test
2411         HOST_GENERATOR_FILE.  If defined, include config.h and define
2412         GENERATOR_FILE afterwards, otherwise include bconfig.h.
2413         * gengtype-parse.c: Likewise.
2414         * gengtype-state.c: Likewise.
2415         * gengtype-lex.l: Likewise.
2416         * errors.c: Likewise.
2417
2418 2014-12-03  Joern Rennecke  <joern.rennecke@embecosm.com>
2419
2420         * config/epiphany/epiphany.c (epiphany_override_options):
2421         If TARGET_SOFT_CMPSF is not enabled, set flag_finite_math_only.
2422         * config/epiphany/epiphany.md (mov<mode>cc): Don't use
2423         reverse_condition_maybe_unordered if flag_finite_math_only is set.
2424
2425 2014-12-03  Andrew Stubbs  <ams@codesourcery.com>
2426
2427         Revert:
2428
2429         2014-09-17  Andrew Stubbs  <ams@codesourcery.com>
2430         * config/arm/arm.c (arm_option_override): Reject -mfpu=neon
2431         when architecture is older than ARMv7.
2432
2433 2014-12-03  Richard Biener  <rguenther@suse.de>
2434
2435         * builtins.c (target_percent_c): Export.
2436         (fold_builtin_fprintf): Move to gimple-fold.c.
2437         (fold_builtin_2): Do not fold fprintf functions.
2438         (fold_builtin_3): Likewise.
2439         (fold_builtin_4): Remove.
2440         (fold_builtin_n): Do not call fold_builtin_4.
2441         * builtins.h (target_percent_c): Declare.
2442         * gimple-fold.c (gimple_fold_builtin_fprintf): Move from
2443         builtins.c and gimplify.
2444         (gimple_fold_builtin): Fold fprintf, fprintf_unlocked, vfprintf,
2445         fprintf_chk and vfprintf_chk here.
2446
2447 2014-12-03  Martin Jambor  <mjambor@suse.cz>
2448
2449         PR ipa/64153
2450         * ipa-inline-analysis.c (evaluate_conditions_for_known_args): Check
2451         type sizes before view_converting.
2452
2453 2014-12-03  H.J. Lu  <hongjiu.lu@intel.com>
2454
2455         PR rtl-optimization/64151
2456         PR rtl-optimization/64156
2457         * ira-costs.c (scan_one_insn): Revert r218266.
2458
2459 2014-12-03  Richard Biener  <rguenther@suse.de>
2460
2461         * builtins.c (fold_builtin_fpclassify): Change to take
2462         array of arguments instead of CALL_EXPR tree.
2463         (MAX_ARGS_TO_FOLD_BUILTIN): Remove.
2464         (fold_builtin_n): Dispatch to fold_builtin_varargs.
2465         (fold_call_expr): Always use fold_builtin_n.
2466         (fold_builtin_call_array): Change to not build the unfolded call,
2467         always use fold_builtin_n.
2468         (fold_builtin_varargs): Change to take array of arguments instead
2469         of CALL_EXPR tree.
2470         (fold_call_stmt): Always use fold_builtin_n.
2471         * tree.c (build_call_expr_loc_array): Use fold_build_call_array_loc.
2472         * fold-const.c (fold_build_call_array_loc): Build the call
2473         if fold_builtin_call_array returned NULL_TREE.
2474         * gimple-fold.c (gimple_fold_stmt_to_constant_1): Do not build
2475         a CALL_EXPR and use fold_builtin_call_array instead of
2476         fold_call_expr.
2477
2478 2014-12-03  Alan Lawrence  <alan.lawrence@arm.com>
2479
2480         * config/aarch64/aarch64-simd.md (aarch64_simd_dup<mode>, orn<mode>3,
2481         bic<mode>3, add<mode>3, sub<mode>3, neg<mode>2, abs<mode>2, and<mode>3,
2482         ior<mode>3, xor<mode>3, one_cmpl<mode>2,
2483         aarch64_simd_lshr<mode> ,arch64_simd_ashr<mode>,
2484         aarch64_simd_imm_shl<mode>, aarch64_simd_reg_sshl<mode>,
2485         aarch64_simd_reg_shl<mode>_unsigned, aarch64_simd_reg_shr<mode>_signed,
2486         ashl<mode>3, lshr<mode>3, ashr<mode>3, vashl<mode>3,
2487         reduc_plus_scal_<mode>, aarch64_vcond_internal<mode><mode>,
2488         vcondu<mode><mode>, aarch64_cm<optab><mode>, aarch64_cmtst<mode>):
2489         Change VDQ to VDQ_I.
2490
2491         (mul<mode>3): Change VDQM to VDQ_BHSI.
2492         (aarch64_simd_vec_set<mode>,vashr<mode>3, vlshr<mode>3, vec_set<mode>,
2493         aarch64_mla<mode>, aarch64_mls<mode>, <su><maxmin><mode>3,
2494         aarch64_<sur>h<addsub><mode>): Change VQ_S to VDQ_BHSI.
2495
2496         (*aarch64_<su>mlal<mode>, *aarch64_<su>mlsl<mode>,
2497         aarch64_<ANY_EXTEND:su><ADDSUB:optab>l<mode>,
2498         aarch64_<ANY_EXTEND:su><ADDSUB:optab>w<mode>, aarch64_<sur>shll_n<mode>):
2499         Change VDW to VD_BHSI.
2500         (*aarch64_combinez<mode>, *aarch64_combinez_be<mode>):
2501         Change VDIC to VD_BHSI.
2502
2503         * config/aarch64/aarch64-simd-builtins.def (saddl, uaddl, ssubl, usubl,
2504         saddw, uaddw, ssubw, usubw, shadd, uhadd, srhadd, urhadd, sshll_n,
2505         ushll_n): Change BUILTIN_VDW to BUILTIN_VD_BHSI.
2506
2507         * config/aarch64/iterators.md (SDQ_I, VDQ, VQ_S, VSDQ_I_BHSI, VDQM, VDW,
2508         VDIC, VDQQHS): Remove.
2509         (Vwtype): Update comment (changing VDW to VD_BHSI).
2510
2511 2014-12-03  Richard Biener  <rguenther@suse.de>
2512
2513         PR middle-end/14541
2514         * builtins.c (fold_builtin_logarithm): Implement simplifications ...
2515         * match.pd: ... here as patterns.
2516
2517 2014-12-03  Prachi Godbole  <prachi.godbole@imgtec.com>
2518
2519         * config/mips/p5600.md (define_automaton, define_cpu_unit): Replace
2520         p5600_agen_pipe and p5600_alu_pipe with p5600_agen_alq_pipe.
2521         (p5600_int_arith_1, p5600_int_arith_2, p5600_int_arith_4): Change
2522         reservation order.
2523
2524 2014-12-03  Tom de Vries  <tom@codesourcery.com>
2525
2526         PR rtl-optimization/63957
2527         * doc/invoke.texi: Replace -fuse-caller-save with -fipa-ra.
2528         * final.c (rest_of_handle_final): Replace flag_use_caller_save with
2529         flag_ipa_ra.
2530         (get_call_reg_set_usage): Same.
2531         * lra-assigns.c (lra_assign): Same.
2532         * lra-constraints.c (need_for_call_save_p): Same.
2533         * lra-lives.c (process_bb_lives): Same.
2534         * lra.c (lra): Same.
2535         * calls.c (expand_call): Same.
2536         (emit_library_call_value_1): Same.
2537         * config/arm/arm.c (arm_option_override): Same.
2538         * opts.c (default_options_table): Replace OPT_fuse_caller_save with
2539         OPT_fipa_ra.
2540         * target.def (call_fusage_contains_non_callee_clobbers): Replace
2541         fuse-caller-save with fipa-ra.
2542         * doc/tm.texi (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS): Same.
2543         * common.opt: Same.
2544
2545 2014-12-03  Yury Gribov  <y.gribov@samsung.com>
2546
2547         * sanopt.c (maybe_get_single_definition): New function.
2548         (maybe_get_dominating_check): Ditto.
2549         (can_remove_asan_check): Ditto.
2550         (struct tree_map_traits): New struct.
2551         (struct sanopt_ctx): Use custom traits for asan_check_map.
2552         (maybe_optimize_ubsan_null_ifn): Move code to
2553         maybe_get_dominating_check.
2554         (maybe_optimize_asan_check_ifn): Move code and take non-SSA expressions
2555         into account when optimizing.
2556         (sanopt_optimize_walker): Optimize ASan checks even when
2557         recovering.
2558
2559 2014-12-03  Ilya Enkovich  <ilya.enkovich@intel.com>
2560
2561         * config/i386/constraints.md (Yr): New.
2562         * config/i386/i386.h (reg_class): Add NO_REX_SSE_REGS.
2563         (REG_CLASS_NAMES): Likewise.
2564         (REG_CLASS_CONTENTS): Likewise.
2565         * config/i386/sse.md (*vec_concatv2sf_sse4_1): Add alternatives
2566         which use only NO_REX_SSE_REGS.
2567         (vec_set<mode>_0): Likewise.
2568         (*vec_setv4sf_sse4_1): Likewise.
2569         (sse4_1_insertps): Likewise.
2570         (*sse4_1_extractps): Likewise.
2571         (*sse4_1_mulv2siv2di3<mask_name>): Likewise.
2572         (*<sse4_1_avx2>_mul<mode>3<mask_name>): Likewise.
2573         (*sse4_1_<code><mode>3<mask_name>): Likewise.
2574         (*sse4_1_<code><mode>3): Likewise.
2575         (*sse4_1_eqv2di3): Likewise.
2576         (sse4_2_gtv2di3): Likewise.
2577         (*vec_extractv4si): Likewise.
2578         (*vec_concatv2si_sse4_1): Likewise.
2579         (vec_concatv2di): Likewise.
2580         (<sse4_1>_blend<ssemodesuffix><avxsizesuffix>): Likewise.
2581         (<sse4_1>_blendv<ssemodesuffix><avxsizesuffix>): Likewise.
2582         (<sse4_1>_dp<ssemodesuffix><avxsizesuffix>): Likewise.
2583         (<vi8_sse4_1_avx2_avx512>_movntdqa): Likewise.
2584         (<sse4_1_avx2>_mpsadbw): Likewise.
2585         (<sse4_1_avx2>packusdw<mask_name>): Likewise.
2586         (<sse4_1_avx2>_pblendvb): Likewise.
2587         (sse4_1_pblendw): Likewise.
2588         (sse4_1_phminposuw): Likewise.
2589         (sse4_1_<code>v8qiv8hi2<mask_name>): Likewise.
2590         (sse4_1_<code>v4qiv4si2<mask_name>): Likewise.
2591         (sse4_1_<code>v4hiv4si2<mask_name>): Likewise.
2592         (sse4_1_<code>v2qiv2di2<mask_name>): Likewise.
2593         (sse4_1_<code>v2hiv2di2<mask_name>): Likewise.
2594         (sse4_1_<code>v2siv2di2<mask_name>): Likewise.
2595         (sse4_1_ptest): Likewise.
2596         (<sse4_1>_round<ssemodesuffix><avxsizesuffix>): Likewise.
2597         (sse4_1_round<ssescalarmodesuffix>): Likewise.
2598         * config/i386/subst.md (mask_prefix4): New.
2599         * config/i386/x86-tune.def (X86_TUNE_AVOID_4BYTE_PREFIXES): New.
2600
2601 2014-12-03  Segher Boessenkool  <segher@kernel.crashing.org>
2602
2603         PR rtl-optimization/52714
2604         * combine.c (try_combine): Allow combining two insns into two
2605         new insns if at least one of those is a noop.
2606
2607 2014-12-03  Bin Cheng  <bin.cheng@arm.com>
2608
2609         * target.def (fusion_priority): Wrap code with @smallexample.
2610         * doc/tm.texi: Regenerated.
2611
2612 2014-12-03  Manuel López-Ibáñez  <manu@gcc.gnu.org>
2613
2614         * diagnostic.c (diagnostic_show_locus): Honor override_column when
2615         placing the caret.
2616
2617 2014-12-02  Dmitry Vyukov  <dvyukov@google.com>
2618
2619         * asan.c: (asan_finish_file): Use default priority for constructors
2620         in kernel mode.
2621
2622 2014-12-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
2623
2624         PR target/64115
2625         * config/rs6000/rs6000.c (rs6000_delegitimize_address): Remove
2626         invalid UNSPEC_TOCREL sanity check under ENABLE_CHECKING.
2627
2628 2014-12-02  H.J. Lu  <hongjiu.lu@intel.com>
2629
2630         PR target/64108
2631         * config/i386/i386.c (decide_alg): Stop only if there aren't
2632         any usable algorithms.
2633
2634 2014-12-02  Tom de Vries  <tom@codesourcery.com>
2635
2636         PR rtl-optimization/63718
2637         * config/arm/arm.c (arm_option_override): Disable fuse-caller-save for
2638         Thumb1.
2639
2640 2014-12-02  Richard Biener  <rguenther@suse.de>
2641
2642         * match.pd: When combining divisions exclude the degenerate
2643         case involving INT_MIN from overflow handling.
2644
2645 2014-12-02  Wilco Dijkstra  <wilco.dijkstra@arm.com>
2646
2647         * ira-costs.c (scan_one_insn): Improve spill cost adjustment.
2648
2649 2014-12-02  Martin Jambor  <mjambor@suse.cz>
2650
2651         PR ipa/63814
2652         * ipa-cp.c (same_node_or_its_all_contexts_clone_p): New function.
2653         (cgraph_edge_brings_value_p): New parameter dest, use
2654         same_node_or_its_all_contexts_clone_p and check availability.
2655         (cgraph_edge_brings_value_p): Likewise.
2656         (get_info_about_necessary_edges): New parameter dest, pass it to
2657         cgraph_edge_brings_value_p.  Update caller.
2658         (gather_edges_for_value): Likewise.
2659         (perhaps_add_new_callers): Use cgraph_edge_brings_value_p to check
2660         both the destination and availability.
2661
2662 2014-12-02  Uros Bizjak  <ubizjak@gmail.com>
2663
2664         PR target/64113
2665         * config/alpha/alpha.md (call_value_osf_tlsgd): Do not split insn
2666         using post-reload splitter.  Use peephole2 pass instead.
2667         (call_value_osf_tlsldm): Ditto.
2668         (TLS_CALL): New int iterator.
2669         (tls): New int attribute.
2670         (call_value_osf_<tls>): Merge insn pattern from call_value_osf_tlsgd
2671         and call_value_tlsldm using TLS_CALL int iterator.
2672
2673 2014-12-02  Richard Biener  <rguenther@suse.de>
2674             Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
2675
2676         * genmatch.c: Include hash-set.h.
2677         (fatal_at): Add source_location overload.
2678         (parser::record_operlist): New method.
2679         (parser::push_simplify): Likewise.
2680         (parser::oper_lists_set): New member.
2681         (parser::oper_lists): Likewise.
2682         (parser::parse_operation): Record seen operator list references.
2683         (parser::parse_c_expr): Likewise.
2684         (parser::parse_simplify): Init oper_lists_set and oper_lists
2685         and use push_simplify.
2686         (parser::parser): Init oper_lists_set and oper_lists.
2687
2688 2014-12-02  Richard Biener  <rguenther@suse.de>
2689
2690         * match.pd: Restrict division combining to trunc_div and
2691         exact_div.
2692
2693 2014-12-02  Jakub Jelinek  <jakub@redhat.com>
2694
2695         * config/sparc/sparc.c (sparc_atomic_assign_expand_fenv):
2696         Remove NULL last argument from create_tmp_var calls.
2697         * config/mips/mips.c (mips_atomic_assign_expand_fenv): Likewise.
2698         * config/arm/arm-builtins.c (arm_atomic_assign_expand_fenv): Likewise.
2699         * config/i386/i386.c (add_condition_to_bb,
2700         ix86_atomic_assign_expand_fenv): Likewise.
2701         * config/mep/mep.c (mep_gimplify_va_arg_expr): Likewise.
2702         * config/xtensa/xtensa.c (xtensa_gimplify_va_arg_expr): Likewise.
2703         * config/aarch64/aarch64-builtins.c
2704         (aarch64_atomic_assign_expand_fenv): Likewise.
2705         * config/stormy16/stormy16.c (xstormy16_gimplify_va_arg_expr):
2706         Likewise.
2707         * config/rs6000/rs6000.c (rs6000_atomic_assign_expand_fenv): Likewise.
2708         * config/alpha/alpha.c (alpha_atomic_assign_expand_fenv): Likewise.
2709         * config/sh/sh.c (sh_gimplify_va_arg_expr): Likewise.
2710
2711         * config/alpha/alpha.c (alpha_gimple_fold_builtin): Use
2712         gimple_build_assign instead of gimple_build_assign_with_ops and swap
2713         the order of first two arguments.
2714         * config/aarch64/aarch64-builtins.c (aarch64_gimple_fold_builtin):
2715         Likewise.  Remove last NULL_TREE argument.
2716
2717 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2718
2719         PR rtl-optimization/59278
2720         * combine (reg_dead_at_p): Consider REG_UNUSED notes.
2721
2722 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2723
2724         * combine.c (try_combine): Use is_parallel_of_n_reg_sets some more.
2725
2726 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2727
2728         * combine.c (is_parallel_of_n_reg_sets): New function.
2729         (can_split_parallel_of_n_reg_sets): New function.
2730         (try_combine): If I2 is a PARALLEL of two SETs, split it into
2731         two insns if possible.
2732
2733 2014-12-01  Tobias Burnus  <burnus@net-b.de>
2734             Jack Howarth  <howarth@bromo.med.uc.edu>
2735
2736         PR middle-end/64017
2737         * configure.ac (ac_has_isl_schedule_constraints_compute_schedule):
2738         New check.
2739         * doc/install.texi (ISL): Permit ISL 0.14.
2740         * graphite-optimize-isl.c (getScheduleForBandList, optimize_isl):
2741         Conditionally use ISL 0.13+ functions.
2742         * graphite-interchange.c: Make 'extern "C"' conditional.
2743         * graphite-isl-ast-to-gimple.c: Ditto.
2744         * graphite-poly.c: Ditto.
2745         * graphite-sese-to-poly.c: Ditto.
2746         * config.in: Regenerate.
2747         * gcc/configure: Regenerate.
2748
2749 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2750
2751         * combine.c (distribute_links): Handle multiple SETs.
2752
2753 2014-12-01  Segher Boessenkool  <segher@kernel.crashing.org>
2754
2755         * combine.c (struct insn_link): New field `regno'.
2756         (alloc_insn_link): New parameter `regno'.  Use it.
2757         (find_single_use): Check the new field.
2758         (can_combine_def_p, can_combine_use_p): New functions.  Split
2759         off from ...
2760         (create_log_links): ... here.  Correct data type of `regno'.
2761         Adjust call to alloc_insn_link.
2762         (adjust_for_new_dest): Find regno, use it in call to
2763         alloc_insn_link.
2764         (try_combine): Check reg_used_between_p when combining a PARALLEL
2765         as earlier insn.  Adjust call to alloc_insn_link.
2766         (distribute_links): Check the new field.
2767
2768 2014-12-01  David Malcolm  <dmalcolm@redhat.com>
2769
2770         PR jit/63854
2771         * real.c (real_from_string): Add missing mpfr_clear.
2772
2773 2014-12-01  David Malcolm  <dmalcolm@redhat.com>
2774
2775         PR jit/63854
2776         * tree-ssa-math-opts.c (execute_cse_sincos_1): Fix a missing
2777         release of stmts by converting it to an auto_vec.
2778
2779 2014-12-01  Richard Biener  <rguenther@suse.de>
2780
2781         * Makefile.in (gimple-match.o-warn): Use -Wno-unused instead of
2782         -Wno-unused-variable and -Wno-unused-but-set-variable to restore
2783         bootstrap with old GCC.
2784         (generic-match.o-warn): Likewise.
2785
2786 2014-12-01  Richard Biener  <rguenther@suse.de>
2787
2788         * fold-const.c (const_binop): Handle POINTER_PLUS_EXPR.
2789         Properly handle FIXED_CST shifts by INTEGER_CST.
2790         (const_binop): Move COMPLEX_EXPR, VEC_PACK_TRUNC_EXPR,
2791         VEC_PACK_FIX_TRUNC_EXPR, VEC_WIDEN_MULT_LO_EXPR,
2792         VEC_WIDEN_MULT_HI_EXPR, VEC_WIDEN_MULT_EVEN_EXPR and
2793         VEC_WIDEN_MULT_ODD_EXPR handling here from ...
2794         (fold_binary_loc): ... here.  Call const_binop overload
2795         with result type.
2796
2797 2014-12-01  Marek Polacek  <polacek@redhat.com>
2798             Jakub Jelinek  <jakub@redhat.com>
2799
2800         PR sanitizer/64121
2801         * ubsan.c (instrument_object_size): Stop searching if the base
2802         occurs in abnormal phi.
2803
2804 2014-12-01  Marek Polacek  <polacek@redhat.com>
2805
2806         PR sanitizer/63956
2807         * ubsan.c (is_ubsan_builtin_p): Check also built-in class.
2808
2809 2014-12-01  Jakub Jelinek  <jakub@redhat.com>
2810
2811         * gimple.h (gimple_build_assign_stat): Remove prototype.
2812         (gimple_build_assign): Remove define.  Add overload prototypes
2813         with tree lhs and either a tree rhs, or enum tree_code and
2814         1, 2 or 3 tree operands.
2815         * gimple.c (gimple_build_assign_stat): Renamed to...
2816         (gimple_build_assign): ... this.  Add overloads with
2817         enum tree_code and 1, 2 or 3 tree operands.
2818         (gimple_build_assign_with_ops): Remove 1 and 2 operand overloads.
2819         Rename the 3 operand overload to ...
2820         (gimple_build_assign_1): ... this.  Make it static inline.
2821         * tree-ssa-strlen.c (get_string_length): Use gimple_build_assign
2822         instead of gimple_build_assign_with_ops, swap the order of first
2823         two arguments and adjust formatting where necessary.
2824         * tree-vect-slp.c (vect_get_constant_vectors,
2825         vect_create_mask_and_perm): Likewise.
2826         * tree-ssa-forwprop.c (simplify_rotate): Likewise.
2827         * asan.c (build_shadow_mem_access, maybe_create_ssa_name,
2828         maybe_cast_to_ptrmode, asan_expand_check_ifn): Likewise.
2829         * tsan.c (instrument_builtin_call): Likewise.
2830         * tree-chkp.c (chkp_compute_bounds_for_assignment,
2831         chkp_generate_extern_var_bounds): Likewise.
2832         * tree-loop-distribution.c (generate_memset_builtin): Likewise.
2833         * tree-ssa-loop-im.c (rewrite_reciprocal): Likewise.
2834         * gimple-builder.c (build_assign, build_type_cast): Likewise.
2835         * tree-vect-loop-manip.c (vect_create_cond_for_align_checks): Likewise.
2836         * value-prof.c (gimple_divmod_fixed_value, gimple_mod_pow2,
2837         gimple_mod_subtract): Likewise.
2838         * gimple-match-head.c (maybe_push_res_to_seq): Likewise.
2839         * tree-vect-patterns.c (vect_recog_dot_prod_pattern,
2840         vect_recog_sad_pattern, vect_handle_widen_op_by_const,
2841         vect_recog_widen_mult_pattern, vect_recog_pow_pattern,
2842         vect_recog_widen_sum_pattern, vect_operation_fits_smaller_type,
2843         vect_recog_over_widening_pattern, vect_recog_widen_shift_pattern,
2844         vect_recog_rotate_pattern, vect_recog_vector_vector_shift_pattern,
2845         vect_recog_divmod_pattern, vect_recog_mixed_size_cond_pattern,
2846         adjust_bool_pattern_cast, adjust_bool_pattern,
2847         vect_recog_bool_pattern): Likewise.
2848         * gimple-ssa-strength-reduction.c (create_add_on_incoming_edge,
2849         insert_initializers, introduce_cast_before_cand,
2850         replace_one_candidate): Likewise.
2851         * tree-ssa-math-opts.c (insert_reciprocals, powi_as_mults_1,
2852         powi_as_mults, build_and_insert_binop, build_and_insert_cast,
2853         pass_cse_sincos::execute, bswap_replace, convert_mult_to_fma):
2854         Likewise.
2855         * tree-tailcall.c (adjust_return_value_with_ops,
2856         update_accumulator_with_ops): Likewise.
2857         * tree-predcom.c (reassociate_to_the_same_stmt): Likewise.
2858         * tree-ssa-reassoc.c (build_and_add_sum,
2859         optimize_range_tests_to_bit_test, update_ops,
2860         maybe_optimize_range_tests, rewrite_expr_tree, linearize_expr,
2861         negate_value, repropagate_negates, attempt_builtin_powi,
2862         reassociate_bb): Likewise.
2863         * tree-vect-loop.c (vect_is_simple_reduction_1,
2864         get_initial_def_for_induction, vect_create_epilog_for_reduction):
2865         Likewise.
2866         * ipa-split.c (split_function): Likewise.
2867         * tree-ssa-phiopt.c (conditional_replacement, minmax_replacement,
2868         abs_replacement, neg_replacement): Likewise.
2869         * tree-profile.c (gimple_gen_edge_profiler): Likewise.
2870         * tree-vrp.c (simplify_truth_ops_using_ranges,
2871         simplify_float_conversion_using_ranges,
2872         simplify_internal_call_using_ranges): Likewise.
2873         * gimple-fold.c (rewrite_to_defined_overflow, gimple_build): Likewise.
2874         * tree-vect-generic.c (expand_vector_divmod,
2875         optimize_vector_constructor): Likewise.
2876         * ubsan.c (ubsan_expand_null_ifn, ubsan_expand_objsize_ifn,
2877         instrument_bool_enum_load): Likewise.
2878         * tree-ssa-loop-manip.c (create_iv): Likewise.
2879         * omp-low.c (lower_rec_input_clauses, expand_omp_for_generic,
2880         expand_omp_for_static_nochunk, expand_omp_for_static_chunk,
2881         expand_cilk_for, simd_clone_adjust): Likewise.
2882         * trans-mem.c (expand_transaction): Likewise.
2883         * tree-vect-data-refs.c (bump_vector_ptr, vect_permute_store_chain,
2884         vect_setup_realignment, vect_permute_load_chain,
2885         vect_shift_permute_load_chain): Likewise.
2886         * tree-vect-stmts.c (vect_init_vector, vectorizable_mask_load_store,
2887         vectorizable_simd_clone_call, vect_gen_widened_results_half,
2888         vect_create_vectorized_demotion_stmts, vectorizable_conversion,
2889         vectorizable_shift, vectorizable_operation, vectorizable_store,
2890         permute_vec_elements, vectorizable_load): Likewise.
2891
2892 2014-12-01  Richard Biener  <rguenther@suse.de>
2893
2894         PR middle-end/64111
2895         * tree.c (int_cst_hasher::hash): Use TYPE_UID instead of
2896         htab_hash_pointer to not break PCH.
2897
2898 2014-12-01  Richard Biener  <rguenther@suse.de>
2899
2900         PR tree-optimization/15346
2901         * Makefile.in (gimple-match.o-warn): Remove -Wno-unused-parameter,
2902         add -Wno-unused-but-set-variable.
2903         * match.pd: Combine two successive divisions.
2904
2905 2014-12-01  Richard Biener  <rguenther@suse.de>
2906
2907         PR middle-end/64126
2908         * match.pd: Allow conversions in ~A + 1 -> -A, add -A - 1 -> ~A
2909         and -1 - A -> ~A.
2910         * fold-const.c (fold_binary_loc): Remove transforms here.
2911
2912 2014-12-01  Maciej W. Rozycki  <macro@codesourcery.com>
2913
2914         * config/mips/mips.c (mips16_build_call_stub): Move the save of
2915         the return address in $18 ahead of passing arguments to FPRs.
2916
2917 2014-12-01  Ilya Enkovich  <ilya.enkovich@intel.com>
2918
2919         PR target/64055
2920         * tree-chkp.c (chkp_find_bound_slots_1): Allow non constant
2921         values in array domain.
2922
2923 2014-12-01  Yuri Rumyantsev  <ysrumyan@gmail.com>
2924
2925         PR tree-optimization/63941
2926         * tree-if-conv.c (add_to_predicate_list): Delete wrong assertion that
2927         DOM_BB has non-true predicate, conditionally set non-true predicate
2928         for BB.
2929
2930 2014-12-01  Martin Jambor  <mjambor@suse.cz>
2931
2932         PR ipa/63551
2933         * ipa-inline-analysis.c (evaluate_conditions_for_known_args): Convert
2934         value of the argument to the type of the value in the condition.
2935
2936 2014-12-01  Oleg Endo  <olegendo@gcc.gnu.org>
2937
2938         PR target/63986
2939         PR target/51244
2940         * config/sh/sh.c (sh_unspec_insn_p,
2941         sh_insn_operands_modified_between_p): New functions.
2942         (sh_split_movrt_negc_to_movt_xor): Do not delete insn if its operands
2943         are modified or if it has side effects, may trap or is volatile.
2944
2945 2014-11-29  Jakub Jelinek  <jakub@redhat.com>
2946
2947         * gimple-expr.h (create_tmp_var_raw, create_tmp_var,
2948         create_tmp_reg): Add default NULL value to last argument.
2949         * tree-ssanames.h (make_ssa_name, copy_ssa_name): Likewise.
2950         * gimple-low.c (lower_builtin_posix_memalign): Remove NULL
2951         last argument from create_tmp_var_raw, create_tmp_var,
2952         create_tmp_reg, make_ssa_name and copy_ssa_name calls.
2953         * tree-ssa-strlen.c (get_string_length): Likewise.
2954         * tree-emutls.c (gen_emutls_addr, lower_emutls_1): Likewise.
2955         * tree-ssa-phiprop.c (phiprop_insert_phi): Likewise.
2956         * tree-vect-slp.c (vect_get_constant_vectors): Likewise.
2957         * ipa-prop.c (ipa_modify_call_arguments): Likewise.
2958         * tree-ssa-forwprop.c (simplify_rotate): Likewise.
2959         * tree-ssa-ccp.c (fold_builtin_alloca_with_align): Likewise.
2960         * asan.c (build_shadow_mem_access, maybe_create_ssa_name,
2961         maybe_cast_to_ptrmode, asan_expand_check_ifn): Likewise.
2962         * tsan.c (instrument_expr, instrument_builtin_call,
2963         instrument_func_entry): Likewise.
2964         * varpool.c (add_new_static_var): Likewise.
2965         * tree-loop-distribution.c (generate_memset_builtin): Likewise.
2966         * gimplify.c (internal_get_tmp_var, gimplify_return_expr,
2967         gimplify_modify_expr_to_memcpy, gimplify_modify_expr_to_memset,
2968         gimplify_init_ctor_eval_range, gimplify_init_constructor,
2969         gimplify_omp_atomic, gimplify_expr): Likewise.
2970         * gimple-builder.c (build_assign, build_type_cast): Likewise.
2971         * tree-vect-loop-manip.c (slpeel_update_phi_nodes_for_guard1,
2972         slpeel_update_phi_nodes_for_guard2, slpeel_tree_peel_loop_to_edge,
2973         vect_loop_versioning): Likewise.
2974         * tree-if-conv.c (version_loop_for_if_conversion): Likewise.
2975         * gimple-match-head.c (maybe_push_res_to_seq): Likewise.
2976         * tree-vect-patterns.c (vect_handle_widen_op_by_const,
2977         vect_recog_widen_mult_pattern, vect_operation_fits_smaller_type,
2978         vect_recog_over_widening_pattern): Likewise.
2979         * tree-sra.c (build_ref_for_offset, create_access_replacement):
2980         Likewise.
2981         * tree-cfg.c (make_blocks): Likewise.
2982         * tree-eh.c (lower_eh_constructs_2, lower_resx, lower_eh_dispatch):
2983         Likewise.
2984         * tree-ssa-propagate.c (update_call_from_tree): Likewise.
2985         * tree-complex.c (get_component_ssa_name, expand_complex_div_wide):
2986         Likewise.
2987         * tree-ssa-math-opts.c (build_and_insert_cast): Likewise.
2988         * tree-tailcall.c (update_accumulator_with_ops): Likewise.
2989         * tree-predcom.c (initialize_root_vars, initialize_root_vars_lm,
2990         execute_load_motion, reassociate_to_the_same_stmt): Likewise.
2991         * tree-ssa-reassoc.c (build_and_add_sum,
2992         optimize_range_tests_to_bit_test, update_ops,
2993         maybe_optimize_range_tests, rewrite_expr_tree, linearize_expr,
2994         negate_value, repropagate_negates): Likewise.
2995         * tree-vect-loop.c (vect_is_simple_reduction_1,
2996         vect_create_epilog_for_reduction): Likewise.
2997         * ipa-split.c (split_function): Likewise.
2998         * tree-inline.c (remap_ssa_name, setup_one_parameter,
2999         declare_return_variable, tree_function_versioning): Likewise.
3000         * tree-cfgcleanup.c (fixup_noreturn_call): Likewise.
3001         * cfgexpand.c (update_alias_info_with_stack_vars, expand_used_vars):
3002         Likewise.
3003         * tree-ssa-phiopt.c (conditional_replacement, abs_replacement,
3004         neg_replacement): Likewise.
3005         * gimplify-me.c (force_gimple_operand_1, gimple_regimplify_operands):
3006         Likewise.
3007         * tree-vrp.c (simplify_truth_ops_using_ranges,
3008         simplify_float_conversion_using_ranges,
3009         simplify_internal_call_using_ranges): Likewise.
3010         * tree-switch-conversion.c (emit_case_bit_tests,
3011         build_one_array, build_arrays, gen_def_assigns): Likewise.
3012         * gimple-fold.c (gimple_fold_builtin_memory_op,
3013         gimple_fold_builtin_strcat, gimple_fold_call, gimple_build): Likewise.
3014         * tree-vect-generic.c (expand_vector_divmod,
3015         optimize_vector_constructor): Likewise.
3016         * ubsan.c (ubsan_encode_value, ubsan_expand_null_ifn,
3017         ubsan_expand_objsize_ifn, instrument_si_overflow,
3018         instrument_bool_enum_load, instrument_nonnull_arg): Likewise.
3019         * tree-outof-ssa.c (insert_backedge_copies): Likewise.
3020         * tree-ssa-loop-manip.c (create_iv,
3021         tree_transform_and_unroll_loop): Likewise.
3022         * omp-low.c (scan_omp_parallel, lower_rec_simd_input_clauses,
3023         lower_rec_input_clauses, lower_lastprivate_clauses,
3024         expand_parallel_call, expand_omp_for_static_chunk,
3025         expand_omp_atomic_pipeline, expand_omp_target,
3026         maybe_add_implicit_barrier_cancel, lower_omp_single_simple,
3027         lower_omp_critical, lower_omp_for, task_copyfn_copy_decl,
3028         lower_depend_clauses, lower_omp_target, lower_omp_1,
3029         ipa_simd_modify_stmt_ops, simd_clone_adjust): Likewise.
3030         * tree-parloops.c (take_address_of, create_phi_for_local_result,
3031         create_call_for_reduction_1, separate_decls_in_region,
3032         create_parallel_loop): Likewise.
3033         * graphite-sese-to-poly.c (rewrite_cross_bb_scalar_dependence,
3034         handle_scalar_deps_crossing_scop_limits): Likewise.
3035         * trans-mem.c (lower_transaction, build_tm_load, build_tm_store,
3036         expand_assign_tm, expand_call_tm, expand_transaction,
3037         ipa_tm_insert_gettmclone_call): Likewise.
3038         * tree-vect-data-refs.c (bump_vector_ptr, vect_setup_realignment):
3039         Likewise.
3040         * tree-vect-stmts.c (vect_init_vector, vectorizable_mask_load_store,
3041         vectorizable_call, vectorizable_simd_clone_call,
3042         vectorizable_conversion, vectorizable_store, permute_vec_elements,
3043         vectorizable_load): Likewise.
3044
3045 2014-11-29  Tobias Burnus  <burnus@net-b.de>
3046             Manuel López-Ibáñez  <manu@gcc.gnu.org>
3047
3048         * opt-functions.awk (lang_enabled_by): Support || for
3049         enabled-by.
3050         * optc-gen.awk: Ditto.
3051         * doc/options.texi (LangEnabledBy, EnabledBy): Document the
3052         || syntax.
3053
3054 2014-11-28  Mike Stump  <mikestump@comcast.net>
3055
3056         * bitmap.c (bitmap_ior): Zap current as it could be deleted.
3057         (bitmap_ior_and_compl): Likewise.
3058
3059 2014-11-28  Vladimir Makarov  <vmakarov@redhat.com>
3060
3061         PR target/64061
3062         * lra.c (lra_substitute_pseudo): Ignore constant with int mode for
3063         subreg.
3064
3065 2014-11-28  Segher Boessenkool  <segher@kernel.crashing.org>
3066
3067         PR target/64093
3068         * config/rs6000/rs6000.md (and<mode>3): Don't generate
3069         and<mode>3_imm unless rs6000_gen_cell_microcode is true.
3070
3071 2014-11-28  Vladimir Makarov  <vmakarov@redhat.com>
3072
3073         PR rtl-optimization/64087
3074         * lra-lives.c (process_bb_lives): Add debug output.
3075         (lra_create_live_ranges): Don't remove dead insn on the second
3076         call of lra_create_live_ranges_1.
3077
3078 2014-11-28  H.J. Lu  <hongjiu.lu@intel.com>
3079
3080         PR rtl-optimization/64037
3081         * combine.c (setup_incoming_promotions): Pass the argument
3082         before any promotions happen to promote_function_mode.
3083
3084 2014-11-28  Evgeny Stupachenko  <evstupac@gmail.com>
3085
3086         * tree-vect-data-refs.c (vect_transform_grouped_load): Limit shift
3087         permutations to loads group of size 3.
3088
3089 2014-11-28  Jiong Wang  <jiong.wang@arm.com>
3090
3091         * config/arm/arm.md (copysignsf3): New pattern.
3092         (copysigndf3): Likewise.
3093
3094 2014-11-28  Andrey Turetskiy  <andrey.turetskiy@intel.com>
3095             Ilya Verbin  <ilya.verbin@intel.com>
3096
3097         * omp-low.c (lower_omp_critical): Mark critical sections
3098         inside target functions as offloadable.
3099
3100 2014-11-28  Ilya Verbin  <ilya.verbin@intel.com>
3101
3102         * lto-wrapper.c (run_gcc): Set have_lto and have_offload if at least one
3103         file contains sections with LTO and offload IR, respectively.
3104
3105 2014-11-28  Ilya Verbin  <ilya.verbin@intel.com>
3106
3107         * cgraphunit.c (ipa_passes): Handle flag_generate_offload.
3108         (symbol_table::compile): Set flag_generate_offload if there is something
3109         to offload.
3110         * common.opt (flag_generate_offload): New Variable declaration.
3111         * dwarf2out.c (dwarf2out_finish): Handle flag_generate_offload.
3112         * ipa-inline-analysis.c (inline_generate_summary): Do not skip if
3113         flag_generate_offload is set.
3114         * lto-streamer.c (gate_lto_out): Handle flag_generate_offload.
3115         * passes.c (ipa_write_summaries): Do not skip if flag_generate_offload
3116         is set.
3117         * toplev.c (compile_file): Emit LTO marker if offload info has been
3118         previously emitted.  Do not emit lto_slim marker if
3119         flag_generate_offload is without flag_generate_lto.
3120         * tree.c (free_lang_data): Do not skip if flag_generate_offload is set.
3121
3122 2014-11-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3123
3124         * config/arm/arm-cores.def (cortex-a17.cortex-a7): New entry.
3125         * config/arm/arm-tables.opt: Regenerate.
3126         * config/arm/arm-tune.md: Regenerate.
3127         * config/arm/bpabi.h (BE8_LINK_SPEC): Add mcpu=cortex-a17.cortex-a7.
3128         * config/arm/t-aprofile: Add cortex-a17.cortex-a7 entry to
3129         MULTILIB_MATCHES.
3130
3131 2014-11-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3132
3133         * config/arm/arm.md (generic_sched): Specify cortexa17 in 'no' list.
3134         Include cortex-a17.md.
3135         * config/arm/arm.c (arm_issue_rate): Specify 2 for cortexa17.
3136         * config/arm/arm-cores.def (cortex-a17): New entry.
3137         * config/arm/arm-tables.opt: Regenerate.
3138         * config/arm/arm-tune.md: Regenerate.
3139         * config/arm/bpabi.h (BE8_LINK_SPEC): Specify mcpu=cortex-a17.
3140         * config/arm/cortex-a17.md: New file.
3141         * config/arm/cortex-a17-neon.md: New file.
3142         * config/arm/driver-arm.c (arm_cpu_table): Add entry for cortex-a17.
3143         * config/arm/t-aprofile: Add cortex-a17 entries to MULTILIB_MATCHES.
3144
3145 2014-11-28  Richard Biener  <rguenther@suse.de>
3146
3147         PR middle-end/64084
3148         * genmatch.c (dt_node::gen_kids_1): New function, split out
3149         from dt_node::gen_kids.
3150         (decision_tree::cmp_node): DT_TRUE are generally not equal.
3151         (decision_tree::find_node): Treat DT_TRUE as barrier for
3152         node CSE on the same level.
3153         (dt_node::append_node): Do not keep DT_TRUE last.
3154         (dt_node::gen_kids): Emit code after each DT_TRUE node seen.
3155
3156 2014-11-28  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
3157
3158         * config/arm/t-aprofile (MULTILIB_MATCHES): New entry for
3159         -march=armv8-a+crc.
3160
3161 2014-11-27  Uros Bizjak  <ubizjak@gmail.com>
3162
3163         * config/i386/i386.md (preferred_for_size): New attribute
3164         (*pushxf): Split Yx*r constraints to r,*r.  Use preferred_for_size
3165         attribute to conditionally disable alternative 1.
3166         (*pushdf): Split Yd*r constraints to r,*r.  Use preferred_for_size
3167         and prefered_for_speed attributes to conditionally disable
3168         alternative 1.
3169         (*movxf_internal): Split Yx*r constraints to r,*r.  Use
3170         preferred_for_size attribute to conditionally disable
3171         alternatives 3 and 4.
3172         (*movdf_internal): Split Yd*r constraints to r,*r.  Use
3173         preferred_for_size and prefered_for_speed attributes to conditionally
3174         disable alternatives 3 and 4.
3175         * config/i386/constraints.md (Yd, Yx): Remove register constraints.
3176
3177 2014-11-27  Eric Botcazou  <ebotcazou@adacore.com>
3178
3179         * dwarf2out.c (set_block_origin_self): Skip nested functions.
3180
3181 2014-11-27  H.J. Lu  <hongjiu.lu@intel.com>
3182
3183         PR target/63833
3184         * config/i386/i386.h (REAL_PIC_OFFSET_TABLE_REGNUM): Use
3185         R15_REG for 64-bit.
3186         * config/i386/rdos64.h (REAL_PIC_OFFSET_TABLE_REGNUM): Removed.
3187
3188 2014-11-27  Martin Liska  <mliska@suse.cz>
3189             David Malcolm  <dmalcolm@redhat.com>
3190
3191         * ipa-icf.c (sem_function::equals_private): int* is replaced with
3192         auto_vec.
3193         (sem_function::bb_dict_test): Likewise.
3194         * ipa-icf.h: Likewise.
3195
3196 2014-11-27  Richard Biener  <rguenther@suse.de>
3197
3198         PR middle-end/64088
3199         * fold-const.c (const_unop): Re-instantiate missing condition
3200         before calling fold_abs_const.
3201
3202         PR tree-optimization/64088
3203         * tree-ssa-tail-merge.c (update_debug_stmt): After resetting
3204         the stmt break from the loop over use operands.
3205
3206 2014-11-27  Ilya Tocar  <ilya.tocar@intel.com>
3207
3208         * config/i386/cpuid.h (bit_MPX, bit_BNDREGS, bit_BNDCSR):
3209         Define.
3210         * config/i386/i386.c (get_builtin_code_for_version): Add avx512f.
3211         (fold_builtin_cpu): Ditto.
3212         * doc/extend.texi: Documment it.
3213
3214 2014-11-27  Jakub Jelinek  <jakub@redhat.com>
3215
3216         PR middle-end/64067
3217         * expr.c (expand_expr_addr_expr_1) <case COMPOUND_LITERAL_EXPR>:
3218         Handle it by returning address of COMPOUND_LITERAL_EXPR_DECL
3219         not only if modifier is EXPAND_INITIALIZER, but whenever
3220         COMPOUND_LITERAL_EXPR_DECL is non-NULL and TREE_STATIC.
3221
3222         PR tree-optimization/64024
3223         * tree-vectorizer.h (struct _stmt_vec_info): Remove simd_clone_fndecl
3224         field.  Add simd_clone_info field.
3225         (STMT_VINFO_SIMD_CLONE_FNDECL): Remove.
3226         (STMT_VINFO_SIMD_CLONE_INFO): Define.
3227         * tree-vect-stmts.c (vectorizable_simd_clone_call): Adjust for
3228         STMT_VINFO_SIMD_CLONE_FNDECL becoming first element of
3229         STMT_VINFO_SIMD_CLONE_INFO vector.  For linear arguments, remember
3230         base and linear_step from analysis phase and use it during transform
3231         phase, biased by the difference between LOOP_VINFO_NITERS{_UNCHANGED,}
3232         multiplied by linear_step.
3233         (free_stmt_vec_info): Release STMT_VINFO_SIMD_CLONE_INFO.
3234
3235         PR lto/64025
3236         * alias.c (find_base_term): Use std::swap.  Prefer tmp2
3237         if it is CONSTANT_P other than CONST_INT.
3238
3239 2014-11-27  Thomas Preud'homme  <thomas.preudhomme@arm.com>
3240
3241         PR target/59593
3242         * config/arm/arm.c (dump_minipool): dispatch to consttable pattern
3243         based on mode size.
3244         * config/arm/arm.md (consttable_1): Move from config/arm/thumb1.md and
3245         make it TARGET_EITHER.
3246         (consttable_2): Move from config/arm/thumb1.md, make it TARGET_EITHER
3247         and move HFmode handling from consttable_4 to it.
3248         (consttable_4): Move HFmode handling to consttable_2 pattern.
3249         * config/arm/thumb1.md (consttable_1): Move to config/arm/arm.md.
3250         (consttable_2): Ditto.
3251
3252 2014-11-27  Richard Biener  <rguenther@suse.de>
3253
3254         * tree-ssa-sccvn.c (try_to_simplify): Allow
3255         gimple_fold_stmt_to_constant_1 to follow SSA edges.
3256
3257 2014-11-27  Richard Biener  <rguenther@suse.de>
3258
3259         PR tree-optimization/64083
3260         * tree-ssa-threadupdate.c (thread_through_all_blocks): Do not
3261         forcibly mark loop for removal the wrong way.
3262
3263 2014-11-27  Richard Biener  <rguenther@suse.de>
3264
3265         PR middle-end/63704
3266         * alias.c (mems_in_disjoint_alias_sets_p): Remove assert
3267         and instead return false when !fstrict-aliasing.
3268
3269 2014-11-27  Richard Biener  <rguenther@suse.de>
3270
3271         PR tree-optimization/61634
3272         * tree-vect-slp.c: Include gimple-walk.h.
3273         (vect_detect_hybrid_slp_stmts): Rewrite to propagate hybrid
3274         down the SLP tree for one scalar statement.
3275         (vect_detect_hybrid_slp_1): New walker function.
3276         (vect_detect_hybrid_slp_2): Likewise.
3277         (vect_detect_hybrid_slp): Properly handle pattern statements
3278         in a pre-scan over all loop stmts.
3279
3280 2014-11-27  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
3281
3282         Revert:
3283         2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
3284         * config/aarch64/aarch64.c (aarch64_code_to_ccmode,
3285         aarch64_convert_mode, aarch64_gen_ccmp_first,
3286         aarch64_gen_ccmp_next): New functions.
3287         (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): Define.
3288
3289 2014-11-26  Jakub Jelinek  <jakub@redhat.com>
3290
3291         * gcc.c (SANITIZER_SPEC): Don't error on -fsanitize=thread
3292         without -pie or -shared, error on -fsanitize=thread -static instead.
3293
3294 2014-11-26  Bernd Edlinger  <bernd.edlinger@hotmail.de>
3295
3296         PR ipa/61190
3297         * cgraph.h (symtab_node::call_for_symbol_and_aliases): Fix comment.
3298         (cgraph_node::function_or_virtual_thunk_symbol): New function.
3299         (cgraph_node::call_for_symbol_and_aliases): Fix comment.
3300         (cgraph_node::call_for_symbol_thunks_and_aliases): Adjust comment.
3301         Add new optional parameter exclude_virtual_thunks.
3302         * cgraph.c (cgraph_node::call_for_symbol_thunks_and_aliases): Add new
3303         optional parameter exclude_virtual_thunks.
3304         (cgraph_node::set_const_flag): Don't propagate to virtual thunks.
3305         (cgraph_node::set_pure_flag): Likewise.
3306         (cgraph_node::function_symbol): Simplified.
3307         (cgraph_node::function_or_virtual_thunk_symbol): New function.
3308         * ipa-pure-const.c (analyze_function): For virtual thunks set
3309         pure_const_state to IPA_NEITHER.
3310         (propagate_pure_const): Use function_or_virtual_thunk_symbol.
3311
3312 2014-11-26  Richard Biener  <rguenther@suse.de>
3313
3314         PR middle-end/63738
3315         * tree-data-ref.c (split_constant_offset_1): Do not follow
3316         SSA edges for SSA names with SSA_NAME_OCCURS_IN_ABNORMAL_PHI.
3317
3318 2014-11-26  Richard Biener  <rguenther@suse.de>
3319
3320         * fold-const.h (const_unop): Declare.
3321         (const_binop): Likewise.
3322         * fold-const.c (const_binop): Export overload that expects
3323         a type parameter and dispatches to fold_relational_const as well.
3324         Check both operand kinds for guarding the transforms.
3325         (const_unop): New function, with constant folding from fold_unary_loc.
3326         (fold_unary_loc): Dispatch to const_unop for tcc_constant operand.
3327         Remove constant folding done there from the simplifications.
3328         (fold_binary_loc): Check for constants using CONSTANT_CLASS_P.
3329         (fold_negate_expr): Remove dead code from the REAL_CST case.
3330         Avoid building garbage in the COMPLEX_CST case.
3331         * gimple-match-head.c (gimple_resimplify1): Dispatch to
3332         const_unop.
3333         (gimple_resimplify2): Dispatch to const_binop.
3334         (gimple_simplify): Likewise.
3335
3336 2014-11-26  Ilya Enkovich  <ilya.enkovich@intel.com>
3337
3338         PR bootstrap/63995
3339         * tree-chkp-opt.c (chkp_reduce_bounds_lifetime): Ignore
3340         debug statement when searching for a new position for
3341         bounds load/creation statement.
3342
3343 2014-11-26  Marek Polacek  <polacek@redhat.com>
3344
3345         PR sanitizer/63788
3346         * asan.c (initialize_sanitizer_builtins): Add BT_FN_SIZE_CONST_PTR_INT
3347         var.  Conditionally build BUILT_IN_OBJECT_SIZE decl.
3348         (ATTR_PURE_NOTHROW_LEAF_LIST): Define.
3349
3350 2014-11-26  Ilya Enkovich  <ilya.enkovich@intel.com>
3351
3352         PR lto/64075
3353         * tree-streamer-in.c (unpack_ts_function_decl_value_fields): Use
3354         proper size for function_code bitfield.
3355         (pack_ts_function_decl_value_fields): Likewise.
3356
3357 2014-11-21  Mark Wielaard  <mjw@redhat.com>
3358
3359         * doc/invoke.texi (-gdwarf-@{version}): Mention experimental DWARFv5.
3360         * opts.c (common_handle_option): Accept -gdwarf-5.
3361         * dwarf2out.c (is_cxx): Add DW_LANG_C_plus_plus_11 and
3362         DW_LANG_C_plus_plus_14.
3363         (lower_bound_default): Likewise. Plus DW_LANG_C11.
3364         (gen_compile_unit_die): Output DW_LANG_C_plus_plus_11,
3365         DW_LANG_C_plus_plus_14 or DW_LANG_C11.
3366         (output_compilation_unit_header): Output at most a DWARFv4 header.
3367         (output_skeleton_debug_sections): Likewise.
3368         (output_line_info): Likewise.
3369         (output_aranges): Document header version number.
3370
3371 2014-11-26  Richard Biener  <rguenther@suse.de>
3372
3373         * gimple-fold.c (get_symbol_constant_value): Allow all
3374         GIMPLE register type zero-constants.
3375
3376 2014-11-26  Mark Wielaard  <mjw@redhat.com>
3377
3378         * dwarf2out.c (gen_subprogram_die): Add DW_AT_noreturn when the
3379         function decl has TREE_THIS_VOLATILE.
3380
3381 2014-11-26  Richard Biener  <rguenther@suse.de>
3382
3383         PR tree-optimization/62238
3384         * tree-predcom.c (ref_at_iteration): Unshare the expression
3385         before gimplifying it.
3386         (prepare_initializers_chain): Discard unused seq.
3387
3388 2014-11-26  Prachi Godbole  <prachi.godbole@imgtec.com>
3389
3390         * config/mips/mips.c (mips_rtx_cost_data): Fix memory_latency cost
3391         for p5600.
3392
3393 2014-11-25  Vladimir Makarov  <vmakarov@redhat.com>
3394
3395         * ira-lives.c (process_bb_node_lives): Make code with conditional
3396         REAL_PIC_OFFSET_TABLE_REGNUM.
3397
3398 2014-11-25  Vladimir Makarov  <vmakarov@redhat.com>
3399
3400         PR target/63527
3401         * ira-lives.c (process_bb_node_lives): Check and remove conflict
3402         of pic pseudo with pic hard reg.
3403
3404 2014-11-25  Rohit  <rohitarulraj@freescale.com>
3405
3406         PR bootstrap/63703
3407         * config/rs6000/darwin.h (REGISTER_NAMES): Update based on 32 newly
3408         added GCC hard register numbers for SPE high registers.
3409
3410 2014-11-25  Segher Boessenkool  <segher@kernel.crashing.org>
3411
3412         * bt-load.c (migrate_btr_defs): Get the key of a heap entry
3413         before removing it, not after.
3414
3415 2014-11-25  Segher Boessenkool  <segher@kernel.crashing.org>
3416
3417         * config/mn10300/mn10300.c (mn10300_insert_setlb_lcc): Remove
3418         PATTERN call.
3419
3420 2014-11-25  Segher Boessenkool  <segher@kernel.crashing.org>
3421
3422         * config/rs6000/sysv4.h (ASM_OUTPUT_REG_POP): Use addi instead
3423         of addic.
3424
3425 2014-11-25  Segher Boessenkool  <segher@kernel.crashing.org>
3426
3427         * config/rs6000/rs6000.md (iorxor, IORXOR): Delete code_attrs.
3428         (rest of file): Replace those with code resp. CODE.
3429
3430 2014-11-25  Tom de Vries  <tom@codesourcery.com>
3431
3432         * tree-cfg.c (verify_sese): New function.
3433         (move_sese_region_to_fn): Call verify_sese.
3434         * tree-cfg.h (verify_sese): Declare.
3435
3436 2014-11-25  Richard Biener  <rguenther@suse.de>
3437
3438         PR lto/64065
3439         * lto-streamer-out.c (output_struct_function_base): Stream
3440         last_clique field.
3441         * lto-streamer-in.c (input_struct_function_base): Likewise.
3442
3443 2014-11-25  Martin Liska  <mliska@suse.cz>
3444
3445         PR bootstrap/64050
3446         PR ipa/64060
3447         * sreal.c (sreal::operator+): Addition fixed.
3448         (sreal::signedless_plus): Negative numbers are
3449         handled correctly.
3450         (sreal::operator-): Subtraction is fixed.
3451         (sreal::signedless_minus): Negative numbers are
3452         handled correctly.
3453         * sreal.h (sreal::operator<): Equal negative numbers
3454         are compared correctly.
3455         (sreal::shift): New checking asserts are introduced.
3456         Operation is fixed.
3457
3458 2014-11-25  Richard Biener  <rguenther@suse.de>
3459
3460         PR tree-optimization/61927
3461         * tree-vect-loop.c (vect_analyze_loop_2): Revert ordering
3462         of group and pattern analysis to the one in GCC 4.8.
3463
3464 2014-11-25  Ilya Tocar  <ilya.tocar@intel.com>
3465             Jakub Jelinek  <jakub@redhat.com>
3466
3467         * gcc.c (handle_foffload_option): Remove unnecessary calls to strchr,
3468         strlen, strncpy.
3469         * lto-wrapper.c (append_offload_options): Likewise.
3470
3471 2014-11-25  Eric Botcazou  <ebotcazou@adacore.com>
3472
3473         * config/rs6000/rs6000.c (rs6000_call_aix): For the AIX ABI, do not
3474         load the static chain if the call was originally direct.
3475
3476 2014-11-25  Jan Hubicka  <hubicka@ucw.cz>
3477
3478         PR ipa/64059
3479         * ipa-prop.c (ipa_analyze_call_uses): Don't call get_dynamic_type when
3480         devirtualization is disabled.
3481
3482 2014-11-24  Michael Meissner  <meissner@linux.vnet.ibm.com>
3483
3484         PR target/63965
3485         * config/rs6000/rs6000.c (rs6000_setup_reg_addr_masks): Do not set
3486         Altivec & -16 mask if the type is not valid for Altivec registers.
3487         (rs6000_secondary_reload_memory): Add support for ((reg + const) +
3488         reg) that occurs during push_reload processing.
3489
3490         * config/rs6000/altivec.md (altivec_mov<mode>): Add instruction
3491         alternative for moving constant vectors which are easy altivec
3492         constants to GPRs.  Set the length attribute each of the
3493         alternatives.
3494
3495         * config/rs6000/rs6000-cpus.def: Undo November 21st changes, a
3496         work in progress patch was committed instead of the fixes for
3497         63965.
3498         * config/rs6000/rs6000.c: Likewise.
3499
3500 2014-11-22  Jan Hubicka  <hubicka@ucw.cz>
3501
3502         PR ipa/63671
3503         * ipa-inline-transform.c (can_remove_node_now_p_1): Handle alises
3504         and -fno-devirtualize more carefully.
3505         (can_remove_node_now_p): Update.
3506
3507 2014-11-24  Andrew Pinski  <apinski@cavium.com>
3508
3509         PR rtl-opt/63972
3510         * shrink-wrap.c (move_insn_for_shrink_wrap): Allow LO_SUM also.
3511
3512 2014-11-24  Alan Lawrence  <alan.lawrence@arm.com>
3513
3514         * config/aarch64/aarch64-simd.md (vec_shr<mode>): New.
3515
3516 2014-11-24  Alan Lawrence  <alan.lawrence@arm.com>
3517
3518         * config/aarch64/aarch64-builtins.c (aarch64_simd_expand_args):
3519         Refactor by combining switch statements and make arrays into scalars.
3520
3521 2014-11-24  David Edelsohn  <dje.gcc@gmail.com>
3522
3523         PR c++/58561
3524         * dbxout.c: Include stringpool.h
3525         (dbxout_type) [default]: Ignore auto type.
3526
3527 2014-11-24  Richard Biener  <rguenther@suse.de>
3528
3529         PR tree-optimization/63679
3530         * tree-ssa-sccvn.c: Include ipa-ref.h, plugin-api.h and cgraph.h.
3531         (copy_reference_ops_from_ref): Fix non-constant ADDR_EXPR case
3532         to properly leave off at -1.
3533         (fully_constant_vn_reference_p): Generalize folding from
3534         constant initializers.
3535         (vn_reference_lookup_3): When looking through aggregate copies
3536         handle offsetted reads and try simplifying the result to
3537         a constant.
3538         * gimple-fold.h (fold_ctor_reference): Export.
3539         * gimple-fold.c (fold_ctor_reference): Likewise.
3540
3541 2014-11-24  Petr Murzin  <petr.murzin@intel.com>
3542
3543         * simplify-rtx.c (simplify_ternary_operation): Simplify
3544         vec_merge (vec_duplicate (vec_select)).
3545
3546 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3547
3548         * config/aarch64/aarch64.c (AARCH64_FUSE_ADRP_LDR): Define.
3549         (cortexa53_tunings): Specify AARCH64_FUSE_ADRP_LDR in fuseable_ops.
3550         (aarch_macro_fusion_pair_p): Handle AARCH64_FUSE_ADRP_LDR.
3551
3552 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3553
3554         * config/aarch64/aarch64.c (AARCH64_FUSE_MOVK_MOVK): Define.
3555         (cortexa53_tunings): Specify AARCH64_FUSE_MOVK_MOVK in fuseable_ops.
3556         (cortexa57_tunings): Likewise.
3557         (aarch_macro_fusion_pair_p): Handle AARCH64_FUSE_MOVK_MOVK.
3558
3559 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3560
3561         * sched-deps.c (sched_macro_fuse_insns): Do not check modified_in_p
3562         in the not conditional jump case.
3563         * doc/tm.texi (TARGET_SCHED_MACRO_FUSION_PAIR_P): Update description.
3564         * target.def (TARGET_SCHED_MACRO_FUSION_PAIR_P): Update description.
3565
3566 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3567
3568         * config/aarch64/aarch64.c: Include tm-constrs.h
3569         (AARCH64_FUSE_ADRP_ADD): Define.
3570         (cortexa57_tunings): Add AARCH64_FUSE_ADRP_ADD to fuseable_ops.
3571         (cortexa53_tunings): Likewise.
3572         (aarch_macro_fusion_pair_p): Handle AARCH64_FUSE_ADRP_ADD.
3573
3574 2014-11-24  Martin Liska  <mliska@suse.cz>
3575
3576         * ipa-inline.c (edge_badness): long is replaced by sreal
3577         as fibonacci_heap template type.
3578         (update_edge_key): Likewise.
3579         (inline_small_functions): Likewise.
3580
3581 2014-11-24  Martin Liska  <mliska@suse.cz>
3582
3583         * predict.c (propagate_freq): More elegant sreal API is used.
3584         (estimate_bb_frequencies): Precomputed constants replaced by integer
3585         constants.
3586         * sreal.c (sreal::normalize): New function.
3587         (sreal::to_int): Likewise.
3588         (sreal::operator+): Likewise.
3589         (sreal::operator-): Likewise.
3590         (sreal::signedless_plus): Likewise.
3591         (sreal::signedless_minus): Likewise.
3592         (sreal::operator/): Negative number support is added.
3593         * sreal.h: Definition of new functions added.
3594         (inline sreal operator<<): New function.
3595         (inline sreal operator>>): Likewise.
3596
3597 2014-11-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3598
3599         * config/aarch64/aarch64-protos.h (struct tune_params): Add
3600         fuseable_ops field.
3601         * config/aarch64/aarch64.c (generic_tunings): Specify fuseable_ops.
3602         (cortexa53_tunings): Likewise.
3603         (cortexa57_tunings): Likewise.
3604         (thunderx_tunings): Likewise.
3605         (aarch64_macro_fusion_p): New function.
3606         (aarch_macro_fusion_pair_p): Likewise.
3607         (TARGET_SCHED_MACRO_FUSION_P): Define.
3608         (TARGET_SCHED_MACRO_FUSION_PAIR_P): Likewise.
3609         (AARCH64_FUSE_MOV_MOVK): Likewise.
3610         (AARCH64_FUSE_NOTHING): Likewise.
3611
3612 2014-11-24  Martin Liska  <mliska@suse.cz>
3613
3614         PR lto/63968
3615         * bb-reorder.c (find_traces_1_round): decreate_key is replaced
3616         with replace_key method.
3617         * fibonacci_heap.h (fibonacci_heap::insert): New argument.
3618         (fibonacci_heap::replace_key_data): Likewise.
3619         (fibonacci_heap::replace_key): New method that can even increment key,
3620         this operation costs O(log N).
3621         (fibonacci_heap::extract_min): New argument.
3622         (fibonacci_heap::delete_node): Likewise.
3623
3624 2014-11-24  Richard Biener  <rguenther@suse.de>
3625
3626         PR tree-optimization/55334
3627         * function.h (struct function): Add last_clique member.
3628         * tree-inline.c (remap_dependence_clique): New function.
3629         (remap_gimple_op_r): Remap dependence cliques in MEM_REFs.
3630         (copy_tree_body_r): Likewise.
3631         (copy_cfg_body): Free dependence map.
3632         (copy_gimple_seq_and_replace_locals): Likewise.
3633         * tree-pretty-print.c (dump_generic_node): Dump
3634         dependence info.
3635         * tree-ssa-alias.c (refs_may_alias_p_1): Use dependence info
3636         to answer alias query.
3637         * tree-ssa-structalias.c: Include tree-phinodes.h, ssa-iterators.h,
3638         tree-pretty-print.h and gimple-walk.h.
3639         (struct variable_info): Add is_restrict_var flag and ruid
3640         member.
3641         (new_var_info): Initialize is_restrict_var.
3642         (make_constraint_from_restrict): Likewise.
3643         (create_variable_info_for): Exclude restricts from global vars
3644         from new handling.
3645         (intra_create_variable_infos): But not those from parameters.
3646         (visit_loadstore): New function.
3647         (maybe_set_dependence_info): Likewise.
3648         (compute_dependence_clique): Likewise.
3649         (compute_may_aliases): Call compute_dependence_clique.
3650         * tree-data-ref.c (dr_analyze_indices): Copy dependence info
3651         to fake MEM_REF.
3652         (dr_may_alias_p): Use recorded dependence info to answer
3653         alias query.
3654         * tree-core.h (struct tree_base): Add clique, base struct in
3655         union.
3656         * tree.h (MR_DEPENDENCE_CLIQUE): New macro.
3657         (MR_DEPENDENCE_BASE): Likewise.
3658         * tree-inline.h (dependence_hasher): New hash-map kind.
3659         (struct copy_body_data): Add dependence_map pointer.
3660         * gimple-fold.c (maybe_canonicalize_mem_ref_addr): Avoid
3661         throwing away dependence info.
3662         * tree-streamer-in.c (unpack_value_fields): Stream dependence info.
3663         * tree-streamer-out.c (streamer_pack_tree_bitfields): Likewise.
3664
3665 2014-11-23  Oleg Endo  <olegendo@gcc.gnu.org>
3666
3667         PR target/53976
3668         * config/sh/sh_optimize_sett_clrt.cc
3669         (sh_optimize_sett_clrt::find_last_ccreg_values): Return bool instead
3670         of void.  Abort at complex edges.
3671         (sh_optimize_sett_clrt::execute): Do nothing if find_last_ccreg_values
3672         returned false.
3673
3674 2014-11-22  John David Anglin  <danglin@gcc.gnu.org>
3675
3676         PR other/63694
3677         * configure.ac: Check for strtol, strtoul, strtoll and strtoull
3678         declarations.
3679         * configure: Regenerated.
3680         * config.in: Regenerated.
3681
3682 2014-11-22  Jan Hubicka  <hubicka@ucw.cz>
3683
3684         * ipa.c (symbol_table::remove_unreachable_nodes): Mark all inline
3685         clones as having abstract origin used.
3686         * ipa-inline-transform.c (can_remove_node_now_p_1): Drop abstract
3687         origin check.
3688         (clone_inlined_nodes): Copy abstract originflag.
3689         * lto-cgraph.c (compute_ltrans_boundary): Use get_create to get
3690         abstract origin node.
3691
3692 2014-11-22  Uros Bizjak  <ubizjak@gmail.com>
3693
3694         * params.def (PARAM_MAX_COMPLETELY_PEELED_INSNS): Increase to 200.
3695         * config/i386/i386.c (ix86_option_override_internal): Do not increase
3696         PARAM_MAX_COMPLETELY_PEELED_INSNS.
3697
3698 2014-11-22  Oleg Endo  <olegendo@gcc.gnu.org>
3699
3700         PR target/63783
3701         PR target/51244
3702         * config/sh/sh_treg_combine.cc (sh_treg_combine::make_not_reg_insn):
3703         Do not emit bitwise not insn.  Emit logical not insn sequence instead.
3704         Adjust related comments throughout the file.
3705
3706 2014-11-22  Oleg Endo  <olegendo@gcc.gnu.org>
3707
3708         PR target/63986
3709         PR target/51244
3710         * config/sh/sh.c (sh_is_logical_t_store_expr,
3711         sh_try_omit_signzero_extend): Use rtx_insn* for insn argument.
3712         (sh_split_movrt_negc_to_movt_xor): New function.
3713         (sh_find_set_of_reg): Move to ...
3714         * config/sh/sh-protos.h (sh_find_set_of_reg): ... here and convert
3715         to template function.
3716         (set_of_reg): Use rtx_insn* for insn member.
3717         (sh_is_logical_t_store_expr, sh_try_omit_signzero_extend): Use
3718         rtx_insn* for insn argument.
3719         * config/sh/sh.md (movrt_negc, *movrt_negc): Split into movt-xor
3720         sequence using new sh_split_movrt_negc_to_movt_xor function.
3721         (movrt_xor): Allow also for SH2A.
3722         (*movt_movrt): Delete insns and splits.
3723
3724 2014-11-22  Marc Glisse  <marc.glisse@inria.fr>
3725
3726         PR tree-optimization/60770
3727         * tree-sra.c (clobber_subtree): New function.
3728         (sra_modify_constructor_assign): Call it.
3729
3730 2014-11-21  Vladimir Makarov  <vmakarov@redhat.com>
3731
3732         PR target/63897
3733         * lra-lives.c (mark_regno_live, mark_regno_dead): Remove last
3734         argument.
3735         (process_bb_lives): Rename dead_insn_p on remove_p
3736         and global_live_info_p on dead_insn_p.  Calculate local live info
3737         unconditionally.  Remove last argument in calls mark_regno_live and
3738         mark_regno_dead.  Reorganize body of EXECUTE_IF_SET_IN_BITMAP.
3739         (lra_create_live_ranges): Rename to lra_create_live_ranges_1.
3740         Return bool.  Rename global_live_info_p on dead_insn_p.  Return
3741         flag of live info change.
3742         (lra_create_live_ranges): New.
3743
3744 2014-11-21  Jakub Jelinek  <jakub@redhat.com>
3745
3746         PR target/63848
3747         PR target/63975
3748         * internal-fn.c (expand_arith_overflow_result_store,
3749         expand_addsub_overflow, expand_neg_overflow, expand_mul_overflow): Use
3750         do_compare_rtx_and_jump instead of emit_cmp_and_jump_insns everywhere,
3751         adjust arguments to those functions.  Use unsignedp = true for
3752         EQ, NE, GEU, LEU, LTU and GTU comparisons.
3753
3754         PR tree-optimization/64006
3755         * tree-vrp.c (stmt_interesting_for_vrp): Return true
3756         for {ADD,SUB,MUL}_OVERFLOW internal calls.
3757         (vrp_visit_assignment_or_call): For {ADD,SUB,MUL}_OVERFLOW
3758         internal calls, check if any REALPART_EXPR/IMAGPART_EXPR
3759         immediate uses would change their value ranges and return
3760         SSA_PROP_INTERESTING if so, or SSA_PROP_NOT_INTERESTING
3761         if there are some REALPART_EXPR/IMAGPART_EXPR immediate uses
3762         interesting for vrp.
3763
3764 2014-11-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
3765
3766         PR target/63965
3767         * config/rs6000/rs6000.c (rs6000_setup_reg_addr_masks): Do not set
3768         Altivec & -16 mask if the type is not valid for Altivec registers.
3769         (rs6000_secondary_reload_memory): Add support for ((reg + const) +
3770         reg) that occurs during push_reload processing.
3771
3772         * config/rs6000/altivec.md (altivec_mov<mode>): Add instruction
3773         alternative for moving constant vectors which are easy altivec
3774         constants to GPRs.  Set the length attribute each of the
3775         alternatives.
3776
3777 2014-11-21  Matthew Fortune  <matthew.fortune@imgtec.com>
3778
3779         * configure.ac: When checking for MIPS .module support ensure that
3780         o32 FPXX is supported to avoid a second configure check.
3781         * configure: Regenerate.
3782
3783 2014-11-21  Jiong Wang  <jiong.wang@arm.com>
3784
3785         * config/aarch64/iterators.md (VS): New mode iterator.
3786         (vsi2qi): New mode attribute.
3787         (VSI2QI): Likewise.
3788         * config/aarch64/aarch64-simd-builtins.def: New entry for ctz.
3789         * config/aarch64/aarch64-simd.md (ctz<mode>2): New pattern for ctz.
3790         * config/aarch64/aarch64-builtins.c
3791         (aarch64_builtin_vectorized_function): Support BUILT_IN_CTZ.
3792
3793 2014-11-21  H.J. Lu  <hongjiu.lu@intel.com>
3794
3795         PR bootstrap/63784
3796         * configure: Regenerated.
3797
3798 2014-11-21  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
3799
3800         * config/aarch64/arm_neon.h (vsqrt_f64): New intrinsic.
3801
3802 2014-11-21  Ilya Tocar  <ilya.tocar@intel.com>
3803
3804         * common/config/i386/i386-common.c (OPTION_MASK_ISA_PCOMMIT_UNSET,
3805         OPTION_MASK_ISA_PCOMMIT_SET): New.
3806         (ix86_handle_option): Handle OPT_mpcommit.
3807         * config.gcc: Add pcommitintrin.h
3808         * config/i386/pcommitintrin.h: New file.
3809         * config/i386/cpuid.h (bit_PCOMMIT): Define.
3810         * config/i386/driver-i386.c (host_detect_local_cpu): Detect pcommit.
3811         * config/i386/i386-c.c (ix86_target_macros_internal): Define
3812         __PCOMMIT__.
3813         * config/i386/i386.c (ix86_target_string): Add -mpcommit.
3814         (PTA_PCOMMIT): Define.
3815         (ix86_option_override_internal): Handle new option.
3816         (ix86_valid_target_attribute_inner_p): Add pcommit.
3817         (ix86_builtins): Add IX86_BUILTIN_PCOMMIT.
3818         (bdesc_special_args): Add __builtin_ia32_pcommit.
3819         * config/i386/i386.h (TARGET_PCOMMIT, TARGET_PCOMMIT_P): Define.
3820         * config/i386/i386.md (unspecv): Add UNSPECV_PCOMMIT.
3821         (pcommit): New instruction.
3822         * config/i386/i386.opt: Add mpcommit.
3823         * config/i386/x86intrin.h: Include pcommitintrin.h.
3824
3825 2014-11-20  Mark Wielaard  <mjw@redhat.com>
3826
3827         PR debug/38757
3828         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Use lang_GNU_C.
3829         * config/darwin.c (darwin_file_end): Use lang_GNU_CXX.
3830         (darwin_override_options): Likewise.
3831         * config/ia64/ia64.c (ia64_struct_retval_addr_is_first_parm_p):
3832         Likewise.
3833         * config/rs6000/rs6000.c (rs6000_output_function_epilogue):
3834         Likewise.
3835         * dbxout.c (get_lang_number): Likewise.
3836         (dbxout_type): Likewise.
3837         (dbxout_symbol_location): Likewise.
3838         * dwarf2out.c (add_prototyped_attribute): Add DW_AT_prototype
3839         also for DW_LANG_{C,C99,ObjC}.
3840         (highest_c_language): New function.
3841         (gen_compile_unit_die): Call highest_c_language to merge LTO
3842         TRANSLATION_UNIT_LANGUAGE. Use strncmp language_string to
3843         determine if DW_LANG_C99 or DW_LANG_C89 should be returned.
3844         * fold-const.c (fold_cond_expr_with_comparison): Use lang_GNU_CXX.
3845         * langhooks.h (struct lang_hooks): Add version comment to name.
3846         (lang_GNU_C): New function declaration.
3847         (lang_GNU_CXX): Likewise.
3848         * langhooks.c (lang_GNU_C): New function.
3849         (lang_GNU_CXX): Likewise.
3850         * vmsdbgout.c (vmsdbgout_init): Use lang_GNU_C and lang_GNU_CXX.
3851
3852 2014-11-21  Ilya Tocar  <ilya.tocar@intel.com>
3853
3854         * common/config/i386/i386-common.c (OPTION_MASK_ISA_CLWB_UNSET,
3855         OPTION_MASK_ISA_CLWB_SET): New.
3856         (ix86_handle_option): Handle OPT_mclwb.
3857         * config.gcc: Add clwbintrin.h.
3858         * config/i386/clwbintrin.h: New file.
3859         * config/i386/cpuid.h (bit_CLWB): Define.
3860         * config/i386/driver-i386.c (host_detect_local_cpu): Detect clwb.
3861         * config/i386/i386-c.c (ix86_target_macros_internal): Define
3862         __CLWB__.
3863         * config/i386/i386.c (ix86_target_string): Add -mclwb.
3864         (PTA_CLWB): Define.
3865         (ix86_option_override_internal): Handle new option.
3866         (ix86_valid_target_attribute_inner_p): Add clwb.
3867         (ix86_builtins): Add IX86_BUILTIN_CLWB.
3868         (ix86_init_mmx_sse_builtins): Add __builtin_ia32_clwb.
3869         (ix86_expand_builtin): Handle IX86_BUILTIN_CLWB.
3870         * config/i386/i386.h (TARGET_CLWB, TARGET_CLWB_P): Define.
3871         * config/i386/i386.md (unspecv): Add UNSPECV_CLWB.
3872         (clwb): New instruction.
3873         * config/i386/i386.opt: Add mclwb.
3874         * config/i386/x86intrin.h: Include clwbintrin.h.
3875
3876 2014-11-21  Ilya Tocar  <ilya.tocar@intel.com>
3877
3878         * common/config/i386/i386-common.c (OPTION_MASK_ISA_AVX512VBMI_SET
3879         OPTION_MASK_ISA_AVX512VBMI_UNSET): New.
3880         (ix86_handle_option): Handle OPT_mavx512vbmi.
3881         * config.gcc: Add avx512vbmiintrin.h, avx512vbmivlintrin.h.
3882         * config/i386/avx512vbmiintrin.h: New file.
3883         * config/i386/avx512vbmivlintrin.h: Ditto.
3884         * config/i386/cpuid.h (bit_AVX512VBMI): New.
3885         * config/i386/driver-i386.c (host_detect_local_cpu): Detect avx512vbmi.
3886         * config/i386/i386-c.c (ix86_target_macros_internal): Define
3887         __AVX512VBMI__.
3888         * config/i386/i386.c (ix86_target_string): Add -mavx512vbmi.
3889         (PTA_AVX512VBMI): Define.
3890         (ix86_option_override_internal): Handle new options.
3891         (ix86_valid_target_attribute_inner_p): Add avx512vbmi,
3892         (ix86_builtins): Add IX86_BUILTIN_VPMULTISHIFTQB512,
3893         IX86_BUILTIN_VPMULTISHIFTQB256, IX86_BUILTIN_VPMULTISHIFTQB128,
3894         IX86_BUILTIN_VPERMVARQI512_MASK, IX86_BUILTIN_VPERMT2VARQI512,
3895         IX86_BUILTIN_VPERMT2VARQI512_MASKZ, IX86_BUILTIN_VPERMI2VARQI512,
3896         IX86_BUILTIN_VPERMVARQI256_MASK, IX86_BUILTIN_VPERMVARQI128_MASK,
3897         IX86_BUILTIN_VPERMT2VARQI256, IX86_BUILTIN_VPERMT2VARQI256_MASKZ,
3898         IX86_BUILTIN_VPERMT2VARQI128, IX86_BUILTIN_VPERMI2VARQI256,
3899         IX86_BUILTIN_VPERMI2VARQI128.
3900         (bdesc_special_args): Add __builtin_ia32_vpmultishiftqb512_mask,
3901         __builtin_ia32_vpmultishiftqb256_mask,
3902         __builtin_ia32_vpmultishiftqb128_mask,
3903         __builtin_ia32_permvarqi512_mask, __builtin_ia32_vpermt2varqi512_mask,
3904         __builtin_ia32_vpermt2varqi512_maskz,
3905         __builtin_ia32_vpermi2varqi512_mask, __builtin_ia32_permvarqi256_mask,
3906         __builtin_ia32_permvarqi128_mask, __builtin_ia32_vpermt2varqi256_mask,
3907         __builtin_ia32_vpermt2varqi256_maskz,
3908         __builtin_ia32_vpermt2varqi128_mask,
3909         __builtin_ia32_vpermt2varqi128_maskz,
3910         __builtin_ia32_vpermi2varqi256_mask,
3911         __builtin_ia32_vpermi2varqi128_mask.
3912         (ix86_hard_regno_mode_ok): Allow big masks for AVX512VBMI.
3913         * config/i386/i386.h (TARGET_AVX512VBMI, TARGET_AVX512VBMI_P): Define.
3914         * config/i386/i386.opt: Add mavx512vbmi.
3915         * config/i386/immintrin.h: Include avx512vbmiintrin.h,
3916         avx512vbmivlintrin.h.
3917         * config/i386/sse.md (unspec): Add UNSPEC_VPMULTISHIFT.
3918         (VI1_AVX512VL): New iterator.
3919         (<avx512>_permvar<mode><mask_name>): Use it.
3920         (<avx512>_vpermi2var<mode>3_maskz): Ditto.
3921         (<avx512>_vpermi2var<mode>3<sd_maskz_name>): Ditto.
3922         (<avx512>_vpermi2var<mode>3_mask): Ditto.
3923         (<avx512>_vpermt2var<mode>3_maskz): Ditto.
3924         (<avx512>_vpermt2var<mode>3<sd_maskz_name>): Ditto.
3925         (<avx512>_vpermt2var<mode>3_mask): Ditto.
3926         (vpmultishiftqb<mode><mask_name>): Ditto.
3927
3928 2014-11-21  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
3929
3930         PR rtl-optimization/63952
3931         * optabs.c (prepare_cmp_insn): Do not call can_compare_p for CCmode.
3932         * config/s390/s390.md ("cbranchcc4"): Accept any s390_comparison.
3933         Remove incorrect TARGET_HARD_FLOAT check and no-op expander code.
3934
3935 2014-11-21  Ilya Tocar  <ilya.tocar@intel.com>
3936
3937         * common/config/i386/i386-common.c (OPTION_MASK_ISA_AVX512IFMA_SET,
3938         OPTION_MASK_ISA_AVX512IFMA_UNSET): New.
3939         (ix86_handle_option): Handle OPT_mavx512ifma.
3940         * config.gcc: Add avx512ifmaintrin.h, avx512ifmavlintrin.h.
3941         * config/i386/avx512ifmaintrin.h: New file.
3942         * config/i386/avx512ifmaivlntrin.h: Ditto.
3943         * config/i386/cpuid.h (bit_AVX512IFMA): New.
3944         * config/i386/driver-i386.c (host_detect_local_cpu): Detect
3945         avx512ifma.
3946         * config/i386/i386-c.c (ix86_target_macros_internal): Define
3947         __AVX512IFMA__.
3948         * config/i386/i386.c (ix86_target_string): Add -mavx512ifma.
3949         (PTA_AVX512IFMA): Define.
3950         (ix86_option_override_internal): Handle new options.
3951         (ix86_valid_target_attribute_inner_p): Add avx512ifma.
3952         (ix86_builtins): Add IX86_BUILTIN_VPMADD52LUQ512,
3953         IX86_BUILTIN_VPMADD52HUQ512, IX86_BUILTIN_VPMADD52LUQ256,
3954         IX86_BUILTIN_VPMADD52HUQ256, IX86_BUILTIN_VPMADD52LUQ128,
3955         IX86_BUILTIN_VPMADD52HUQ128, IX86_BUILTIN_VPMADD52LUQ512_MASKZ,
3956         IX86_BUILTIN_VPMADD52HUQ512_MASKZ, IX86_BUILTIN_VPMADD52LUQ256_MASKZ,
3957         IX86_BUILTIN_VPMADD52HUQ256_MASKZ, IX86_BUILTIN_VPMADD52LUQ128_MASKZ,
3958         IX86_BUILTIN_VPMADD52HUQ128_MASKZ.
3959         (bdesc_special_args): Add __builtin_ia32_vpmadd52luq512_mask,
3960         __builtin_ia32_vpmadd52luq512_maskz,
3961         __builtin_ia32_vpmadd52huq512_mask,
3962         __builtin_ia32_vpmadd52huq512_maskx,
3963         __builtin_ia32_vpmadd52luq256_mask,
3964         __builtin_ia32_vpmadd52luq256_maskz,
3965         __builtin_ia32_vpmadd52huq256_mask,
3966         __builtin_ia32_vpmadd52huq256_maskz,
3967         __builtin_ia32_vpmadd52luq128_mask,
3968         __builtin_ia32_vpmadd52luq128_maskz,
3969         __builtin_ia32_vpmadd52huq128_mask,
3970         __builtin_ia32_vpmadd52huq128_maskz,
3971         * config/i386/i386.h (TARGET_AVX512IFMA, TARGET_AVX512IFMA_P): Define.
3972         * config/i386/i386.opt: Add mavx512ifma.
3973         * config/i386/immintrin.h: Include avx512ifmaintrin.h,
3974         avx512ifmavlintrin.h.
3975         * config/i386/sse.md (unspec): Add UNSPEC_VPMADD52LUQ,
3976         UNSPEC_VPMADD52HUQ.
3977         (VPMADD52): New iterator.
3978         (vpmadd52type): New attribute.
3979         (vpamdd52huq<mode>_maskz): New.
3980         (vpamdd52luq<mode>_maskz): Ditto.
3981         (vpamdd52<vpmadd52type><mode><sd_maskz_name>): Ditto.
3982         (vpamdd52<vpmadd52type><mode>_mask): Ditto.
3983
3984 2014-11-21  Alan Lawrence  <alan.lawrence@arm.com>
3985
3986         Revert:
3987         2014-09-22  Alan Lawrence  <alan.lawrence@arm.com>
3988         * fold-const.c (tree_swap_operands_p): Strip only sign-preserving NOPs.
3989
3990 2014-11-21  Andrew Bennett  <andrew.bennett@imgtec.com>
3991
3992         * config/mips/mips.c (mips_process_sync_loop): Place a
3993         nop in the delay slot of the branch likely instruction.
3994         (mips_output_sync_loop): Ensure mips_branch_likely is
3995         set before calling mips_output_sync_loop.
3996         (mips_sync_loop_insns): Likewise.
3997
3998 2014-11-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
3999
4000         PR/target 63673
4001         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Allow
4002         the base pointer of vec_vsx_ld and vec_vsx_st to take a pointer to
4003         double.
4004
4005 2014-11-21  Georg-Johann Lay  <avr@gjlay.de>
4006
4007         Forward-port from 2014-10-30 4_9-branch r216934
4008
4009         PR target/63633
4010         * config/avr/avr-protos.h (regmask): New inline function.
4011         (avr_fix_inputs, avr_emit3_fix_outputs): New protos.
4012         * config/avr/avr.c (avr_fix_operands, avr_move_fixed_operands)
4013         (avr_fix_inputs, avr_emit3_fix_outputs): New functions.
4014         * config/avr/avr-fixed.md (mulqq3_nomul, muluqq3_nomul)
4015         (mul<ALL2QA>3, mul<ALL4A>3, <usdiv><ALL1Q>3, <usdiv><ALL2QA>3)
4016         (<usdiv><ALL4A>3, round<ALL124QA>3): Fix input operands.
4017         * config/avr/avr-dimode.md (add<ALL8>3, sub<ALL8>3)
4018         (<ss_addsub><ALL8S>3, <us_addsub><ALL8U>3, cbranch<ALL8>4)
4019         (<di_shifts><ALL8>3, <any_extend>mulsidi3): Fix input operands.
4020         * config/avr/avr.md (mulqi3_call, mulhi3_call, mulsi3, mulpsi3)
4021         (mulu<QIHI>si3, muls<QIHI>si3, mulohisi3, <any_extend>mulhisi3)
4022         (usmulhisi3, <any_extend>mulhi3_highpart, mulsqipsi3)
4023         (fmul, fmuls, fmulsu): Fix operands.  Turn insn into expander as
4024         needed.
4025
4026 2014-11-21  Jakub Jelinek  <jakub@redhat.com>
4027
4028         PR target/61137
4029         * config/ia64/ia64.c (ia64_attribute_takes_identifier_p): New function.
4030         (TARGET_ATTRIBUTE_TAKES_IDENTIFIER_P): Redefine to it.
4031
4032 2014-11-21  James Greenhalgh  <james.greenhalgh@arm.com>
4033
4034         * config/aarch64/aarch64-simd.md
4035         (aarch64_<ANY_EXTEND:su><ADDSUB:optab>l<mode>): Add a tab between
4036         output mnemonic and operands.
4037         (aarch64_simd_vec_unpack<su>_lo_<mode>): Likewise.
4038         (aarch64_simd_vec_unpack<su>_hi_<mode>): Likewise.
4039
4040 2014-11-21  Evgeny Stupachenko  <evstupac@gmail.com>
4041
4042         * config/i386/i386.c (ix86_option_override_internal): Increase
4043         PARAM_MAX_COMPLETELY_PEELED_INSNS.
4044
4045 2014-11-21  Evgeny Stupachenko  <evstupac@gmail.com>
4046
4047         PR target/60451
4048         * config/i386/i386.c (expand_vec_perm_even_odd_pack): New.
4049         (expand_vec_perm_even_odd_1): Add new expand for V8HI mode,
4050         replace for V16QI, V16HI and V32QI modes.
4051         (ix86_expand_vec_perm_const_1): Add new expand.
4052
4053 2014-11-21  Nick Clifton  <nickc@redhat.com>
4054
4055         * config/rl78/rl78-real.md (movqi_from_es): New pattern.
4056         * config/rl78/rl78.c (struct machine_function): Add uses_es field.
4057         (rl78_expand_prologue): Save the ES register in interrupt handlers
4058         that use it.
4059         (rl78_expand_epilogue): Restore the ES register if necessary.
4060         (rl78_start_function): Mention if the function uses the ES
4061         register.
4062         (rl78_lo16): Record the use of the ES register.
4063         (transcode_memory_rtx): Likewise.
4064
4065 2014-11-21  Jakub Jelinek  <jakub@redhat.com>
4066
4067         PR tree-optimization/61773
4068         * tree-ssa-strlen.c (get_string_length): Don't assert
4069         stpcpy has been prototyped if si->stmt is BUILT_IN_MALLOC.
4070
4071         PR target/63910
4072         * simplify-rtx.c (simplify_immed_subreg): Return NULL for integer
4073         modes wider than MAX_BITSIZE_MODE_ANY_INT.  If not using
4074         CONST_WIDE_INT, make sure r fits into CONST_DOUBLE.
4075
4076 2014-11-21  Markus Trippelsdorf  <markus@trippelsdorf.de>
4077
4078         * config/rs6000/rs6000.c (includes_rldic_lshift_p): Use
4079         HOST_WIDE_INT_M1U instead of ~0.
4080         (includes_rldicr_lshift_p): Likewise.
4081
4082 2014-11-21  Chung-Ju Wu  <jasonwucj@gmail.com>
4083
4084         * config/nds32/nds32.c (nds32_legitimate_address_p): For LO_SUM,
4085         we need to look into its operand to determine if it is a valid
4086         address.
4087
4088 2014-11-21  Chung-Ju Wu  <jasonwucj@gmail.com>
4089
4090         * config/nds32/nds32.c (nds32_emit_stack_push_multiple): Add new
4091         vaarg_p argument and create correct CFI info.
4092         (nds32_expand_prologue): Pass true or false to
4093         nds32_emit_stack_push_multiple function.
4094
4095 2014-11-21  Chung-Ju Wu  <jasonwucj@gmail.com>
4096
4097         * config/nds32/nds32.c (nds32_expand_prologue): Set fp_adjust_insn
4098         as RTX_FRAME_RELATED_P rtx.
4099
4100 2014-11-21  Chung-Ju Wu  <jasonwucj@gmail.com>
4101
4102         * config/nds32/nds32.opt (march): Add help message.
4103
4104 2014-11-20  Patrick Palka  <ppalka@gcc.gnu.org>
4105
4106         * tree-vrp.c (test_for_singularity): New parameter
4107         strict_overflow_p.  Set *strict_overflow_p to true if signed
4108         overflow must be undefined for the return value to satisfy the
4109         conditional.
4110         (simplify_cond_using_ranges): Don't perform the simplification
4111         if it violates overflow rules.
4112
4113 2014-11-20  Marek Polacek  <polacek@redhat.com>
4114
4115         * tree-ssa-loop-niter.c (maybe_lower_iteration_bound): Fix typo.
4116
4117 2014-11-20  Andrew Stubbs  <ams@codesourcery.com>
4118
4119         * tree-ssa-loop-niter.c (maybe_lower_iteration_bound): Warn if a loop
4120         condition would be removed due to undefined behaviour.
4121
4122 2014-11-20  Andrew Pinski  <apinski@cavium.com>
4123
4124         PR ipa/63981
4125         PR ipa/63982
4126         * ipa-polymorphic-call.c (possible_placement_new):
4127         Use POINTER_SIZE instead of GET_MODE_BITSIZE (Pmode).
4128         (ipa_polymorphic_call_context::restrict_to_inner_class): Likewise.
4129         (extr_type_from_vtbl_ptr_store): Likewise.
4130
4131 2014-11-20  Markus Trippelsdorf  <markus@trippelsdorf.de>
4132
4133         * config/rs6000/constraints.md: Avoid signed integer overflows.
4134         * config/rs6000/predicates.md: Likewise.
4135         * config/rs6000/rs6000.c (num_insns_constant_wide): Likewise.
4136         (includes_rldic_lshift_p): Likewise.
4137         (includes_rldicr_lshift_p): Likewise.
4138         * emit-rtl.c (const_wide_int_htab_hash): Likewise.
4139         * loop-iv.c (determine_max_iter): Likewise.
4140         (iv_number_of_iterations): Likewise.
4141         * tree-ssa-loop-ivopts.c (get_computation_cost_at): Likewise.
4142         * varasm.c (get_section_anchor): Likewise.
4143
4144 2014-11-20  Charles Baylis  <charles.baylis@linaro.org>
4145
4146         PR target/63870
4147         * config/aarch64/aarch64-builtins.c (aarch64_simd_expand_args): Pass
4148         expression to aarch64_simd_lane_bounds.
4149         * config/aarch64/aarch64-protos.h (aarch64_simd_lane_bounds): Update
4150         prototype.
4151         * config/aarch64/aarch64-simd.md: (aarch64_combinez<mode>): Update
4152         call to aarch64_simd_lane_bounds.
4153         (aarch64_get_lanedi): Likewise.
4154         (aarch64_ld2_lane<mode>): Likewise.
4155         (aarch64_ld3_lane<mode>): Likewise.
4156         (aarch64_ld4_lane<mode>): Likewise.
4157         (aarch64_im_lane_boundsi): Likewise.
4158         * config/aarch64/aarch64.c (aarch64_simd_lane_bounds): Add exp
4159         parameter. Report calling function in error message if exp is non-NULL.
4160
4161 2014-11-20  Segher Boessenkool  <segher@kernel.crashing.org>
4162
4163         PR target/60111
4164         * config/sh/sh.c: Use signed char for signed field.
4165
4166 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4167
4168         * cfgexpand.c, gimple-ssa.h, trans-mem.c: Replace htab with
4169         hash_table.
4170
4171 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4172
4173         * ipa-utils.c, lto-section-in.c, lto-streamer.h,
4174         tree-scalar-evolution.c: Replace htab with hash_table.
4175
4176 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4177
4178         * lto-section-in.c (lto_delete_in_decl_state): Adjust.
4179         (lto_free_function_in_decl_state): Likewise.
4180         * lto-streamer-out.c (copy_function_or_variable): Likewise.
4181         * lto-streamer.h (lto_file_decl_data_get_ ## name): Likewise.
4182         (lto_file_decl_data_num_ ## name ## s): Likewise.
4183         (struct lto_tree_ref_table): Remove.
4184         (struct lto_in_decl_state): Replace lto_tree_ref_table with vec<tree>.
4185
4186 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4187
4188         * hash-map.h (hash_map::iterator): New class.
4189         (hash_map::begin): New method.
4190         (hash_map::end): Likewise.
4191         * alias.c, config/alpha/alpha.c, dwarf2asm.c, omp-low.c, tree.h:
4192         replace splay_tree with hash_map.
4193
4194 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4195
4196         * hash-table.h (hash_table::hash_table): Call alloc_entries.
4197         (hash_table::alloc_entries): new method.
4198         (hash_table::expand): Call alloc_entries.
4199         (hash_table::empty): Likewise.
4200
4201 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4202
4203         * config/i386/i386.c, function.c, trans-mem.c, tree-core.h,
4204         tree.c, tree.h, ubsan.c, varasm.c: Use hash_table instead of htab.
4205
4206 2014-11-20  Trevor Saunders  <tsaunders@mozilla.com>
4207
4208         * doc/gty.texi: Document the new cache gty attribute.
4209         * gengtype.c (finish_cache_funcs): New function.
4210         (write_roots): Call gt_clear_cache on global variables with the cache
4211         gty attribute.
4212         * ggc-common.c (ggc_mark_roots): Call gt_clear_caches.
4213         * ggc.h (gt_clear_caches): New declaration.
4214         * hash-table.h (struct ggc_cache_hasher): New hasher for caches in gc
4215         memory.
4216         (gt_cleare_cache): New function.
4217         * emit-rtl.c, rtl.h, tree.c: Use hash_table instead of htab.
4218
4219 2014-11-20  Segher Boessenkool  <segher@kernel.crashing.org>
4220
4221         * combine.c (try_combine): Prefer to delete dead SETs inside
4222         a PARALLEL over keeping them.
4223
4224 2014-11-20  Segher Boessenkool  <segher@kernel.crashing.org>
4225
4226         * combine.c (combine_validate_cost): Always print the insn costs
4227         to the dump file.
4228
4229 2014-11-20  Richard Henderson <rth@redhat.com>
4230
4231         PR target/63977
4232         * config/i386/i386.c (ix86_static_chain): Reinstate the check
4233         for DECL_STATIC_CHAIN.
4234
4235 2014-11-20  Tejas Belagod  <tejas.belagod@arm.com>
4236
4237         * config/aarch64/aarch64-protos.h (aarch64_classify_symbol):
4238         Fixup prototype.
4239         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate,
4240         aarch64_cannot_force_const_mem, aarch64_classify_address,
4241         aarch64_classify_symbolic_expression): Fixup call to
4242         aarch64_classify_symbol.
4243         (aarch64_classify_symbol): Add range-checking for
4244         symbol + offset addressing for tiny and small models.
4245
4246 2014-11-20  Richard Biener  <rguenther@suse.de>
4247
4248         PR middle-end/63962
4249         * match.pd ((p +p off1) +p off2 -> (p +p (off1 + off2))):
4250         Guard with single-use operand 0.
4251
4252 2014-11-20   Richard Biener  <rguenther@suse.de>
4253
4254         PR tree-optimization/63677
4255         * tree-ssa-dom.c: Include gimplify.h for unshare_expr.
4256         (avail_exprs_stack): Make a vector of pairs.
4257         (struct hash_expr_elt): Replace stmt member with vop member.
4258         (expr_elt_hasher::equal): Simplify.
4259         (initialize_hash_element): Adjust.
4260         (initialize_hash_element_from_expr): Likewise.
4261         (dom_opt_dom_walker::thread_across_edge): Likewise.
4262         (record_cond): Likewise.
4263         (dom_opt_dom_walker::before_dom_children): Likewise.
4264         (print_expr_hash_elt): Likewise.
4265         (remove_local_expressions_from_table): Restore previous state
4266         if requested.
4267         (record_equivalences_from_stmt): Record &x + CST as constant
4268         &MEM[&x, CST] for further propagation.
4269         (vuse_eq): New function.
4270         (lookup_avail_expr): For loads use the alias oracle to see
4271         whether a candidate from the expr hash is usable.
4272         (avail_expr_hash): Do not hash VUSEs.
4273
4274 2014-11-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
4275
4276         PR target/59593
4277         * config/arm/arm.md (*movhi_insn): Use right formatting
4278         for immediate.
4279
4280 2014-11-20  Igor Zamyatin  <igor.zamyatin@intel.com>
4281
4282         PR sanitizer/63845
4283         * function.c (assign_parms): Move init of pic_offset_table_rtx
4284         from here to...
4285         * cfgexpand.c (expand_used_vars): ...here.
4286
4287 2014-11-19  Jan Hubicka  <hubicka@ucw.cz>
4288
4289         * tree.c (free_lang_data_in_type): If BINFO has no important
4290         information in it, set it to NULL.
4291         (get_binfo_at_offset): Do not walk fields, only bases.
4292         * ipa-utils.h (polymorphic_type_binfo_p): Be ready for BINFO_TYPE
4293         to be NULL.
4294         * ipa-polymorphic-call.c (record_known_type): Likewise.
4295
4296 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4297
4298         PR jit/63854
4299         * ipa-icf.c (sem_item_optimizer::~sem_item_optimizer): Free each
4300         congruence_class_group *.
4301
4302 2014-11-19  Uros Bizjak  <ubizjak@gmail.com>
4303
4304         PR target/63947
4305         * config/i386/i386.c (put_condition_code) <case LTU, case GEU>:
4306         Output "b" and "nb" suffix for FP mode.
4307
4308 2014-11-19  Jan Hubicka  <hubicka@ucw.cz>
4309
4310         PR bootstrap/63963
4311         * tree-streamer-out.c (write_ts_function_decl_tree_pointers): Stream
4312         out DECL_FUNCTION_SPECIFIC_TARGET
4313         * tree-streamer-in.c (lto_input_ts_function_decl_tree_pointers): Stream
4314         in DECL_FUNCTION_SPECIFIC_TARGET.
4315
4316 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4317
4318         PR jit/63854
4319         * pass_manager.h (GCC_PASS_LISTS): Add all_late_ipa_passes.
4320
4321 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4322
4323         PR jit/63854
4324         * lra.c (lra): After creating live ranges in preparation for call
4325         to lra_inheritance, set live_p to true.
4326
4327 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4328
4329         PR jit/63854
4330         * tree-ssa-threadedge.c (thread_across_edge): Don't just release
4331         "path", delete it.
4332         * tree-ssa-threadupdate.c (delete_jump_thread_path): Likewise.
4333
4334 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4335
4336         PR jit/63854
4337         * tree-ssa-pre.c (do_regular_insertion): Convert "avail" from
4338         vec<> to auto_vec<> to fix a leak.
4339
4340 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4341
4342         PR jit/63854
4343         * dwarf2out.c (dwarf2out_c_finalize): Free producer_string.
4344
4345 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4346
4347         PR jit/63854
4348         * ira-costs.c (ira_costs_c_finalize): New function.
4349         * ira.h (ira_costs_c_finalize): New prototype.
4350         * toplev.c (toplev::finalize): Call ira_costs_c_finalize.
4351
4352 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4353
4354         PR jit/63854
4355         * ipa-reference.c (ipa_reference_c_finalize): Release
4356         optimization_summary_obstack.
4357
4358 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4359
4360         PR jit/63854
4361         * toplev.c (toplev::finalize): Free opts_obstack.
4362
4363 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4364
4365         PR jit/63854
4366         * toplev.c (toplev::finalize): Clean up save_decoded_options.
4367
4368 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4369
4370         PR jit/63854
4371         * bb-reorder.c
4372         (find_rarely_executed_basic_blocks_and_crossing_edges): Convert
4373         local bbs_in_hot_partition from vec<> to auto_vec<>.
4374
4375 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4376
4377         PR jit/63854
4378         * config/alpha/alpha.c (alpha_option_override): Remove static from
4379         "handle_trap_shadows_info" and "align_insns_info".
4380         * config/i386/i386.c (ix86_option_override): Likewise for
4381         "insert_vzeroupper_info".
4382         * config/rl78/rl78.c (rl78_asm_file_start): Likewise for
4383         "rl78_devirt_info" and "rl78_move_elim_info".
4384         * config/rs6000/rs6000.c (rs6000_option_override): Likewise for
4385         "analyze_swaps_info".
4386         * context.c (gcc::context::~context): New.
4387         * context.h (gcc::context::~context): New.
4388         * dumpfile.c (dump_files): Add "false" initializers for new field
4389         "owns_strings".
4390         (gcc::dump_manager::~dump_manager): New.
4391         (gcc::dump_manager::dump_register): Add param "take_ownership".
4392         * dumpfile.h (struct dump_file_info): Add field "owns_strings".
4393         (gcc::dump_manager::~dump_manager): New.
4394         (gcc::dump_manager::dump_register): Add param "take_ownership".
4395         * pass_manager.h (gcc::pass_manager::operator delete): New.
4396         (gcc::pass_manager::~pass_manager): New.
4397         * passes.c (pass_manager::register_one_dump_file): Pass "true" to
4398         new "owns_strings" argument to dump_register.
4399         (pass_manager::operator delete): New.
4400         (delete_pass_tree): New function.
4401         (pass_manager::~pass_manager): New.
4402         * statistics.c (statistics_early_init): Pass "false" to
4403         new "owns_strings" argument to dump_register.
4404         * toplev.c (toplev::finalize): Clean up the context and thus the
4405         things it owns.
4406
4407 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4408
4409         PR jit/63854
4410         * reginfo.c (finish_subregs_of_mode): Replace obstack_finish with
4411         obstack_free when cleaning up valid_mode_changes_obstack.
4412
4413 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4414
4415         PR jit/63854
4416         * opts.c (finalize_options_struct): New.
4417         * opts.h (finalize_options_struct): New.
4418         * toplev.c (toplev::finalize): Call finalize_options_struct
4419         on global_options and global_options_set.
4420
4421 2014-11-19  Manuel López-Ibáñez  <manu@gcc.gnu.org>
4422             Jakub Jelinek  <jakub@redhat.com>
4423
4424         PR driver/36312
4425         PR driver/63837
4426         * gcc.c (process_command): Don't check for input/output
4427         filename equality if output is HOST_BIT_BUCKET.
4428         * toplev.c (init_asm_output): Likewise.
4429
4430 2014-11-19  David Malcolm  <dmalcolm@redhat.com>
4431
4432         Merger of git branch "gimple-classes-v2-option-3".
4433
4434         * ChangeLog.gimple-classes: New.
4435
4436         * coretypes.h (struct gcond): Add forward decl.
4437         (struct gdebug): Likewise.
4438         (struct ggoto): Likewise.
4439         (struct glabel): Likewise.
4440         (struct gswitch): Likewise.
4441         (struct gassign): Likewise.
4442         (struct gasm): Likewise.
4443         (struct gcall): Likewise.
4444         (struct gtransaction): Likewise.
4445         (struct greturn): Likewise.
4446         (struct gbind): Likewise.
4447         (struct gcatch): Likewise.
4448         (struct geh_filter): Likewise.
4449         (struct geh_mnt): Likewise.
4450         (struct geh_else): Likewise.
4451         (struct gresx): Likewise.
4452         (struct geh_dispatch): Likewise.
4453         (struct gphi): Likewise.
4454         (struct gtry): Likewise.
4455         (struct gomp_atomic_load): Likewise.
4456         (struct gomp_atomic_store): Likewise.
4457         (struct gomp_continue): Likewise.
4458         (struct gomp_critical): Likewise.
4459         (struct gomp_for): Likewise.
4460         (struct gomp_parallel): Likewise.
4461         (struct gomp_task): Likewise.
4462         (struct gomp_sections): Likewise.
4463         (struct gomp_single): Likewise.
4464         (struct gomp_target): Likewise.
4465         (struct gomp_teams): Likewise.
4466
4467         * doc/gimple.texi (Class hierarchy of GIMPLE statements): Update
4468         for renaming of gimple subclasses.
4469
4470         * gdbhooks.py: Update.
4471
4472         * gimple-iterator.c (gsi_for_phi): New.
4473         (gsi_start_phis): Strengthen return type from gimple_stmt_iterator
4474         to gphi_iterator.
4475         * gimple-iterator.h (struct gphi_iterator): New subclass of
4476         gimple_stmt_iterator.
4477         (gsi_for_phi): New prototype.
4478         (gsi_start_phis): Strengthen return type from gimple_stmt_iterator
4479         to gphi_iterator.
4480         (gsi_next_nonvirtual_phi): Strengthen param from
4481         gimple_stmt_iterator * to gphi_iterator *, and local "phi" from
4482         gimple to gphi *.
4483
4484         * gsstruct.def: Update for renamings of classes.
4485
4486         * gimple.c (gimple_build_return): Strengthen return type from
4487         gimple to greturn *.
4488         (gimple_call_reset_alias_info): Strengthen param to gcall *.
4489         (gimple_build_call_1): Strengthen return type from gimple to
4490         gcall *.
4491         (gimple_build_call_vec): Likewise.
4492         (gimple_build_call): Likewise.
4493         (gimple_build_call_valist): Likewise.
4494         (gimple_build_call_internal_1): Likewise.
4495         (gimple_build_call_internal): Likewise.
4496         (gimple_build_call_internal_vec): Likewise.
4497         (gimple_build_call_from_tree): Likewise.
4498         (gimple_build_assign_stat): Strengthen return type from gimple to
4499         gassign *.
4500         (gimple_build_assign_with_ops): Likewise.
4501         (gimple_build_assign_with_ops): Likewise.
4502         (gimple_build_cond): Strengthen return type from gimple to
4503         gcond *.
4504         (gimple_build_cond_from_tree): Likewise.
4505         (gimple_cond_set_condition_from_tree): Require a gcond *.
4506         (gimple_build_label): Strengthen return type from gimple to
4507         glabel *.
4508         (gimple_build_goto): Strengthen return type from gimple to
4509         ggoto *.
4510         (gimple_build_bind): Strengthen return type from gimple to
4511         gbind *.
4512         (gimple_build_asm_1): Strengthen return type from gimple to
4513         gasm *.
4514         (gimple_build_asm_vec): Likewise.
4515         (gimple_build_catch): Strengthen return type from gimple to
4516         gcatch *.
4517         (gimple_build_eh_filter): Strengthen return type from gimple to
4518         geh_filter *.
4519         (gimple_build_eh_must_not_throw): Strengthen return type from
4520         gimple to geh_mnt *.
4521         (gimple_build_eh_else): Strengthen return type from gimple to
4522         geh_else *.
4523         (gimple_build_try): Update for renaming of gimple_statement_try to
4524         gtry.
4525         (gimple_build_resx): Strengthen return type from gimple to
4526         gresx *.
4527         (gimple_build_switch_nlabels): Strengthen return type from gimple
4528         to gswitch *.
4529         (gimple_build_switch): Likewise.
4530         (gimple_build_eh_dispatch): Strengthen return type from gimple to
4531         geh_dispatch *.
4532         (gimple_build_debug_bind_stat): Strengthen return type from gimple
4533         to gdebug *.
4534         (gimple_build_debug_source_bind_stat): Strengthen return type from
4535         gimple to gdebug *.
4536         (gimple_build_omp_critical): Strengthen return type from gimple to
4537         gomp_critical *.
4538         (gimple_build_omp_for): Strengthen return type from gimple to
4539         gomp_for *.
4540         (gimple_build_omp_parallel): Strengthen return type from gimple to
4541         gomp_parallel *.
4542         (gimple_build_omp_task): Strengthen return type from gimple to
4543         gomp_task *.
4544         (gimple_build_omp_continue): Strengthen return type from gimple to
4545         gomp_continue *.
4546         (gimple_build_omp_sections): Strengthen return type from gimple to
4547         gomp_sections *.
4548         (gimple_build_omp_single): Strengthen return type from gimple to
4549         gomp_single *.
4550         (gimple_build_omp_target): Strengthen return type from gimple to
4551         gomp_target *.
4552         (gimple_build_omp_teams): Strengthen return type from gimple to
4553         gomp_teams *.
4554         (gimple_build_omp_atomic_load): Strengthen return type from gimple
4555         to gomp_atomic_load *.
4556         (gimple_build_omp_atomic_store): Strengthen return type from gimple
4557         to gomp_atomic_store *.
4558         (gimple_build_transaction): Strengthen return type from gimple
4559         to gtransaction *.
4560         (empty_stmt_p): Replace check for GIMPLE_BIND with a dyn_cast.
4561         (gimple_call_fnspec): Require a const gcall *.
4562         (gimple_call_arg_flags): Likewise.
4563         (gimple_call_return_flags): Likewise.
4564         (gimple_set_bb): Add a checked cast.
4565         (gimple_copy): Within the cases, add locals of the appropriate
4566         subclass and use in place of "stmt" and "copy" for typesafety.
4567         (gimple_has_side_effects): Add a checked cast.
4568         (gimple_could_trap_p_1): Likewise.
4569         (gimple_call_copy_skip_args): Require a gcall *, and return one.
4570         (gimple_asm_clobbers_memory_p): Require a const gasm *.
4571         (infer_nonnull_range): Replace a check for GIMPLE_RETURN with a
4572         dyn_cast, introducing local "return_stmt" and using ti in place
4573         of "stmt".
4574
4575         * gimple.h (gimple_vec): Eliminate this typedef.
4576         (struct gimple_statement_call): Rename to...
4577         (struct gcall): ...this.
4578         (struct gimple_statement_bind): Rename to...
4579         (struct gbind): ...this.
4580         (struct gimple_statement_catch): Rename to...
4581         (struct gcatch): ...this.
4582         (struct gimple_statement_eh_filter): Rename to...
4583         (struct geh_filter): ...this.
4584         (struct gimple_statement_eh_else): Rename to...
4585         (struct geh_else): ...this.
4586         (struct gimple_statement_eh_mnt): Rename to...
4587         (struct geh_mnt): ...this.
4588         (struct gimple_statement_phi): Rename to...
4589         (struct gphi): ...this.
4590         (struct gimple_statement_resx): Rename to...
4591         (struct gresx): ...this.
4592         (struct gimple_statement_eh_dispatch): Rename to...
4593         (struct geh_dispatch): ...this.
4594         (struct gimple_statement_try): Rename to...
4595         (struct gtry): ...this.
4596         (struct gimple_statement_asm): Rename to...
4597         (struct gasm): ...this.
4598         (struct gimple_statement_omp_critical): Rename to...
4599         (struct gomp_critical): ...this.
4600         (struct gimple_statement_omp_for): Rename to...
4601         (struct gomp_for): ...this.
4602         (struct gimple_statement_omp_parallel): Rename to...
4603         (struct gomp_parallel): ...this.
4604         (struct gimple_statement_omp_target): Rename to...
4605         (struct gomp_target): ...this.
4606         (struct gimple_statement_omp_task): Rename to...
4607         (struct gomp_task): ...this.
4608         (struct gimple_statement_omp_sections): Rename to...
4609         (struct gomp_sections): ...this.
4610         (struct gimple_statement_omp_continue): Rename to...
4611         (struct gomp_continue): ...this.
4612         (struct gimple_statement_omp_single): Rename to...
4613         (struct gomp_single): ...this.
4614         (struct gimple_statement_omp_teams): Rename to...
4615         (struct gomp_teams): ...this.
4616         (struct gimple_statement_omp_atomic_load): Rename to...
4617         (struct gomp_atomic_load): ...this.
4618         (struct gimple_statement_omp_atomic_store :): Rename to...
4619         (struct gomp_atomic_store :): ...this.
4620         (struct gimple_statement_transaction): Rename to...
4621         (struct gtransaction): ...this.
4622         (struct gcond): New subclass.
4623         (struct gdebug): New subclass.
4624         (struct ggoto): New subclass.
4625         (struct glabel): New subclass.
4626         (struct gswitch): New subclass.
4627         (struct gassign): New subclass.
4628         (struct greturn): New subclass.
4629         (is_a_helper <gimple_statement_asm *>::test): Rename to...
4630         (is_a_helper <gasm *>::test): ...this.
4631         (is_a_helper <gimple_statement_bind *>::test): Rename to...
4632         (is_a_helper <gbind *>::test): ...this.
4633         (is_a_helper <gassign *>::test): New.
4634         (is_a_helper <gimple_statement_call *>::test): Rename to...
4635         (is_a_helper <gcall *>::test): ...this.
4636         (is_a_helper <gimple_statement_catch *>::test): Rename to...
4637         (is_a_helper <gcatch *>::test): ...this.
4638         (is_a_helper <gimple_statement_resx *>::test): Rename to...
4639         (is_a_helper <gresx *>::test): ...this.
4640         (is_a_helper <gcond *>::test): New.
4641         (is_a_helper <gdebug *>::test): New.
4642         (is_a_helper <ggoto *>::test): New.
4643         (is_a_helper <glabel *>::test): New.
4644         (is_a_helper <gimple_statement_eh_dispatch *>::test): Rename to...
4645         (is_a_helper <geh_dispatch *>::test): ...this.
4646         (is_a_helper <gimple_statement_eh_else *>::test): Rename to...
4647         (is_a_helper <geh_else *>::test): ...this.
4648         (is_a_helper <gimple_statement_eh_filter *>::test): Rename to...
4649         (is_a_helper <geh_filter *>::test): ...this.
4650         (is_a_helper <gimple_statement_eh_mnt *>::test): Rename to...
4651         (is_a_helper <geh_mnt *>::test): ...this.
4652         (is_a_helper <gimple_statement_omp_atomic_load *>::test): Rename to...
4653         (is_a_helper <gomp_atomic_load *>::test): ...this.
4654         (is_a_helper <gimple_statement_omp_atomic_store *>::test): Rename to...
4655         (is_a_helper <gomp_atomic_store *>::test): ...this.
4656         (is_a_helper <gimple_statement_omp_continue *>::test): Rename to...
4657         (is_a_helper <gomp_continue *>::test): ...this.
4658         (is_a_helper <gimple_statement_omp_critical *>::test): Rename to...
4659         (is_a_helper <gomp_critical *>::test): ...this.
4660         (is_a_helper <gimple_statement_omp_for *>::test): Rename to...
4661         (is_a_helper <gomp_for *>::test): ...this.
4662         (is_a_helper <gimple_statement_omp_parallel *>::test): Rename to...
4663         (is_a_helper <gomp_parallel *>::test): ...this.
4664         (is_a_helper <gimple_statement_omp_target *>::test): Rename to...
4665         (is_a_helper <gomp_target *>::test): ...this.
4666         (is_a_helper <gimple_statement_omp_sections *>::test): Rename to...
4667         (is_a_helper <gomp_sections *>::test): ...this.
4668         (is_a_helper <gimple_statement_omp_single *>::test): Rename to...
4669         (is_a_helper <gomp_single *>::test): ...this.
4670         (is_a_helper <gimple_statement_omp_teams *>::test): Rename to...
4671         (is_a_helper <gomp_teams *>::test): ...this.
4672         (is_a_helper <gimple_statement_omp_task *>::test): Rename to...
4673         (is_a_helper <gomp_task *>::test): ...this.
4674         (is_a_helper <gimple_statement_phi *>::test): Rename to...
4675         (is_a_helper <gphi *>::test): ...this.
4676         (is_a_helper <gimple_statement_transaction *>::test): Rename to...
4677         (is_a_helper <gtransaction *>::test): ...this.
4678         (is_a_helper <greturn *>::test): New.
4679         (is_a_helper <gswitch *>::test): New.
4680         (is_a_helper <gimple_statement_try *>::test): Rename to...
4681         (is_a_helper <gtry *>::test): ...this.
4682         (is_a_helper <const gimple_statement_asm *>::test): Rename to...
4683         (is_a_helper <const gasm *>::test): ...this.
4684         (is_a_helper <const gimple_statement_bind *>::test): Rename to...
4685         (is_a_helper <const gbind *>::test): ...this.
4686         (is_a_helper <const gimple_statement_call *>::test): Rename to...
4687         (is_a_helper <const gcall *>::test): ...this.
4688         (is_a_helper <const gimple_statement_catch *>::test): Rename to...
4689         (is_a_helper <const gcatch *>::test): ...this.
4690         (is_a_helper <const gimple_statement_resx *>::test): Rename to...
4691         (is_a_helper <const gresx *>::test): ...this.
4692         (is_a_helper <const gimple_statement_eh_dispatch *>::test): Rename to...
4693         (is_a_helper <const geh_dispatch *>::test): ...this.
4694         (is_a_helper <const gimple_statement_eh_filter *>::test): Rename to...
4695         (is_a_helper <const geh_filter *>::test): ...this.
4696         (is_a_helper <const gimple_statement_omp_atomic_load *>::test):
4697         Rename to...
4698         (is_a_helper <const gomp_atomic_load *>::test): ...this.
4699         (is_a_helper <const gimple_statement_omp_atomic_store *>::test):
4700         Rename to...
4701         (is_a_helper <const gomp_atomic_store *>::test): ...this.
4702         (is_a_helper <const gimple_statement_omp_continue *>::test):
4703         Rename to...
4704         (is_a_helper <const gomp_continue *>::test): ...this.
4705         (is_a_helper <const gimple_statement_omp_critical *>::test):
4706         Rename to...
4707         (is_a_helper <const gomp_critical *>::test): ...this.
4708         (is_a_helper <const gimple_statement_omp_for *>::test): Rename to...
4709         (is_a_helper <const gomp_for *>::test): ...this.
4710         (is_a_helper <const gimple_statement_omp_parallel *>::test):
4711         Rename to...
4712         (is_a_helper <const gomp_parallel *>::test): ...this.
4713         (is_a_helper <const gimple_statement_omp_target *>::test): Rename to...
4714         (is_a_helper <const gomp_target *>::test): ...this.
4715         (is_a_helper <const gimple_statement_omp_sections *>::test):
4716         Rename to...
4717         (is_a_helper <const gomp_sections *>::test): ...this.
4718         (is_a_helper <const gimple_statement_omp_single *>::test): Rename to...
4719         (is_a_helper <const gomp_single *>::test): ...this.
4720         (is_a_helper <const gimple_statement_omp_teams *>::test): Rename to...
4721         (is_a_helper <const gomp_teams *>::test): ...this.
4722         (is_a_helper <const gimple_statement_omp_task *>::test): Rename to...
4723         (is_a_helper <const gomp_task *>::test): ...this.
4724         (is_a_helper <const gimple_statement_phi *>::test): Rename to...
4725         (is_a_helper <const gphi *>::test): ...this.
4726         (is_a_helper <const gimple_statement_transaction *>::test): Rename to...
4727         (is_a_helper <const gtransaction *>::test): ...this.
4728         (gimple_build_return): Strengthen return type to greturn *.
4729         (gimple_call_reset_alias_info): Require a gcall *.
4730         (gimple_build_call_vec): Return a gcall *.
4731         (gimple_build_call): Likewise.
4732         (gimple_build_call_valist): Likewise.
4733         (gimple_build_call_internal): Likewise.
4734         (gimple_build_call_internal_vec): Likewise.
4735         (gimple_build_call_from_tree): Likewise.
4736         (gimple_build_assign_stat): Return a gassign *.
4737         (gimple_build_assign_with_ops): Likewise.
4738         (gimple_build_cond): Return a gcond *.
4739         (gimple_build_cond_from_tree): Likewise.
4740         (gimple_cond_set_condition_from_tree): Require a gcond *.
4741         (gimple_build_label): Return a glabel *.
4742         (gimple_build_goto): Return a ggoto *.
4743         (gimple_build_bind): Return a gbind *.
4744         (gimple_build_asm_vec): Return a gasm *.
4745         (gimple_build_catch): Return a gcatch *.
4746         (gimple_build_eh_filter): Return a geh_filter *.
4747         (gimple_build_eh_must_not_throw): Return a geh_mnt *.
4748         (gimple_build_eh_else): Return a geh_else *.
4749         (gimple_build_try): Return a gtry *.
4750         (gimple_build_resx): Return a gresx *.
4751         (gimple_build_switch_nlabels): Return a gswitch *.
4752         (gimple_build_switch): Return a gswitch *.
4753         (gimple_build_eh_dispatch): Return a geh_dispatch *.
4754         (gimple_build_debug_bind_stat): Return a gdebug *.
4755         (gimple_build_debug_source_bind_stat): Return a gdebug *.
4756         (gimple_build_omp_critical): Return a gomp_critical *.
4757         (gimple_build_omp_for): Return a gomp_for *.
4758         (gimple_build_omp_parallel): Return a gomp_parallel *.
4759         (gimple_build_omp_task): Return a gomp_task *.
4760         (gimple_build_omp_continue): Return a gomp_continue *.
4761         (gimple_build_omp_sections): Return a gomp_sections *.
4762         (gimple_build_omp_single): Return a gomp_single *.
4763         (gimple_build_omp_target): Return a gomp_target *.
4764         (gimple_build_omp_teams): Return a gomp_teams *.
4765         (gimple_build_omp_atomic_load): Return a gomp_atomic_load *.
4766         (gimple_build_omp_atomic_store): Return a gomp_atomic_store *.
4767         (gimple_build_transaction): Return a gtransaction *.
4768         (gimple_call_arg_flags): Require a const gcall *.
4769         (gimple_call_return_flags): Likewise.
4770         (gimple_call_copy_skip_args): Require and return a gcall *.
4771         (gimple_asm_clobbers_memory_p): Require a const gasm *.
4772         (gimple_seq_first_stmt_as_a_bind): New.
4773         (gimple_assign_nontemporal_move_p): Require a const gassign *
4774         rather than a const_gimple.
4775         (gimple_call_internal_fn): Update for renaming to gcall.
4776         (gimple_call_fntype): Likewise.
4777         (gimple_call_set_fntype): Require a gcall * rather than a gimple.
4778         (gimple_call_set_fn): Likewise.
4779         (gimple_call_set_internal_fn): Likewise.
4780         (gimple_call_set_chain): Likewise.
4781         (gimple_call_set_tail): Likewise.
4782         (gimple_call_tail_p): Likewise.
4783         (gimple_call_set_return_slot_opt): Likewise.
4784         (gimple_call_return_slot_opt_p): Likewise.
4785         (gimple_call_set_from_thunk): Likewise.
4786         (gimple_call_from_thunk_p): Likewise.
4787         (gimple_call_set_va_arg_pack): Likewise.
4788         (gimple_call_va_arg_pack_p): Likewise.
4789         (gimple_call_set_nothrow): Likewise.
4790         (gimple_call_nothrow_p): Likewise.
4791         (gimple_call_set_alloca_for_var): Likewise.
4792         (gimple_call_alloca_for_var_p): Likewise.
4793         (gimple_call_use_set): Likewise.
4794         (gimple_call_clobber_set): Likewise.
4795         (gimple_call_return_type): Require a const gcall * rather than a
4796         const_gimple.
4797         (gimple_call_chain_ptr): Likewise.
4798         (gimple_call_copy_flags): Require a pair of gcall *.
4799         (gimple_cond_set_code): Require a gcond * rather than a gimple
4800         (gimple_cond_set_lhs): Likewise.
4801         (gimple_cond_set_rhs): Likewise.
4802         (gimple_cond_set_true_label): Likewise.
4803         (gimple_cond_set_false_label): Likewise.
4804         (gimple_cond_make_false): Likewise.
4805         (gimple_cond_make_true): Likewise.
4806         (gimple_cond_lhs_ptr): Require a const gcond * rather than a
4807         const_gimple.
4808         (gimple_cond_rhs_ptr): Likewise.
4809         (gimple_cond_true_label): Likewise.
4810         (gimple_cond_false_label): Likewise.
4811         (gimple_cond_true_p): Likewise.
4812         (gimple_cond_false_p): Likewise.
4813         (gimple_cond_set_condition): Likewise.
4814         (gimple_label_label): Require a const glabel *.
4815         (gimple_label_set_label): Require a glabel *.
4816         (gimple_goto_set_dest): Require a ggoto *.
4817         (gimple_bind_vars): Require a const gbind *.
4818         (gimple_bind_block): Likewise.
4819         (gimple_bind_set_vars): Require a gbind *.
4820         (gimple_bind_append_vars): Likewise.
4821         (gimple_bind_body_ptr): Likewise.
4822         (gimple_bind_body): Likewise.
4823         (gimple_bind_set_body): Likewise.
4824         (gimple_bind_add_stmt): Likewise.
4825         (gimple_bind_add_seq): Likewise.
4826         (gimple_bind_set_block): Likewise.
4827         (gimple_asm_ninputs): Require a const gasm *.
4828         (gimple_asm_noutputs): Likewise.
4829         (gimple_asm_nclobbers): Likewise.
4830         (gimple_asm_nlabels): Likewise.
4831         (gimple_asm_input_op): Likewise.
4832         (gimple_asm_input_op_ptr): Likewise.
4833         (gimple_asm_output_op): Likewise.
4834         (gimple_asm_output_op_ptr): Likewise.
4835         (gimple_asm_clobber_op): Likewise.
4836         (gimple_asm_label_op): Likewise.
4837         (gimple_asm_string): Likewise.
4838         (gimple_asm_volatile_p): Likewise.
4839         (gimple_asm_input_p): Likewise.
4840         (gimple_asm_set_input_op): Require a gasm *.
4841         (gimple_asm_set_output_op): Likewise.
4842         (gimple_asm_set_clobber_op): Likewise.
4843         (gimple_asm_set_label_op): Likewise.
4844         (gimple_asm_set_volatile): Likewise.
4845         (gimple_asm_set_input): Likewise.
4846         (gimple_catch_types): Require a const gcatch *.
4847         (gimple_catch_types_ptr): Require a gcatch *.
4848         (gimple_catch_handler_ptr): Likewise.
4849         (gimple_catch_handler): Likewise.
4850         (gimple_catch_set_types): Likewise.
4851         (gimple_catch_set_handler): Likewise.
4852         (gimple_eh_filter_types): Update for renaming of subclass to
4853         geh_filter.
4854         (gimple_eh_filter_types_ptr): Likewise.
4855         (gimple_eh_filter_failure_ptr): Likewise.
4856         (gimple_eh_filter_set_types): Require a geh_filter *.
4857         (gimple_eh_filter_set_failure): Likewise.
4858         (gimple_eh_must_not_throw_fndecl): Require a geh_mnt *.
4859         (gimple_eh_must_not_throw_set_fndecl): Likewise.
4860         (gimple_eh_else_n_body_ptr): Require a geh_else *.
4861         (gimple_eh_else_n_body): Likewise.
4862         (gimple_eh_else_e_body_ptr): Likewise.
4863         (gimple_eh_else_e_body): Likewise.
4864         (gimple_eh_else_set_n_body): Likewise.
4865         (gimple_eh_else_set_e_body): Likewise.
4866         (gimple_try_set_kind): Require a gtry *.
4867         (gimple_try_set_catch_is_cleanup): Likewise.
4868         (gimple_try_set_eval): Likewise.
4869         (gimple_try_set_cleanup): Likewise.
4870         (gimple_try_eval_ptr): Update for renaming of subclass to gtry.
4871         (gimple_try_cleanup_ptr): Likewise.
4872         (gimple_phi_capacity): Update for renaming of subclass to gphi.
4873         (gimple_phi_num_args): Likewise.
4874         (gimple_phi_result): Likewise.
4875         (gimple_phi_result_ptr): Likewise.
4876         (gimple_phi_arg): Likewise.
4877         (gimple_phi_set_result): Require a gphi *.
4878         (gimple_phi_set_arg): Likewise.
4879         (gimple_phi_arg_def_ptr): Likewise.
4880         (gimple_phi_arg_edge): Likewise.
4881         (gimple_phi_arg_location): Likewise.
4882         (gimple_phi_arg_location_from_edge): Likewise.
4883         (gimple_phi_arg_set_location): Likewise.
4884         (gimple_phi_arg_has_location): Likewise.
4885         (gimple_resx_region): Require a const gresx *.
4886         (gimple_resx_set_region): Require a gresx *.
4887         (gimple_eh_dispatch_region): Require a const geh_dispatch *.
4888         (gimple_eh_dispatch_set_region): Require a geh_dispatch *.
4889         (gimple_switch_num_labels): Require a const gswitch *.
4890         (gimple_switch_set_num_labels): Likewise.
4891         (gimple_switch_index): Likewise.
4892         (gimple_switch_index_ptr): Likewise.
4893         (gimple_switch_label): Likewise.
4894         (gimple_switch_default_label): Likewise.
4895         (gimple_switch_set_index): Require a gswitch *.
4896         (gimple_switch_set_label): Likewise.
4897         (gimple_switch_set_default_label): Likewise.
4898         (gimple_omp_critical_name): Require a const gomp_critical *.
4899         (gimple_omp_critical_name_ptr): Require a gomp_critical *.
4900         (gimple_omp_critical_set_name): Likewise.
4901         (gimple_omp_for_set_kind): Require a gomp_for *.
4902         (gimple_omp_for_set_combined_p): Likewise.
4903         (gimple_omp_for_set_combined_into_p): Likewise.
4904         (gimple_omp_for_clauses): Update for renaming of subclass to
4905         gomp_for.
4906         (gimple_omp_for_clauses_ptr): Likewise.
4907         (gimple_omp_for_set_clauses): Likewise.
4908         (gimple_omp_for_collapse): Likewise.
4909         (gimple_omp_for_index): Likewise.
4910         (gimple_omp_for_index_ptr): Likewise.
4911         (gimple_omp_for_set_index): Likewise.
4912         (gimple_omp_for_initial): Likewise.
4913         (gimple_omp_for_initial_ptr): Likewise.
4914         (gimple_omp_for_set_initial): Likewise.
4915         (gimple_omp_for_final): Likewise.
4916         (gimple_omp_for_final_ptr): Likewise.
4917         (gimple_omp_for_set_final): Likewise.
4918         (gimple_omp_for_incr): Likewise.
4919         (gimple_omp_for_incr_ptr): Likewise.
4920         (gimple_omp_for_set_incr): Likewise.
4921         (gimple_omp_for_pre_body): Likewise.
4922         (gimple_omp_for_set_pre_body): Likewise.
4923         (gimple_omp_parallel_clauses): Update for renaming of subclass to
4924         gomp_parallel.
4925         (gimple_omp_parallel_clauses_ptr): Require a gomp_parallel *.
4926         (gimple_omp_parallel_set_clauses): Likewise.
4927         (gimple_omp_parallel_child_fn_ptr): Likewise.
4928         (gimple_omp_parallel_set_child_fn): Likewise.
4929         (gimple_omp_parallel_data_arg_ptr): Likewise.
4930         (gimple_omp_parallel_set_data_arg): Likewise.
4931         (gimple_omp_parallel_child_fn): Require a const gomp_parallel *.
4932         (gimple_omp_parallel_data_arg): Likewise.
4933         (gimple_omp_task_clauses): Update for renaming of subclass to
4934         gomp_task.
4935         (gimple_omp_task_clauses_ptr): Likewise.
4936         (gimple_omp_task_set_clauses): Likewise.
4937         (gimple_omp_task_child_fn): Likewise.
4938         (gimple_omp_task_child_fn_ptr): Likewise.
4939         (gimple_omp_task_set_child_fn): Likewise.
4940         (gimple_omp_task_data_arg): Likewise.
4941         (gimple_omp_task_data_arg_ptr): Likewise.
4942         (gimple_omp_task_set_data_arg): Likewise.
4943         (gimple_omp_taskreg_clauses): Whitespace fixes.
4944         (gimple_omp_taskreg_clauses_ptr): Likewise.
4945         (gimple_omp_taskreg_set_clauses): Likewise.
4946         (gimple_omp_taskreg_child_fn): Likewise.
4947         (gimple_omp_taskreg_child_fn_ptr): Likewise.
4948         (gimple_omp_taskreg_set_child_fn): Likewise.
4949         (gimple_omp_taskreg_data_arg): Likewise.
4950         (gimple_omp_taskreg_data_arg_ptr): Likewise.
4951         (gimple_omp_taskreg_set_data_arg): Likewise.
4952         (gimple_omp_task_copy_fn): Update for renaming of subclass to
4953         gomp_task.
4954         (gimple_omp_task_copy_fn_ptr): Likewise.
4955         (gimple_omp_task_set_copy_fn): Likewise.
4956         (gimple_omp_task_arg_size): Likewise.
4957         (gimple_omp_task_arg_size_ptr): Likewise.
4958         (gimple_omp_task_set_arg_size): Likewise.
4959         (gimple_omp_task_arg_align): Likewise.
4960         (gimple_omp_task_arg_align_ptr): Likewise.
4961         (gimple_omp_task_set_arg_align): Likewise.
4962         (gimple_omp_single_clauses): Update for renaming of subclass to
4963         gomp_single.
4964         (gimple_omp_single_clauses_ptr): Likewise.
4965         (gimple_omp_single_set_clauses): Likewise.
4966         (gimple_omp_target_clauses): Update for renaming of subclass to
4967         gomp_target.
4968         (gimple_omp_target_clauses_ptr): Likewise.
4969         (gimple_omp_target_set_clauses): Require a gomp_target *.
4970         (gimple_omp_target_set_kind): Likewise.
4971         (gimple_omp_target_child_fn_ptr): Likewise.
4972         (gimple_omp_target_set_child_fn): Likewise.
4973         (gimple_omp_target_data_arg_ptr): Likewise.
4974         (gimple_omp_target_set_data_arg): Likewise.
4975         (gimple_omp_target_child_fn): Require a const gomp_target *.
4976         (gimple_omp_target_data_arg): Likewise.
4977         (gimple_omp_teams_clauses): Update for renaming of subclass to
4978         gomp_teams.
4979         (gimple_omp_teams_clauses_ptr): Likewise.
4980         (gimple_omp_teams_set_clauses): Require a gomp_teams *.
4981         (gimple_omp_sections_clauses): Update for renaming of subclass to
4982         gomp_sections.
4983         (gimple_omp_sections_clauses_ptr): Likewise.
4984         (gimple_omp_sections_set_clauses): Likewise.
4985         (gimple_omp_sections_control): Likewise.
4986         (gimple_omp_sections_control_ptr): Likewise.
4987         (gimple_omp_sections_set_control): Likewise.
4988         (gimple_omp_for_set_cond): Likewise.
4989         (gimple_omp_for_cond): Likewise.
4990         (gimple_omp_atomic_store_set_val): Require a gomp_atomic_store *.
4991         (gimple_omp_atomic_store_val_ptr): Likewise.
4992         (gimple_omp_atomic_load_set_lhs): Likewise.
4993         (gimple_omp_atomic_store_val): Require a const gomp_atomic_store *.
4994         (gimple_omp_atomic_load_lhs): Likewise.
4995         (gimple_omp_atomic_load_rhs): Likewise.
4996         (gimple_omp_atomic_load_lhs_ptr): Require a gomp_atomic_load *.
4997         (gimple_omp_atomic_load_set_rhs): Likewise.
4998         (gimple_omp_atomic_load_rhs_ptr): Likewise.
4999         (gimple_omp_continue_control_def): Require a const gomp_continue *.
5000         (gimple_omp_continue_control_use): Likewise.
5001         (gimple_omp_continue_control_def_ptr): Require a gomp_continue *.
5002         (gimple_omp_continue_set_control_def): Likewise.
5003         (gimple_omp_continue_control_use_ptr): Likewise.
5004         (gimple_omp_continue_set_control_use): Likewise.
5005         (gimple_transaction_body_ptr): Require a gtransaction *.
5006         (gimple_transaction_body): Likewise.
5007         (gimple_transaction_label_ptr): Likewise.
5008         (gimple_transaction_label): Require a const gtransaction *.
5009         (gimple_transaction_subcode): Likewise.
5010         (gimple_transaction_set_body): Require a gtransaction *.
5011         (gimple_transaction_set_label): Likewise.
5012         (gimple_transaction_set_subcode): Likewise.
5013         (gimple_return_retval_ptr): Require a const greturn *.
5014         (gimple_return_retval): Likewise.
5015         (gimple_return_set_retval): Require a greturn *.
5016         (gimple_expr_type): Introduce local "call_stmt" and use in place of
5017         "stmt" for typesafety.
5018
5019         * asan.c: Use gimple subclasses.
5020         * auto-profile.c: Likewise.
5021         * builtins.c: Likewise.
5022         * builtins.h: Likewise.
5023         * cfgexpand.c: Likewise.
5024         * cfgloop.c: Likewise.
5025         * cfgloopmanip.c: Likewise.
5026         * cgraph.c: Likewise.
5027         * cgraph.h: Likewise.
5028         * cgraphbuild.c: Likewise.
5029         * cgraphclones.c: Likewise.
5030         * cgraphunit.c: Likewise.
5031         * expr.h: Likewise.
5032         * gimple-builder.c: Likewise.
5033         * gimple-builder.h: Likewise.
5034         * gimple-fold.c: Likewise.
5035         * gimple-low.c: Likewise.
5036         * gimple-pretty-print.c: Likewise.
5037         * gimple-ssa-isolate-paths.c: Likewise.
5038         * gimple-ssa-strength-reduction.c: Likewise.
5039         * gimple-streamer-in.c: Likewise.
5040         * gimple-streamer-out.c: Likewise.
5041         * gimple-walk.c: Likewise.
5042         * gimplify-me.c: Likewise.
5043         * gimplify.c: Likewise.
5044         * gimplify.h: Likewise.
5045         * graphite-scop-detection.c: Likewise.
5046         * graphite-sese-to-poly.c: Likewise.
5047         * internal-fn.c: Likewise.
5048         * internal-fn.def:: Likewise.
5049         * internal-fn.h: Likewise.
5050         * ipa-icf-gimple.c: Likewise.
5051         * ipa-icf-gimple.h: Likewise.
5052         * ipa-icf.c: Likewise.
5053         * ipa-inline-analysis.c: Likewise.
5054         * ipa-prop.c: Likewise.
5055         * ipa-prop.h: Likewise.
5056         * ipa-pure-const.c: Likewise.
5057         * ipa-split.c: Likewise.
5058         * lto-streamer-in.c: Likewise.
5059         * lto-streamer-out.c: Likewise.
5060         * omp-low.c: Likewise.
5061         * predict.c: Likewise.
5062         * sanopt.c: Likewise.
5063         * sese.c: Likewise.
5064         * ssa-iterators.h: Likewise.
5065         * stmt.c: Likewise.
5066         * trans-mem.c: Likewise.
5067         * tree-call-cdce.c: Likewise.
5068         * tree-cfg.c: Likewise.
5069         * tree-cfg.h: Likewise.
5070         * tree-cfgcleanup.c: Likewise.
5071         * tree-chkp.c: Likewise.
5072         * tree-chkp.h: Likewise.
5073         * tree-complex.c: Likewise.
5074         * tree-data-ref.c: Likewise.
5075         * tree-dfa.c: Likewise.
5076         * tree-eh.c: Likewise.
5077         * tree-eh.h: Likewise.
5078         * tree-emutls.c: Likewise.
5079         * tree-if-conv.c: Likewise.
5080         * tree-inline.c: Likewise.
5081         * tree-inline.h: Likewise.
5082         * tree-into-ssa.c: Likewise.
5083         * tree-into-ssa.h: Likewise.
5084         * tree-loop-distribution.c: Likewise.
5085         * tree-nrv.c: Likewise.
5086         * tree-object-size.c: Likewise.
5087         * tree-outof-ssa.c: Likewise.
5088         * tree-parloops.c: Likewise.
5089         * tree-phinodes.c: Likewise.
5090         * tree-phinodes.h: Likewise.
5091         * tree-predcom.c: Likewise.
5092         * tree-profile.c: Likewise.
5093         * tree-scalar-evolution.c: Likewise.
5094         * tree-scalar-evolution.h
5095         * tree-sra.cn_function):
5096         * tree-ssa-alias.c: Likewise.
5097         * tree-ssa-alias.h: Likewise.
5098         * tree-ssa-ccp.c: Likewise.
5099         * tree-ssa-coalesce.c: Likewise.
5100         * tree-ssa-copy.c: Likewise.
5101         * tree-ssa-copyrename.c: Likewise.
5102         * tree-ssa-dce.c: Likewise.
5103         * tree-ssa-dom.c: Likewise.
5104         * tree-ssa-forwprop.c: Likewise.
5105         * tree-ssa-ifcombine.c: Likewise.
5106         * tree-ssa-live.c: Likewise.
5107         * tree-ssa-loop-im.c: Likewise.
5108         * tree-ssa-loop-ivcanon.c: Likewise.
5109         * tree-ssa-loop-ivopts.c: Likewise.
5110         * tree-ssa-loop-manip.c: Likewise.
5111         * tree-ssa-loop-niter.c: Likewise.
5112         * tree-ssa-loop-prefetch.c: Likewise.
5113         * tree-ssa-loop-unswitch.c: Likewise.
5114         * tree-ssa-math-opts.c: Likewise.
5115         * tree-ssa-operands.c: Likewise.
5116         * tree-ssa-phiopt.c: Likewise.
5117         * tree-ssa-phiprop.c: Likewise.
5118         * tree-ssa-pre.c: Likewise.
5119         * tree-ssa-propagate.c: Likewise.
5120         * tree-ssa-propagate.h: Likewise.
5121         * tree-ssa-reassoc.c: Likewise.
5122         * tree-ssa-sccvn.c: Likewise.
5123         * tree-ssa-sccvn.h: Likewise.
5124         * tree-ssa-sink.c: Likewise.
5125         * tree-ssa-strlen.c
5126         * tree-ssa-structalias.c
5127         * tree-ssa-tail-merge.c: Likewise.
5128         * tree-ssa-ter.c: Likewise.
5129         * tree-ssa-threadedge.c: Likewise.
5130         * tree-ssa-threadedge.h: Likewise.
5131         * tree-ssa-threadupdate.c: Likewise.
5132         * tree-ssa-uncprop.c: Likewise.
5133         * tree-ssa-uninit.c: Likewise.
5134         * tree-ssa.c: Likewise.
5135         * tree-stdarg.c: Likewise.
5136         * tree-switch-conversion.c: Likewise.
5137         * tree-tailcall.c: Likewise.
5138         * tree-vect-data-refs.c: Likewise.
5139         * tree-vect-generic.c: Likewise.
5140         * tree-vect-loop-manip.c: Likewise.
5141         * tree-vect-loop.c: Likewise.
5142         * tree-vect-patterns.c: Likewise.
5143         * tree-vect-slp.c: Likewise.
5144         * tree-vect-stmts.c: Likewise.
5145         * tree-vectorizer.h: Likewise.
5146         * tree-vrp.c: Likewise.
5147         * tree.c: Likewise.
5148         * ubsan.c: Likewise.
5149         * value-prof.c: Likewise.
5150         * value-prof.h: Likewise.
5151         * vtable-verify.c: Likewise.
5152
5153 2014-11-19  Markus Trippelsdorf  <markus@trippelsdorf.de>
5154
5155         * config/rs6000/constraints.md: Avoid signed integer overflows.
5156         * config/rs6000/predicates.md: Likewise.
5157
5158 2014-11-19  Renlin Li  <Renlin.Li@arm.com>
5159
5160         PR target/63424
5161         * config/aarch64/aarch64-simd.md (<su><maxmin>v2di3): New.
5162
5163 2014-11-19  Renlin Li  <Renlin.Li@arm.com>
5164
5165         PR middle-end/63762
5166         * ira.c (ira): Update preferred class.
5167
5168 2014-11-19  Jakub Jelinek  <jakub@redhat.com>
5169
5170         * gimple.h (gimple_build_assign_with_ops): Add unary arg overload.
5171         (gimple_assign_set_rhs_with_ops_1): Renamed to ...
5172         (gimple_assign_set_rhs_with_ops): ... this.  Adjust binary arg
5173         inline overload to use it.  Add unary arg overload.
5174         * gimple.c (gimple_build_assign_with_ops): New unary arg overload.
5175         (gimple_assign_set_rhs_from_tree): Use
5176         gimple_assign_set_rhs_with_ops instead of
5177         gimple_assign_set_rhs_with_ops_1.
5178         (gimple_assign_set_rhs_with_ops_1): Renamed to ...
5179         (gimple_assign_set_rhs_with_ops): ... this.
5180         * ipa-split.c (split_function): Remove last NULL argument
5181         from gimple_build_assign_with_ops call.
5182         * tree-ssa-loop-im.c
5183         (move_computations_dom_walker::before_dom_children): Likewise.
5184         * tsan.c (instrument_builtin_call): Likewise.
5185         * tree-vect-stmts.c (vect_init_vector, vectorizable_mask_load_store,
5186         vectorizable_conversion, vectorizable_load): Likewise.
5187         * tree-vect-loop.c (vect_is_simple_reduction_1,
5188         get_initial_def_for_induction): Likewise.
5189         * tree-loop-distribution.c (generate_memset_builtin): Likewise.
5190         * tree-vect-patterns.c (vect_handle_widen_op_by_const,
5191         vect_recog_widen_mult_pattern, vect_operation_fits_smaller_type,
5192         vect_recog_over_widening_pattern, vect_recog_rotate_pattern,
5193         vect_recog_vector_vector_shift_pattern, vect_recog_divmod_pattern,
5194         vect_recog_mixed_size_cond_pattern, adjust_bool_pattern_cast,
5195         adjust_bool_pattern, vect_recog_bool_pattern): Likewise.
5196         * tree-ssa-phiopt.c (conditional_replacement, abs_replacement,
5197         neg_replacement): Likewise.
5198         * asan.c (build_shadow_mem_access, maybe_create_ssa_name,
5199         maybe_cast_to_ptrmode, asan_expand_check_ifn): Likewise.
5200         * tree-vect-slp.c (vect_get_constant_vectors): Likewise.
5201         * omp-low.c (lower_rec_input_clauses, expand_omp_for_generic,
5202         expand_omp_for_static_nochunk, expand_omp_for_static_chunk,
5203         simd_clone_adjust): Likewise.
5204         * tree-vect-loop-manip.c (vect_create_cond_for_align_checks): Likewise.
5205         * gimple-ssa-strength-reduction.c (introduce_cast_before_cand,
5206         replace_one_candidate): Likewise.
5207         * gimple-builder.c (build_type_cast): Likewise.
5208         * tree-ssa-forwprop.c (simplify_rotate): Likewise.
5209         (forward_propagate_addr_expr_1): Remove last NULL argument
5210         from gimple_assign_set_rhs_with_ops call.
5211         (simplify_vector_constructor): Use gimple_assign_set_rhs_with_ops
5212         instead of gimple_assign_set_rhs_with_ops_1.
5213         * tree-ssa-reassoc.c (maybe_optimize_range_tests): Remove last NULL
5214         argument from gimple_build_assign_with_ops call.
5215         (repropagate_negates): Remove last NULL argument from
5216         gimple_assign_set_rhs_with_ops call.
5217         * ubsan.c (ubsan_expand_null_ifn, ubsan_expand_objsize_ifn): Remove
5218         last NULL argument from gimple_build_assign_with_ops call.
5219         (instrument_bool_enum_load): Likewise.  Remove last NULL argument
5220         from gimple_assign_set_rhs_with_ops call.
5221         * tree-ssa-math-opts.c (build_and_insert_cast, convert_mult_to_fma):
5222         Remove last NULL argument from gimple_build_assign_with_ops call.
5223         (bswap_replace): Likewise.  Use gimple_assign_set_rhs_with_ops instead
5224         of gimple_assign_set_rhs_with_ops_1.
5225         (convert_plusminus_to_widen): Use gimple_assign_set_rhs_with_ops
5226         instead of gimple_assign_set_rhs_with_ops_1.
5227         * gimple-fold.c (replace_stmt_with_simplification): Likewise.
5228         (rewrite_to_defined_overflow, gimple_build): Remove last NULL argument
5229         from gimple_build_assign_with_ops call.
5230         * tree-ssa-strlen.c (handle_pointer_plus): Remove last NULL argument
5231         from gimple_assign_set_rhs_with_ops call.
5232         * tree-vrp.c (simplify_truth_ops_using_ranges,
5233         simplify_bit_ops_using_ranges): Remove last NULL argument from
5234         gimple_assign_set_rhs_with_ops call.
5235         (simplify_float_conversion_using_ranges,
5236         simplify_internal_call_using_ranges): Remove last NULL argument from
5237         gimple_build_assign_with_ops call.
5238
5239 2014-11-19  Wilco Dijkstra  <wdijkstr@arm.com>
5240
5241         PR target/61915
5242         * config/aarch64/aarch64.c (generic_regmove_cost): Increase FP move
5243         cost.
5244
5245 2014-11-19  Marek Polacek  <polacek@redhat.com>
5246
5247         PR sanitizer/63690
5248         * ubsan.c (instrument_object_size): Check for MEM_REF.
5249
5250 2014-11-19  Ilya Verbin  <ilya.verbin@intel.com>
5251
5252         PR regression/63868
5253         * cgraph.c (cgraph_node::create): Guard g->have_offload with
5254         ifdef ENABLE_OFFLOADING.
5255         * omp-low.c (create_omp_child_function): Likewise.
5256         (expand_omp_target): Guard node->mark_force_output and offload_funcs
5257         with ifdef ENABLE_OFFLOADING.
5258         * varpool.c (varpool_node::get_create): Guard g->have_offload and
5259         offload_vars with ifdef ENABLE_OFFLOADING.
5260
5261 2014-11-19  Felix Yang  <felix.yang@huawei.com>
5262             Shanyao Chen  <chenshanyao@huawei.com>
5263
5264         PR target/59593
5265         * config/arm/arm.md (define_attr "arch"): Add v6t2.
5266         (define_attr "arch_enabled"): Add test for the above.
5267         (*movhi_insn_arch4): Add new alternative.
5268
5269 2014-11-19  Richard Henderson  <rth@redhat.com>
5270
5271         * c-family/c-common.c (c_common_reswords): Add
5272         __builtin_call_with_static_chain.
5273         * c-family/c-common.h (RID_BUILTIN_CALL_WITH_STATIC_CHAIN): New.
5274         * c/c-parser.c (c_parser_postfix_expression): Handle it.
5275         * doc/extend.texi (__builtin_call_with_static_chain): Document it.
5276
5277         * calls.c (prepare_call_address): Allow decl or type for first arg.
5278         (expand_call): Pass type to prepare_call_address if no decl.
5279         * gimple-fold.c (gimple_fold_call): Eliminate the static chain if
5280         the function doesn't use it; fold it otherwise.
5281         * gimplify.c (gimplify_call_expr): Gimplify the static chain.
5282         * tree-cfg.c (verify_gimple_call): Allow a static chain on indirect
5283         function calls.
5284
5285         * targhooks.c (default_static_chain): Remove check for
5286         DECL_STATIC_CHAIN.
5287         * config/moxie/moxie.c (moxie_static_chain): Likewise.
5288         * config/i386/i386.c (ix86_static_chain): Allow decl or type
5289         as the first argument.
5290         * config/xtensa/xtensa.c (xtensa_static_chain): Change the name
5291         of the unused first parameter.
5292         * doc/tm.texi (TARGET_STATIC_CHAIN): Document the first parameter
5293         may be a type.
5294         * target.def (static_chain): Likewise.
5295
5296 2014-11-19  Renlin Li  <renlin.li@arm.com>
5297
5298         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Define
5299         __ARM_FP_FAST, __ARM_FEATURE_FMA, __ARM_FP,
5300         __ARM_FEATURE_NUMERIC_MAXMIN, __ARM_NEON_FP.
5301
5302 2014-11-19  Marek Polacek  <polacek@redhat.com>
5303
5304         PR sanitizer/63879
5305         * fold-const.c (negate_expr_p) <case NEGATE_EXPR>: Return
5306         !TYPE_OVERFLOW_SANITIZED.
5307         (fold_negate_expr) <case INTEGER_CST>: Fold when overflow
5308         does not trap and when overflow wraps, or when SANITIZE_SI_OVERFLOW
5309         is 0.
5310
5311 2014-11-19  Ilya Tocar  <ilya.tocar@intel.com>
5312
5313         * collect2.c (main): Don't call fatal_error before
5314         diagnostic_initialize.
5315         * lto-wrapper.c (main): Likewise.
5316
5317 2014-11-19  Tom de Vries  <tom@codesourcery.com>
5318
5319         PR tree-optimization/62167
5320         * tree-ssa-tail-merge.c (stmt_local_def): Handle statements with vuse
5321         conservatively.
5322         (gimple_equal_p): Don't use vn_valueize to compare for lhs equality of
5323         assigns.
5324
5325 2014-11-19  Jakub Jelinek  <jakub@redhat.com>
5326
5327         PR tree-optimization/63915
5328         * tree-vect-stmts.c (vectorizable_simd_clone_call): Pass
5329         true instead of false as last argument to gsi_replace.
5330
5331         PR sanitizer/63520
5332         * internal-fn.c (expand_ubsan_result_store): New function.
5333         (expand_addsub_overflow, expand_neg_overflow, expand_mul_overflow):
5334         Use it instead of just emit_move_insn.
5335
5336 2014-11-19  Richard Biener  <rguenther@suse.de>
5337
5338         PR tree-optimization/63844
5339         * omp-low.c (fixup_child_record_type): Use a restrict qualified
5340         referece type for the receiver parameter.
5341
5342 2014-11-19  Jakub Jelinek  <jakub@redhat.com>
5343
5344         PR sanitizer/63913
5345         * ubsan.c: Include tree-eh.h.
5346         (instrument_bool_enum_load): Handle loads that can throw.
5347
5348         PR rtl-optimization/63843
5349         * simplify-rtx.c (simplify_binary_operation_1) <case ASHIFTRT>: For
5350         optimization of ashiftrt of subreg of lshiftrt, check that code
5351         is ASHIFTRT.
5352
5353 2014-11-18  Andrew MacLeod  <amacleod@redhat.com>
5354
5355         * attribs.c (decl_attributes): Remove always true condition,
5356         TREE_TYPE(x) will never compare equal to a TYPE_DECL.
5357
5358 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5359
5360         PR target/63937
5361         * target.def (use_by_pieces_infrastructure_p): Take unsigned
5362         HOST_WIDE_INT as the size parameter.
5363         * targhooks.c (default_use_by_pieces_infrastructure_p): Likewise.
5364         * targhooks.h (default_use_by_pieces_infrastructure_p): Likewise.
5365         * config/arc/arc.c (arc_use_by_pieces_infrastructure_p)): Likewise.
5366         * config/mips/mips.c (mips_use_by_pieces_infrastructure_p)): Likewise.
5367         * config/s390/s390.c (s390_use_by_pieces_infrastructure_p)): Likewise.
5368         * config/sh/sh.c (sh_use_by_pieces_infrastructure_p)): Likewise.
5369         * config/aarch64/aarch64.c
5370         (aarch64_use_by_pieces_infrastructure_p)): Likewise.
5371         * doc/tm.texi: Regenerate.
5372
5373 2014-11-18  Jan Hubicka  <hubicka@ucw.cz>
5374
5375         * ipa-cp.c (ipcp_cloning_candidate_p): Use opt_for_fn.
5376         (ipa_value_from_jfunc, ipa_context_from_jfunc): Skip sanity check.
5377         (ipa_get_indirect_edge_target_1): Use opt_for_fn.
5378         (good_cloning_opportunity_p): Likewise.
5379         (ipa-cp gate): Enable ipa-cp with LTO.
5380         * ipa-profile.c (ipa_propagate_frequency): Use opt_for_fn.
5381         * ipa.c (symbol_table::remove_unreachable_nodes): Always build type
5382         inheritance.
5383         * ipa-inline-transform.c (inline_transform): Check if there are inlines
5384         to apply even at -O0.
5385         * cgraphunit.c (cgraph_node::finalize_function): Use opt_for_fn.
5386         (analyze_functions): Build type inheritance graph.
5387         * ipa-inline.c (can_inline_edge_p): Use opt_for_fn.
5388         (want_early_inline_function_p, want_inline_small_function_p):
5389         Likewise.
5390         (check_callers): Likewise.
5391         (edge_badness): Likewise.
5392         (inline_small_functions): Always be ready for indirect inlining
5393         to happend.
5394         (ipa_inline): Always use want_inline_function_to_all_callers_p.
5395         (early_inline_small_functions): Use opt_for_fn.
5396         * ipa-inline-analysis.c (estimate_function_body_sizes): use opt_for_fn.
5397         (estimate_function_body_sizes): Likewise.
5398         (compute_inline_parameters): Likewise.
5399         (estimate_edge_devirt_benefit): Likewise.
5400         (inline_analyze_function): Likewise.
5401         * ipa-devirt.c (ipa_devirt): Likewise.
5402         (gate): Use in_lto_p.
5403         * ipa-prop.c (ipa_func_spec_opts_forbid_analysis_p): Use opt_for_fn.
5404         (try_make_edge_direct_virtual_call): Likewise.
5405         (update_indirect_edges_after_inlining): Likewise.
5406         (ipa_free_all_structures_after_ipa_cp): Add in_lto_p check.
5407         * common.opt (findirect-inlining): Turn into optimization.
5408         * ipa-pure-const.c (add_new_function): Use opt_for_fn.
5409         (pure_const_generate_summary): Likewise.
5410         (gate_pure_const): Always enable with in_lto_p.
5411
5412 2014-11-18  Maciej W. Rozycki  <macro@codesourcery.com>
5413
5414         * config/mips/mips.md (compression): Add `micromips32' setting.
5415         (enabled, length): Handle it.
5416         (shift_compression): Replace `micromips' with `micromips32' in
5417         the `compression' attribute.
5418         (*add<mode>3, sub<mode>3): Likewise.
5419
5420 2014-11-18  Maciej W. Rozycki  <macro@codesourcery.com>
5421
5422         * gcc/config/mips/mips.md (*jump_absolute): Use a branch when in
5423         range, a jump otherwise.
5424
5425 2014-11-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
5426
5427         * config/arm/cortex-a15-neon.md (cortex_a15_vfp_to_from_gp):
5428         Split into...
5429         (cortex_a15_gp_to_vfp): ...This.
5430         (cortex_a15_fp_to_gp): ...And this.
5431         Define and comment bypass from vfp operations to fp->gp moves.
5432
5433 2014-11-18  Martin Liska  <mliska@suse.cz>
5434
5435         * var-tracking.c (vt_find_locations): New fibonacci_node is used.
5436
5437 2014-11-18  Martin Liska  <mliska@suse.cz>
5438
5439         * bt-load.c (add_btr_def): New fibonacci_heap is used.
5440         (migrate_btr_defs): Likewise.
5441
5442 2014-11-18  Martin Liska  <mliska@suse.cz>
5443
5444         * tracer.c (tail_duplicate): New fibonacci_heap class is used.
5445
5446 2014-11-18  Martin Liska  <mliska@suse.cz>
5447
5448         * bb-reorder.c (mark_bb_visited): New fibonacci_heap is used.
5449         (find_traces): Likewise.
5450         (find_traces_1_round): Likewise.
5451
5452 2014-11-18  Martin Liska  <mliska@suse.cz>
5453
5454         * fibonacci_heap.h: New file.
5455         (fibonacci_heap::insert): Created from fibheap_insert.
5456         (fibonacci_heap::empty): Created from fibheap_empty.
5457         (fibonacci_heap::nodes): Created from fibheap_nodes.
5458         (fibonacci_heap::min_key): Created from fibheap_min_key.
5459         (fibonacci_heap::decrease_key): Created from fibheap_replace_key.
5460         (fibonacci_heap::replace_key_data): Created from fibheap_replace_key_data.
5461         (fibonacci_heap::extract_min): Created from fibheap_extract_min.
5462         (fibonacci_heap::min): Created from fibheap_min.
5463         (fibonacci_heap::replace_data): Created from fibheap_replace_data.
5464         (fibonacci_heap::delete_node): Created from fibheap_delete_node.
5465         (fibonacci_heap::union_with): Created from fibheap_union.
5466         * ipa-inline.c (update_edge_key): New heap API is used.
5467         (update_caller_keys): Likewise.
5468         (update_callee_keys): Likewise.
5469         (lookup_recursive_calls): Likewise.
5470         (recursive_inlining): Likewise.
5471         (add_new_edges_to_heap): Likewise.
5472         (heap_edge_removal_hook): Likewise.
5473         (inline_small_functions): Likewise.
5474
5475 2014-11-18  Marek Polacek  <polacek@redhat.com>
5476
5477         PR sanitizer/63866
5478         * asan.c (asan_global_struct): Create a TYPE_DECL for "__asan_global",
5479         put it into TYPE_NAME and TYPE_STUB_DECL.
5480         * ubsan.c (ubsan_type_descriptor_type): New variable.
5481         Function renamed to ...
5482         (ubsan_get_type_descriptor_type): ... this.  Cache
5483         return value in ubsan_type_descriptor_type variable.
5484         Create a TYPE_DECL for "__ubsan_type_descriptor", put it into
5485         TYPE_NAME and TYPE_STUB_DECL.
5486         (ubsan_get_source_location_type): Create a TYPE_DECL for
5487         "__ubsan_source_location", put it into TYPE_NAME and TYPE_STUB_DECL.
5488         (ubsan_type_descriptor, ubsan_create_data): Call
5489         ubsan_get_type_descriptor_type instead of ubsan_type_descriptor_type.
5490         Create a TYPE_DECL for name, put it into TYPE_NAME and TYPE_STUB_DECL.
5491
5492 2014-11-18  Felix Yang  <felix.yang@huawei.com>
5493
5494         * config/aarch64/aarch64.c (doloop_end): New pattern.
5495         * config/aarch64/aarch64.md (TARGET_CAN_USE_DOLOOP_P): Implement.
5496
5497 2014-11-18  Jason Merrill  <jason@redhat.com>
5498
5499         * tree.c (warn_deprecated_use): Show declaration with inform.
5500
5501 2014-11-18  Richard Biener  <rguenther@suse.de>
5502
5503         PR tree-optimization/63914
5504         * tree-ssa-ccp.c (canonicalize_value): Remove float value
5505         canonicalization.
5506         (valid_lattice_transition): Allow (partial) transition
5507         from NaN to non-NaN if !HONOR_NANS.
5508         (set_lattice_value): Check for valid lattice transitions
5509         only when checking is enabled.
5510
5511 2014-11-18  Bernd Schmidt  <bernds@codesourcery.com>
5512
5513         * config/nvptx/nvptx.c: Include <sstream> directly after "config.h".
5514
5515 2014-11-18  Christophe Lyon  <christophe.lyon@linaro.org>
5516
5517         * config/arm/neon-testgen.ml (emit_prologue): Handle new
5518         compile_test_optim argument.
5519         (emit_automatics): Rename to emit_variables. Support variable
5520         indentation of its output.
5521         (compile_test_optim): New function.
5522         (test_intrinsic): Call compile_test_optim.
5523         * config/arm/neon.ml (features): Add Compiler_optim.
5524         (ops): Add Compiler_optim feature to Vbic and Vorn.
5525         (type_in_crypto_only): Replace 'or' by '||'.
5526         (reinterp): Likewise.
5527         (reinterpq): Likewise.
5528
5529 2014-11-18  Alan Lawrence  <alan.lawrence@arm.com>
5530
5531         * config/aarch64/arm_neon.h (vld1_dup_f32, vld1_dup_f64, vld1_dup_p8,
5532         vld1_dup_p16, vld1_dup_s8, vld1_dup_s16, vld1_dup_s32, vld1_dup_s64,
5533         vld1_dup_u8, vld1_dup_u16, vld1_dup_u32, vld1_dup_u64, vld1q_dup_f32,
5534         vld1q_dup_f64, vld1q_dup_p8, vld1q_dup_p16, vld1q_dup_s8, vld1q_dup_s16,
5535         vld1q_dup_s32, vld1q_dup_s64, vld1q_dup_u8, vld1q_dup_u16,
5536         vld1q_dup_u32, vld1q_dup_u64): Replace inline asm with vdup_n_ and
5537         pointer dereference.
5538
5539 2014-11-18  Marc Glisse  <marc.glisse@inria.fr>
5540
5541         * tree.c (element_mode, integer_truep): New functions.
5542         * tree.h (element_mode, integer_truep): Declare them.
5543         * fold-const.c (negate_expr_p, fold_negate_expr, combine_comparisons,
5544         fold_cond_expr_with_comparison, fold_real_zero_addition_p,
5545         fold_comparison, fold_ternary_loc, tree_call_nonnegative_warnv_p,
5546         fold_strip_sign_ops): Use element_mode.
5547         (fold_binary_loc): Use element_mode and element_precision.
5548         * match.pd: Use integer_truep, element_mode, element_precision,
5549         VECTOR_TYPE_P and build_one_cst. Extend some transformations to
5550         vectors. Simplify A/-A.
5551
5552 2014-11-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
5553
5554         * config/arm/arm.md (unaligned_loaddi): Use std::swap instead of
5555         manual swapping implementation.
5556         (movcond_addsi): Likewise.
5557         * config/arm/arm.c (arm_canonicalize_comparison): Likewise.
5558         (arm_select_dominance_cc_mode): Likewise.
5559         (arm_reload_out_hi): Likewise.
5560         (gen_operands_ldrd_strd): Likewise.
5561         (output_move_double): Likewise.
5562         (arm_print_operand_address): Likewise.
5563         (thumb_output_move_mem_multiple): Likewise.
5564         (SWAP_RTX): Delete.
5565
5566 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5567
5568         * config/arm/arm-builtins.c (CONVERT_QUALIFIERS): Delete.
5569         (COPYSIGNF_QUALIFIERS): Likewise.
5570         (CREATE_QUALIFIERS): Likewise.
5571         (DUP_QUALIFIERS): Likewise.
5572         (FLOAT_WIDEN_QUALIFIERS): Likewise.
5573         (FLOAT_NARROW_QUALIFIERS): Likewise.
5574         (REINTERP_QUALIFIERS): Likewise.
5575         (RINT_QUALIFIERS): Likewise.
5576         (SPLIT_QUALIFIERS): Likewise.
5577         (FIXCONV_QUALIFIERS): Likewise.
5578         (SCALARMUL_QUALIFIERS): Likewise.
5579         (SCALARMULL_QUALIFIERS): Likewise.
5580         (SCALARMULH_QUALIFIERS): Likewise.
5581         (SELECT_QUALIFIERS): Likewise.
5582         (VTBX_QUALIFIERS): Likewise.
5583         (SHIFTIMM_QUALIFIERS): Likewise.
5584         (SCALARMAC_QUALIFIERS): Likewise.
5585         (LANEMUL_QUALIFIERS): Likewise.
5586         (LANEMULH_QUALIFIERS): Likewise.
5587         (LANEMULL_QUALIFIERS): Likewise.
5588         (SHIFTACC_QUALIFIERS): Likewise.
5589         (SHIFTINSERT_QUALIFIERS): Likewise.
5590         (VTBL_QUALIFIERS): Likewise.
5591         (LOADSTRUCT_QUALIFIERS): Likewise.
5592         (LOADSTRUCTLANE_QUALIFIERS): Likewise.
5593         (STORESTRUCT_QUALIFIERS): Likewise.
5594         (STORESTRUCTLANE_QUALIFIERS): Likewise.
5595         (neon_builtin_type_mode): Delete.
5596         (v8qi_UP): Map to V8QImode.
5597         (v8qi_UP): Map to V8QImode.
5598         (v4hi_UP): Map to V4HImode.
5599         (v4hf_UP): Map to V4HFmode.
5600         (v2si_UP): Map to V2SImode.
5601         (v2sf_UP): Map to V2SFmode.
5602         (di_UP): Map to DImode.
5603         (v16qi_UP): Map to V16QImode.
5604         (v8hi_UP): Map to V8HImode.
5605         (v4si_UP): Map to V4SImode.
5606         (v4sf_UP): Map to V4SFmode.
5607         (v2di_UP): Map to V2DImode.
5608         (ti_UP): Map to TImode.
5609         (ei_UP): Map to EImode.
5610         (oi_UP): Map to OImode.
5611         (neon_itype): Delete.
5612         (neon_builtin_datum): Remove itype, make mode a machine_mode.
5613         (VAR1): Update accordingly.
5614         (arm_init_neon_builtins): Use machine_mode directly.
5615         (neon_dereference_pointer): Likewise.
5616         (arm_expand_neon_args): Use qualifiers to decide operand types.
5617         (arm_expand_neon_builtin): Likewise.
5618         * config/arm/arm_neon_builtins.def: Remap operation type for
5619         many builtins.
5620
5621 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5622
5623         * config/arm/arm-builtins.c (arm_scalar_builtin_types): New.
5624         (enum arm_simd_type): Likewise.
5625         (struct arm_simd_type_info): Likewise
5626         (arm_mangle_builtin_scalar_type): Likewise.
5627         (arm_mangle_builtin_vector_type): Likewise.
5628         (arm_mangle_builtin_type): Likewise.
5629         (arm_simd_builtin_std_type): Likewise.
5630         (arm_lookup_simd_builtin_type): Likewise.
5631         (arm_simd_builtin_type): Likewise.
5632         (arm_init_simd_builtin_types): Likewise.
5633         (arm_init_simd_builtin_scalar_types): Likewise.
5634         (arm_init_neon_builtins): Rewrite using qualifiers.
5635         * config/arm/arm-protos.h (arm_mangle_builtin_type): New.
5636         * config/arm/arm-simd-builtin-types.def: New file.
5637         * config/arm/t-arm (arm-builtins.o): Depend on it.
5638         * config/arm/arm.c (arm_mangle_type): Call arm_mangle_builtin_type.
5639         * config/arm/arm_neon.h (int8x8_t): Use new internal type.
5640         (int16x4_t): Likewise.
5641         (int32x2_t): Likewise.
5642         (float16x4_t): Likewise.
5643         (float32x2_t): Likewise.
5644         (poly8x8_t): Likewise.
5645         (poly16x4_t): Likewise.
5646         (uint8x8_t): Likewise.
5647         (uint16x4_t): Likewise.
5648         (uint32x2_t): Likewise.
5649         (int8x16_t): Likewise.
5650         (int16x8_t): Likewise.
5651         (int32x4_t): Likewise.
5652         (int64x2_t): Likewise.
5653         (float32x4_t): Likewise.
5654         (poly8x16_t): Likewise.
5655         (poly16x8_t): Likewise.
5656         (uint8x16_t): Likewise.
5657         (uint16x8_t): Likewise.
5658         (uint32x4_t): Likewise.
5659         (uint64x2_t): Likewise.
5660
5661 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5662
5663         * gcc/config/arm/arm-builtins.c (arm_type_qualifiers): New.
5664         (neon_itype): Add new types corresponding to the types used in
5665         qualifiers names.
5666         (arm_unop_qualifiers): New.
5667         (arm_bswap_qualifiers): Likewise.
5668         (arm_binop_qualifiers): Likewise.
5669         (arm_ternop_qualifiers): Likewise.
5670         (arm_getlane_qualifiers): Likewise.
5671         (arm_lanemac_qualifiers): Likewise.
5672         (arm_setlane_qualifiers): Likewise.
5673         (arm_combine_qualifiers): Likewise.
5674         (arm_load1_qualifiers): Likewise.
5675         (arm_load1_lane_qualifiers): Likewise.
5676         (arm_store1_qualifiers): Likewise.
5677         (arm_storestruct_lane_qualifiers): Likewise.
5678         (UNOP_QUALIFIERS): Likewise.
5679         (DUP_QUALIFIERS): Likewise.
5680         (SPLIT_QUALIFIERS): Likewise.
5681         (CONVERT_QUALIFIERS): Likewise.
5682         (FLOAT_WIDEN_QUALIFIERS): Likewise.
5683         (FLOAT_NARROW_QUALIFIERS): Likewise.
5684         (RINT_QUALIFIERS): Likewise.
5685         (COPYSIGNF_QUALIFIERS): Likewise.
5686         (CREATE_QUALIFIERS): Likewise.
5687         (REINTERP_QUALIFIERS): Likewise.
5688         (BSWAP_QUALIFIERS): Likewise.
5689         (BINOP_QUALIFIERS): Likewise.
5690         (FIXCONV_QUALIFIERS): Likewise.
5691         (SCALARMUL_QUALIFIERS): Likewise.
5692         (SCALARMULL_QUALIFIERS): Likewise.
5693         (SCALARMULH_QUALIFIERS): Likewise.
5694         (TERNOP_QUALIFIERS): Likewise.
5695         (SELECT_QUALIFIERS): Likewise.
5696         (VTBX_QUALIFIERS): Likewise.
5697         (GETLANE_QUALIFIERS): Likewise.
5698         (SHIFTIMM_QUALIFIERS): Likewise.
5699         (LANEMAC_QUALIFIERS): Likewise.
5700         (SCALARMAC_QUALIFIERS): Likewise.
5701         (SETLANE_QUALIFIERS): Likewise.
5702         (SHIFTINSERT_QUALIFIERS): Likewise.
5703         (SHIFTACC_QUALIFIERS): Likewise.
5704         (LANEMUL_QUALIFIERS): Likewise.
5705         (LANEMULL_QUALIFIERS): Likewise.
5706         (LANEMULH_QUALIFIERS): Likewise.
5707         (COMBINE_QUALIFIERS): Likewise.
5708         (VTBL_QUALIFIERS): Likewise.
5709         (LOAD1_QUALIFIERS): Likewise.
5710         (LOADSTRUCT_QUALIFIERS): Likewise.
5711         (LOAD1LANE_QUALIFIERS): Likewise.
5712         (LOADSTRUCTLANE_QUALIFIERS): Likewise.
5713         (STORE1_QUALIFIERS): Likewise.
5714         (STORESTRUCT_QUALIFIERS): Likewise.
5715         (STORE1LANE_QUALIFIERS): Likewise.
5716         (STORESTRUCTLANE_QUALIFIERS): Likewise.
5717         (neon_builtin_datum): Keep track of qualifiers.
5718         (VAR1): Likewise.
5719
5720 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5721
5722         * config/arm/arm-builtins.c (VAR1): Add a comma.
5723         (VAR2): Rewrite in terms of VAR1.
5724         (VAR3-10): Likewise.
5725         (arm_builtins): Remove leading comma before ARM_BUILTIN_MAX.
5726         * config/arm/arm_neon_builtins.def: Remove trailing commas.
5727
5728 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5729
5730         * config.gcc (extra_objs): Add arm-builtins.o for arm*-*-*.
5731         (target_gtfiles): Add config/arm/arm-builtins.c for arm*-*-*.
5732         * config/arm/arm-builtins.c: New.
5733         * config/arm/t-arm (arm_builtins.o): New.
5734         * config/arm/arm-protos.h (arm_expand_builtin): New.
5735         (arm_builtin_decl): Likewise.
5736         (arm_init_builtins): Likewise.
5737         (arm_atomic_assign_expand_fenv): Likewise.
5738         * config/arm/arm.c (arm_atomic_assign_expand_fenv): Remove prototype.
5739         (arm_init_builtins): Likewise.
5740         (arm_init_iwmmxt_builtins): Likewise
5741         (safe_vector_operand): Likewise
5742         (arm_expand_binop_builtin): Likewise
5743         (arm_expand_unop_builtin): Likewise
5744         (arm_expand_builtin): Likewise
5745         (arm_builtin_decl): Likewise
5746         (insn_flags): Remove static.
5747         (tune_flags): Likewise.
5748         (enum arm_builtins): Move to config/arm/arm-builtins.c.
5749         (arm_init_neon_builtins): Likewise.
5750         (struct builtin_description): Likewise.
5751         (arm_init_iwmmxt_builtins): Likewise.
5752         (arm_init_fp16_builtins): Likewise.
5753         (arm_init_crc32_builtins): Likewise.
5754         (arm_init_builtins): Likewise.
5755         (arm_builtin_decl): Likewise.
5756         (safe_vector_operand): Likewise.
5757         (arm_expand_ternop_builtin): Likewise.
5758         (arm_expand_binop_builtin): Likewise.
5759         (arm_expand_unop_builtin): Likewise.
5760         (neon_dereference_pointer): Likewise.
5761         (arm_expand_neon_args): Likewise.
5762         (arm_expand_neon_builtin): Likewise.
5763         (neon_split_vcombine): Likewise.
5764         (arm_expand_builtin): Likewise.
5765         (arm_builtin_vectorized_function): Likewise.
5766         (arm_atomic_assign_expand_fenv): Likewise.
5767
5768 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5769
5770         * config/arm/t-arm (arm.o): Include arm-protos.h in the recipe.
5771         * config/arm/arm.c (FL_CO_PROC): Move to arm-protos.h.
5772         (FL_ARCH3M): Likewise.
5773         (FL_MODE26): Likewise.
5774         (FL_MODE32): Likewise.
5775         (FL_ARCH4): Likewise.
5776         (FL_ARCH5): Likewise.
5777         (FL_THUMB): Likewise.
5778         (FL_LDSCHED): Likewise.
5779         (FL_STRONG): Likewise.
5780         (FL_ARCH5E): Likewise.
5781         (FL_XSCALE): Likewise.
5782         (FL_ARCH6): Likewise.
5783         (FL_VFPV2): Likewise.
5784         (FL_WBUF): Likewise.
5785         (FL_ARCH6K): Likewise.
5786         (FL_THUMB2): Likewise.
5787         (FL_NOTM): Likewise.
5788         (FL_THUMB_DIV): Likewise.
5789         (FL_VFPV3): Likewise.
5790         (FL_NEON): Likewise.
5791         (FL_ARCH7EM): Likewise.
5792         (FL_ARCH7): Likewise.
5793         (FL_ARM_DIV): Likewise.
5794         (FL_ARCH8): Likewise.
5795         (FL_CRC32): Likewise.
5796         (FL_SMALLMUL): Likewise.
5797         (FL_IWMMXT): Likewise.
5798         (FL_IWMMXT2): Likewise.
5799         (FL_TUNE): Likewise.
5800         (FL_FOR_ARCH2): Likewise.
5801         (FL_FOR_ARCH3): Likewise.
5802         (FL_FOR_ARCH3M): Likewise.
5803         (FL_FOR_ARCH4): Likewise.
5804         (FL_FOR_ARCH4T): Likewise.
5805         (FL_FOR_ARCH5): Likewise.
5806         (FL_FOR_ARCH5T): Likewise.
5807         (FL_FOR_ARCH5E): Likewise.
5808         (FL_FOR_ARCH5TE): Likewise.
5809         (FL_FOR_ARCH5TEJ): Likewise.
5810         (FL_FOR_ARCH6): Likewise.
5811         (FL_FOR_ARCH6J): Likewise.
5812         (FL_FOR_ARCH6K): Likewise.
5813         (FL_FOR_ARCH6Z): Likewise.
5814         (FL_FOR_ARCH6ZK): Likewise.
5815         (FL_FOR_ARCH6T2): Likewise.
5816         (FL_FOR_ARCH6M): Likewise.
5817         (FL_FOR_ARCH7): Likewise.
5818         (FL_FOR_ARCH7A): Likewise.
5819         (FL_FOR_ARCH7VE): Likewise.
5820         (FL_FOR_ARCH7R): Likewise.
5821         (FL_FOR_ARCH7M): Likewise.
5822         (FL_FOR_ARCH7EM): Likewise.
5823         (FL_FOR_ARCH8A): Likewise.
5824         * config/arm/arm-protos.h: Take definitions moved from arm.c.
5825
5826 2014-11-18  James Greenhalgh  <james.greenhalgh@arm.com>
5827
5828         * config/arm/arm.c (arm_expand_neon_builtin): Remove "Magic Word"
5829         parameter, rearrange switch statement accordingly.
5830         (arm_evpc_neon_vrev): Remove "Magic Word".
5831         * config/arm/unspecs.md (unspec): Split many UNSPECs to
5832         rounding, or signed/unsigned variants.
5833         * config/arm/neon.md (vcond<mode><mode>): Remove "Magic Word" code.
5834         (vcondu<mode><mode>): Likewise.
5835         (neon_vadd): Remove "Magic Word" operand.
5836         (neon_vaddl): Remove "Magic Word" operand, convert to use
5837         signed/unsigned iterator.
5838         (neon_vaddw): Likewise.
5839         (neon_vhadd): Likewise, also iterate over "rounding" forms.
5840         (neon_vqadd): Remove "Magic Word" operand, convert to use
5841         signed/unsigned iterator.
5842         (neon_v<r>addhn): Remove "Magic Word" operand, convert to iterate
5843         over "rounding" forms.
5844         (neon_vmul): Remove "Magic Word" operand, iterate over
5845         polynomial/float instruction forms.
5846         (neon_vmla): Remove "Magic Word" operand.
5847         (neon_vfma): Likewise.
5848         (neon_vfms): Likewise.
5849         (neon_vmls): Likewise.
5850         (neon_vmlal): Remove "Magic Word" operand, iterate over
5851         signed/unsigned forms.
5852         (neon_vmlsl): Likewise.
5853         (neon_vqdmulh): Remove "Magic Word" operand, iterate over "rounding"
5854         forms.
5855         (neon_vqdmlal): Remove "Magic Word" operand, iterate over
5856         signed/unsigned forms.
5857         (neon_vqdmlsl): Likewise.
5858         (neon_vmull): Likewise.
5859         (neon_vqdmull): Remove "Magic Word" operand.
5860         (neon_vsub): Remove "Magic Word" operand.
5861         (neon_vsubl): Remove "Magic Word" operand, convert to use
5862         signed/unsigned iterator.
5863         (neon_vsubw): Likewise.
5864         (neon_vhsub): Likewise.
5865         (neon_vqsub): Likewise.
5866         (neon_v<r>subhn): Remove "Magic Word" operand, convert to iterate
5867         over "rounding" forms.
5868         (neon_vceq): Remove "Magic Word" operand.
5869         (neon_vcge): Likewise.
5870         (neon_vcgeu): Likewise.
5871         (neon_vcgt): Likewise.
5872         (neon_vcgtu): Likewise.
5873         (neon_vcle): Likewise.
5874         (neon_vclt): Likewise.
5875         (neon_vcage): Likewise.
5876         (neon_vcagt): Likewise.
5877         (neon_vabd): Remove "Magic Word" operand, iterate over
5878         signed/unsigned forms, and split out...
5879         (neon_vabdf): ...this as new.
5880         (neon_vabdl): Remove "Magic Word" operand, iterate over
5881         signed/unsigned forms.
5882         (neon_vaba): Likewise.
5883         (neon_vmax): Remove "Magic Word" operand, iterate over
5884         signed/unsigned and max/min forms, and split out...
5885         (neon_v<maxmin>f): ...this as new.
5886         (neon_vmin): Delete.
5887         (neon_vpadd): Remove "Magic Word" operand.
5888         (neon_vpaddl): Remove "Magic Word" operand, iterate over
5889         signed/unsigned variants.
5890         (neon_vpadal): Likewise.
5891         (neon_vpmax): Remove "Magic Word" operand, iterate over
5892         signed/unsigned and max/min forms, and split out...
5893         (neon_vp<maxmin>f): ...this as new.
5894         (neon_vpmin): Delete.
5895         (neon_vrecps): Remove "Magic Word" operand.
5896         (neon_vrsqrts): Likewise.
5897         (neon_vabs): Likewise.
5898         (neon_vqabs): Likewise.
5899         (neon_vneg): Likewise.
5900         (neon_vqneg): Likewise.
5901         (neon_vcls): Likewise.
5902         (neon_vcnt): Likewise.
5903         (neon_vrecpe): Likewise.
5904         (neon_vrsqrte): Likewise.
5905         (neon_vmvn): Likewise.
5906         (neon_vget_lane): Likewise.
5907         (neon_vget_laneu): New.
5908         (neon_vget_lanedi): Remove "Magic Word" operand.
5909         (neon_vget_lanev2di): Likewise.
5910         (neon_vcvt): Remove "Magic Word" operand, iterate over
5911         signed/unsigned variants.
5912         (neon_vcvt_n): Likewise.
5913         (neon_vmovn): Remove "Magic Word" operand.
5914         (neon_vqmovn): Remove "Magic Word" operand, iterate over
5915         signed/unsigned variants.
5916         (neon_vmovun): Remove "Magic Word" operand.
5917         (neon_vmovl): Remove "Magic Word" operand, iterate over
5918         signed/unsigned variants.
5919         (neon_vmul_lane): Remove "Magic Word" operand.
5920         (neon_vmull_lane): Remove "Magic Word" operand, iterate over
5921         signed/unsigned variants.
5922         (neon_vqdmull_lane): Remove "Magic Word" operand.
5923         (neon_vqdmulh_lane): Remove "Magic Word" operand, iterate over
5924         rounding variants.
5925         (neon_vmla_lane): Remove "Magic Word" operand.
5926         (neon_vmlal_lane): Remove "Magic Word" operand, iterate over
5927         signed/unsigned variants.
5928         (neon_vqdmlal_lane): Remove "Magic Word" operand.
5929         (neon_vmls_lane): Likewise.
5930         (neon_vmlsl_lane): Remove "Magic Word" operand, iterate over
5931         signed/unsigned variants.
5932         (neon_vqdmlsl_lane): Remove "Magic Word" operand.
5933         (neon_vmul_n): Remove "Magic Word" operand.
5934         (neon_vmull_n): Rename to...
5935         (neon_vmulls_n): ...this, remove "Magic Word" operand.
5936         (neon_vmullu_n): New.
5937         (neon_vqdmull_n): Remove "Magic Word" operand.
5938         (neon_vqdmulh_n): Likewise.
5939         (neon_vqrdmulh_n): New.
5940         (neon_vmla_n): Remove "Magic Word" operand.
5941         (neon_vmls_n): Likewise.
5942         (neon_vmlal_n): Rename to...
5943         (neon_vmlals_n): ...this, remove "Magic Word" operand.
5944         (neon_vmlalu_n): New.
5945         (neon_vqdmlal_n): Remove "Magic Word" operand.
5946         (neon_vmlsl_n): Rename to...
5947         (neon_vmlsls_n): ...this, remove "Magic Word" operand.
5948         (neon_vmlslu_n): New.
5949         (neon_vqdmlsl_n): Remove "Magic Word" operand.
5950         (neon_vrev64): Remove "Magic Word" operand.
5951         (neon_vrev32): Likewise.
5952         (neon_vrev16): Likewise.
5953         (neon_vshl): Remove "Magic Word" operand, iterate over
5954         signed/unsigned and "rounding" forms.
5955         (neon_vqshl): Likewise.
5956         (neon_vshr_n): Likewise.
5957         (neon_vshrn_n): Remove "Magic Word" operand, iterate over
5958         "rounding" forms.
5959         (neon_vqshrn_n): Remove "Magic Word" operand, iterate over
5960         signed/unsigned and "rounding" forms.
5961         (neon_vqshrun_n): Remove "Magic Word" operand, iterate over
5962         "rounding" forms.
5963         (neon_vshl_n): Remove "Magic Word" operand.
5964         (neon_vqshl_n): Remove "Magic Word" operand, iterate over
5965         signed/unsigned variants.
5966         (neon_vqshlu_n): Remove "Magic Word" operand.
5967         (neon_vshll_n): Remove "Magic Word" operand, iterate over
5968         signed/unsigned variants.
5969         (neon_vsra_n): Remove "Magic Word" operand, iterate over
5970         signed/unsigned and "rounding" forms.
5971         * config/arm/iterators.md (VPF): New.
5972         (VADDL): Likewise.
5973         (VADDW): Likewise.
5974         (VHADD): Likewise.
5975         (VQADD): Likewise.
5976         (VADDHN): Likewise.
5977         (VMLAL): Likewise.
5978         (VMLAL_LANE): Likewise.
5979         (VLMSL): Likewise.
5980         (VMLSL_LANE): Likewise.
5981         (VQDMULH): Likewise,
5982         (VQDMULH_LANE): Likewise.
5983         (VMULL): Likewise.
5984         (VMULL_LANE): Likewise.
5985         (VSUBL): Likewise.
5986         (VSUBW): Likewise.
5987         (VHSUB): Likewise.
5988         (VQSUB): Likewise.
5989         (VSUBHN): Likewise.
5990         (VABD): Likewise.
5991         (VABDL): Likewise.
5992         (VMAXMIN): Likewise.
5993         (VMAXMINF): Likewise.
5994         (VPADDL): Likewise.
5995         (VPADAL): Likewise.
5996         (VPMAXMIN): Likewise.
5997         (VPMAXMINF): Likewise.
5998         (VCVT_US): Likewise.
5999         (VCVT_US_N): Likewise.
6000         (VQMOVN): Likewise.
6001         (VMOVL): Likewise.
6002         (VSHL): Likewise.
6003         (VQSHL): Likewise.
6004         (VSHR_N): Likewise.
6005         (VSHRN_N): Likewise.
6006         (VQSHRN_N): Likewise.
6007         (VQSHRUN_N): Likewise.
6008         (VQSHL_N): Likewise.
6009         (VSHLL_N): Likewise.
6010         (VSRA_N): Likewise.
6011         (pf): Likewise.
6012         (sup): Likewise.
6013         (r): Liekwise.
6014         (maxmin): Likewise.
6015         (shift_op): Likewise.
6016         * config/arm/arm_neon_builtins.def (vaddl): Split to...
6017         (vaddls): ...this and...
6018         (vaddlu): ...this.
6019         (vaddw): Split to...
6020         (vaddws): ...this and...
6021         (vaddwu): ...this.
6022         (vhadd): Split to...
6023         (vhadds): ...this and...
6024         (vhaddu): ...this and...
6025         (vrhadds): ...this and...
6026         (vrhaddu): ...this.
6027         (vqadd): Split to...
6028         (vqadds): ...this and...
6029         (vqaddu): ...this.
6030         (vaddhn): Split to itself and...
6031         (vraddhn): ...this.
6032         (vmul): Split to...
6033         (vmulf): ...this and...
6034         (vmulp): ...this.
6035         (vmlal): Split to...
6036         (vmlals): ...this and...
6037         (vmlalu): ...this.
6038         (vmlsl): Split to...
6039         (vmlsls): ...this and...
6040         (vmlslu): ...this.
6041         (vqdmulh): Split to itself and...
6042         (vqrdmulh): ...this.
6043         (vmull): Split to...
6044         (vmullp): ...this and...
6045         (vmulls): ...this and...
6046         (vmullu): ...this.
6047         (vmull_n): Split to...
6048         (vmulls_n): ...this and...
6049         (vmullu_n): ...this.
6050         (vmull_lane): Split to...
6051         (vmulls_lane): ...this and...
6052         (vmullu_lane): ...this.
6053         (vqdmulh_n): Split to itself and...
6054         (vqrdmulh_n): ...this.
6055         (vqdmulh_lane): Split to itself and...
6056         (vqrdmulh_lane): ...this.
6057         (vshl): Split to...
6058         (vshls): ...this and...
6059         (vshlu): ...this and...
6060         (vrshls): ...this and...
6061         (vrshlu): ...this.
6062         (vqshl): Split to...
6063         (vqshls): ...this and...
6064         (vqrshlu): ...this and...
6065         (vqrshls): ...this and...
6066         (vqrshlu): ...this.
6067         (vshr_n): Split to...
6068         (vshrs_n): ...this and...
6069         (vshru_n): ...this and...
6070         (vrshrs_n): ...this and...
6071         (vrshru_n): ...this.
6072         (vshrn_n): Split to itself and...
6073         (vrshrn_n): ...this.
6074         (vqshrn_n): Split to...
6075         (vqshrns_n): ...this and...
6076         (vqshrnu_n): ...this and...
6077         (vqrshrns_n): ...this and...
6078         (vqrshrnu_n): ...this.
6079         (vqshrun_n): Split to itself and...
6080         (vqrshrun_n): ...this.
6081         (vqshl_n): Split to...
6082         (vqshl_s_n): ...this and...
6083         (vqshl_u_n): ...this.
6084         (vshll_n): Split to...
6085         (vshlls_n): ...this and...
6086         (vshllu_n): ...this.
6087         (vsra_n): Split to...
6088         (vsras_n): ...this and...
6089         (vsrau_n): ...this and.
6090         (vrsras_n): ...this and...
6091         (vrsrau_n): ...this and.
6092         (vsubl): Split to...
6093         (vsubls): ...this and...
6094         (vsublu): ...this.
6095         (vsubw): Split to...
6096         (vsubws): ...this and...
6097         (vsubwu): ...this.
6098         (vqsub): Split to...
6099         (vqsubs): ...this and...
6100         (vqsubu): ...this.
6101         (vhsub): Split to...
6102         (vhsubs): ...this and...
6103         (vhsubu): ...this.
6104         (vsubhn): Split to itself and...
6105         (vrsubhn): ...this.
6106         (vabd): Split to...
6107         (vabds): ...this and...
6108         (vabdu): ...this and...
6109         (vabdf): ...this.
6110         (vabdl): Split to...
6111         (vabdls): ...this and...
6112         (vabdlu): ...this.
6113         (vaba): Split to...
6114         (vabas): ...this and...
6115         (vabau): ...this and...
6116         (vabal): Split to...
6117         (vabals): ...this and...
6118         (vabalu): ...this.
6119         (vmax): Split to...
6120         (vmaxs): ...this and...
6121         (vmaxu): ...this and...
6122         (vmaxf): ...this.
6123         (vmin): Split to...
6124         (vmins): ...this and...
6125         (vminu): ...this and...
6126         (vminf): ...this.
6127         (vpmax): Split to...
6128         (vpmaxs): ...this and...
6129         (vpmaxu): ...this and...
6130         (vpmaxf): ...this.
6131         (vpmin): Split to...
6132         (vpmins): ...this and...
6133         (vpminu): ...this and...
6134         (vpminf): ...this.
6135         (vpaddl): Split to...
6136         (vpaddls): ...this and...
6137         (vpaddlu): ...this.
6138         (vpadal): Split to...
6139         (vpadals): ...this and...
6140         (vpadalu): ...this.
6141         (vget_laneu): New.
6142         (vqmovn): Split to...
6143         (vqmovns): ...this and...
6144         (vqmovnu): ...this.
6145         (vmovl): Split to...
6146         (vmovls): ...this and...
6147         (vmovlu): ...this.
6148         (vmlal_lane): Split to...
6149         (vmlals_lane): ...this and...
6150         (vmlalu_lane): ...this.
6151         (vmlsl_lane): Split to...
6152         (vmlsls_lane): ...this and...
6153         (vmlslu_lane): ...this.
6154         (vmlal_n): Split to...
6155         (vmlals_n): ...this and...
6156         (vmlalu_n): ...this.
6157         (vmlsl_n): Split to...
6158         (vmlsls_n): ...this and...
6159         (vmlslu_n): ...this.
6160         (vext): Make type "SHIFTINSERT".
6161         (vcvt): Split to...
6162         (vcvts): ...this and...
6163         (vcvtu): ...this.
6164         (vcvt_n): Split to...
6165         (vcvts_n): ...this and...
6166         (vcvtu_n): ...this.
6167         * config/arm/arm_neon.h (vaddl_s8): Remove "Magic Word".
6168         (vaddl_s16): Likewise.
6169         (vaddl_s32): Likewise.
6170         (vaddl_u8): Likewise.
6171         (vaddl_u16): Likewise.
6172         (vaddl_u32): Likewise.
6173         (vaddw_s8): Likewise.
6174         (vaddw_s16): Likewise.
6175         (vaddw_s32): Likewise.
6176         (vaddw_u8): Likewise.
6177         (vaddw_u16): Likewise.
6178         (vaddw_u32): Likewise.
6179         (vhadd_s8): Likewise.
6180         (vhadd_s16): Likewise.
6181         (vhadd_s32): Likewise.
6182         (vhadd_u8): Likewise.
6183         (vhadd_u16): Likewise.
6184         (vhadd_u32): Likewise.
6185         (vhaddq_s8): Likewise.
6186         (vhaddq_s16): Likewise.
6187         (vhaddq_s32): Likewise.
6188         (vhaddq_u8): Likewise.
6189         (vhaddq_u16): Likewise.
6190         (vrhadd_s8): Likewise.
6191         (vrhadd_s16): Likewise.
6192         (vrhadd_s32): Likewise.
6193         (vrhadd_u8): Likewise.
6194         (vrhadd_u16): Likewise.
6195         (vrhadd_u32): Likewise.
6196         (vrhaddq_s8): Likewise.
6197         (vrhaddq_s16): Likewise.
6198         (vrhaddq_s32): Likewise.
6199         (vrhaddq_u8): Likewise.
6200         (vrhaddq_u16): Likewise.
6201         (vrhaddq_u32): Likewise.
6202         (vqadd_s8): Likewise.
6203         (vqadd_s16): Likewise.
6204         (vqadd_s32): Likewise.
6205         (vqadd_s64): Likewise.
6206         (vqadd_u8): Likewise.
6207         (vqadd_u16): Likewise.
6208         (vqadd_u32): Likewise.
6209         (vqadd_u64): Likewise.
6210         (vqaddq_s8): Likewise.
6211         (vqaddq_s16): Likewise.
6212         (vqaddq_s32): Likewise.
6213         (vqaddq_s64): Likewise.
6214         (vqaddq_u8): Likewise.
6215         (vqaddq_u16): Likewise.
6216         (vqaddq_u32): Likewise.
6217         (vqaddq_u64): Likewise.
6218         (vaddhn_s16): Likewise.
6219         (vaddhn_s32): Likewise.
6220         (vaddhn_s64): Likewise.
6221         (vaddhn_u16): Likewise.
6222         (vaddhn_u32): Likewise.
6223         (vaddhn_u64): Likewise.
6224         (vraddhn_s16): Likewise.
6225         (vraddhn_s32): Likewise.
6226         (vraddhn_s64): Likewise.
6227         (vraddhn_u16): Likewise.
6228         (vraddhn_u32): Likewise.
6229         (vraddhn_u64): Likewise.
6230         (vmul_p8): Likewise.
6231         (vmulq_p8): Likewise.
6232         (vqdmulh_s16): Likewise.
6233         (vqdmulh_s32): Likewise.
6234         (vqdmulhq_s16): Likewise.
6235         (vqdmulhq_s32): Likewise.
6236         (vqrdmulh_s16): Likewise.
6237         (vqrdmulh_s32): Likewise.
6238         (vqrdmulhq_s16): Likewise.
6239         (vqrdmulhq_s32): Likewise.
6240         (vmull_s8): Likewise.
6241         (vmull_s16): Likewise.
6242         (vmull_s32): Likewise.
6243         (vmull_u8): Likewise.
6244         (vmull_u16): Likewise.
6245         (vmull_u32): Likewise.
6246         (vmull_p8): Likewise.
6247         (vqdmull_s16): Likewise.
6248         (vqdmull_s32): Likewise.
6249         (vmla_s8): Likewise.
6250         (vmla_s16): Likewise.
6251         (vmla_s32): Likewise.
6252         (vmla_f32): Likewise.
6253         (vmla_u8): Likewise.
6254         (vmla_u16): Likewise.
6255         (vmla_u32): Likewise.
6256         (vmlaq_s8): Likewise.
6257         (vmlaq_s16): Likewise.
6258         (vmlaq_s32): Likewise.
6259         (vmlaq_f32): Likewise.
6260         (vmlaq_u8): Likewise.
6261         (vmlaq_u16): Likewise.
6262         (vmlaq_u32): Likewise.
6263         (vmlal_s8): Likewise.
6264         (vmlal_s16): Likewise.
6265         (vmlal_s32): Likewise.
6266         (vmlal_u8): Likewise.
6267         (vmlal_u16): Likewise.
6268         (vmlal_u32): Likewise.
6269         (vqdmlal_s16): Likewise.
6270         (vqdmlal_s32): Likewise.
6271         (vmls_s8): Likewise.
6272         (vmls_s16): Likewise.
6273         (vmls_s32): Likewise.
6274         (vmls_f32): Likewise.
6275         (vmls_u8): Likewise.
6276         (vmls_u16): Likewise.
6277         (vmls_u32): Likewise.
6278         (vmlsq_s8): Likewise.
6279         (vmlsq_s16): Likewise.
6280         (vmlsq_s32): Likewise.
6281         (vmlsq_f32): Likewise.
6282         (vmlsq_u8): Likewise.
6283         (vmlsq_u16): Likewise.
6284         (vmlsq_u32): Likewise.
6285         (vmlsl_s8): Likewise.
6286         (vmlsl_s16): Likewise.
6287         (vmlsl_s32): Likewise.
6288         (vmlsl_u8): Likewise.
6289         (vmlsl_u16): Likewise.
6290         (vmlsl_u32): Likewise.
6291         (vqdmlsl_s16): Likewise.
6292         (vqdmlsl_s32): Likewise.
6293         (vfma_f32): Likewise.
6294         (vfmaq_f32): Likewise.
6295         (vfms_f32): Likewise.
6296         (vfmsq_f32): Likewise.
6297         (vsubl_s8): Likewise.
6298         (vsubl_s16): Likewise.
6299         (vsubl_s32): Likewise.
6300         (vsubl_u8): Likewise.
6301         (vsubl_u16): Likewise.
6302         (vsubl_u32): Likewise.
6303         (vsubw_s8): Likewise.
6304         (vsubw_s16): Likewise.
6305         (vsubw_s32): Likewise.
6306         (vsubw_u8): Likewise.
6307         (vsubw_u16): Likewise.
6308         (vsubw_u32): Likewise.
6309         (vhsub_s8): Likewise.
6310         (vhsub_s16): Likewise.
6311         (vhsub_s32): Likewise.
6312         (vhsub_u8): Likewise.
6313         (vhsub_u16): Likewise.
6314         (vhsub_u32): Likewise.
6315         (vhsubq_s8): Likewise.
6316         (vhsubq_s16): Likewise.
6317         (vhsubq_s32): Likewise.
6318         (vhsubq_u8): Likewise.
6319         (vhsubq_u16): Likewise.
6320         (vhsubq_u32): Likewise.
6321         (vqsub_s8): Likewise.
6322         (vqsub_s16): Likewise.
6323         (vqsub_s32): Likewise.
6324         (vqsub_s64): Likewise.
6325         (vqsub_u8): Likewise.
6326         (vqsub_u16): Likewise.
6327         (vqsub_u32): Likewise.
6328         (vqsub_u64): Likewise.
6329         (vqsubq_s8): Likewise.
6330         (vqsubq_s16): Likewise.
6331         (vqsubq_s32): Likewise.
6332         (vqsubq_s64): Likewise.
6333         (vqsubq_u8): Likewise.
6334         (vqsubq_u16): Likewise.
6335         (vqsubq_u32): Likewise.
6336         (vqsubq_u64): Likewise.
6337         (vsubhn_s16): Likewise.
6338         (vsubhn_s32): Likewise.
6339         (vsubhn_s64): Likewise.
6340         (vsubhn_u16): Likewise.
6341         (vsubhn_u32): Likewise.
6342         (vsubhn_u64): Likewise.
6343         (vrsubhn_s16): Likewise.
6344         (vrsubhn_s32): Likewise.
6345         (vrsubhn_s64): Likewise.
6346         (vrsubhn_u16): Likewise.
6347         (vrsubhn_u32): Likewise.
6348         (vrsubhn_u64): Likewise.
6349         (vceq_s8): Likewise.
6350         (vceq_s16): Likewise.
6351         (vceq_s32): Likewise.
6352         (vceq_f32): Likewise.
6353         (vceq_u8): Likewise.
6354         (vceq_u16): Likewise.
6355         (vceq_u32): Likewise.
6356         (vceq_p8): Likewise.
6357         (vceqq_s8): Likewise.
6358         (vceqq_s16): Likewise.
6359         (vceqq_s32): Likewise.
6360         (vceqq_f32): Likewise.
6361         (vceqq_u8): Likewise.
6362         (vceqq_u16): Likewise.
6363         (vceqq_u32): Likewise.
6364         (vceqq_p8): Likewise.
6365         (vcge_s8): Likewise.
6366         (vcge_s16): Likewise.
6367         (vcge_s32): Likewise.
6368         (vcge_f32): Likewise.
6369         (vcge_u8): Likewise.
6370         (vcge_u16): Likewise.
6371         (vcge_u32): Likewise.
6372         (vcgeq_s8): Likewise.
6373         (vcgeq_s16): Likewise.
6374         (vcgeq_s32): Likewise.
6375         (vcgeq_f32): Likewise.
6376         (vcgeq_u8): Likewise.
6377         (vcgeq_u16): Likewise.
6378         (vcgeq_u32): Likewise.
6379         (vcle_s8): Likewise.
6380         (vcle_s16): Likewise.
6381         (vcle_s32): Likewise.
6382         (vcle_f32): Likewise.
6383         (vcle_u8): Likewise.
6384         (vcle_u16): Likewise.
6385         (vcle_u32): Likewise.
6386         (vcleq_s8): Likewise.
6387         (vcleq_s16): Likewise.
6388         (vcleq_s32): Likewise.
6389         (vcleq_f32): Likewise.
6390         (vcleq_u8): Likewise.
6391         (vcleq_u16): Likewise.
6392         (vcleq_u32): Likewise.
6393         (vcgt_s8): Likewise.
6394         (vcgt_s16): Likewise.
6395         (vcgt_s32): Likewise.
6396         (vcgt_f32): Likewise.
6397         (vcgt_u8): Likewise.
6398         (vcgt_u16): Likewise.
6399         (vcgt_u32): Likewise.
6400         (vcgtq_s8): Likewise.
6401         (vcgtq_s16): Likewise.
6402         (vcgtq_s32): Likewise.
6403         (vcgtq_f32): Likewise.
6404         (vcgtq_u8): Likewise.
6405         (vcgtq_u16): Likewise.
6406         (vcgtq_u32): Likewise.
6407         (vclt_s8): Likewise.
6408         (vclt_s16): Likewise.
6409         (vclt_s32): Likewise.
6410         (vclt_f32): Likewise.
6411         (vclt_u8): Likewise.
6412         (vclt_u16): Likewise.
6413         (vclt_u32): Likewise.
6414         (vcltq_s8): Likewise.
6415         (vcltq_s16): Likewise.
6416         (vcltq_s32): Likewise.
6417         (vcltq_f32): Likewise.
6418         (vcltq_u8): Likewise.
6419         (vcltq_u16): Likewise.
6420         (vcltq_u32): Likewise.
6421         (vcage_f32): Likewise.
6422         (vcageq_f32): Likewise.
6423         (vcale_f32): Likewise.
6424         (vcaleq_f32): Likewise.
6425         (vcagt_f32): Likewise.
6426         (vcagtq_f32): Likewise.
6427         (vcalt_f32): Likewise.
6428         (vcaltq_f32): Likewise.
6429         (vtst_s8): Likewise.
6430         (vtst_s16): Likewise.
6431         (vtst_s32): Likewise.
6432         (vtst_u8): Likewise.
6433         (vtst_u16): Likewise.
6434         (vtst_u32): Likewise.
6435         (vtst_p8): Likewise.
6436         (vtstq_s8): Likewise.
6437         (vtstq_s16): Likewise.
6438         (vtstq_s32): Likewise.
6439         (vtstq_u8): Likewise.
6440         (vtstq_u16): Likewise.
6441         (vtstq_u32): Likewise.
6442         (vtstq_p8): Likewise.
6443         (vabd_s8): Likewise.
6444         (vabd_s16): Likewise.
6445         (vabd_s32): Likewise.
6446         (vabd_f32): Likewise.
6447         (vabd_u8): Likewise.
6448         (vabd_u16): Likewise.
6449         (vabd_u32): Likewise.
6450         (vabdq_s8): Likewise.
6451         (vabdq_s16): Likewise.
6452         (vabdq_s32): Likewise.
6453         (vabdq_f32): Likewise.
6454         (vabdq_u8): Likewise.
6455         (vabdq_u16): Likewise.
6456         (vabdq_u32): Likewise.
6457         (vabdl_s8): Likewise.
6458         (vabdl_s16): Likewise.
6459         (vabdl_s32): Likewise.
6460         (vabdl_u8): Likewise.
6461         (vabdl_u16): Likewise.
6462         (vabdl_u32): Likewise.
6463         (vaba_s8): Likewise.
6464         (vaba_s16): Likewise.
6465         (vaba_s32): Likewise.
6466         (vaba_u8): Likewise.
6467         (vaba_u16): Likewise.
6468         (vaba_u32): Likewise.
6469         (vabaq_s8): Likewise.
6470         (vabaq_s16): Likewise.
6471         (vabaq_s32): Likewise.
6472         (vabaq_u8): Likewise.
6473         (vabaq_u16): Likewise.
6474         (vabaq_u32): Likewise.
6475         (vabal_s8): Likewise.
6476         (vabal_s16): Likewise.
6477         (vabal_s32): Likewise.
6478         (vabal_u8): Likewise.
6479         (vabal_u16): Likewise.
6480         (vabal_u32): Likewise.
6481         (vmax_s8): Likewise.
6482         (vmax_s16): Likewise.
6483         (vmax_s32): Likewise.
6484         (vmax_f32): Likewise.
6485         (vmax_u8): Likewise.
6486         (vmax_u16): Likewise.
6487         (vmax_u32): Likewise.
6488         (vmaxq_s8): Likewise.
6489         (vmaxq_s16): Likewise.
6490         (vmaxq_s32): Likewise.
6491         (vmaxq_f32): Likewise.
6492         (vmaxq_u8): Likewise.
6493         (vmaxq_u16): Likewise.
6494         (vmaxq_u32): Likewise.
6495         (vmin_s8): Likewise.
6496         (vmin_s16): Likewise.
6497         (vmin_s32): Likewise.
6498         (vmin_f32): Likewise.
6499         (vmin_u8): Likewise.
6500         (vmin_u16): Likewise.
6501         (vmin_u32): Likewise.
6502         (vminq_s8): Likewise.
6503         (vminq_s16): Likewise.
6504         (vminq_s32): Likewise.
6505         (vminq_f32): Likewise.
6506         (vminq_u8): Likewise.
6507         (vminq_u16): Likewise.
6508         (vminq_u32): Likewise.
6509         (vpadd_s8): Likewise.
6510         (vpadd_s16): Likewise.
6511         (vpadd_s32): Likewise.
6512         (vpadd_f32): Likewise.
6513         (vpadd_u8): Likewise.
6514         (vpadd_u16): Likewise.
6515         (vpadd_u32): Likewise.
6516         (vpaddl_s8): Likewise.
6517         (vpaddl_s16): Likewise.
6518         (vpaddl_s32): Likewise.
6519         (vpaddl_u8): Likewise.
6520         (vpaddl_u16): Likewise.
6521         (vpaddl_u32): Likewise.
6522         (vpaddlq_s8): Likewise.
6523         (vpaddlq_s16): Likewise.
6524         (vpaddlq_s32): Likewise.
6525         (vpaddlq_u8): Likewise.
6526         (vpaddlq_u16): Likewise.
6527         (vpaddlq_u32): Likewise.
6528         (vpadal_s8): Likewise.
6529         (vpadal_s16): Likewise.
6530         (vpadal_s32): Likewise.
6531         (vpadal_u8): Likewise.
6532         (vpadal_u16): Likewise.
6533         (vpadal_u32): Likewise.
6534         (vpadalq_s8): Likewise.
6535         (vpadalq_s16): Likewise.
6536         (vpadalq_s32): Likewise.
6537         (vpadalq_u8): Likewise.
6538         (vpadalq_u16): Likewise.
6539         (vpadalq_u32): Likewise.
6540         (vpmax_s8): Likewise.
6541         (vpmax_s16): Likewise.
6542         (vpmax_s32): Likewise.
6543         (vpmax_f32): Likewise.
6544         (vpmax_u8): Likewise.
6545         (vpmax_u16): Likewise.
6546         (vpmax_u32): Likewise.
6547         (vpmin_s8): Likewise.
6548         (vpmin_s16): Likewise.
6549         (vpmin_s32): Likewise.
6550         (vpmin_f32): Likewise.
6551         (vpmin_u8): Likewise.
6552         (vpmin_u16): Likewise.
6553         (vpmin_u32): Likewise.
6554         (vrecps_f32): Likewise.
6555         (vrecpsq_f32): Likewise.
6556         (vrsqrts_f32): Likewise.
6557         (vrsqrtsq_f32): Likewise.
6558         (vshl_s8): Likewise.
6559         (vshl_s16): Likewise.
6560         (vshl_s32): Likewise.
6561         (vshl_s64): Likewise.
6562         (vshl_u8): Likewise.
6563         (vshl_u16): Likewise.
6564         (vshl_u32): Likewise.
6565         (vshl_u64): Likewise.
6566         (vshlq_s8): Likewise.
6567         (vshlq_s16): Likewise.
6568         (vshlq_s32): Likewise.
6569         (vshlq_s64): Likewise.
6570         (vshlq_u8): Likewise.
6571         (vshlq_u16): Likewise.
6572         (vshlq_u32): Likewise.
6573         (vshlq_u64): Likewise.
6574         (vrshl_s8): Likewise.
6575         (vrshl_s16): Likewise.
6576         (vrshl_s32): Likewise.
6577         (vrshl_s64): Likewise.
6578         (vrshl_u8): Likewise.
6579         (vrshl_u16): Likewise.
6580         (vrshl_u32): Likewise.
6581         (vrshl_u64): Likewise.
6582         (vrshlq_s8): Likewise.
6583         (vrshlq_s16): Likewise.
6584         (vrshlq_s32): Likewise.
6585         (vrshlq_s64): Likewise.
6586         (vrshlq_u8): Likewise.
6587         (vrshlq_u16): Likewise.
6588         (vrshlq_u32): Likewise.
6589         (vrshlq_u64): Likewise.
6590         (vqshl_s8): Likewise.
6591         (vqshl_s16): Likewise.
6592         (vqshl_s32): Likewise.
6593         (vqshl_s64): Likewise.
6594         (vqshl_u8): Likewise.
6595         (vqshl_u16): Likewise.
6596         (vqshl_u32): Likewise.
6597         (vqshl_u64): Likewise.
6598         (vqshlq_s8): Likewise.
6599         (vqshlq_s16): Likewise.
6600         (vqshlq_s32): Likewise.
6601         (vqshlq_s64): Likewise.
6602         (vqshlq_u8): Likewise.
6603         (vqshlq_u16): Likewise.
6604         (vqshlq_u32): Likewise.
6605         (vqshlq_u64): Likewise.
6606         (vqrshl_s8): Likewise.
6607         (vqrshl_s16): Likewise.
6608         (vqrshl_s32): Likewise.
6609         (vqrshl_s64): Likewise.
6610         (vqrshl_u8): Likewise.
6611         (vqrshl_u16): Likewise.
6612         (vqrshl_u32): Likewise.
6613         (vqrshl_u64): Likewise.
6614         (vqrshlq_s8): Likewise.
6615         (vqrshlq_s16): Likewise.
6616         (vqrshlq_s32): Likewise.
6617         (vqrshlq_s64): Likewise.
6618         (vqrshlq_u8): Likewise.
6619         (vqrshlq_u16): Likewise.
6620         (vqrshlq_u32): Likewise.
6621         (vqrshlq_u64): Likewise.
6622         (vshr_n_s8): Likewise.
6623         (vshr_n_s16): Likewise.
6624         (vshr_n_s32): Likewise.
6625         (vshr_n_s64): Likewise.
6626         (vshr_n_u8): Likewise.
6627         (vshr_n_u16): Likewise.
6628         (vshr_n_u32): Likewise.
6629         (vshr_n_u64): Likewise.
6630         (vshrq_n_s8): Likewise.
6631         (vshrq_n_s16): Likewise.
6632         (vshrq_n_s32): Likewise.
6633         (vshrq_n_s64): Likewise.
6634         (vshrq_n_u8): Likewise.
6635         (vshrq_n_u16): Likewise.
6636         (vshrq_n_u32): Likewise.
6637         (vshrq_n_u64): Likewise.
6638         (vrshr_n_s8): Likewise.
6639         (vrshr_n_s16): Likewise.
6640         (vrshr_n_s32): Likewise.
6641         (vrshr_n_s64): Likewise.
6642         (vrshr_n_u8): Likewise.
6643         (vrshr_n_u16): Likewise.
6644         (vrshr_n_u32): Likewise.
6645         (vrshr_n_u64): Likewise.
6646         (vrshrq_n_s8): Likewise.
6647         (vrshrq_n_s16): Likewise.
6648         (vrshrq_n_s32): Likewise.
6649         (vrshrq_n_s64): Likewise.
6650         (vrshrq_n_u8): Likewise.
6651         (vrshrq_n_u16): Likewise.
6652         (vrshrq_n_u32): Likewise.
6653         (vrshrq_n_u64): Likewise.
6654         (vshrn_n_s16): Likewise.
6655         (vshrn_n_s32): Likewise.
6656         (vshrn_n_s64): Likewise.
6657         (vshrn_n_u16): Likewise.
6658         (vshrn_n_u32): Likewise.
6659         (vshrn_n_u64): Likewise.
6660         (vrshrn_n_s16): Likewise.
6661         (vrshrn_n_s32): Likewise.
6662         (vrshrn_n_s64): Likewise.
6663         (vrshrn_n_u16): Likewise.
6664         (vrshrn_n_u32): Likewise.
6665         (vrshrn_n_u64): Likewise.
6666         (vqshrn_n_s16): Likewise.
6667         (vqshrn_n_s32): Likewise.
6668         (vqshrn_n_s64): Likewise.
6669         (vqshrn_n_u16): Likewise.
6670         (vqshrn_n_u32): Likewise.
6671         (vqshrn_n_u64): Likewise.
6672         (vqrshrn_n_s16): Likewise.
6673         (vqrshrn_n_s32): Likewise.
6674         (vqrshrn_n_s64): Likewise.
6675         (vqrshrn_n_u16): Likewise.
6676         (vqrshrn_n_u32): Likewise.
6677         (vqrshrn_n_u64): Likewise.
6678         (vqshrun_n_s16): Likewise.
6679         (vqshrun_n_s32): Likewise.
6680         (vqshrun_n_s64): Likewise.
6681         (vqrshrun_n_s16): Likewise.
6682         (vqrshrun_n_s32): Likewise.
6683         (vqrshrun_n_s64): Likewise.
6684         (vshl_n_s8): Likewise.
6685         (vshl_n_s16): Likewise.
6686         (vshl_n_s32): Likewise.
6687         (vshl_n_s64): Likewise.
6688         (vshl_n_u8): Likewise.
6689         (vshl_n_u16): Likewise.
6690         (vshl_n_u32): Likewise.
6691         (vshl_n_u64): Likewise.
6692         (vshlq_n_s8): Likewise.
6693         (vshlq_n_s16): Likewise.
6694         (vshlq_n_s32): Likewise.
6695         (vshlq_n_s64): Likewise.
6696         (vshlq_n_u8): Likewise.
6697         (vshlq_n_u16): Likewise.
6698         (vshlq_n_u32): Likewise.
6699         (vshlq_n_u64): Likewise.
6700         (vqshl_n_s8): Likewise.
6701         (vqshl_n_s16): Likewise.
6702         (vqshl_n_s32): Likewise.
6703         (vqshl_n_s64): Likewise.
6704         (vqshl_n_u8): Likewise.
6705         (vqshl_n_u16): Likewise.
6706         (vqshl_n_u32): Likewise.
6707         (vqshl_n_u64): Likewise.
6708         (vqshlq_n_s8): Likewise.
6709         (vqshlq_n_s16): Likewise.
6710         (vqshlq_n_s32): Likewise.
6711         (vqshlq_n_s64): Likewise.
6712         (vqshlq_n_u8): Likewise.
6713         (vqshlq_n_u16): Likewise.
6714         (vqshlq_n_u32): Likewise.
6715         (vqshlq_n_u64): Likewise.
6716         (vqshlu_n_s8): Likewise.
6717         (vqshlu_n_s16): Likewise.
6718         (vqshlu_n_s32): Likewise.
6719         (vqshlu_n_s64): Likewise.
6720         (vqshluq_n_s8): Likewise.
6721         (vqshluq_n_s16): Likewise.
6722         (vqshluq_n_s32): Likewise.
6723         (vqshluq_n_s64): Likewise.
6724         (vshll_n_s8): Likewise.
6725         (vshll_n_s16): Likewise.
6726         (vshll_n_s32): Likewise.
6727         (vshll_n_u8): Likewise.
6728         (vshll_n_u16): Likewise.
6729         (vshll_n_u32): Likewise.
6730         (vsra_n_s8): Likewise.
6731         (vsra_n_s16): Likewise.
6732         (vsra_n_s32): Likewise.
6733         (vsra_n_s64): Likewise.
6734         (vsra_n_u8): Likewise.
6735         (vsra_n_u16): Likewise.
6736         (vsra_n_u32): Likewise.
6737         (vsra_n_u64): Likewise.
6738         (vsraq_n_s8): Likewise.
6739         (vsraq_n_s16): Likewise.
6740         (vsraq_n_s32): Likewise.
6741         (vsraq_n_s64): Likewise.
6742         (vsraq_n_u8): Likewise.
6743         (vsraq_n_u16): Likewise.
6744         (vsraq_n_u32): Likewise.
6745         (vsraq_n_u64): Likewise.
6746         (vrsra_n_s8): Likewise.
6747         (vrsra_n_s16): Likewise.
6748         (vrsra_n_s32): Likewise.
6749         (vrsra_n_s64): Likewise.
6750         (vrsra_n_u8): Likewise.
6751         (vrsra_n_u16): Likewise.
6752         (vrsra_n_u32): Likewise.
6753         (vrsra_n_u64): Likewise.
6754         (vrsraq_n_s8): Likewise.
6755         (vrsraq_n_s16): Likewise.
6756         (vrsraq_n_s32): Likewise.
6757         (vrsraq_n_s64): Likewise.
6758         (vrsraq_n_u8): Likewise.
6759         (vrsraq_n_u16): Likewise.
6760         (vrsraq_n_u32): Likewise.
6761         (vrsraq_n_u64): Likewise.
6762         (vabs_s8): Likewise.
6763         (vabs_s16): Likewise.
6764         (vabs_s32): Likewise.
6765         (vabs_f32): Likewise.
6766         (vabsq_s8): Likewise.
6767         (vabsq_s16): Likewise.
6768         (vabsq_s32): Likewise.
6769         (vabsq_f32): Likewise.
6770         (vqabs_s8): Likewise.
6771         (vqabs_s16): Likewise.
6772         (vqabs_s32): Likewise.
6773         (vqabsq_s8): Likewise.
6774         (vqabsq_s16): Likewise.
6775         (vqabsq_s32): Likewise.
6776         (vneg_s8): Likewise.
6777         (vneg_s16): Likewise.
6778         (vneg_s32): Likewise.
6779         (vneg_f32): Likewise.
6780         (vnegq_s8): Likewise.
6781         (vnegq_s16): Likewise.
6782         (vnegq_s32): Likewise.
6783         (vnegq_f32): Likewise.
6784         (vqneg_s8): Likewise.
6785         (vqneg_s16): Likewise.
6786         (vqneg_s32): Likewise.
6787         (vqnegq_s8): Likewise.
6788         (vqnegq_s16): Likewise.
6789         (vqnegq_s32): Likewise.
6790         (vmvn_s8): Likewise.
6791         (vmvn_s16): Likewise.
6792         (vmvn_s32): Likewise.
6793         (vmvn_u8): Likewise.
6794         (vmvn_u16): Likewise.
6795         (vmvn_u32): Likewise.
6796         (vmvn_p8): Likewise.
6797         (vmvnq_s8): Likewise.
6798         (vmvnq_s16): Likewise.
6799         (vmvnq_s32): Likewise.
6800         (vmvnq_u8): Likewise.
6801         (vmvnq_u16): Likewise.
6802         (vmvnq_u32): Likewise.
6803         (vmvnq_p8): Likewise.
6804         (vcls_s8): Likewise.
6805         (vcls_s16): Likewise.
6806         (vcls_s32): Likewise.
6807         (vclsq_s8): Likewise.
6808         (vclsq_s16): Likewise.
6809         (vclsq_s32): Likewise.
6810         (vclz_s8): Likewise.
6811         (vclz_s16): Likewise.
6812         (vclz_s32): Likewise.
6813         (vclz_u8): Likewise.
6814         (vclz_u16): Likewise.
6815         (vclz_u32): Likewise.
6816         (vclzq_s8): Likewise.
6817         (vclzq_s16): Likewise.
6818         (vclzq_s32): Likewise.
6819         (vclzq_u8): Likewise.
6820         (vclzq_u16): Likewise.
6821         (vclzq_u32): Likewise.
6822         (vcnt_s8): Likewise.
6823         (vcnt_u8): Likewise.
6824         (vcnt_p8): Likewise.
6825         (vcntq_s8): Likewise.
6826         (vcntq_u8): Likewise.
6827         (vcntq_p8): Likewise.
6828         (vrecpe_f32): Likewise.
6829         (vrecpe_u32): Likewise.
6830         (vrecpeq_f32): Likewise.
6831         (vrecpeq_u32): Likewise.
6832         (vrsqrte_f32): Likewise.
6833         (vrsqrte_u32): Likewise.
6834         (vrsqrteq_f32): Likewise.
6835         (vrsqrteq_u32): Likewise.
6836         (vget_lane_s8): Likewise.
6837         (vget_lane_s16): Likewise.
6838         (vget_lane_s32): Likewise.
6839         (vget_lane_f32): Likewise.
6840         (vget_lane_u8): Likewise.
6841         (vget_lane_u16): Likewise.
6842         (vget_lane_u32): Likewise.
6843         (vget_lane_p8): Likewise.
6844         (vget_lane_p16): Likewise.
6845         (vget_lane_s64): Likewise.
6846         (vget_lane_u64): Likewise.
6847         (vgetq_lane_s8): Likewise.
6848         (vgetq_lane_s16): Likewise.
6849         (vgetq_lane_s32): Likewise.
6850         (vgetq_lane_f32): Likewise.
6851         (vgetq_lane_u8): Likewise.
6852         (vgetq_lane_u16): Likewise.
6853         (vgetq_lane_u32): Likewise.
6854         (vgetq_lane_p8): Likewise.
6855         (vgetq_lane_p16): Likewise.
6856         (vgetq_lane_s64): Likewise.
6857         (vgetq_lane_u64): Likewise.
6858         (vcvt_s32_f32): Likewise.
6859         (vcvt_f32_s32): Likewise.
6860         (vcvt_f32_u32): Likewise.
6861         (vcvt_u32_f32): Likewise.
6862         (vcvtq_s32_f32): Likewise.
6863         (vcvtq_f32_s32): Likewise.
6864         (vcvtq_f32_u32): Likewise.
6865         (vcvtq_u32_f32): Likewise.
6866         (vcvt_n_s32_f32): Likewise.
6867         (vcvt_n_f32_s32): Likewise.
6868         (vcvt_n_f32_u32): Likewise.
6869         (vcvt_n_u32_f32): Likewise.
6870         (vcvtq_n_s32_f32): Likewise.
6871         (vcvtq_n_f32_s32): Likewise.
6872         (vcvtq_n_f32_u32): Likewise.
6873         (vcvtq_n_u32_f32): Likewise.
6874         (vmovn_s16): Likewise.
6875         (vmovn_s32): Likewise.
6876         (vmovn_s64): Likewise.
6877         (vmovn_u16): Likewise.
6878         (vmovn_u32): Likewise.
6879         (vmovn_u64): Likewise.
6880         (vqmovn_s16): Likewise.
6881         (vqmovn_s32): Likewise.
6882         (vqmovn_s64): Likewise.
6883         (vqmovn_u16): Likewise.
6884         (vqmovn_u32): Likewise.
6885         (vqmovn_u64): Likewise.
6886         (vqmovun_s16): Likewise.
6887         (vqmovun_s32): Likewise.
6888         (vqmovun_s64): Likewise.
6889         (vmovl_s8): Likewise.
6890         (vmovl_s16): Likewise.
6891         (vmovl_s32): Likewise.
6892         (vmovl_u8): Likewise.
6893         (vmovl_u16): Likewise.
6894         (vmovl_u32): Likewise.
6895         (vmul_lane_s16): Likewise.
6896         (vmul_lane_s32): Likewise.
6897         (vmul_lane_f32): Likewise.
6898         (vmul_lane_u16): Likewise.
6899         (vmul_lane_u32): Likewise.
6900         (vmulq_lane_s16): Likewise.
6901         (vmulq_lane_s32): Likewise.
6902         (vmulq_lane_f32): Likewise.
6903         (vmulq_lane_u16): Likewise.
6904         (vmulq_lane_u32): Likewise.
6905         (vmla_lane_s16): Likewise.
6906         (vmla_lane_s32): Likewise.
6907         (vmla_lane_f32): Likewise.
6908         (vmla_lane_u16): Likewise.
6909         (vmla_lane_u32): Likewise.
6910         (vmlaq_lane_s16): Likewise.
6911         (vmlaq_lane_s32): Likewise.
6912         (vmlaq_lane_f32): Likewise.
6913         (vmlaq_lane_u16): Likewise.
6914         (vmlaq_lane_u32): Likewise.
6915         (vmlal_lane_s16): Likewise.
6916         (vmlal_lane_s32): Likewise.
6917         (vmlal_lane_u16): Likewise.
6918         (vmlal_lane_u32): Likewise.
6919         (vqdmlal_lane_s16): Likewise.
6920         (vqdmlal_lane_s32): Likewise.
6921         (vmls_lane_s16): Likewise.
6922         (vmls_lane_s32): Likewise.
6923         (vmls_lane_f32): Likewise.
6924         (vmls_lane_u16): Likewise.
6925         (vmls_lane_u32): Likewise.
6926         (vmlsq_lane_s16): Likewise.
6927         (vmlsq_lane_s32): Likewise.
6928         (vmlsq_lane_f32): Likewise.
6929         (vmlsq_lane_u16): Likewise.
6930         (vmlsq_lane_u32): Likewise.
6931         (vmlsl_lane_s16): Likewise.
6932         (vmlsl_lane_s32): Likewise.
6933         (vmlsl_lane_u16): Likewise.
6934         (vmlsl_lane_u32): Likewise.
6935         (vqdmlsl_lane_s16): Likewise.
6936         (vqdmlsl_lane_s32): Likewise.
6937         (vmull_lane_s16): Likewise.
6938         (vmull_lane_s32): Likewise.
6939         (vmull_lane_u16): Likewise.
6940         (vmull_lane_u32): Likewise.
6941         (vqdmull_lane_s16): Likewise.
6942         (vqdmull_lane_s32): Likewise.
6943         (vqdmulhq_lane_s16): Likewise.
6944         (vqdmulhq_lane_s32): Likewise.
6945         (vqdmulh_lane_s16): Likewise.
6946         (vqdmulh_lane_s32): Likewise.
6947         (vqrdmulhq_lane_s16): Likewise.
6948         (vqrdmulhq_lane_s32): Likewise.
6949         (vqrdmulh_lane_s16): Likewise.
6950         (vqrdmulh_lane_s32): Likewise.
6951         (vmul_n_s16): Likewise.
6952         (vmul_n_s32): Likewise.
6953         (vmul_n_f32): Likewise.
6954         (vmul_n_u16): Likewise.
6955         (vmul_n_u32): Likewise.
6956         (vmulq_n_s16): Likewise.
6957         (vmulq_n_s32): Likewise.
6958         (vmulq_n_f32): Likewise.
6959         (vmulq_n_u16): Likewise.
6960         (vmulq_n_u32): Likewise.
6961         (vmull_n_s16): Likewise.
6962         (vmull_n_s32): Likewise.
6963         (vmull_n_u16): Likewise.
6964         (vmull_n_u32): Likewise.
6965         (vqdmull_n_s16): Likewise.
6966         (vqdmull_n_s32): Likewise.
6967         (vqdmulhq_n_s16): Likewise.
6968         (vqdmulhq_n_s32): Likewise.
6969         (vqdmulh_n_s16): Likewise.
6970         (vqdmulh_n_s32): Likewise.
6971         (vqrdmulhq_n_s16): Likewise.
6972         (vqrdmulhq_n_s32): Likewise.
6973         (vqrdmulh_n_s16): Likewise.
6974         (vqrdmulh_n_s32): Likewise.
6975         (vmla_n_s16): Likewise.
6976         (vmla_n_s32): Likewise.
6977         (vmla_n_f32): Likewise.
6978         (vmla_n_u16): Likewise.
6979         (vmla_n_u32): Likewise.
6980         (vmlaq_n_s16): Likewise.
6981         (vmlaq_n_s32): Likewise.
6982         (vmlaq_n_f32): Likewise.
6983         (vmlaq_n_u16): Likewise.
6984         (vmlaq_n_u32): Likewise.
6985         (vmlal_n_s16): Likewise.
6986         (vmlal_n_s32): Likewise.
6987         (vmlal_n_u16): Likewise.
6988         (vmlal_n_u32): Likewise.
6989         (vqdmlal_n_s16): Likewise.
6990         (vqdmlal_n_s32): Likewise.
6991         (vmls_n_s16): Likewise.
6992         (vmls_n_s32): Likewise.
6993         (vmls_n_f32): Likewise.
6994         (vmls_n_u16): Likewise.
6995         (vmls_n_u32): Likewise.
6996         (vmlsq_n_s16): Likewise.
6997         (vmlsq_n_s32): Likewise.
6998         (vmlsq_n_f32): Likewise.
6999         (vmlsq_n_u16): Likewise.
7000         (vmlsq_n_u32): Likewise.
7001         (vmlsl_n_s16): Likewise.
7002         (vmlsl_n_s32): Likewise.
7003         (vmlsl_n_u16): Likewise.
7004         (vmlsl_n_u32): Likewise.
7005         (vqdmlsl_n_s16): Likewise.
7006         (vqdmlsl_n_s32): Likewise.
7007
7008 2014-11-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
7009
7010         * config/arm/arm.c (arm_new_rtx_costs, case PLUS, MINUS):
7011         Add cost of alu.arith in simple SImode case.
7012
7013 2014-11-18  Jiong Wang  <jiong.wang@arm.com>
7014
7015         * lra-eliminations.c (update_reg_eliminate): Relax gcc_assert for fixed
7016         registers.
7017
7018 2014-11-18  Marat Zakirov  <m.zakirov@samsung.com>
7019
7020         * opts.c (finish_options): Disable aggressive opts for sanitizer.
7021         (common_handle_option): Move code to finish_options.
7022
7023 2014-11-18  Yury Gribov  <y.gribov@samsung.com>
7024
7025         PR sanitizer/63802
7026         * stor-layout.c (min_align_of_type): Respect user alignment
7027         more.
7028
7029 2014-11-18  Ilya Enkovich  <ilya.enkovich@intel.com>
7030
7031         * passes.c (remove_cgraph_node_from_order): New.
7032         (do_per_function_toporder): Register cgraph removal
7033         hook.
7034
7035 2014-11-17  Terry Guo  <terry.guo@arm.com>
7036
7037         * config/arm/arm.c (arm_issue_rate): Return 2 for cortex-m7.
7038         * config/arm/arm.md (generic_sched): Exclude cortex-m7.
7039         (generic_vfp): Likewise.
7040         * config/arm/cortex-m7.md: Pipeline description for cortex-m7.
7041
7042 2014-11-17  Vladimir Makarov  <vmakarov@redhat.com>
7043
7044         PR rtl-optimization/63906
7045         * lra-remat.c (operand_to_remat): Check SP and
7046         frame_pointer_required.
7047
7048 2014-11-17  Mircea Namolaru  <mircea.namolaru@inria.fr>
7049
7050         * doc/invoke.texi (floop-unroll-and-jam): Document
7051         (loop-unroll-jam-size): Likewise.
7052         (loop-unroll-jam-depth): Likewise.
7053         * graphite-optimize-isl.c (getPrevectorMap_full): Modify comment.
7054         (getScheduleForBandList): Replaced unsafe union_map reuse.
7055
7056 2014-11-17  Andrew Pinski  <apinski@cavium.com>
7057
7058         * config/aarch64/thunderx.md: Remove copyright which should not
7059         have been there.
7060
7061 2014-11-17  Michael Meissner  <meissner@linux.vnet.ibm.com>
7062             Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
7063
7064         * config/rs6000/rs6000.c (RELOAD_REG_AND_M16): Add support for
7065         Altivec style vector loads that ignore the bottom 3 bits of the
7066         address.
7067         (rs6000_debug_addr_mask): New function to print the addr_mask
7068         values if debugging.
7069         (rs6000_debug_print_mode): Call rs6000_debug_addr_mask to print
7070         out addr_mask.
7071         (rs6000_setup_reg_addr_masks): Add support for Altivec style
7072         vector loads that ignore the bottom 3 bits of the address.  Allow
7073         pre-increment and pre-decrement on floating point, even if the
7074         -mupper-regs-{sf,df} options were used.
7075         (rs6000_init_hard_regno_mode_ok): Rework DFmode support if
7076         -mupper-regs-df.  Add support for -mupper-regs-sf.  Rearrange code
7077         placement for direct move support.
7078         (rs6000_option_override_internal): Add checks for -mupper-regs-df
7079         requiring -mvsx, and -mupper-regs-sf requiring -mpower8-vector.
7080         If -mupper-regs, set both -mupper-regs-sf and -mupper-regs-df,
7081         depending on the underlying cpu.
7082         (rs6000_secondary_reload_fail): Add ATTRIBUTE_NORETURN.
7083         (rs6000_secondary_reload_toc_costs): Helper function to identify
7084         costs of a TOC load for secondary reload support.
7085         (rs6000_secondary_reload_memory): Helper function for secondary
7086         reload, to determine if a particular memory operation is directly
7087         handled by the hardware, or if it needs support from secondary
7088         reload to create a valid address.
7089         (rs6000_secondary_reload): Rework code, to be clearer.  If the
7090         appropriate -mupper-regs-{sf,df} is used, use FPR registers to
7091         reload scalar values, since the FPR registers have D-form
7092         addressing. Move most of the code handling memory to the function
7093         rs6000_secondary_reload_memory, and use the reg_addr structure to
7094         determine what type of address modes are supported.  Print more
7095         debug information if -mdebug=addr.
7096         (rs6000_secondary_reload_inner): Rework entire function to be more
7097         general.  Use the reg_addr bits to determine what type of
7098         addressing is supported.
7099         (rs6000_preferred_reload_class): Rework.  Move constant handling
7100         into a single place.  Prefer using FLOAT_REGS for scalar floating
7101         point.
7102         (rs6000_secondary_reload_class): Use a FPR register to move a
7103         value from an Altivec register to a GPR, and vice versa.  Move VSX
7104         handling above traditional floating point.
7105
7106         * config/rs6000/rs6000.md (mov<mode>_hardfloat, FMOVE32 case):
7107         Delete some spaces in the constraints.
7108         (DF->DF move peephole2): Disable if -mupper-regs-{sf,df} to
7109         allow using FPR registers to load/store an Altivec register for
7110         scalar floating point types.
7111         (SF->SF move peephole2): Likewise.
7112         (DFmode splitter): Add a define_split to move floating point
7113         constants to the constant pool before register allocation.
7114         Normally constants are put into the pool immediately, but
7115         -ffast-math delays putting them into the constant pool for the
7116         reciprocal approximation support.
7117         (SFmode splitter): Likewise.
7118
7119         * config/rs6000/rs6000.opt (-mupper-regs-df): Make option public.
7120         (-mupper-regs-sf): Likewise.
7121
7122         * config/rs6000/rs6000-c.c (rs6000_target_modify_macros): Define
7123         __UPPER_REGS_DF__ if -mupper-regs-df.  Define __UPPER_REGS_SF__ if
7124         -mupper-regs-sf.
7125         (-mupper-regs): New combination option that sets -mupper-regs-sf
7126         and -mupper-regs-df by default if the cpu supports the instructions.
7127
7128         * doc/invoke.texi (RS/6000 and PowerPC Options): Document
7129         -mupper-regs, -mupper-regs-sf, and -mupper-regs-df.
7130
7131         * config/rs6000/predicates.md (memory_fp_constant): New predicate
7132         to return true if the operand is a floating point constant that
7133         must be put into the constant pool, before register allocation
7134         occurs.
7135
7136         * config/rs6000/rs6000-cpus.def (ISA_2_6_MASKS_SERVER): Enable
7137         -mupper-regs-df by default.
7138         (ISA_2_7_MASKS_SERVER): Enable -mupper-regs-sf by default.
7139         (POWERPC_MASKS): Add -mupper-regs-{sf,df} as options set by the
7140         various -mcpu=... options.
7141         (power7 cpu): Enable -mupper-regs-df by default.
7142
7143         * doc/invoke.texi (RS/6000 and PowerPC Options): Document
7144         -mupper-regs.
7145
7146 2014-11-17  Zhouyi Zhou <yizhouzhou@ict.ac.cn>
7147
7148         * ira-conflicts.c (build_conflict_bit_table): Add the current
7149         object to OBJECTS_LIVE after traversing OBJECTS_LIVE.
7150
7151 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7152
7153         * ipa-cp.c (ipa_get_indirect_edge_target_1): Handle speculation.
7154         (ipa_get_indirect_edge_target): Add SPECULATIVE argument.
7155         (devirtualization_time_bonus): Use it.
7156         (ipcp_discover_new_direct_edges): Likewise.
7157         * ipa-inline-analysis.c (estimate_edge_devirt_benefit): Update.
7158         * ipa-prop.h (ipa_get_indirect_edge_target): Update prototype.
7159
7160 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7161
7162         * tree.c (free_lang_data_in_decl): Set
7163         DECL_FUNCTION_SPECIFIC_OPTIMIZATION to optimization_default_node.
7164
7165 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7166
7167         * cgraphunit.c (analyze_functions): Use opt_for_fn.
7168         * cgraph.h (cgraph_node::optimize_for_size_p): Likewise.
7169
7170 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7171
7172         * cgraph.c (symbol_table::create_edge): Use opt_for_fn.
7173         (cgraph_node::cannot_return_p): Likewise.
7174         (cgraph_edge::cannot_lead_to_return_p): Likewise.
7175         (cgraph_edge::maybe_hot_p): Likewise.
7176
7177 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7178
7179         * predict.c (maybe_hot_frequency_p): Use opt_for_fn.
7180         (optimize_function_for_size_p): Likewise.
7181         (probably_never_executed): Likewise; replace cfun by fun.
7182
7183 2014-11-17  Alan Lawrence  <alan.lawrence@arm.com>
7184
7185         * config/aarch64/aarch64-simd.md (aarch64_simd_vec_set<mode>): Add
7186         variant reading from memory and assembling to ld1.
7187
7188         * config/aarch64/arm_neon.h (vld1_lane_f32, vld1_lane_f64, vld1_lane_p8,
7189         vld1_lane_p16, vld1_lane_s8, vld1_lane_s16, vld1_lane_s32,
7190         vld1_lane_s64, vld1_lane_u8, vld1_lane_u16, vld1_lane_u32,
7191         vld1_lane_u64, vld1q_lane_f32, vld1q_lane_f64, vld1q_lane_p8,
7192         vld1q_lane_p16, vld1q_lane_s8, vld1q_lane_s16, vld1q_lane_s32,
7193         vld1q_lane_s64, vld1q_lane_u8, vld1q_lane_u16, vld1q_lane_u32,
7194         vld1q_lane_u64): Replace asm with vset_lane and pointer dereference.
7195
7196 2014-11-17  Jason Merrill  <jason@redhat.com>
7197
7198         * tree-inline.c (copy_fn): New.
7199         * tree-inline.h: Declare it.
7200
7201 2014-11-17  Alan Lawrence  <alan.lawrence@arm.com>
7202
7203         * config/aarch64/aarch64-builtins.c (TYPES_CREATE): Remove.
7204         * config/aarch64/aarch64-simd-builtins.def (create): Remove.
7205         * config/aarch64/aarch64-simd.md (aarch64_create<mode>): Remove.
7206         * config/aarch64/arm_neon.h (vcreate_f64, vreinterpret_f64_s64,
7207         vreinterpret_f64_u64): Replace __builtin_aarch64_createv1df with C casts.
7208         * config/aarch64/iterators.md (VD1): Remove.
7209
7210 2014-11-17  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
7211
7212         * config/aarch64/aarch64-cores.def (cortex-a53): Remove
7213         AARCH64_FL_CRYPTO from feature flags.
7214         (cortex-a57): Likewise.
7215         (cortex-a57.cortex-a53): Likewise.
7216
7217 2014-11-17  Jan Hubicka  <hubicka@ucw.cz>
7218
7219         * tree.c (free_lang_data_in_decl): Annotate all functio nbodies with
7220         DECL_FUNCTION_SPECIFIC_TARGET.
7221         * i386.c (ix86_set_current_function): Handle explicit default options.
7222
7223 2014-11-17  Ilya Enkovich  <ilya.enkovich@intel.com>
7224
7225         * builtins.c (expand_builtin_memcpy_with_bounds): Use target hook
7226         instead of BNDmode.
7227         (expand_builtin_mempcpy_with_bounds): Likewise.
7228         (expand_builtin_memset_with_bounds): Likewise.
7229
7230 2014-11-17  Ilya Enkovich  <ilya.enkovich@intel.com>
7231
7232         * tree-ssa-strlen.c: include ipa-chkp.h, cgraph.h,
7233         ipa-ref.h, plugin-api.h.
7234         (get_string_length): Handle calls with bounds.
7235         (adjust_last_stmt): Likewise.
7236         (handle_builtin_strchr): Likewise.
7237         (handle_builtin_strcpy): Likewise.
7238         (handle_builtin_memcpy): Likewise.
7239         (handle_builtin_strcat): Likewise.
7240
7241 2014-11-17  Ilya Enkovich  <ilya.enkovich@intel.com>
7242
7243         * tree-chkp-opt.c (chkp_get_nobnd_fndecl): New.
7244         (chkp_get_nochk_fndecl): New.
7245         (chkp_optimize_string_function_calls): New.
7246         (chkp_opt_execute): Call chkp_optimize_string_function_calls.
7247         * tree-cfg.h (insert_cond_bb): New.
7248         * tree-cfg.c (insert_cond_bb): New.
7249
7250 2014-11-17  Ilya Enkovich  <ilya.enkovich@intel.com>
7251
7252         * tree-core.h (built_in_class): Add builtin codes to be used
7253         by Pointer Bounds Checker for instrumented builtin functions.
7254         * tree-streamer-in.c: Include ipa-chkp.h.
7255         (streamer_get_builtin_tree): Created instrumented decl if
7256         required.
7257         * ipa-chkp.h (chkp_maybe_clone_builtin_fndecl): New.
7258         * ipa-chkp.c (chkp_build_instrumented_fndecl): Support builtin
7259         function decls.
7260         (chkp_maybe_clone_builtin_fndecl): New.
7261         (chkp_maybe_create_clone): Support builtin function decls.
7262         (chkp_versioning): Clone builtin functions.
7263         * tree-chkp.c (chkp_instrument_normal_builtin): New.
7264         (chkp_add_bounds_to_call_stmt): Support builtin functions.
7265         (chkp_replace_function_pointer): Likewise.
7266         * builtins.c (expand_builtin_memcpy_args): New.
7267         (expand_builtin_memcpy): Call expand_builtin_memcpy_args.
7268         (expand_builtin_memcpy_with_bounds): New.
7269         (expand_builtin_mempcpy_with_bounds): New.
7270         (expand_builtin_mempcpy_args): Add orig_exp arg. Support
7271         BUILT_IN_CHKP_MEMCPY_NOBND_NOCHK
7272         (expand_builtin_memset_with_bounds): New.
7273         (expand_builtin_memset_args): Support BUILT_IN_CHKP_MEMSET_NOBND_NOCHK.
7274         (expand_builtin_with_bounds): New.
7275         * builtins.h (expand_builtin_with_bounds): New.
7276         * expr.c (expand_expr_real_1): Support instrumented builtin calls.
7277
7278 2014-11-17  Dodji Seketeli  <dodji@redhat.com>
7279
7280         * gimple.h (gimple_set_visited, gimple_visited_p)
7281         (gimple_set_plf, gimple_plf, gimple_set_uid, gimple_uid): Add more
7282         comments to these accessors.
7283
7284 2014-11-17  Georg-Johann Lay  <avr@gjlay.de>
7285
7286         * config/avr/avr-log.c (avr_log_set_avr_log) [TARGET_ALL_DEBUG]:
7287         Set avr_log_details to "all".
7288
7289 2014-11-17  Richard Biener  <rguenther@suse.de>
7290
7291         PR middle-end/63898
7292         * match.pd: Guard X / CST -> X * CST' transform against
7293         zero CST.
7294
7295 2014-11-17  Terry Guo  <terry.guo@arm.com>
7296
7297         * config/arm/thumb1.md (*addsi3_cbranch_scratch): Updated to UAL
7298         format.
7299
7300 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@arm.com>
7301
7302         * ifcvt.c (HAVE_cbranchcc4): Define.
7303         (noce_emit_cmove, noce_get_alt_condition, noce_get_condition):
7304         Use HAVE_cbranchcc4.
7305
7306 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7307
7308         * config/aarch64/aarch64.c (aarch64_code_to_ccmode,
7309         aarch64_convert_mode, aarch64_gen_ccmp_first,
7310         aarch64_gen_ccmp_next): New functions.
7311         (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): Define.
7312
7313 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7314
7315         * config/aarch64/aarch64-protos.h (aarch64_ccmp_mode_to_code): New.
7316         * aarch64.c (aarch64_nzcv_codes): New data.
7317         (aarch64_ccmp_mode_to_code): New.
7318         (aarch64_print_operand): Output nzcv.
7319         config/aarch64/aarch64.md (cbranchcc4, *ccmp_and, *ccmp_ior, cstorecc4):
7320         New patterns.
7321         (cstore<mode>4): Handle ccmp_cc_register.
7322         * config/aarch64/predicates.md (const0_operand): New.
7323
7324 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7325
7326         * config/aarch64/aarch64-modes.def: Define ccmp CC mode.
7327         * config/aarch64/aarch64.c (aarch64_get_condition_code_1): New function
7328         extacted from aarch64_get_condition_code.
7329         (aarch64_get_condition_code): Call aarch64_get_condition_code_1.
7330         config/aarch64/predicates.md (ccmp_cc_register): New predicate.
7331
7332 014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7333
7334         * config/aarch64/constraints.md (Usn, aarch64_ccmp_immediate,
7335         aarch64_ccmp_operand): New constraints.
7336
7337 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7338
7339         * Makefile.in: Add ccmp.o.
7340         * ccmp.c: New file.
7341         * ccmp.h: New file.
7342         * expr.c: include "ccmp.h"
7343         (expand_cond_expr_using_cmove): Handle VOIDmode.
7344         (expand_expr_real_1): Try to expand ccmp.
7345
7346 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7347
7348         * cfgexpand.c (expand_gimple_cond): Check ccmp.
7349         * expmed.c (emit_cstore): Make it global.
7350         * expmed.h: #include "insn-codes.h"
7351         (emit_cstore): New prototype.
7352         * expr.c (expand_operands): Make it global.
7353         * expr.h (expand_operands): New prototype.
7354         * optabs.c (get_rtx_code): Make it global.
7355         * optabs.h (get_rtx_code): New prototype.
7356
7357 2014-11-17  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
7358
7359         * target.def (gen_ccmp_first, gen_ccmp_first): Add two new hooks.
7360         * doc/tm.texi.in (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): New.
7361         * doc/tm.texi (TARGET_GEN_CCMP_FIRST, TARGET_GEN_CCMP_NEXT): New.
7362
7363 2014-11-16  Patrick Palka  <ppalka@gcc.gnu.org>
7364
7365         PR middle-end/63790
7366         * tree-ssa-forwprop.c (forward_propagate_into_comparison_1):
7367         Always combine comparisons or conversions from booleans.
7368
7369 2014-11-16  Jan Hubicka  <hubicka@ucw.cz>
7370
7371         * ipa-polymorphic-call.c
7372         (ipa_polymorphic_call_context::speculation_consistent_p): Constify.
7373         (ipa_polymorphic_call_context::meet_speculation_with): New function.
7374         (ipa_polymorphic_call_context::combine_with): Handle types in
7375         construction better.
7376         (ipa_polymorphic_call_context::equal_to): Do not bother about useless
7377         speculation.
7378         (ipa_polymorphic_call_context::meet_with): New function.
7379         * cgraph.h (class ipa_polymorphic_call_context): Add
7380         meet_width, meet_speculation_with; constify speculation_consistent_p.
7381         * ipa-cp.c (ipa_context_from_jfunc): Handle speculation; combine
7382         with incomming context.
7383         (propagate_context_accross_jump_function): Likewise; be more cureful.
7384         about set_contains_variable.
7385         (ipa_get_indirect_edge_target_1): Fix handling of dynamic type changes.
7386         (find_more_scalar_values_for_callers_subset): Fix.
7387         (find_more_contexts_for_caller_subset): Perform meet operation.
7388
7389 2014-11-16  Jan Hubicka  <hubicka@ucw.cz>
7390
7391         * passes.c (execute_one_pass): Do not apply all transforms prior
7392         every simple IPA pass.
7393         * cgraphunit.c: Do not include fibheap.h
7394         (expand_thunk): Use get_untransformed_body.
7395         (cgraph_node::expand): Likewise.
7396         * tree-ssa-structalias.c (ipa_pta_execute): Skip inline clones.
7397         * cgraph.c (release_function_body): Do not push cfun when CFG
7398         is not there.
7399         (cgraph_node::get_untransformed_body): Break out from ...
7400         (cgraph_node::get_body): ... here; add code to apply all transforms.
7401         * cgraph.h (cgraph_node): Add get_untransformed_body.
7402         * ipa-icf.c (sem_function::init): Use get_untransformed_body.
7403         * cgraphclones.c (duplicate_thunk_for_node): Likewise.
7404         * tree-inline.c (expand_call_inline): LIkewise.
7405         * i386.c (ix86_reset_to_default_globals): Break out from ...
7406         (ix86_set_current_function): ... here;
7407         (ix86_reset_previous_fndecl): Use it.
7408         (ix86_simd_clone_adjust): Use ix86_reset_previous_fndecl.
7409
7410 2014-11-16  Eric Botcazou  <ebotcazou@adacore.com>
7411
7412         * doc/tm.texi.in (TARGET_FLAGS_REGNUM): Move around.
7413         * doc/tm.texi: Regenerate.
7414
7415 2014-11-16  Uros Bizjak  <ubizjak@gmail.com>
7416
7417         * config/sh/sh.c: Do not include algorithm.
7418         (sh_emit_scc_to_t): Replace open-coded swap with std::swap
7419         to swap values.
7420         (sh_emit_compare_and_branch): Ditto.
7421         (sh_emit_compare_and_set): Ditto.
7422         * config/sh/sh.md (replacement peephole2): Ditto.
7423         (cstore4_media): Ditto.
7424         (*fmasf4): Ditto.
7425
7426 2014-11-15  Vladimir Makarov  <vmakarov@redhat.com>
7427
7428         * lra-remat.c (cand_transf_func): Process regno for
7429         rematerialization too.
7430         * lra.c (lra): Switch on rematerialization pass.
7431
7432 2014-11-15  Vladimir Makarov  <vmakarov@redhat.com>
7433
7434         * lra.c (lra): Switch off rematerialization pass.
7435
7436 2014-11-15  Marc Glisse  <marc.glisse@inria.fr>
7437
7438         * config/i386/xmmintrin.h (_mm_add_ps, _mm_sub_ps, _mm_mul_ps,
7439         _mm_div_ps, _mm_store_ss, _mm_cvtss_f32): Use vector extensions
7440         instead of builtins.
7441         * config/i386/emmintrin.h (__v2du, __v4su, __v8hu, __v16qu): New
7442         typedefs.
7443         (_mm_sqrt_sd): Fix comment.
7444         (_mm_add_epi8, _mm_add_epi16, _mm_add_epi32, _mm_add_epi64,
7445         _mm_sub_epi8, _mm_sub_epi16, _mm_sub_epi32, _mm_sub_epi64,
7446         _mm_mullo_epi16, _mm_cmpeq_epi8, _mm_cmpeq_epi16, _mm_cmpeq_epi32,
7447         _mm_cmplt_epi8, _mm_cmplt_epi16, _mm_cmplt_epi32, _mm_cmpgt_epi8,
7448         _mm_cmpgt_epi16, _mm_cmpgt_epi32, _mm_and_si128, _mm_or_si128,
7449         _mm_xor_si128, _mm_store_sd, _mm_cvtsd_f64, _mm_storeh_pd,
7450         _mm_cvtsi128_si64, _mm_cvtsi128_si64x, _mm_add_pd, _mm_sub_pd,
7451         _mm_mul_pd, _mm_div_pd, _mm_storel_epi64, _mm_movepi64_pi64):
7452         Use vector extensions instead of builtins.
7453         * config/i386/smmintrin.h (_mm_cmpeq_epi64, _mm_cmpgt_epi64,
7454         _mm_mullo_epi32): Likewise.
7455         * config/i386/avxintrin.h (__v4du, __v8su, __v16hu, __v32qu):
7456         New typedefs.
7457         (_mm256_add_pd, _mm256_add_ps, _mm256_div_pd, _mm256_div_ps,
7458         _mm256_mul_pd, _mm256_mul_ps, _mm256_sub_pd, _mm256_sub_ps):
7459         Use vector extensions instead of builtins.
7460         * config/i386/avx2intrin.h (_mm256_cmpeq_epi8, _mm256_cmpeq_epi16,
7461         _mm256_cmpeq_epi32, _mm256_cmpeq_epi64, _mm256_cmpgt_epi8,
7462         _mm256_cmpgt_epi16, _mm256_cmpgt_epi32, _mm256_cmpgt_epi64,
7463         _mm256_and_si256, _mm256_or_si256, _mm256_xor_si256, _mm256_add_epi8,
7464         _mm256_add_epi16, _mm256_add_epi32, _mm256_add_epi64,
7465         _mm256_mullo_epi16, _mm256_mullo_epi32, _mm256_sub_epi8,
7466         _mm256_sub_epi16, _mm256_sub_epi32, _mm256_sub_epi64): Likewise.
7467         * config/i386/avx512fintrin.h (__v8du, __v16su, __v32hu, __v64qu):
7468         New typedefs.
7469         (_mm512_or_si512, _mm512_or_epi32, _mm512_or_epi64, _mm512_xor_si512,
7470         _mm512_xor_epi32, _mm512_xor_epi64, _mm512_and_si512,
7471         _mm512_and_epi32, _mm512_and_epi64, _mm512_mullo_epi32,
7472         _mm512_add_epi64, _mm512_sub_epi64, _mm512_add_epi32,
7473         _mm512_sub_epi32, _mm512_add_pd, _mm512_add_ps, _mm512_sub_pd,
7474         _mm512_sub_ps, _mm512_mul_pd, _mm512_mul_ps, _mm512_div_pd,
7475         _mm512_div_ps): Use vector extensions instead of builtins.
7476         * config/i386/avx512bwintrin.h (_mm512_mullo_epi16, _mm512_add_epi8,
7477         _mm512_sub_epi8, _mm512_sub_epi16, _mm512_add_epi16): Likewise.
7478         * config/i386/avx512dqintrin.h (_mm512_mullo_epi64): Likewise.
7479         * config/i386/avx512vldqintrin.h (_mm256_mullo_epi64, _mm_mullo_epi64):
7480         Likewise.
7481
7482 2014-11-15  Jan Hubicka <hubicka@ucw.cz>
7483
7484         * lto-streamer-out.c (hash_tree): Use cl_optimization_hash.
7485         * lto-streamer.h (cl_optimization_stream_out,
7486         cl_optimization_stream_in): Declare.
7487         * optc-save-gen.awk: Generate cl_optimization LTO streaming
7488         and hashing routines.
7489         * opth-gen.awk: Add prototype of cl_optimization_hash.
7490         * tree-streamer-in.c (unpack_ts_optimization): Remove.
7491         (streamer_unpack_tree_bitfields): Use cl_optimization_stream_in.
7492         * tree-streamer-out.c (pack_ts_optimization): Remove.
7493         (streamer_pack_tree_bitfields): Use cl_optimization_stream_out.
7494
7495 2014-11-15  Mircea Namolaru  <mircea.namolaru@inria.fr>
7496
7497         * common.opt (flag_loop_unroll_and_jam): New flag.
7498         * params.def (PARAM_LOOP_UNROLL_JAM_SIZE): Parameter for unroll and
7499         jam flag.
7500         (PARAM_LOOP_UNROLL_JAM_DEPTH): Likewise.
7501         * graphite-poly.h (struct poly_bb:map_sepclass): New field
7502         * graphite-poly.c (new_poly_bb): Initialization for new field.
7503         (apply_poly_transforms): Support for unroll and jam flag.
7504         * graphite-isl-ast-to-gimple.c (generate_luj_sepclass): Compute the
7505         separation class.
7506         (generate_luj_sepclass_opt): Build the separation class option.
7507         (generate_luj_options): Set unroll and jam options.
7508         (set_options): Support for unroll and jam options.
7509         (scop_to_isl_ast): Likewise
7510         * graphite-optimize-isl.c (getPrevectorMap_full): New function for
7511         computing the separating class map.
7512         (optimize_isl): Support for the separating class map.
7513         (apply_schedule_map_to_scop): Likewise.
7514         (getScheduleMap): Likewise.
7515         (getScheduleForBand): Likewise.
7516         (getScheduleForBandList): Likewise.
7517         * graphite.c (gate_graphite_transforms): Add unroll and jam flag.
7518         * toplev.c (process_options) Likewise.
7519
7520 2014-11-15  Eric Botcazou  <ebotcazou@adacore.com>
7521
7522         * tree-cfg.c (replace_loop_annotate_in_block): New function extracted
7523         from...
7524         (replace_loop_annotate): ...here.  Call it on the header and on the
7525         latch block, if any.  Restore proper behavior of final cleanup.
7526
7527 2014-11-15  Eric Botcazou  <ebotcazou@adacore.com>
7528
7529         * tree-ssa-loop-ivcanon.c (try_unroll_loop_completely): Add log message
7530         for max-completely-peeled-insns limit.
7531
7532 2014-11-14  Jan Hubicka  <hubicka@ucw.cz>
7533
7534         * ipa-prop.h (ipa_known_type_data): Remove.
7535         (ipa_binfo_from_known_type_jfunc): Remove.
7536
7537 2014-11-14  Andrew Pinski  <apinski@cavium.com>
7538
7539         * config/aarch64/aarch64-cores.def (thunderx): Change the scheduler
7540         over to thunderx.
7541         * config/aarch64/aarch64.md: Include thunderx.md.
7542         (generic_sched): Set to no for thunderx.
7543         * config/aarch64/thunderx.md: New file.
7544
7545 2014-11-14  Michael Meissner  <meissner@linux.vnet.ibm.com>
7546
7547         * config/rs6000/predicates.md (easy_fp_constant): Delete redunant
7548         tests for 0.0.
7549
7550         * config/rs6000/vector.md (VEC_R): Move secondary reload support
7551         insns to rs6000.md from vector.md.
7552         (reload_<VEC_R:mode>_<P:mptrsize>_store): Likewise.
7553         (reload_<VEC_R:mode>_<P:mptrsize>_load): Likewise.
7554         (vec_reload_and_plus_<mptrsize>): Likewise.
7555
7556         * config/rs6000/rs6000.md (Fa): New mode attribute to give
7557         constraint for the Altivec registers for a type.
7558         (RELOAD): New mode iterator for all of the types that have
7559         secondary reload address support to load up a base register.
7560         (extendsfdf2_fpr): Use correct constraint.
7561         (copysign<mode>3_fcpsgn): For SFmode, use correct xscpsgndp
7562         instruction.
7563         (floatsi<mode>2_lfiwax): Add support for -mupper-regs-{sf,df}.
7564         Generate the non-VSX instruction if all registers were FPRs.  Do
7565         not use the patterns in vsx.md for scalar operations.
7566         (floatsi<mode>2_lfiwax_mem): Likewise.
7567         (floatunssi<mode>2_lfiwzx): Likewise.
7568         (floatunssi<mode>2_lfiwzx_mem): Likewise.
7569         (fix_trunc<mode>di2_fctidz): Likewise.
7570         (fixuns_trunc<mode>di2_fctiduz): Likewise.
7571         (fctiwz_<mode>): Likewise.
7572         (fctiwuz_<mode>): Likewise.
7573         (friz): Likewise.
7574         (floatdidf2_fpr): Likewise.
7575         (floatdidf2_mem): Likewise.
7576         (floatunsdidf2): Likewise.
7577         (floatunsdidf2_fcfidu): Likewise.
7578         (floatunsdidf2_mem): Likewise.
7579         (floatdisf2_fcfids): Likewise.
7580         (floatdisf2_mem): Likewise.
7581         (floatdisf2_internal1): Add explicit test for not FCFIDS to make
7582         it more obvious that the code is for pre-ISA 2.06 machines.
7583         (floatdisf2_internal2): Likewise.
7584         (floatunsdisf2_fcfidus): Add support for -mupper-regs-{sf,df}.
7585         Generate the non-VSX instruction if all registers were FPRs.  Do
7586         not use the patterns in vsx.md for scalar operations.
7587         (floatunsdisf2_mem): Likewise.
7588         (reload_<RELOAD:mode>_<P:mptrsize>_store): Move the reload
7589         handlers here from vector.md, and expand the types we generate
7590         reload handlers for.
7591         (reload_<RELOAD:mode>_<P:mptrsize>_load): Likewise.
7592         (vec_reload_and_plus_<mptrsize>): Likewise.
7593
7594         * config/rs6000/vsx.md (vsx_float<VSi><mode>2): Only provide the
7595         vector forms of the instructions.  Move VSX scalar forms to
7596         rs6000.md, and add support for -mupper-regs-sf.
7597         (vsx_floatuns<VSi><mode>2): Likewise.
7598         (vsx_fix_trunc<mode><VSi>2): Likewise.
7599         (vsx_fixuns_trunc<mode><VSi>2): Likewise.
7600         (vsx_float_fix_<mode>2): Delete DF version, rename to
7601         vsx_float_fix_v2df2.
7602         (vsx_float_fix_v2df2): Likewise.
7603
7604 2014-11-14  Martin Jambor  <mjambor@suse.cz>
7605
7606         * ipa-prop.h (jump_func_type): Removed value IPA_JF_KNOWN_TYPE.
7607         (ipa_pass_through_data): Removed field type_preserved.
7608         (ipa_ancestor_jf_data): removed fields type and type_preserved.
7609         (ipa_jump_func): Removed field known_type.
7610         (ipa_get_jf_known_type_offset): Removed.
7611         (ipa_get_jf_known_type_base_type): Likewise.
7612         (ipa_get_jf_known_type_component_type): Likewise.
7613         (ipa_get_jf_ancestor_type): Likewise.
7614         * ipa-cp.c (print_ipcp_constant_value): Removed BINFO handling.
7615         (ipa_get_jf_pass_through_result): Likewise.
7616         (ipa_get_jf_ancestor_result): Always build ptr_node_type accesses.
7617         (values_equal_for_ipcp_p): Removed BINFO handling.
7618         (ipa_get_indirect_edge_target_1): Updated comment.
7619         * ipa-prop.c (ipa_print_node_jump_functions_for_edge): Removed handling
7620         of IPA_JF_KNOWN_TYPE jump functions.  Do not print removed fields.
7621         (ipa_set_jf_known_type): Removed.
7622         (ipa_set_jf_simple_pass_through): Do not set removed fields.  Update
7623         all callers.
7624         (ipa_set_jf_arith_pass_through): Likewise.
7625         (ipa_set_ancestor_jf): Likewise.
7626         (ipa_binfo_from_known_type_jfunc): Removed.
7627         (prop_type_change_info): Removed fields known_current_type and
7628         multiple_types_encountered.
7629         (extr_type_from_vtbl_ptr_store): Removed.
7630         (check_stmt_for_type_change): Do not attempt to identify changed type.
7631         (detect_type_change_from_memory_writes): Do not set the removed fields,
7632         always set jfunc to unknown.
7633         (compute_complex_assign_jump_func): Do not detect dynamic type change.
7634         (compute_complex_ancestor_jump_func): Likewise.
7635         (compute_known_type_jump_func): Removed.
7636         (ipa_compute_jump_functions_for_edge): Do not detect dynamic type
7637         change.  Do not comute known type jump functions.
7638         (combine_known_type_and_ancestor_jfs): Removed.
7639         (update_jump_functions_after_inlining): Removed handling of
7640         IPA_JF_KNOWN_TYPE jump functions.  Do not set removed fields.
7641         (ipa_write_jump_function): Do not stream removed fields or known type
7642         jump functions.
7643         (ipa_read_jump_function): Likewise.
7644
7645 2014-11-14  Vladimir Makarov  <vmakarov@redhat.com>
7646
7647         * lra-int.h (lra_create_live_ranges): Add parameter.
7648         * lra-lives.c (temp_bitmap): Move higher.
7649         (initiate_live_solver): Move temp_bitmap initialization into
7650         lra_live_ranges_init.
7651         (finish_live_solver): Move temp_bitmap clearing into
7652         live_ranges_finish.
7653         (process_bb_lives): Add parameter.  Use it to control live info
7654         update and dead insn elimination.  Pass it to mark_regno_live and
7655         mark_regno_dead.
7656         (lra_create_live_ranges): Add parameter.  Pass it to
7657         process_bb_lives.
7658         (lra_live_ranges_init, lra_live_ranges_finish): See changes in
7659         initiate_live_solver and finish_live_solver.
7660         * lra-remat.c (do_remat): Process insn non-operand hard regs too.
7661         Use temp_bitmap to update avail_cands.
7662         * lra.c (lra): Pass new parameter to lra_create_live_ranges.  Move
7663         check with lra_need_for_spill_p after live range pass.  Switch on
7664         rematerialization pass.
7665
7666 2014-11-14  Martin Jambor  <mjambor@suse.cz>
7667
7668         * ipa-prop.h (ipa_get_jf_pass_through_type_preserved): use
7669         agg_preserved flag instead.
7670         (ipa_get_jf_ancestor_type_preserved): Likewise.
7671         (ipa_node_params): Rename known_vals to known_csts, update all users.
7672         New field known_contexts.
7673         (ipa_get_indirect_edge_target): Update prototype.
7674         (ipcp_poly_ctx_values_pool): Declare.
7675         (ipa_context_from_jfunc): Likewise.
7676         * ipa-inline.h (estimate_ipcp_clone_size_and_time): Updated prototype.
7677         * cgraph.h (ipa_polymorphic_call_context): New method equal_to.  New
7678         parameter newline of method dump.
7679         * ipa-cp.c (ctxlat): New field.
7680         (ipcp_values_pool): Renamed to ipcp_cst_values_pool, updated all users.
7681         (ipcp_poly_ctx_values_pool):New variable.
7682         (ipa_get_poly_ctx_lat): New function.
7683         (print_ipcp_constant_value): New overloaded function for contexts.
7684         (print_all_lattices): Also print contexts.
7685         (ipa_topo_info): New field contexts;
7686         (set_all_contains_variable): Also set the flag in the context lattice.
7687         (initialize_node_lattices): Likewise for flag bottom.
7688         (ipa_get_jf_ancestor_result): Removed BINFO handling.
7689         (ipa_value_from_jfunc): Likewise.
7690         (ipa_context_from_jfunc): New function.
7691         (values_equal_for_ipcp_p): New overloaded function for contexts.
7692         (allocate_and_init_ipcp_value): Construct the value.
7693         (allocate_and_init_ipcp_value): New overloaded function for contexts.
7694         (propagate_scalar_accross_jump_function): Removed handling of
7695         KNOWN_TYPE jump functions.
7696         (propagate_context_accross_jump_function): New function.
7697         (propagate_constants_accross_call): Also propagate contexts.
7698         (ipa_get_indirect_edge_target_1): Work on contexts rather than BINFOs.
7699         (ipa_get_indirect_edge_target): Likewise.
7700         (devirtualization_time_bonus): Likewise.
7701         (gather_context_independent_values): Create and populate known_contexts
7702         vector rather than known_binfos.
7703         (perform_estimation_of_a_value): Work on contexts rather than BINFOs.
7704         (estimate_local_effects): Likewise.
7705         (add_all_node_vals_to_toposort): Also add contexts to teir topological
7706         sort.
7707         (ipcp_propagate_stage): Also propagate effects of contexts.
7708         (ipcp_discover_new_direct_edges): Receive and pass known_contexts to
7709         ipa_get_indirect_edge_target_1.
7710         (cgraph_edge_brings_value_p): New overloaded function for contexts.
7711         (create_specialized_node): Work on contexts rather than BINFOs.
7712         (find_more_contexts_for_caller_subset): New function.
7713         (known_contexts_useful_p): New function.
7714         (copy_useful_known_contexts): Likewise.
7715         (modify_known_vectors_with_val): Likewise.
7716         (ipcp_val_in_agg_replacements_p): Renamed to
7717         ipcp_val_agg_replacement_ok_p, return true for all offset indicating
7718         non-aggregate.
7719         (ipcp_val_agg_replacement_ok_p): New overloaded function for contexts.
7720         (decide_about_value): Work on contexts rather than BINFOs.
7721         (decide_whether_version_node): Likewise.
7722         (ipcp_driver): Initialize the new alloc pool.
7723         * ipa-prop.c (ipa_print_node_jump_functions_for_edge): Prettify
7724         printing of edge contexts.
7725         (ipa_set_ancestor_jf): Replace assert with conditional setting of
7726         type_preserved to false.
7727         (update_jump_functions_after_inlining): Use access function instead of
7728         reading agg_preserved directly.  Store combined context in the ancestor
7729         case.
7730         (try_make_edge_direct_virtual_call): Work on contexts rather than
7731         BINFOs.
7732         (update_indirect_edges_after_inlining): Get context from
7733         ipa_context_from_jfunc.
7734         (ipa_free_node_params_substructures): Free also known_contexts.
7735         (ipa_free_all_structures_after_ipa_cp): Free the new alloc pool.
7736         (ipa_free_all_structures_after_iinln): Likewise.
7737         * ipa-inline-analysis.c (evaluate_properties_for_edge): Work on
7738         contexts rather than BINFOs.
7739         (estimate_edge_devirt_benefit): Likewise.
7740         (estimate_edge_size_and_time): Likewise.
7741         (estimate_calls_size_and_time): Likewise.
7742         (estimate_node_size_and_time): Likewise.
7743         (estimate_ipcp_clone_size_and_time): Likewise.
7744         (do_estimate_edge_time): Likewise.
7745         (do_estimate_edge_size): Likewise.
7746         (do_estimate_edge_hints): Likewise.
7747         * ipa-polymorphic-call.c (ipa_polymorphic_call_context::dump): New
7748         parameter newline, ouput newline only when it is set.
7749         (ipa_polymorphic_call_context::equal_to): New method.
7750
7751 2014-11-14  Martin Jambor  <mjambor@suse.cz>
7752
7753         * ipa-cp.c (ipcp_value_source): Converted to a template class.  All
7754         users converted to the same specialization as the using class/function
7755         or specialization on tree.
7756         (ipcp_value): Likewise.
7757         (ipcp_lattice): Likewise.
7758         (ipcp_agg_lattice): Now derived from tree specialization of
7759         ipcp_lattice.
7760         (values_topo): Moved to new class value_topo_info.
7761         (ipa_lat_is_single_const): Turned into ipcp_lattice::is_single_const.
7762         Updated all callers.
7763         (print_lattice): Turned into ipcp_lattice::print.  Updated all
7764         callers.
7765         (value_topo_info): New class template.
7766         (ipa_topo_info): New field constants.  New constructor.
7767         (build_toporder_info): Do not clear stack_top, only checkign assert
7768         it.
7769         (set_lattice_to_bottom): Turned into ipcp_lattice::set_to_bottom.
7770         Updated all callers.
7771         (set_lattice_contains_variable): Turned into
7772         ipcp_lattice::set_contains_variable.  Updated all callers.
7773         (add_value_source): Turned into ipcp_value::add_source.  Updated all
7774         callers.
7775         (allocate_and_init_ipcp_value): New function.
7776         (add_value_to_lattice): Turned into ipcp_lattice::add_value.  Last
7777         parameter got default a value.  Updated all callers.
7778         (add_scalar_value_to_lattice): Removed, users converted to using
7779         ipcp_lattice::add_value with default value of the last parameter.
7780         (add_val_to_toposort): Turned to value_topo_info::add_val.  Updated
7781         all callers.
7782         (propagate_effects): Made method of value_topo_info.
7783         (cgraph_edge_brings_value_p): Now a template function.
7784         (get_info_about_necessary_edges): Likewise.
7785         (gather_edges_for_value): Likewise.
7786         (perhaps_add_new_callers): Likewise.
7787         (decide_about_value): Likewise.
7788         * ipa-prop.h (ipcp_lattice): Remove fowrward declaration.
7789
7790 2014-11-14  Jakub Jelinek  <jakub@redhat.com>
7791
7792         * doc/install.texi (--with-diagnostics-color=): Document.
7793
7794         * tree-ssa.dce.c (eliminate_unnecessary_stmts): Eliminate
7795         IFN_GOMP_SIMD_LANE without lhs as useless.
7796
7797         * ipa-pure-const.c (struct funct_state_d): Add can_free field.
7798         (varying_state): Add true for can_free.
7799         (check_call): For builtin or internal !nonfreeing_call_p set
7800         local->can_free.
7801         (check_stmt): For asm volatile and asm with "memory" set
7802         local->can_free.
7803         (analyze_function): Clear local->can_free initially, continue
7804         calling check_stmt until all flags are computed, dump can_free
7805         flag.
7806         (pure_const_write_summary): Write can_free flag.
7807         (pure_const_read_summary): Read it back.
7808         (propagate_pure_const): Propagate also can_free flag, set
7809         w->nonfreeing_fn if it is false after propagation.
7810         * cgraph.h (cgraph_node): Add nonfreeing_fn member.
7811         * gimple.c: Include ipa-ref.h, lto-streamer.h and cgraph.h.
7812         (nonfreeing_call_p): Return cgraph nonfreeing_fn flag if set.
7813         Also return true for IFN_ABNORMAL_DISPATCHER.
7814         * cgraph.c (cgraph_node::dump): Dump nonfreeing_fn flag.
7815         * lto-cgraph.c (lto_output_node): Write nonfreeing_fn flag.
7816         (input_overwrite_node): Read it back.
7817
7818 2014-11-14  Jakub Jelinek  <jakub@redhat.com>
7819             Marek Polacek  <polacek@redhat.com>
7820
7821         * sanopt.c: Include tree-ssa-operands.h.
7822         (struct sanopt_info): Add has_freeing_call_p,
7823         has_freeing_call_computed_p, imm_dom_path_with_freeing_call_p,
7824         imm_dom_path_with_freeing_call_computed_p, freeing_call_events,
7825         being_visited_p fields.
7826         (struct sanopt_ctx): Add asan_check_map field.
7827         (imm_dom_path_with_freeing_call, maybe_optimize_ubsan_null_ifn,
7828         maybe_optimize_asan_check_ifn): New functions.
7829         (sanopt_optimize_walker): Use them, optimize even ASAN_CHECK
7830         internal calls.
7831         (pass_sanopt::execute): Call sanopt_optimize even for
7832         -fsanitize=address.
7833         * gimple.c (nonfreeing_call_p): Return true for non-ECF_LEAF
7834         internal calls.
7835
7836 2014-11-14  Alan Lawrence  <alan.lawrence@arm.com>
7837
7838         * tree-vect-loop.c (vect_create_epilog_for_reduction): Move code for
7839         'if (extract_scalar_result)' to the only place that it is true.
7840
7841 2014-11-14  H.J. Lu  <hongjiu.lu@intel.com>
7842
7843         * config.gcc (default_gnu_indirect_function): Set to yes
7844         for i[34567]86-*-linux* and x86_64-*-linux* if not targeting
7845         Android nor uclibc.
7846
7847 2014-11-14  Felix Yang  <felix.yang@huawei.com>
7848             Jiji Jiang  <jiangjiji@huawei.com>
7849
7850         * config/aarch64/aarch64-simd.md (*aarch64_simd_ld1r<mode>): Use
7851         VALL mode iterator instead of VALLDI.
7852
7853 2014-11-14  Jan Hubicka  <hubicka@ucw.cz>
7854
7855         * optc-save-gen.awk: Output cl_target_option_eq,
7856         cl_target_option_hash, cl_target_option_stream_out,
7857         cl_target_option_stream_in functions.
7858         * opth-gen.awk: Output prototypes for
7859         cl_target_option_eq and cl_target_option_hash.
7860         * lto-streamer.h (cl_target_option_stream_out,
7861         cl_target_option_stream_in): Declare.
7862         * tree.c (cl_option_hash_hash): Use cl_target_option_hash.
7863         (cl_option_hash_eq): Use cl_target_option_eq.
7864         * tree-streamer-in.c (unpack_value_fields): Stream in
7865         TREE_TARGET_OPTION.
7866         * lto-streamer-out.c (DFS::DFS_write_tree_body): Follow
7867         DECL_FUNCTION_SPECIFIC_TARGET.
7868         (hash_tree): Hash TREE_TARGET_OPTION; visit
7869         DECL_FUNCTION_SPECIFIC_TARGET.
7870         * tree-streamer-out.c (streamer_pack_tree_bitfields): Skip
7871         TS_TARGET_OPTION.
7872         (streamer_write_tree_body): Output TS_TARGET_OPTION.
7873
7874 2014-11-14  Richard Biener  <rguenther@suse.de>
7875
7876         * gimple-fold.h (gimple_fold_stmt_to_constant_1): Add 2nd
7877         valueization hook defaulted to no_follow_ssa_edges.
7878         * gimple-fold.c (gimple_fold_stmt_to_constant_1): Pass
7879         2nd valueization hook to gimple_simplify.
7880         * tree-ssa-ccp.c (valueize_op_1): New function to be
7881         used for gimple_simplify called via gimple_fold_stmt_to_constant_1.
7882         (ccp_fold): Adjust.
7883         * tree-vrp.c (vrp_valueize_1): New function to be
7884         used for gimple_simplify called via gimple_fold_stmt_to_constant_1.
7885         (vrp_visit_assignment_or_call): Adjust.
7886
7887 2014-11-14  Marek Polacek  <polacek@redhat.com>
7888
7889         * fold-const.c (fold_negate_expr): Don't fold INTEGER_CST if
7890         that overflows when SANITIZE_SI_OVERFLOW is on.  Guard -(-A)
7891         folding with TYPE_OVERFLOW_SANITIZED.
7892
7893 2014-11-14  Marek Polacek  <polacek@redhat.com>
7894
7895         PR sanitizer/63839
7896         * asan.c (ATTR_CONST_NORETURN_NOTHROW_LEAF_LIST,
7897         ATTR_COLD_CONST_NORETURN_NOTHROW_LEAF_LIST): Define.
7898         * builtin-attrs.def (ATTR_COLD_CONST_NORETURN_NOTHROW_LEAF_LIST):
7899         Define.
7900         * builtins.c (fold_builtin_0): Don't include ubsan.h.  Don't
7901         instrument BUILT_IN_UNREACHABLE here.
7902         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_BUILTIN_UNREACHABLE): Make
7903         const.
7904         * sanopt.c (pass_sanopt::execute): Instrument BUILT_IN_UNREACHABLE.
7905         * tree-ssa-ccp.c (optimize_unreachable): Bail out if
7906         SANITIZE_UNREACHABLE.
7907         * ubsan.c (ubsan_instrument_unreachable): Rewrite for GIMPLE.
7908         * ubsan.h (ubsan_instrument_unreachable): Adjust declaration.
7909
7910 2014-11-14  Alan Lawrence  <alan.lawrence@arm.com>
7911
7912         * config/rs6000/vector.md (vec_shl_<mode>): Remove.
7913         (vec_shr_<mode>): Reverse shift if BYTES_BIG_ENDIAN.
7914
7915 2014-11-14  Alan Lawrence  <alan.lawrence@arm.com>
7916
7917         * optabs.c (shift_amt_for_vec_perm_mask): Remove code conditional on
7918         BYTES_BIG_ENDIAN.
7919         * tree-vect-loop.c (calc_vec_perm_mask_for_shift,
7920         vect_create_epilog_for_reduction): Likewise.
7921         * doc/md.texi (vec_shr_m): Clarify direction of shifting.
7922
7923 2014-11-14  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
7924
7925         PR target/63724
7926         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate): Split out
7927         numerical immediate handling to...
7928         (aarch64_internal_mov_immediate): ...this. New.
7929         (aarch64_rtx_costs): Use aarch64_internal_mov_immediate.
7930         (aarch64_mov_operand_p): Relax predicate.
7931         * config/aarch64/aarch64.md (mov<mode>:GPI): Do not expand CONST_INTs.
7932         (*movsi_aarch64): Turn into define_insn_and_split and new alternative
7933         for 'n'.
7934         (*movdi_aarch64): Likewise.
7935
7936 2014-11-14  Richard Biener  <rguenther@suse.de>
7937
7938         * match.pd: Implement more binary patterns exercised by
7939         fold_stmt.
7940         * fold-const.c (sing_bit_p): Export.
7941         (exact_inverse): Likewise.
7942         (fold_binary_loc): Remove patterns here.
7943         (tree_unary_nonnegative_warnv_p): Use CASE_CONVERT.
7944         * fold-const.h (sing_bit_p): Declare.
7945         (exact_inverse): Likewise.
7946
7947 2014-11-14  Marek Polacek  <polacek@redhat.com>
7948
7949         * tree.c (build_common_builtin_nodes): Remove doubled ECF_LEAF.
7950
7951 2014-11-14  Richard Biener  <rguenther@suse.de>
7952
7953         * genmatch.c (add_operator): Allow CONSTRUCTOR.
7954         (dt_node::gen_kids): Handle CONSTRUCTOR not as GENERIC.
7955         (parser::parse_op): Allow to iterate over predicates.
7956
7957 2014-11-14  Jakub Jelinek  <jakub@redhat.com>
7958
7959         * configure.ac (--with-diagnostics-color): New configure
7960         option, default to --with-diagnostics-color=auto.
7961         * toplev.c (process_options): Use DIAGNOSTICS_COLOR_DEFAULT
7962         to determine -fdiagnostics-color= option default.
7963         * doc/invoke.texi (-fdiagnostics-color=): Document new
7964         default.
7965         * configure: Regenerated.
7966         * config.in: Regenerated.
7967
7968 2014-11-13  Teresa Johnson  <tejohnson@google.com>
7969
7970         PR tree-optimization/63841
7971         * tree-ssa-strlen.c (strlen_optimize_stmt): Ignore clobbers.
7972
7973 2014-11-14  Bin Cheng  <bin.cheng@arm.com>
7974
7975         * timevar.def (TV_SCHED_FUSION): New time var.
7976         * passes.def (pass_sched_fusion): New pass.
7977         * config/arm/arm.c (TARGET_SCHED_FUSION_PRIORITY): New.
7978         (extract_base_offset_in_addr, fusion_load_store): New.
7979         (arm_sched_fusion_priority): New.
7980         (arm_option_override): Disable scheduling fusion by default
7981         on non-armv7 processors or ldrd/strd isn't preferred.
7982         * sched-int.h (struct _haifa_insn_data): New field.
7983         (INSN_FUSION_PRIORITY, FUSION_MAX_PRIORITY, sched_fusion): New.
7984         * sched-rgn.c (rest_of_handle_sched_fusion): New.
7985         (pass_data_sched_fusion, pass_sched_fusion): New.
7986         (make_pass_sched_fusion): New.
7987         * haifa-sched.c (sched_fusion): New.
7988         (insn_cost): Handle sched_fusion.
7989         (priority): Handle sched_fusion by calling target hook.
7990         (enum rfs_decision): New enum value.
7991         (rfs_str): New element for RFS_FUSION.
7992         (rank_for_schedule): Support sched_fusion.
7993         (schedule_insn, max_issue, prune_ready_list): Handle sched_fusion.
7994         (schedule_block, fix_tick_ready): Handle sched_fusion.
7995         * common.opt (flag_schedule_fusion): New.
7996         * tree-pass.h (make_pass_sched_fusion): New.
7997         * target.def (fusion_priority): New.
7998         * doc/tm.texi.in (TARGET_SCHED_FUSION_PRIORITY): New.
7999         * doc/tm.texi: Regenerated.
8000         * doc/invoke.texi (-fschedule-fusion): New.
8001
8002 2014-11-13  Rong Xu  <xur@google.com>
8003
8004         PR debug/63581
8005         * cfgrtl.c (emit_barrier_after_bb): Append the barrier to the
8006         footer, instead of unconditionally overwritten.
8007
8008 2014-11-14  Martin Jambor  <mjambor@suse.cz>
8009
8010         * cgraph.h (clear_outer_type): Make public.  Fix comment.
8011         * ipa-devirt.c (possible_polymorphic_call_targets): Use
8012         clear_outer_type when resetting the context.
8013
8014 2014-11-13  Dominique Dhumieres  <dominiq@lps.ens.fr>
8015
8016         PR bootstrap/63853
8017         * gcc.c (handle_foffload_option): Replace strchrnul with strchr.
8018         * lto-wrapper.c (parse_env_var, append_offload_options): Likewise.
8019
8020 2014-11-13  Alan Lawrence  <alan.lawrence@arm.com>
8021
8022         * fold-const.c (const_binop): Remove code handling VEC_RSHIFT_EXPR.
8023         * tree-cfg.c (verify_gimple_assign_binary): Likewise.
8024         * tree-inline.c (estimate_operator_cost): Likewise.
8025         * tree-pretty-print.c (dump_generic_node, op_code_prio, op_symbol_code):
8026         Likewise.
8027
8028         * tree-vect-generic.c (expand_vector_operations_1): Remove assertion
8029         against VEC_RSHIFT_EXPR.
8030
8031         * optabs.h (expand_vec_shift_expr): Remove.
8032         * optabs.c (optab_for_tree_code): Remove case VEC_RSHIFT_EXPR.
8033         (expand_vec_shift_expr): Remove.
8034         * tree.def (VEC_RSHIFT_EXPR): Remove
8035
8036 2014-11-13  Alan Lawrence  <alan.lawrence@arm.com>
8037
8038         * optabs.c (can_vec_perm_p): Update comment, does not consider vec_shr.
8039         (shift_amt_for_vec_perm_mask): New.
8040         (expand_vec_perm_1): Use vec_shr_optab if second vector is const0_rtx
8041         and mask appropriate.
8042
8043         * tree-vect-loop.c (calc_vec_perm_mask_for_shift): New.
8044         (have_whole_vector_shift): New.
8045         (vect_model_reduction_cost): Call have_whole_vector_shift instead of
8046         looking for vec_shr_optab.
8047         (vect_create_epilog_for_reduction): Likewise; also rename local variable
8048         have_whole_vector_shift to reduce_with_shift; output VEC_PERM_EXPRs
8049         instead of VEC_RSHIFT_EXPRs.
8050
8051         * tree-vect-stmts.c (vect_gen_perm_mask_checked): Extend comment.
8052
8053 2014-11-13  Alan Lawrence  <alan.lawrence@arm.com>
8054
8055         * tree-vectorizer.h (vect_gen_perm_mask): Remove.
8056         (vect_gen_perm_mask_checked, vect_gen_perm_mask_any): New.
8057
8058         * tree_vec_data_refs.c (vect_permute_load_chain,
8059         vec_permute_store_chain, vec_shift_permute_load_chain): Replace
8060         vect_gen_perm_mask & assert with vect_gen_perm_mask_checked.
8061
8062         * tree-vect-stmts.c (vectorizable_mask_load_store, vectorizable_load):
8063         Likewise.
8064         (vect_gen_perm_mask_checked): New.
8065         (vect_gen_perm_mask): Remove can_vec_perm_p check, rename to...
8066         (vect_gen_perm_mask_any): ...this.
8067         (perm_mask_for_reverse): Call can_vec_perm_p and
8068         vect_gen_perm_mask_checked.
8069
8070 2014-11-13  Felix Yang  <felix.yang@huawei.com>
8071
8072         * ipa-utils.h: Fix typo in comments.
8073         * ipa-profile.c: Likewise.
8074         * tree-ssa-loop-ivcanon.c: Fix typo in comments and debugging dumps.
8075
8076 2014-11-13  Teresa Johnson  <tejohnson@google.com>
8077
8078         PR tree-optimization/63841
8079         * tree-ssa-strlen.c (strlen_optimize_stmt): Ignore clobbers.
8080
8081 2014-11-13  Teresa Johnson  <tejohnson@google.com>
8082
8083         PR tree-optimization/63841
8084         * tree.c (initializer_zerop): A clobber does not zero initialize.
8085
8086 2014-11-13  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
8087
8088         * optabs.c (prepare_operand): Gracefully fail if the mode of X
8089         does not match the operand mode expected by the insn pattern.
8090
8091 2014-11-13  Richard Biener  <rguenther@suse.de>
8092
8093         * match.pd: Add tcc_comparison, inverted_tcc_comparison
8094         and inverted_tcc_comparison_with_nans operator lists.
8095         Use tcc_comparison in the truth_valued_p predicate definition.
8096         Restrict logical_inverted_value with bit_xor to integral types.
8097         Build a boolean true for simplifying x |^ !x because of
8098         vector types.  Implement patterns from forward_propagate_comparison
8099         * tree-ssa-forwprop.c (forward_propagate_comparison): Remove.
8100         (get_prop_dest_stmt): Likewise.
8101         (pass_forwprop::execute): Do not call it.
8102         * fold-const.c (fold_unary_loc): Remove the pattern here.
8103
8104 2014-11-13  Ilya Verbin  <ilya.verbin@intel.com>
8105             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8106
8107         * config.gcc (*-intelmic-* | *-intelmicemul-*): Add i386/t-intelmic to
8108         tmake_file.
8109         (i[34567]86-*-* | x86_64-*-*): Build mkoffload$(exeext) with the
8110         accelerator compiler.
8111         * config/i386/intelmic-mkoffload.c: New file.
8112         * config/i386/t-intelmic: Ditto.
8113
8114 2014-11-13  Bernd Schmidt  <bernds@codesourcery.com>
8115             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8116             Ilya Verbin  <ilya.verbin@intel.com>
8117
8118         * common.opt (foffload, foffload-abi): New options.
8119         * config/i386/i386.c (ix86_offload_options): New static function.
8120         (TARGET_OFFLOAD_OPTIONS): Define.
8121         * coretypes.h (enum offload_abi): New enum.
8122         * doc/tm.texi: Regenerate.
8123         * doc/tm.texi.in (TARGET_OFFLOAD_OPTIONS): Document.
8124         * gcc.c (offload_targets): New static variable.
8125         (handle_foffload_option): New static function.
8126         (driver_handle_option): Handle OPT_foffload_.
8127         (driver::maybe_putenv_OFFLOAD_TARGETS): Set OFFLOAD_TARGET_NAMES
8128         according to offload_targets.
8129         * hooks.c (hook_charptr_void_null): New hook.
8130         * hooks.h (hook_charptr_void_null): Declare.
8131         * lto-opts.c: Include lto-section-names.h.
8132         (lto_write_options): Append options from target offload_options hook and
8133         store them to offload_lto section.  Do not store target-specific,
8134         driver and diagnostic options in offload_lto section.
8135         * lto-wrapper.c (merge_and_complain): Handle OPT_foffload_ and
8136         OPT_foffload_abi_.
8137         (append_compiler_options, append_linker_options)
8138         (append_offload_options): New static functions.
8139         (compile_offload_image): Add new arguments with options.
8140         Call append_compiler_options and append_offload_options.
8141         (compile_images_for_offload_targets): Add new arguments with options.
8142         (find_and_merge_options): New static function.
8143         (run_gcc): Outline options handling into the new functions:
8144         find_and_merge_options, append_compiler_options, append_linker_options.
8145         * opts.c (common_handle_option): Don't handle OPT_foffload_.
8146         Forbid OPT_foffload_abi_ for non-offload compiler.
8147         * target.def (offload_options): New target hook.
8148
8149 2014-11-13  Ilya Verbin  <ilya.verbin@intel.com>
8150             Bernd Schmidt  <bernds@codesourcery.com>
8151             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8152             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
8153
8154         * gcc.c (spec_host_machine, accel_dir_suffix): New variables.
8155         (process_command): Tweak path construction for the possibility
8156         of being configured as an offload compiler.
8157         (driver::maybe_putenv_OFFLOAD_TARGETS): New function.
8158         (driver::main): Call maybe_putenv_OFFLOAD_TARGETS.
8159         (driver::set_up_specs): Tweak path construction for the possibility of
8160         being configured as an offload compiler.
8161         * lto-wrapper.c (OFFLOAD_TARGET_NAMES_ENV): Define.
8162         (offload_names, offloadbegin, offloadend): New static variables.
8163         (free_array_of_ptrs, parse_env_var, access_check, compile_offload_image)
8164         (compile_images_for_offload_targets, copy_file, find_offloadbeginend):
8165         New static functions.
8166         (run_gcc): Determine whether offload sections are present.  If so, run
8167         compile_images_for_offload_targets and return the names of new generated
8168         objects to linker.  If there are offload sections, but no LTO sections,
8169         then return the copies of input objects without link-time recompilation.
8170
8171 2014-11-13  Richard Biener  <rguenther@suse.de>
8172
8173         * genmatch.c (dt_node::gen_kids): Fix placement of break statement.
8174
8175 2014-11-13  Ilya Verbin  <ilya.verbin@intel.com>
8176             Bernd Schmidt  <bernds@codesourcery.com>
8177             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8178             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
8179
8180         * Makefile.in (GTFILES): Add omp-low.h to list of GC files.
8181         * cgraphunit.c: Include omp-low.h.
8182         * doc/tm.texi: Regenerate.
8183         * doc/tm.texi.in (TARGET_RECORD_OFFLOAD_SYMBOL): Document.
8184         * gengtype.c (open_base_files): Add omp-low.h to ifiles.
8185         * lto-cgraph.c (output_offload_tables): New function.
8186         (input_offload_tables): Likewise.
8187         * lto-section-in.c (lto_section_name): Add "offload_table".
8188         * lto-section-names.h (OFFLOAD_VAR_TABLE_SECTION_NAME): Define.
8189         (OFFLOAD_FUNC_TABLE_SECTION_NAME): Likewise.
8190         * lto-streamer-out.c (lto_output): Call output_offload_tables.
8191         * lto-streamer.h (lto_section_type): Add LTO_section_offload_table.
8192         (output_offload_tables, input_offload_tables): Declare.
8193         * omp-low.c: Include common/common-target.h and lto-section-names.h.
8194         (offload_funcs, offload_vars): New global <tree, va_gc> vectors.
8195         (expand_omp_target): Add child_fn into offload_funcs vector.
8196         (add_decls_addresses_to_decl_constructor): New function.
8197         (omp_finish_file): Likewise.
8198         * omp-low.h (omp_finish_file, offload_funcs, offload_vars): Declare.
8199         * target.def (record_offload_symbol): New DEFHOOK.
8200         * toplev.c: Include omp-low.h.
8201         (compile_file): Call omp_finish_file.
8202         * varpool.c: Include omp-low.h.
8203         (varpool_node::get_create): Add decl into offload_vars vector.
8204
8205 2014-11-13  Ilya Verbin  <ilya.verbin@intel.com>
8206             Ilya Tocar  <ilya.tocar@intel.com>
8207             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8208             Bernd Schmidt  <bernds@codesourcery.com>
8209
8210         * cgraph.c: Include context.h.
8211         (cgraph_node::create): Set node->offloadable and g->have_offload if
8212         decl have "omp declare target" attribute.
8213         * cgraph.h (symtab_node): Add need_lto_streaming and offloadable flags.
8214         * cgraphunit.c: Include lto-section-names.h.
8215         (ipa_passes): Call ipa_write_summaries if there is something to write to
8216         OFFLOAD_SECTION_NAME_PREFIX sections.
8217         (symbol_table::compile): Set flag_generate_lto if there is something to
8218         offload.
8219         Replace flag_lto with flag_generate_lto before lto_streamer_hooks_init.
8220         * context.c (gcc::context::context): Initialize have_offload with false.
8221         * context.h (class context): Add have_offload flag.
8222         * ipa-inline-analysis.c (inline_generate_summary): Do not exit under
8223         flag_generate_lto.
8224         (inline_free_summary): Always remove hooks.
8225         * lto-cgraph.c (referenced_from_other_partition_p): Ignore references
8226         from non-offloadable nodes while streaming a node into offload section.
8227         (reachable_from_other_partition_p): Likewise.
8228         (select_what_to_stream): New function.
8229         (compute_ltrans_boundary): Do not call
8230         lto_set_symtab_encoder_in_partition if the node should not be streamed.
8231         * lto-section-names.h (OFFLOAD_SECTION_NAME_PREFIX): Define.
8232         (section_name_prefix): Declare.
8233         * lto-streamer.c (section_name_prefix): New variable.
8234         (lto_get_section_name): Use section_name_prefix instead of
8235         LTO_SECTION_NAME_PREFIX.
8236         * lto-streamer.h (select_what_to_stream): Declare.
8237         * omp-low.c: Include context.h.
8238         (is_targetreg_ctx): New function.
8239         (scan_sharing_clauses): Use offloadable flag, instead of an attribute.
8240         (create_omp_child_function, check_omp_nesting_restrictions): Use new
8241         is_targetreg_ctx function.  Replace usage of "omp declare target"
8242         attribute with a cgraph_node flag offloadable.
8243         (expand_omp_target): Set mark_force_output for offloadable functions.
8244         (lower_omp_critical): Set offloadable flag for omp critical symbol.
8245         * passes.c (ipa_write_summaries): New argument offload_lto_mode.  Call
8246         select_what_to_stream.  Do not call lto_set_symtab_encoder_in_partition
8247         if the node should not be streamed out.
8248         * tree-pass.h (ipa_write_summaries): New bool argument.
8249         * varpool.c: Include context.h.
8250         (varpool_node::get_create): Set node->offloadable and g->have_offload if
8251         decl have "omp declare target" attribute.
8252
8253 2014-11-13  Bernd Schmidt  <bernds@codesourcery.com>
8254             Thomas Schwinge  <thomas@codesourcery.com>
8255             Ilya Verbin  <ilya.verbin@intel.com>
8256             Andrey Turetskiy  <andrey.turetskiy@intel.com>
8257
8258         * Makefile.in (real_target_noncanonical, accel_dir_suffix)
8259         (enable_as_accelerator): New variables substituted by configure.
8260         (libsubdir, libexecsubdir, unlibsubdir): Tweak for the possibility of
8261         being configured as an offload compiler.
8262         (DRIVER_DEFINES): Pass new defines DEFAULT_REAL_TARGET_MACHINE and
8263         ACCEL_DIR_SUFFIX.
8264         (install-cpp, install-common, install_driver, install-gcc-ar): Do not
8265         install for the offload compiler.
8266         * config.in: Regenerate.
8267         * configure: Regenerate.
8268         * configure.ac (real_target_noncanonical, accel_dir_suffix)
8269         (enable_as_accelerator): Compute new variables.
8270         (ACCEL_COMPILER): Define if the compiler is built as the accel compiler.
8271         (OFFLOAD_TARGETS): List of target names suitable for offloading.
8272         (ENABLE_OFFLOADING): Define if list of offload targets is not empty.
8273         * doc/install.texi (Options specification): Document
8274         --enable-as-accelerator-for and --enable-offload-targets.
8275
8276 2014-11-13  H.J. Lu  <hongjiu.lu@intel.com>
8277
8278         PR tree-optimization/63828
8279         * ipa-polymorphic-call.c (possible_placement_new): Check
8280         POINTER_SIZE, instead of BITS_PER_WORD, for pointer size.
8281
8282 2014-11-13  Eric Botcazou  <ebotcazou@adacore.com>
8283
8284         * doc/tm.texi.in (SELECT_CC_MODE): Update example.
8285         (REVERSIBLE_CC_MODE): Fix example.
8286         (REVERSE_CONDITION): Fix typo.
8287         * doc/tm.texi: Regenerate.
8288
8289 2014-11-13  Tom de Vries  <tom@codesourcery.com>
8290
8291         * omp-low.c (pass_data_expand_omp): Set properties_provided to
8292         PROP_gimple_eomp.
8293         (pass_expand_omp::gate): Remove function.  Move gate expression to ...
8294         (pass_expand_omp::execute): ... here, as new variable gate.  Add early
8295         exit if gate is false.
8296         (pass_data pass_data_expand_omp_ssa): New pass_data.
8297         (class pass_expand_omp_ssa): New pass.
8298         (make_pass_expand_omp_ssa): New function.
8299         * passes.def (pass_parallelize_loops): Use PUSH_INSERT_PASSES_WITHIN
8300         instead of NEXT_PASS.
8301         (pass_expand_omp_ssa): Add after pass_parallelize_loops.
8302         * tree-parloops.c (gen_parallel_loop): Remove call to omp_expand_local.
8303         (pass_parallelize_loops::execute): Don't do cleanups TODO_cleanup_cfg
8304         and TODO_rebuild_alias yet.  Add TODO_update_ssa.  Set
8305         cfun->omp_expand_needed.
8306         * tree-pass.h: Add define PROP_gimple_eomp.
8307         (make_pass_expand_omp_ssa): Declare.
8308
8309 2014-11-13  Marek Polacek  <polacek@redhat.com>
8310
8311         * tree.h (TYPE_OVERFLOW_SANITIZED): Define.
8312         * fold-const.c (fold_binary_loc): Use it.
8313         * match.pd: Likewise.
8314
8315 2014-11-14  Kirill Yukhin  <kirill.yukhin@intel.com>
8316
8317         * lra-lives.c (struct bb_data): Rename to ...
8318         (struct bb_data_pseudos): ... this.
8319         (initiate_live_solver): Update struct name.
8320
8321 2014-11-13  Richard Biener  <rguenther@suse.de>
8322
8323         * match.pd: Implement conditional expression patterns.
8324         * tree-ssa-forwprop.c (forward_propagate_into_cond): Remove
8325         them here.
8326         (combine_cond_exprs): Remove.
8327         (pass_forwprop::execute): Do not call combine_cond_exprs.
8328         * fold-const.c (fold_ternary_loc): Remove patterns here.
8329         (pedantic_omit_one_operand_loc): Remove.
8330
8331 2014-12-13  Richard Biener  <rguenther@suse.de>
8332
8333         PR middle-end/61559
8334         * match.pd: Implement bswap patterns for transforms checked by
8335         gcc.dg/builtin-bswap-8.c.
8336
8337 2014-11-13  Vladimir Makarov  <vmakarov@redhat.com>
8338
8339         * lra.c (lra): Switch off rematerialization pass.
8340
8341 2014-11-12  Vladimir Makarov  <vmakarov@redhat.com>
8342
8343         * common.opt (flra-remat): New.
8344         * opts.c (default_options_table): Add entry for flra_remat.
8345         * timevar_def (TV_LRA_REMAT): New.
8346         * doc/invoke.texi (-flra-remat): Add description of the new
8347         option.
8348         * doc/passes.texi (-flra-remat): Remove lra-equivs.c and
8349         lra-saves.c.  Add lra-remat.c.
8350         * Makefile.in (OBJS): Add lra-remat.o.
8351         * lra-remat.c: New file.
8352         * lra.c: Add info about the rematerialization pass in the top
8353         comment.
8354         (collect_non_operand_hard_regs, add_regs_to_insn_regno_info):
8355         Process unallocatable regs too.
8356         (lra_constraint_new_insn_uid_start): Remove.
8357         (lra): Add code for calling rematerialization sub-pass.
8358         * lra-int.h (lra_constraint_new_insn_uid_start): Remove.
8359         (lra_constrain_insn, lra_remat): New prototypes.
8360         (lra_eliminate_regs_1): Add parameter.
8361         * lra-lives.c (make_hard_regno_born, make_hard_regno_dead):
8362         Process unallocatable hard regs too.
8363         (process_bb_lives): Ditto.
8364         * lra-spills.c (remove_pseudos): Add argument to
8365         lra_eliminate_regs_1 call.
8366         * lra-eliminations.c (lra_eliminate_regs_1): Add parameter.  Use it
8367         for sp offset calculation.
8368         (lra_eliminate_regs): Add argument for lra_eliminate_regs_1 call.
8369         (eliminate_regs_in_insn): Add parameter.  Use it for sp offset
8370         calculation.
8371         (process_insn_for_elimination): Add argument for
8372         eliminate_regs_in_insn call.
8373         * lra-constraints.c (get_equiv_with_elimination):  Add argument
8374         for lra_eliminate_regs_1 call.
8375         (process_addr_reg): Add parameter.  Use it.
8376         (process_address_1): Ditto.  Add argument for process_addr_reg
8377         call.
8378         (process_address): Ditto.
8379         (curr_insn_transform): Add parameter.  Use it.  Add argument for
8380         process_address calls.
8381         (lra_constrain_insn): New function.
8382         (lra_constraints): Add argument for curr_insn_transform call.
8383
8384 2014-11-13  Manuel López-Ibáñez  <manu@gcc.gnu.org>
8385
8386         * opts-global.c (postpone_unknown_option_warning): Fix spelling.
8387         (print_ignored_options): Fix quoting.
8388         * opts.c (common_handle_option): Likewise.
8389         (set_debug_level): Likewise.
8390         * toplev.c (process_options): Likewise.
8391
8392 2014-11-12  Jakub Jelinek  <jakub@redhat.com>
8393
8394         PR ipa/63838
8395         * ipa-pure-const.c (propagate_nothrow): Walk w->indirect_calls
8396         chain instead of node->indirect_calls.  Put !can_throw into
8397         conditions of all the loops.
8398
8399 2014-11-12  H.J. Lu  <hongjiu.lu@intel.com>
8400
8401         * config/i386/i386.c (x86_output_mi_thunk): Use gen_rtx_REG to
8402         set pic_offset_table_rtx.
8403
8404 2014-11-12  Matthew Fortune  <matthew.fortune@imgtec.com>
8405
8406         * common/config/mips/mips-common.c (mips_handle_option): Ensure
8407         that -mfp32, -mfp64 disable -mfpxx and -mfpxx disables -mfp64.
8408         * config.gcc (--with-fp-32): New option.
8409         (--with-odd-spreg-32): Likewise.
8410         * config.in (HAVE_AS_DOT_MODULE): New config define.
8411         * config/mips/mips-protos.h
8412         (mips_secondary_memory_needed): New prototype.
8413         (mips_hard_regno_caller_save_mode): Likewise.
8414         * config/mips/mips.c (mips_get_reg_raw_mode): New static prototype.
8415         (mips_get_arg_info): Assert that V2SFmode is only handled specially
8416         with TARGET_PAIRED_SINGLE_FLOAT.
8417         (mips_return_mode_in_fpr_p): Likewise.
8418         (mips16_call_stub_mode_suffix): Likewise.
8419         (mips_get_reg_raw_mode): New static function.
8420         (mips_return_fpr_pair): O32 return values span two registers.
8421         (mips16_build_call_stub): Likewise.
8422         (mips_function_value_regno_p): Support both FP return registers.
8423         (mips_output_64bit_xfer): Use mthc1 whenever TARGET_HAS_MXHC1.  Add
8424         specific cases for TARGET_FPXX to move via memory.
8425         (mips_dwarf_register_span): For TARGET_FPXX pretend that modes larger
8426         than UNITS_PER_FPREG 'span' one register.
8427         (mips_dwarf_frame_reg_mode): New static function.
8428         (mips_file_start): Switch to using .module instead of .gnu_attribute.
8429         No longer support FP ABI 4 (-mips32r2 -mfp64), replace with FP ABI 6.
8430         Add FP ABI 5 (-mfpxx) and FP ABI 7 (-mfp64 -mno-odd-spreg).
8431         (mips_save_reg, mips_restore_reg): Always represent DFmode frame
8432         slots with two CFI directives even for O32 FP64.
8433         (mips_for_each_saved_gpr_and_fpr): Account for fixed_regs when
8434         saving/restoring callee-saved registers.
8435         (mips_hard_regno_mode_ok_p): Implement O32 FP64A extension.
8436         (mips_secondary_memory_needed): New function.
8437         (mips_option_override): ABI check for TARGET_FLOATXX.  Disable
8438         odd-numbered single-precision registers when using TARGET_FLOATXX.
8439         Implement -modd-spreg and defaults.
8440         (mips_conditional_register_usage): Redefine O32 FP64 to match O32 FP32
8441         callee-saved behaviour.
8442         (mips_hard_regno_caller_save_mode): Implement.
8443         (TARGET_GET_RAW_RESULT_MODE): Define target hook.
8444         (TARGET_GET_RAW_ARG_MODE): Define target hook.
8445         (TARGET_DWARF_FRAME_REG_MODE): Define target hook.
8446         * config/mips/mips.h (TARGET_FLOAT32): New macro.
8447         (TARGET_O32_FP64A_ABI): Likewise.
8448         (TARGET_CPU_CPP_BUILTINS): TARGET_FPXX is __mips_fpr==0. Add
8449         _MIPS_SPFPSET builtin define.
8450         (MIPS_FPXX_OPTION_SPEC): New macro.
8451         (OPTION_DEFAULT_SPECS): Pass through --with-fp-32=* to -mfp and
8452         --with-odd-spreg-32=* to -m[no-]odd-spreg.
8453         (ISA_HAS_ODD_SPREG): New macro.
8454         (ISA_HAS_MXHC1): True for anything other than -mfp32.
8455         (ASM_SPEC): Pass through mfpxx, mfp64, -mno-odd-spreg and -modd-spreg.
8456         (MIN_FPRS_PER_FMT): Redefine in terms of TARGET_ODD_SPREG.
8457         (HARD_REGNO_CALLER_SAVE_MODE): Define.  Implement O32 FPXX extension
8458         (HARD_REGNO_CALL_PART_CLOBBERED): Likewise.
8459         (SECONDARY_MEMORY_NEEDED): Likewise.
8460         (FUNCTION_ARG_REGNO_P): Update for O32 FPXX and FP64 extensions.
8461         * config/mips/mips.md (define_attr enabled): Implement O32 FPXX and
8462         FP64A ABI extensions.
8463         (move_doubleword_fpr<mode>): Use ISA_HAS_MXHC1 instead of
8464         TARGET_FLOAT64.
8465         * config/mips/mips.opt (mfpxx): New target option.
8466         (modd-spreg): Likewise.
8467         * config/mips/mti-elf.h (DRIVER_SELF_SPECS): Infer FP ABI from arch.
8468         * config/mips/mti-linux.h (DRIVER_SELF_SPECS): Likewise and remove
8469         fp64 sysroot.
8470         * config/mips/t-mti-elf: Remove fp64 multilib.
8471         * config/mips/t-mti-linux: Likewise.
8472         * configure.ac: Detect .module support.
8473         * configure: Regenerate.
8474         * doc/invoke.texi: Document -mfpxx, -modd-spreg, -mno-odd-spreg option.
8475         * doc/install.texi (--with-fp-32, --with-odd-spreg-32): Document new
8476         options.
8477
8478 2014-11-12  H.J. Lu  <hongjiu.lu@intel.com>
8479
8480         PR target/63815
8481         * config/i386/i386.c (ix86_init_large_pic_reg): New.  Extracted
8482         from ...
8483         (ix86_init_pic_reg): Here.  Use ix86_init_large_pic_reg.
8484         (x86_output_mi_thunk): Set PIC register to %r11.  Call
8485         ix86_init_large_pic_reg to initialize PIC register.
8486
8487 2014-11-12  Kai Tietz  <ktietz@redhat.com>
8488
8489         * sdbout.c (sdbout_symbol): Eliminate register only
8490         if decl isn't a global variable.
8491
8492 2014-11-12  Alan Lawrence  <alan.lawrence@arm.com>
8493
8494         * config/aarch64/aarch64.c (aarch64_simd_lane_bounds): Display indices.
8495
8496         * config/aarch64/aarch64-builtins.c (enum aarch64_type_qualifiers): Add
8497         qualifier_lane_index.
8498         (aarch64_types_ternop_lane_qualifiers, TYPES_TERNOP_LANE): Rename to...
8499         (aarch64_types_quadop_lane_qualifiers, TYPES_QUADOP_LANE): ...these.
8500         (aarch64_types_ternop_lane_qualifiers, TYPES_TERNOP_LANE): New.
8501
8502         (aarch64_types_getlane_qualifiers): Rename to...
8503         (aarch64_types_binop_imm_qualifiers): ...this.
8504         (TYPES_SHIFTIMM): Follow renaming.
8505         (TYPES_GETLANE): Rename to...
8506         (TYPE_GETREG): ...this.
8507
8508         (aarch64_types_setlane_qualifiers): Rename to...
8509         (aarch64_type_ternop_imm_qualifiers): ...this.
8510         (TYPES_SHIFTINSERT, TYPES_SHIFTACC): Follow renaming.
8511         (TYPES_SETLANE): Follow renaming above, and rename self to...
8512         (TYPE_SETREG): ...this.
8513
8514         (enum builtin_simd_arg): Add SIMD_ARG_LANE_INDEX.
8515         (aarch64_simd_expand_args): Add range check and endianness-flip.
8516
8517         (aarch64_simd_expand_builtin): Add mapping for qualifier_lane_index.
8518
8519         * config/aarch64/aarch64-simd.md
8520         (aarch64_sq<r>dmulh_lane<mode>_internal *2): Rename to...
8521         (aarch64_sq<r>dmulh_lane<mode>): ...this, and remove lane bounds check.
8522         (aarch64_sqdmulh_lane<mode> *2, aarch64_sqrdmulh_lane<mode> *2): Delete.
8523
8524         (aarch64_sq<r>dmulh_laneq<mode>_internal): Rename to...
8525         (aarch64_sq<r>dmulh_lane<mode>): ...this.
8526
8527         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal *2): Rename to...
8528         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>): ...this.
8529
8530         (aarch64_sqdml<SBINQOPS:as>l_laneq<mode>_internal *2): Rename to...
8531         (aarch64_sqdml<SBINQOPS:as>l_laneq<mode>): ...this.
8532
8533         (aarch64_sqdmull_lane<mode>_internal *2): Rename to...
8534         (aarch64_sqdmull_lane<mode>): ...this.
8535
8536         (aarch64_sqdmull_laneq<mode>_internal *2): Rename to...
8537         (aarch64_sqdmull_laneq<mode>): ...this.
8538
8539         (aarch64_sqdmulh_laneq<mode>, aarch64_sqrdmulh_laneq<mode>,
8540         (aarch64_sqdmlal_lane<mode>, aarch64_sqdmlal_laneq<mode>,
8541         aarch64_sqdmlsl_lane<mode>, aarch64_sqdmlsl_laneq<mode>,
8542         aarch64_sqdmull_lane<mode>, aarch64_sqdmull_laneq<mode>): Delete.
8543
8544         (aarch64_sqdmlal2_lane<mode>, aarch64_sqdmlal2_laneq<mode>,
8545         aarch64_sqdmlsl2_lane<mode>, aarch64_sqdmlsl2_laneq<mode>,
8546         aarch64_sqdmull2_lane<mode>, aarch64_sqdmull2_laneq<mode>): Remove
8547         bounds check and lane flip.
8548
8549         * config/aarch64/aarch64-simd-builtins.def (be_checked_get_lane,
8550         get_dregoi, get_dregci, getdregxi, get_qregoi,get_qregci, get_qregxi,
8551         set_qregoi, set_qregci, set_qregxi): Change qualifiers to GETREG.
8552
8553         (sqdmlal_lane, sqdmlsl_lane, sqdmlal_laneq, sqdmlsl_laneq,
8554         sqdmlal2_lane, sqdmlsl2_lane, sqdmlal2_laneq, sqdmlsl2_laneq): Follow
8555         renaming of TERNOP_LANE to QUADOP_LANE.
8556
8557         (sqdmull_lane, sqdmull_laneq, sqdmull2_lane, sqdmull2_laneq,
8558         sqdmulh_lane, sqdmulh_laneq, sqrdmulh_lane, sqrdmulh_laneq): Set
8559         qualifiers to TERNOP_LANE.
8560
8561 2014-11-12  Tobias Burnus  <burnus@net-b.de>
8562
8563         * Makefile.in (CLOOGLIBS, CLOOGINC): Remove.
8564         * configure.ac: Ditto.
8565         * graphite-interchange.c: Remove HAVE_CLOOG block.
8566         * config.in: Regenerate.
8567         * configure: Regenerate.
8568
8569 2014-11-12  Jiong Wang  <jiong.wang@arm.com>
8570
8571         * config/aarch64/aarch64.h (CALL_USED_REGISTERS): Mark LR as
8572         caller-save.
8573         (EPILOGUE_USES): Guard the check by epilogue_completed.
8574         * config/aarch64/aarch64.c (aarch64_layout_frame): Explictly check for
8575         LR.
8576         (aarch64_can_eliminate): Check LR_REGNUM liveness.
8577
8578 2014-11-12  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
8579
8580         * config/arm/arm.c (*<arith_shift_insn>_shiftsi): Fix typo.
8581
8582 2014-11-12  Marek Polacek  <polacek@redhat.com>
8583
8584         * fold-const.c (fold_binary_loc): Don't fold if the result
8585         is undefined.
8586         * match.pd (A + (-B) -> A - B, A - (-B) -> A + B,
8587         -(-A) -> A): Likewise.
8588
8589 2014-11-12  Richard Biener  <rguenther@suse.de>
8590
8591         Merge from match-and-simplify branch
8592         2014-11-04  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8593
8594         * genmatch.c (user_id): Add new member is_oper_list.
8595         (user_id::user_id): Add new default argument.
8596         (parser::parse_operator_list): New function.
8597         (parser::parse_for): Allow operator-list.
8598         (parser::parse_pattern): Call parser::parse_operator_list.
8599         (parser::parse_operation): Reject operator-list.
8600         * match-builtin.pd: Define operator lists POWs, CBRTs and SQRTs.
8601
8602         2014-10-31  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8603
8604         * genmatch.c (parser::parse_c_expr): Mark user-defined ops as used.
8605
8606         2014-10-30  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8607
8608         * genmatch.c (parser::parse_op): Check if predicate is used in
8609         result operand.
8610
8611         2014-10-29  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8612
8613         * genmatch.c (parser::parse_for): Make sure to have a valid
8614         token to report errors at.
8615
8616         2014-10-28  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8617
8618         * genmatch.c (parser): Add new member parsing_match_operand.
8619         (parser::parse_operation): Check for conditional convert in result
8620         operand.
8621         (parser::parse_expr): Check for commutative operator in result operand.
8622         Check for :type in match operand.
8623         (parser::parse_simplify): Set/unset parsing_match_operand.
8624         (parser::parser): Initialize parsing_match_operand.
8625
8626         2014-10-28  Richard Biener  <rguenther@suse.de>
8627
8628         * genmatch.c (parser::parse_for): Properly check for already
8629         defined operators.
8630
8631         2014-10-28  Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
8632
8633         * genmatch.c (error_cb): Adjust for printing warnings.
8634         (warning_at): New function.
8635         (user_id): Add new member used.
8636         (get_operator): Mark user_id as used.
8637         (parse_for): Warn for unused operators.
8638
8639 2014-11-12  Richard Biener  <rguenther@suse.de>
8640
8641         * match.pd: Implement simple complex operations cancelling.
8642         * fold-const.c (fold_unary_loc): Remove them here.
8643
8644 2014-11-12  Joseph Myers  <joseph@codesourcery.com>
8645
8646         * cppbuiltin.c (define_builtin_macros_for_compilation_flags):
8647         Define __NO_MATH_ERRNO__ if -fno-math-errno.
8648         * doc/cpp.texi (__NO_MATH_ERRNO__): Document predefined macro.
8649
8650 2014-11-12  Richard Biener  <rguenther@suse.de>
8651
8652         * genmatch.c (::gen_transform): Add capture_info and
8653         expand_compares arguments.
8654         (struct expr): Add is_generic flag.
8655         (lower_cond): New functions lowering [VEC_]COND_EXPR
8656         conditions to a GENERIC and a GIMPLE variant.
8657         (lower): Call lower_cond.
8658         (cmp_operand): Also compare the is_generic flag.
8659         (capture_info::cinfo): Add cond_expr_cond_p flag.
8660         (capture_info::capture_info): Pass down whether the
8661         expression argument is a COND_EXPR condition.
8662         (capture_info::walk_match): Likewise, mark captures
8663         capturing COND_EXPR conditions with cond_expr_cond_p.
8664         (expr::gen_transform): Pass down whether we need to
8665         expand compares from COND_EXPR conditions.
8666         (capture::gen_transform): Expand compares substituted
8667         from COND_EXPR conditions into non-COND_EXPR conditions.
8668         (dt_operand::gen_gimple_expr): Handle explicitely marked
8669         GENERIC expressions as generic.
8670         (dt_simplify::gen): Pass whether we need to expand
8671         conditions to gen_transform.  Handle capture results
8672         which are from COND_EXPR conditions.
8673         (main): Pass gimple flag down to lower.
8674
8675 2014-11-12  Jakub Jelinek  <jakub@redhat.com>
8676
8677         PR c/59708
8678         * builtin-attrs.def (ATTR_NOTHROW_TYPEGENERIC_LEAF): New attribute.
8679         * builtins.c (fold_builtin_arith_overflow): New function.
8680         (fold_builtin_3): Use it.
8681         * builtins.def (BUILT_IN_ADD_OVERFLOW, BUILT_IN_SUB_OVERFLOW,
8682         BUILT_IN_MUL_OVERFLOW, BUILT_IN_SADD_OVERFLOW, BUILT_IN_SADDL_OVERFLOW,
8683         BUILT_IN_SADDLL_OVERFLOW, BUILT_IN_SSUB_OVERFLOW,
8684         BUILT_IN_SSUBL_OVERFLOW, BUILT_IN_SSUBLL_OVERFLOW,
8685         BUILT_IN_SMUL_OVERFLOW, BUILT_IN_SMULL_OVERFLOW,
8686         BUILT_IN_SMULLL_OVERFLOW, BUILT_IN_UADDL_OVERFLOW,
8687         BUILT_IN_UADDLL_OVERFLOW, BUILT_IN_USUB_OVERFLOW,
8688         BUILT_IN_USUBL_OVERFLOW, BUILT_IN_USUBLL_OVERFLOW,
8689         BUILT_IN_UMUL_OVERFLOW, BUILT_IN_UMULL_OVERFLOW,
8690         BUILT_IN_UMULLL_OVERFLOW): New built-in functions.
8691         * builtin-types.def (BT_PTR_UINT, BT_PTR_ULONG, BT_PTR_LONGLONG,
8692         BT_FN_BOOL_INT_INT_INTPTR, BT_FN_BOOL_LONG_LONG_LONGPTR,
8693         BT_FN_BOOL_LONGLONG_LONGLONG_LONGLONGPTR, BT_FN_BOOL_UINT_UINT_UINTPTR,
8694         BT_FN_BOOL_ULONG_ULONG_ULONGPTR,
8695         BT_FN_BOOL_ULONGLONG_ULONGLONG_ULONGLONGPTR, BT_FN_BOOL_VAR): New.
8696         * expr.c (write_complex_part): Remove prototype, no longer static.
8697         * expr.h (write_complex_part): New prototype.
8698         * function.c (aggregate_value_p): For internal functions return 0.
8699         * gimple-fold.c (arith_overflowed_p): New functions.
8700         (gimple_fold_call): Fold {ADD,SUB,MUL}_OVERFLOW internal calls.
8701         * gimple-fold.h (arith_overflowed_p): New prototype.
8702         * tree-ssa-dce.c: Include tree-ssa-propagate.h and gimple-fold.h.
8703         (find_non_realpart_uses, maybe_optimize_arith_overflow): New
8704         functions.
8705         (eliminate_unnecessary_stmts): Transform {ADD,SUB,MUL}_OVERFLOW
8706         into COMPLEX_CST/COMPLEX_EXPR if IMAGPART_EXPR of the result is
8707         never used.
8708         * gimplify.c (gimplify_call_expr): Handle gimplification of
8709         internal calls with lhs.
8710         * internal-fn.c (get_range_pos_neg, get_min_precision,
8711         expand_arith_overflow_result_store): New functions.
8712         (ubsan_expand_si_overflow_addsub_check): Renamed to ...
8713         (expand_addsub_overflow): ... this.  Add LOC, LHS, ARG0, ARG1,
8714         UNSR_P, UNS0_P, UNS1_P, IS_UBSAN arguments, remove STMT argument.
8715         Handle ADD_OVERFLOW and SUB_OVERFLOW expansion.
8716         (ubsan_expand_si_overflow_neg_check): Renamed to ...
8717         (expand_neg_overflow): ... this.  Add LOC, LHS, ARG1, IS_UBSAN
8718         arguments, remove STMT argument.  Handle SUB_OVERFLOW with
8719         0 as first argument expansion.
8720         (ubsan_expand_si_overflow_mul_check): Renamed to ...
8721         (expand_mul_overflow): ... this.  Add LOC, LHS, ARG0, ARG1,
8722         UNSR_P, UNS0_P, UNS1_P, IS_UBSAN arguments, remove STMT argument.
8723         Handle MUL_OVERFLOW expansion.
8724         (expand_UBSAN_CHECK_ADD): Use expand_addsub_overflow, prepare
8725         arguments for it.
8726         (expand_UBSAN_CHECK_SUB): Use expand_addsub_overflow or
8727         expand_neg_overflow, prepare arguments for it.
8728         (expand_UBSAN_CHECK_MUL): Use expand_mul_overflow, prepare arguments
8729         for it.
8730         (expand_arith_overflow, expand_ADD_OVERFLOW, expand_SUB_OVERFLOW,
8731         expand_MUL_OVERFLOW): New functions.
8732         * internal-fn.def (ADD_OVERFLOW, SUB_OVERFLOW, MUL_OVERFLOW): New
8733         internal functions.
8734         * tree-vrp.c (check_for_binary_op_overflow): New function.
8735         (extract_range_basic): Handle {REAL,IMAG}PART_EXPR if the operand
8736         is SSA_NAME set by {ADD,SUB,MUL}_OVERFLOW internal functions.
8737         (simplify_internal_call_using_ranges): Handle {ADD,SUB,MUL}_OVERFLOW
8738         internal functions.
8739         * optabs.def (umulv4_optab): New optab.
8740         * config/i386/i386.md (umulv<mode>4, <u>mulvqi4): New define_expands.
8741         (*umulv<mode>4, *<u>mulvqi4): New define_insns.
8742         * doc/extend.texi (Integer Overflow Builtins): Document
8743         __builtin_*_overflow.
8744
8745 2014-11-12  Richard Biener  <rguenther@suse.de>
8746
8747         * genmatch.c (capture_info::capture_info): Add missing
8748         COND_EXPR handling.
8749         (capture_info::walk_match): Fix COND_EXPR handling.
8750         (capture_info::walk_result): Likewise.
8751
8752 2014-11-12  Richard Biener  <rguenther@suse.de>
8753
8754         PR middle-end/63821
8755         * match.pd: Add missing conversion to the -(T)-X pattern.
8756
8757 2014-11-12  Richard Biener  <rguenther@suse.de>
8758
8759         PR bootstrap/63819
8760         * hash-table.h: Include ggc.h also for generator programs.
8761         * genmatch.c (ggc_internal_cleared_alloc): Properly define
8762         using MEM_STAT_DECL instead of CXX_MEM_STAT_INFO.
8763
8764 2014-11-12  Thomas Preud'homme  <thomas.preudhomme@arm.com>
8765
8766         PR tree-optimization/63761
8767         * tree-ssa-math-opts.c (bswap_replace): Construct gsi from cur_stmt
8768         rather than taking it as a parameter. Add some comments to explain the
8769         gsi_move_before in case of load and why canonicalization of bswap into
8770         a rotation is only done for 16bit values.
8771         (pass_optimize_bswap::execute): Adapt for loop via gsi to make gsi
8772         refer to the statement just before cur_stmt. Ignore 16bit bswap that
8773         are already in canonical form. Adapt bswap_replace to removal of its
8774         gsi parameter.
8775
8776 2014-11-12  Richard Sandiford  <richard.sandiford@arm.com>
8777
8778         * rtl.h (rtx_function, for_each_rtx, for_each_rtx_in_insn): Delete.
8779         * rtlanal.c (non_rtx_starting_operands, for_each_rtx_1, for_each_rtx):
8780         (for_each_rtx_in_insn): Delete.
8781         (init_rtlanal): Remove initialization of non_rtx_starting_operands.
8782         * df-core.c: Remove reference to for_each_rtx in comment.
8783
8784 2014-11-12  Tejas Belagod  <tejas.belagod@arm.com>
8785
8786         * Makefile.in (TEXI_GCC_FILES): Remove arm-acle-intrinsics.texi,
8787         arm-neon-intrinsics.texi, aarch64-acle-intrinsics.texi.
8788         * doc/aarch64-acle-intrinsics.texi: Remove.
8789         * doc/arm-acle-intrinsics.texi: Remove.
8790         * doc/arm-neon-intrinsics.texi: Remove.
8791         * doc/extend.texi: Consolidate sections AArch64 intrinsics,
8792         ARM NEON Intrinsics, ARM ACLE Intrinsics into one ARM C Language
8793         Extension section. Add references to public ACLE specification.
8794
8795 2014-11-11  Patrick Palka  <ppalka@gcc.gnu.org>
8796
8797         * tree-vrp.c (register_edge_assert_for_2): Change return type to
8798         void and adjust accordingly.
8799         (register_edge_assert_for_1): Likewise.
8800         (register_edge_assert_for): Likewise.
8801         (find_conditional_asserts): Likewise.
8802         (find_switch_asserts): Likewise.
8803         (find_assert_locations_1): Likewise.
8804         (find_assert_locations): Likewise.
8805         (insert_range_insertions): Inspect the need_assert_for bitmap.
8806
8807 2014-11-11  Andrew Pinski  <apinski@cavium.com>
8808
8809         Bug target/61997
8810         * config.gcc (aarch64*-*-*): Set target_gtfiles to include
8811         aarch64-builtins.c.
8812         * config/aarch64/aarch64-builtins.c: Include gt-aarch64-builtins.h
8813         at the end of the file.
8814
8815 2014-11-11  Anthony Brandon  <anthony.brandon@gmail.com>
8816             Manuel López-Ibáñez  <manu@gcc.gnu.org>
8817
8818         PR driver/36312
8819         * diagnostic-core.h: Add prototype for fatal_error.
8820         * diagnostic.c (fatal_error): New function fatal_error.
8821         * gcc.c (store_arg): Remove have_o_argbuf_index.
8822         (process_command): Check if input and output files are the same.
8823         * toplev.c (init_asm_output): Check if input and output files are
8824         the same.
8825
8826 2014-11-11  Eric Botcazou  <ebotcazou@adacore.com>
8827
8828         * reorg.c (fill_slots_from_thread): Do not copy frame-related insns.
8829
8830 2014-11-11  Eric Botcazou  <ebotcazou@adacore.com>
8831
8832         PR target/61535
8833         * config/sparc/sparc.c (function_arg_vector_value): Deal with vectors
8834         smaller than 8 bytes.
8835         (sparc_function_arg_1): Tweak.
8836         (sparc_function_value_1): Tweak.
8837
8838 2014-11-11  David Malcolm  <dmalcolm@redhat.com>
8839
8840         * ChangeLog.jit: New.
8841         * Makefile.in (doc_build_sys): New variable, set to "sphinx" if
8842         sphinx is installed, falling back to "texinfo" otherwise.
8843         (FULL_DRIVER_NAME): New variable, adapted from the
8844         install-driver target.  New target, a symlink within the builddir,
8845         linked to "xgcc", for use when running the JIT library from the
8846         builddir.
8847         (MOSTLYCLEANFILES): Add FULL_DRIVER_NAME.
8848         (install-driver): Use $(FULL_DRIVER_NAME) rather than spelling it
8849         out.
8850         * configure.ac (doc_build_sys): New variable, set to "sphinx" if
8851         sphinx is installed, falling back to "texinfo" otherwise.
8852         (GCC_DRIVER_NAME): Generate a gcc-driver-name.h file containing
8853         GCC_DRIVER_NAME for the benefit of jit/internal-api.c.
8854         * configure: Regenerate.
8855         * doc/install.texi (--enable-host-shared): Specify that this is
8856         required when building libgccjit.
8857         (Tools/packages necessary for modifying GCC): Add Sphinx.
8858         * timevar.def (TV_JIT_REPLAY): New.
8859         (TV_ASSEMBLE): New.
8860         (TV_LINK): New.
8861         (TV_LOAD): New.
8862
8863 2014-11-11  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
8864
8865         PR target/63610
8866         * configure: Regenerate.
8867
8868 2014-11-11  James Greenhalgh  <james.greenhalgh@arm.com>
8869
8870         * config/aarch64/aarch64-simd.md
8871         (aarch64_simd_bsl<mode>_internal): Remove float cases, canonicalize.
8872         (aarch64_simd_bsl<mode>): Add gen_lowpart expressions where we
8873         are punning between float vectors and integer vectors.
8874
8875 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8876
8877         * config/alpha/alpha.c (alpha_emit_conditional_branch): Replace
8878         open-coded swap with std::swap to swap values.
8879         (alpha_emit_setcc): Ditto.
8880         (alpha_emit_conditional_move): Ditto.
8881         (alpha_split_tmode_pair): Ditto.
8882
8883 2014-11-11  Evgeny Stupachenko  <evstupac@gmail.com>
8884
8885         * tree-vect-data-refs.c (vect_shift_permute_load_chain): Extend shift
8886         permutations on power of 2 cases.
8887
8888 2014-11-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
8889
8890         * config/aarch64/aarch64.h (MACHMODE): Remove 'enum' keyword.
8891         (CUMULATIVE_ARGS): Guard on !defined(USED_FOR_TARGET).
8892
8893 2014-11-11  Richard Biener  <rguenther@suse.de>
8894
8895         * tree-core.h (pedantic_lvalues): Remove.
8896         * fold-const.c (pedantic_lvalues): Likewise.
8897         (pedantic_non_lvalue_loc): Remove conditional non_lvalue_loc call.
8898
8899 2014-11-11  Martin Liska  <mliska@suse.cz>
8900
8901         PR ipa/63622
8902         PR ipa/63795
8903         * ipa-icf.c (sem_function::merge): Add new target symbol alias
8904         support guard.
8905         (sem_variable::merge): Likewise.
8906         * ipa-icf.h (target_supports_symbol_aliases_p): New function.
8907
8908 2014-11-11  Richard Biener  <rguenther@suse.de>
8909
8910         * match.pd: Implement patterns from associate_plusminus
8911         and factor in differences from the fold-const.c implementation.
8912         * fold-const.c (fold_binary_loc): Remove patterns here.
8913         * tree-ssa-forwprop.c (associate_plusminus): Remove.
8914         (pass_forwprop::execute): Don't call it.
8915         * tree.c (tree_nop_conversion_p): New function, factored
8916         from tree_nop_conversion.
8917         * tree.h (tree_nop_conversion_p): Declare.
8918
8919 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8920
8921         * system.h: Include algorithm and utility.
8922         * rtl.h: Do not include utility here.
8923         * wide-int.h: Ditto.
8924         * tree-vect-data-refs.c (swap): Remove template.
8925         (vect_prune_runtime_alias_test_list): Use std::swap instead of swap.
8926
8927 2014-11-11  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
8928
8929         PR bootstrap/63699
8930         PR bootstrap/63750
8931         * system.h: Include <string> before "safe-ctype.h"
8932         * wide-int.h (wi::smin, wi::smax, wi::umin, wi::umax): Prefix
8933         calls to min/max with wi namespace.
8934         * ipa-chkp.c: Don't include <string>.
8935
8936 2014-11-11  Terry Guo  <terry.guo@arm.com>
8937
8938         * doc/invoke.texi (-masm-syntax-unified): Reword and fix typo.
8939         * config/arm/thumb1.md (*thumb_mulsi3): Use movs to move low
8940         registers.
8941         (*thumb1_movhf): Likewise.
8942
8943 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8944
8945         * sreal.c (sreal::to_int): Use INTTYPE_MAXIMUM (int64_t)
8946         instead of INT64_MAX.
8947
8948 2014-11-11  Tobias Burnus  <burnus@net-b.de>
8949
8950         * doc/install.texi (Prerequisites): Remove CLooG.
8951
8952 2014-11-10  Trevor Saunders  <tsaunders@mozilla.com>
8953
8954         * ipa-inline.c (edge_badness): Adjust.
8955         (inline_small_functions): Likewise.
8956         * predict.c (propagate_freq): Likewise.
8957         (estimate_bb_frequencies): Likewise.
8958         * sreal.c (sreal::dump): Rename from dump_sreal.
8959         (debug): Adjust.
8960         (copy): Remove function.
8961         (sreal::shift_right): Rename from sreal_sift_right.
8962         (sreal::normalize): Rename from normalize.
8963         (sreal_init): Remove function.
8964         (sreal::to_int): Rename from sreal_to_int.
8965         (sreal_compare): Remove function.
8966         (sreal::operator+): Rename from sreal_add.
8967         (sreal::operator-): Rename from sreal_sub.
8968         (sreal::operator*): Rename from sreal_mul.
8969         (sreal::operator/): Rename from sreal_div.
8970         * sreal.h (class sreal): Adjust.
8971         (inline sreal &operator+=): New operator.
8972         (inline sreal &operator-=): Likewise.
8973         (inline sreal &operator/=): Likewise.
8974         (inline sreal &operator*=): Likewise.
8975         (inline bool operator!=): Likewise.
8976         (inline bool operator>): Likewise.
8977         (inline bool operator<=): Likewise.
8978         (inline bool operator>=): Likewise.
8979
8980 2014-11-11  Bin Cheng  <bin.cheng@arm.com>
8981
8982         * sched-deps.c (sched_analyze_1): Check pending list if it is not
8983         less than MAX_PENDING_LIST_LENGTH.
8984         (sched_analyze_2, sched_analyze_insn, deps_analyze_insn): Ditto.
8985
8986 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
8987
8988         * config/i386/i386.c (ix86_decompose_address): Replace open-coded
8989         swap with std::swap to swap values.
8990         (ix86_fixup_binary_operands): Ditto.
8991         (ix86_binary_operator_ok): Ditto.
8992         (ix86_prepare_fp_compare_args): Ditto.
8993         (ix86_expand_branch): Ditto.
8994         (ix86_expand_carry_flag_compare): Ditto.
8995         (ix86_expand_int_movcc): Ditto.
8996         (ix86_prepare_sse_fp_compare_args): Ditto.
8997         (ix86_expand_sse_fp_minmax): Ditto.
8998         (ix86_expand_int_vcond): Ditto.
8999         (ix86_split_long_move): Ditto.
9000         (ix86_expand_sse_comi): Ditto.
9001         (ix86_expand_sse_compare_and_jump): Ditto.
9002         (ix86_expand_sse_compare_mask): Ditto.
9003         * config/i386/i386.md (*add<mode>_1): Ditto.
9004         (addsi_1_zext): Ditto.
9005         (*addhi_1): Ditto.
9006         (*addqi_1): Ditto.
9007         (*add<mode>_2): Ditto.
9008         (*addsi_2_zext): Ditto.
9009         (*add<mode>_3): Ditto.
9010         (*addsi_3_zext): Ditto.
9011         (*add<mode>_5): Ditto.
9012         (absneg splitter): Ditto.
9013
9014 2014-11-11  Uros Bizjak  <ubizjak@gmail.com>
9015
9016         Revert:
9017         2014-10-31  Uros Bizjak  <ubizjak@gmail.com>
9018
9019         PR target/63620
9020         * config/i386/i386-protos.h (ix86_use_pseudo_pic_reg): Declare.
9021         * config/i386/i386.c (ix86_use_pseudo_pic_reg): Export.
9022         * config/i386/i386.md (*pushtf): Allow only CONST_DOUBLEs that won't
9023         be reloaded through memory.
9024         (*pushxf): Ditto.
9025         (*pushdf): Ditto.
9026
9027 2014-11-11  Jakub Jelinek  <jakub@redhat.com>
9028             Martin Liska  <mliska@suse.cz>
9029
9030         * ipa-icf-gimple.c (func_checker::compare_bb): Fix comment typo.
9031         (func_checker::compare_gimple_call): Compare gimple_call_fn,
9032         gimple_call_chain, gimple_call_fntype and call flags.
9033
9034 2014-11-10  Vladimir Makarov  <vmakarov@redhat.com>
9035
9036         PR rtl-optimization/63620
9037         PR rtl-optimization/63799
9038         * lra-lives.c (process_bb_lives): Do not delete EH_REGION, trapped
9039         and setting PIC pseudo insns.
9040         (lra_create_live_ranges): Fix the typo.
9041
9042 2014-11-10  Patrick Palka  <ppalka@gcc.gnu.org>
9043
9044         PR middle-end/63748
9045         * tree-ssa-propagate.c (may_propagate_copy): Allow propagating
9046         SSA copies whose source and destination names both occur in
9047         abnormal PHIs.
9048
9049 2014-11-10 Roman Gareev  <gareevroman@gmail.com>
9050
9051         * Makefile.in: Remove the compilation of graphite-clast-to-gimple.o.
9052         * common.opt: Remove using of fgraphite-code-generator flag.
9053         * flag-types.h: Likewise.
9054         * graphite.c: Remove using of CLooG.
9055         * graphite-blocking.c: Likewise.
9056         * graphite-dependences.c: Likewise.
9057         * graphite-poly.c: Likewise.
9058         * graphite-poly.h: Likewise.
9059         * graphite-scop-detection.c: Likewise.
9060         * graphite-sese-to-poly.c: Likewise.
9061         * graphite-clast-to-gimple.c: Removed.
9062         * graphite-clast-to-gimple.h: Likewise.
9063         * graphite-htab.h: Likewise.
9064
9065 2014-11-10  Paolo Carlini  <paolo.carlini@oracle.com>
9066
9067         * doc/invoke.texi ([-Wshift-count-negative, -Wshift-count-overflow]):
9068         Add.
9069
9070 2014-11-10  Richard Sandiford  <richard.sandiford@arm.com>
9071
9072         * config/frv/frv.c (frv_io_handle_use_1): Delete.
9073         (frv_io_handle_use): Use find_all_hard_regs.
9074
9075 2014-11-10  Richard Sandiford  <richard.sandiford@arm.com>
9076
9077         * config/frv/frv.c (frv_registers_conflict_p_1): Take an rtx rather
9078         than an rtx *.  Take the regstate_t directly rather than via a void *.
9079         Return a bool rather than an int.  Iterate over all subrtxes here.
9080         (frv_registers_conflict_p): Update accordingly.
9081
9082 2014-11-10  Richard Sandiford  <richard.sandiford@arm.com>
9083
9084         * config/frv/frv.c: Include rtl-iter.h.
9085         (frv_acc_group_1): Delete.
9086         (frv_acc_group): Use FOR_EACH_SUBRTX.
9087
9088 2014-11-10  Richard Sandiford  <richard.sandiford@arm.com>
9089
9090         * config/frv/frv.c: Move include of rtl.h after hard-reg-set.h.
9091         (frv_clear_registers_used): Delete.
9092         (frv_ifcvt_modify_tests): Use find_all_hard_regs.
9093
9094 2014-11-10  Jan Hubicka  <hubicka@ucw.cz>
9095
9096         PR bootstrap/63573
9097         * calls.c (initialize_argument_information): When emitting thunk call
9098         use original memory placement of the argument.
9099
9100 2014-11-10  Renlin Li  <renlin.li@arm.com>
9101
9102         PR middle-end/61529
9103         * tree-ssa-threadupdate.c (compute_path_counts): Bound path_in_freq.
9104
9105 2014-11-10  Thomas Preud'homme  <thomas.preudhomme@arm.com>
9106
9107         * expmed.c (expand_shift_1): Expand 8 bit rotate of 16 bit value to
9108         bswaphi if available.
9109
9110 2014-11-10  Bernd Schmidt  <bernds@codesourcery.com>
9111
9112         * config/nvptx/nvptx.c: New file.
9113         * config/nvptx/nvptx.h: New file.
9114         * config/nvptx/nvptx-protos.h: New file.
9115         * config/nvptx/nvptx.md: New file.
9116         * config/nvptx/t-nvptx: New file.
9117         * config/nvptx/nvptx.opt: New file.
9118         * common/config/nvptx/nvptx-common.c: New file.
9119         * config.gcc: Handle nvptx-*-*.
9120
9121 2014-11-10  Richard Biener  <rguenther@suse.de>
9122
9123         * tree-ssa-operands.c (finalize_ssa_uses): Properly put
9124         released operands on the free list.
9125
9126 2014-11-10  Richard Biener  <rguenther@suse.de>
9127
9128         * match.pd: Implement pattern from simplify_mult.
9129         * tree-ssa-forwprop.c (simplify_mult): Remove.
9130         (pass_forwprop::execute): Do not call simplify_mult.
9131
9132 2014-11-10  Richard Biener  <rguenther@suse.de>
9133
9134         PR tree-optimization/63800
9135         * tree-ssa-pre.c (eliminate_push_avail): Push in a way so
9136         we can restore the previous availability in after_dom_children.
9137         (eliminate_dom_walker::after_dom_children): Restore
9138         previous availability.
9139
9140 2014-11-10  Richard Biener  <rguenther@suse.de>
9141
9142         PR middle-end/63798
9143         * expr.c (expand_expr_real_2): When expanding FMA_EXPRs
9144         properly treat the embedded multiplication as commutative
9145         when looking for feeding negates.
9146
9147 2014-11-10  Joern Rennecke  <joern.rennecke@embecosm.com>
9148
9149         * config/avr/avr.h (CPLUSPLUS_CPP_SPEC): Define.
9150
9151 2014-11-10  Martin Liska  <mliska@suse.cz>
9152
9153         * gcc.dg/tree-ssa/ldist-19.c: ICF is disabled
9154         for the test because of default char signedness
9155         on powerpc64 target.
9156
9157 2014-11-10  Richard Biener  <rguenther@suse.de>
9158
9159         * match.pd: Implement pattern from simplify_conversion_from_bitmask.
9160         * tree-ssa-forwprop.c (simplify_conversion_from_bitmask): Remove.
9161         (pass_forwprop::execute): Do not call simplify_conversion_from_bitmask.
9162
9163 2014-11-10  Richard Biener  <rguenther@suse.de>
9164
9165         * match.pd: Move rest of the conversion combining patterns
9166         from tree-ssa-forwprop.c.
9167         * tree-ssa-forwprop.c (combine_conversions): Remove.
9168         (pass_forwprop::execute): Do not call it.
9169
9170 2014-11-10  Eric Botcazou  <ebotcazou@adacore.com>
9171
9172         * gimple-low.c (lower_function_body): Clear the location of the first
9173         inserted representative return if it also fills in for the fallthru.
9174
9175 2014-11-10  Yuri Rumyantsev  <ysrumyan@gmail.com>
9176
9177         * tree-if-conv.c (add_to_predicate_list): Check unconditionally
9178         that bb is always executed to early exit. Use predicate of
9179         cd-equivalent block for join blocks if it exists.
9180         (if_convertible_loop_p_1): Recompute POST_DOMINATOR tree.
9181         (tree_if_conversion): Free post-dominance information.
9182
9183 2014-11-09  Jason Merrill  <jason@redhat.com>
9184
9185         * config/i386/avx512vldqintrin.h (_mm256_broadcast_f32x2): __mmask8.
9186         * config/i386/avx512vlintrin.h (_mm256_mask_cvtepi32_storeu_epi16)
9187         (_mm_mask_cvtusepi32_storeu_epi16)
9188         (_mm_mask_cvtsepi64_storeu_epi32): Return void.
9189
9190 2014-11-09  Joern Rennecke  <joern.rennecke@embecosm.com>
9191
9192         * config/avr/predicates.md (low_io_address_operand): Fix typo.
9193
9194 2014-11-09  Vladimir Makarov  <vmakarov@redhat.com>
9195
9196         PR rtl-optimization/63620
9197         * lra-constraints.c (substitute_pseudo): Add prefix lra_ to the
9198         name.  Move to lra.c.  Make it external.
9199         (substitute_pseudo_within_insn): Ditto.
9200         (inherit_reload_reg, split_reg, remove_inheritance_pseudos): Use
9201         the new names.
9202         (undo_optional_reloads): Ditto.
9203         * lra-int.h (lra_dump_bitmap_with_title, lra_substitute_pseudo):
9204         New prototypes.
9205         (lra_substitute_pseudo_within_insn): Ditto.
9206         * lra-lives.c (bb_killed_pseudos, bb_gen_pseudos): New.
9207         (mark_regno_live): Add parameter.  Update bb_gen_pseudos.
9208         (mark_regno_dead): Add parameter.  Update bb_gen_pseudos and
9209         bb_killed_pseudos.
9210         (struct bb_data, bb_data_t, bb_data): New.
9211         (get_bb_data, get_bb_data_by_index): Ditto.
9212         (all_hard_regs_bitmap): New.
9213         (live_trans_fun, live_con_fun_0, live_con_fun_n, all_blocks): New.
9214         (initiate_live_solver, finish_live_solver): New.
9215         (process_bb_lives): Change return type.  Add code updating local
9216         live data and removing dead insns.  Pass new argument to
9217         mark_regno_live and mark_regno_dead.  Check changing bb pseudo
9218         life info.  Return the result.
9219         (lra_create_live_ranges): Add code to do global pseudo live
9220         analysis.
9221         (lra_live_ranges_init): Call initiate_live_solver.
9222         (lra_live_ranges_finish): Call finish_live_solver.
9223         * lra.c (lra_dump_bitmap_with_title): New.
9224         (lra_substitute_pseudo, lra_substitute_pseudo_within_insn): Move
9225         from lra-constraints.c.
9226
9227 2014-11-09  Richard Biener  <rguenther@suse.de>
9228
9229         * match.pd: Add patterns convering two conversions in a row
9230         from fold-const.c.
9231         * fold-const.c (fold_unary_loc): Remove them here.
9232         * tree-ssa-forwprop.c (combine_conversions): Likewise.
9233         * genmatch.c (dt_node::gen_kids): Check whether we may
9234         follow SSA use-def chains.
9235
9236 2014-11-08  Richard Sandiford  <richard.sandiford@arm.com>
9237
9238         * config/aarch64/aarch64.c: Include rtl-iter.h.
9239         (aarch64_tls_operand_p_1): Delete.
9240         (aarch64_tls_operand_p): Use FOR_EACH_SUBRTX.
9241
9242 2014-11-08  Richard Sandiford  <richard.sandiford@arm.com>
9243
9244         * config/arm/arm.c (arm_note_pic_base): Delete.
9245         (arm_cannot_copy_insn_p): Use FOR_EACH_SUBRTX.
9246
9247 2014-11-08  Richard Sandiford  <richard.sandiford@arm.com>
9248
9249         * config/arm/arm.c: Include rtl-iter.h.
9250         (arm_tls_referenced_p_1): Delete.
9251         (arm_tls_referenced_p): Use FOR_EACH_SUBRTX.
9252
9253 2014-11-08  Richard Sandiford  <richard.sandiford@arm.com>
9254
9255         * config/arm/aarch-common.c: Include rtl-iter.h.
9256         (search_term, arm_find_sub_rtx_with_search_term): Delete.
9257         (arm_find_sub_rtx_with_code): Use FOR_EACH_SUBRTX_VAR.
9258         (arm_get_set_operands): Pass the insn pattern rather than the
9259         insn itself.
9260         (arm_no_early_store_addr_dep): Likewise.
9261
9262 2014-11-08  Eric Botcazou  <ebotcazou@adacore.com>
9263
9264         * config/arm/arm.c (arm_set_return_address): Mark the store as frame
9265         related, if any.
9266         (thumb_set_return_address): Likewise.
9267
9268 2014-11-07  Jeff Law  <law@redhat.com>
9269
9270         PR tree-optimization/61515
9271         * tree-ssa-threadedge.c (invalidate_equivalences): Walk the unwinding
9272         stack rather than looking at every SSA_NAME's value.
9273
9274 2014-11-07  Richard Biener  <rguenther@suse.de>
9275
9276         PR tree-optimization/63605
9277         * fold-const.c (fold_binary_loc): Properly use element_precision
9278         for types that may not be scalar.
9279
9280 2014-11-07  Evgeny Stupachenko  <evstupac@gmail.com>
9281
9282         PR target/63534
9283         * config/i386/i386.md (builtin_setjmp_receiver): Use
9284         pic_offset_table_rtx for PIC register.
9285         (nonlocal_goto_receiver): Delete.
9286
9287 2014-11-07  Daniel Hellstrom  <daniel@gaisler.com>
9288
9289         * config.gcc (sparc-*-rtems*): Clean away unused t-elf.
9290         * config/sparc/t-rtems: Add leon3v7 and muser-mode multilibs.
9291
9292 2014-11-07  Martin Liska  <mliska@suse.cz>
9293
9294         PR ipa/63580
9295         * cgraphunit.c (cgraph_node::create_wrapper):
9296         TREE_ADDRESSABLE is set to false for a newly created thunk.
9297
9298 2014-11-07  Martin Liska  <mliska@suse.cz>
9299
9300         PR ipa/63747
9301         * ipa-icf-gimple.c (func_checker::compare_gimple_switch):
9302         Missing checking for CASE_LOW and CASE_HIGH added.
9303
9304 2014-11-07  Martin Liska  <mliska@suse.cz>
9305
9306         PR ipa/63595
9307         * cgraphunit.c (cgraph_node::expand_thunk): DECL_BY_REFERENCE
9308         is correctly handled for thunks created by IPA ICF.
9309
9310 2014-11-07  Jiong Wang  <jiong.wang@arm.com>
9311 2014-11-07  Richard Biener  <rguenther@suse.de>
9312
9313         PR tree-optimization/63676
9314         * gimple-fold.c (fold_gimple_assign): Do not fold node when
9315         TREE_CLOBBER_P be true.
9316
9317 2014-11-07  Richard Biener  <rguenther@suse.de>
9318
9319         PR middle-end/63770
9320         * match.pd: Guard conflicting GENERIC pattern properly.
9321
9322 2014-11-07  Richard Biener  <rguenther@suse.de>
9323
9324         * match.pd: Add patterns for POINTER_PLUS_EXPR association
9325         and special patterns from tree-ssa-forwprop.c
9326         * fold-const.c (fold_binary_loc): Remove them here.
9327         * tree-ssa-forwprop.c (to_purge): New global bitmap.
9328         (fwprop_set_lattice_val): New function.
9329         (fwprop_invalidate_lattice): Likewise.
9330         (remove_prop_source_from_use): Instead of purging dead EH
9331         edges record blocks to do that in to_purge.
9332         (tidy_after_forward_propagate_addr): Likewise.
9333         (forward_propagate_addr_expr): Invalidate the lattice for
9334         SSA names we release.
9335         (simplify_conversion_from_bitmask): Likewise.
9336         (simplify_builtin_call): Likewise.
9337         (associate_pointerplus_align): Remove.
9338         (associate_pointerplus_diff): Likewise.
9339         (associate_pointerplus): Likewise.
9340         (fold_all_stmts): Merge with ...
9341         (pass_forwprop::execute): ... the original loop over all
9342         basic-blocks.  Delay purging dead EH edges and invalidate
9343         the lattice for SSA names we release.
9344
9345 2014-11-07  Terry Guo  <terry.guo@arm.com>
9346
9347         * config/arm/arm.opt (masm-syntax-unified): New option.
9348         * doc/invoke.texi (-masm-syntax-unified): Document new option.
9349         * config/arm/arm.h (TARGET_UNIFIED_ASM): Also include thumb1.
9350         (ASM_APP_ON): Redefined.
9351         * config/arm/arm.c (arm_option_override): Thumb2 inline assembly
9352         code always use UAL syntax.
9353         (arm_output_mi_thunk): Use UAL syntax for Thumb1 target.
9354         * config/arm/thumb1.md: Likewise.
9355
9356 2014-11-06  John David Anglin  <danglin@gcc.gnu.org>
9357
9358         * config/pa/pa.md (trap): New insn.  Add "trap" to attribute type.
9359         Don't allow trap insn in in_branch_delay, in_nullified_branch_delay
9360         or in_call_delay.
9361
9362 2014-11-06  Steve Ellcey  <sellcey@imgtec.com>
9363
9364         * config.gcc (mips*-mti-linux*): Remove gnu_ld and gas assignments.
9365         Set default_mips_arch and default_mips_abi instead of tm_defines.
9366         (mips*-*-linux*): Set default_mips_arch and default_mips_abi instead
9367         of tm_defines.
9368         (mips*-*-*): Check with_arch and with_abi.  Set tm_defines.
9369         * config/mips/mips.h (STANDARD_STARTFILE_PREFIX_1): Set default
9370         based on MIPS_ABI_DEFAULT.
9371         (STANDARD_STARTFILE_PREFIX_2): Ditto.
9372
9373 2014-11-06  Joseph Myers  <joseph@codesourcery.com>
9374
9375         * doc/invoke.texi (-std=c99, -std=c11): Don't refer to corner
9376         cases of extended identifiers.
9377
9378 2014-11-06  Eric Botcazou  <ebotcazou@adacore.com>
9379
9380         * tree-cfgcleanup.c (fixup_noreturn_call): Do not perform DCE here.
9381
9382 2014-11-06  DJ Delorie  <dj@redhat.com>
9383
9384         * config/m32c/cond.md (movqicc_<code>_<mode>): Remove mode of
9385         conditional.
9386         (movhicc_<code>_<mode>): Likewise.
9387         * config/m32c/m32c.c (encode_pattern_1): Specialise PSImode
9388         subregs.
9389         (m32c_eh_return_data_regno): Change to using memregs to avoid
9390         tying up all the compute regs.
9391         (m32c_legitimate_address_p) Subregs are not valid addresses.
9392
9393 2014-11-06  Bernd Schmidt  <bernds@codesourcery.com>
9394
9395         * function.c (thread_prologue_and_epilogue_insns): No longer static.
9396         * function.h (thread_prologue_and_epilogue_insns): Declare.
9397
9398         * target.def (assemble_undefined_decl): New hooks.
9399         * hooks.c (hook_void_FILEptr_constcharptr_const_tree): New function.
9400         * hooks.h (hook_void_FILEptr_constcharptr_const_tree): Declare.
9401         * doc/tm.texi.in (TARGET_ASM_ASSEMBLE_UNDEFINED_DECL): Add.
9402         * doc/tm.texi: Regenerate.
9403         * output.h (assemble_undefined_decl): Declare.
9404         (get_fnname_from_decl): Declare.
9405         * varasm.c (assemble_undefined_decl): New function.
9406         (get_fnname_from_decl): New function.
9407         * final.c (rest_of_handle_final): Use it.
9408         * varpool.c (varpool_output_variables): Call assemble_undefined_decl
9409         for nodes without a definition.
9410
9411         * target.def (call_args, end_call_args): New hooks.
9412         * hooks.c (hook_void_rtx_tree): New empty function.
9413         * hooks.h (hook_void_rtx_tree): Declare.
9414         * doc/tm.texi.in (TARGET_CALL_ARGS, TARGET_END_CALL_ARGS): Add.
9415         * doc/tm.texi: Regenerate.
9416         * calls.c (expand_call): Slightly rearrange the code.  Use the two new
9417         hooks.
9418         (expand_library_call_value_1): Use the two new hooks.
9419
9420         * expr.c (use_reg_mode): Just return for pseudo registers.
9421
9422         * combine.c (try_combine): Don't allow a call as one of the source
9423         insns.
9424
9425         * target.def (decl_end): New hook.
9426         * varasm.c (assemble_variable_contents, assemble_constant_contents):
9427         Use it.
9428         * doc/tm.texi.in (TARGET_ASM_DECL_END): Add.
9429         * doc/tm.texi: Regenerate.
9430
9431 2014-11-06  Renlin Li  <renlin.li@arm.com>
9432
9433         * config/aarch64/aarch64.c (aarch64_architecture_version): New.
9434         (processor): New architecture_version field.
9435         (aarch64_override_options): Initialize aarch64_architecture_version.
9436         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Define __ARM_ARCH,
9437         __ARM_ARCH_PROFILE, aarch64_arch_name macro.
9438
9439 2014-11-06  James Greenhalgh  <james.greenhalgh@arm.com>
9440
9441         * params.def (sra-max-scalarization-size-Ospeed): New.
9442         (sra-max-scalarization-size-Osize): Likewise.
9443         * doc/invoke.texi (sra-max-scalarization-size-Ospeed): Document.
9444         (sra-max-scalarization-size-Osize): Likewise.
9445         * toplev.c (process_options): Set default values for new
9446         parameters.
9447         * tree-sra.c (analyze_all_variable_accesses): Use new parameters.
9448         * targhooks.c (get_move_ratio): Remove static designator.
9449         * target.h (get_move_ratio): Declare.
9450
9451 2014-11-06  Marek Polacek  <polacek@redhat.com>
9452
9453         * sanopt.c (sanopt_optimize_walker): Limit removal of the checks.
9454         Remove vector limit.
9455
9456 2014-11-06  Richard Biener  <rguenther@suse.de>
9457
9458         * match.pd: Implement bitwise binary and unary simplifications
9459         from tree-ssa-forwprop.c.
9460         * fold-const.c (fold_unary_loc): Remove them here.
9461         (fold_binary_loc): Likewise.
9462         * tree-ssa-forwprop.c (simplify_not_neg_expr): Remove.
9463         (truth_valued_ssa_name): Likewise.
9464         (lookup_logical_inverted_value): Likewise.
9465         (simplify_bitwise_binary_1): Likewise.
9466         (hoist_conversion_for_bitop_p): Likewise.
9467         (simplify_bitwise_binary_boolean): Likewise.
9468         (simplify_bitwise_binary): Likewise.
9469         (pass_forwprop::execute): Remove calls to simplify_not_neg_expr
9470         and simplify_bitwise_binary.
9471         * genmatch.c (dt_node::append_true_op): Use safe_as_a for parent.
9472         (decision_tree::insert): Also insert non-expressions.
9473
9474 2014-11-06  Hale Wang  <hale.wang@arm.com>
9475
9476         * config/arm/arm-cores.def: Add support for
9477         -mcpu=cortex-m0.small-multiply,cortex-m0plus.small-multiply,
9478         cortex-m1.small-multiply.
9479         * config/arm/arm-tables.opt: Regenerate.
9480         * config/arm/arm-tune.md: Regenerate.
9481         * config/arm/arm.c: Update the rtx-costs for MUL.
9482         * config/arm/bpabi.h: Handle
9483         -mcpu=cortex-m0.small-multiply,cortex-m0plus.small-multiply,
9484         cortex-m1.small-multiply.
9485         * doc/invoke.texi: Document
9486         -mcpu=cortex-m0.small-multiply,cortex-m0plus.small-multiply,
9487         cortex-m1.small-multiply.
9488
9489 2014-11-06  Hale Wang  <hale.wang@arm.com>
9490
9491         * config/arm/arm.c: Add cortex-m7 tune.
9492         * config/arm/arm-cores.def: Use cortex-m7 tune.
9493
9494 2014-11-05  Uros Bizjak  <ubizjak@gmail.com>
9495
9496         PR target/63538
9497         * config/i386/i386.c (in_large_data_p): Reject automatic variables.
9498         (ix86_encode_section_info): Do not check for non-automatic varibles
9499         when setting SYMBOL_FLAG_FAR_ADDR flag.
9500         (x86_64_elf_select_section): Do not check ix86_cmodel here.
9501         (x86_64_elf_unique_section): Ditto.
9502         (x86_elf_aligned_common): Emit tab before .largecomm.
9503
9504 2014-11-05  Joseph Myers  <joseph@codesourcery.com>
9505
9506         PR preprocessor/9449
9507         * doc/cpp.texi (Character sets, Tokenization)
9508         (Implementation-defined behavior): Don't refer to UCNs in
9509         identifiers requiring -fextended-identifiers.
9510         * doc/cppopts.texi (-fextended-identifiers): Document as enabled
9511         by default for C99 and later and C++.
9512         * doc/invoke.texi (-std=c99, -std=c11): Don't refer to extended
9513         identifiers needing -fextended-identifiers.
9514
9515 2014-11-05  Ilya Tocar  <ilya.tocar@intel.com>
9516
9517         * config/i386/i386.c (expand_vec_perm_pshufb): Try vpermq/vpermd
9518         for 512-bit wide modes.
9519         (expand_vec_perm_1): Use correct versions of patterns.
9520         * config/i386/sse.md (avx512f_vec_dup<mode>_1): New.
9521         (vashr<mode>3<mask_name>): Split V8HImode and V16QImode.
9522
9523 2014-11-05  Ilya Enkovich  <ilya.enkovich@intel.com>
9524
9525         * ipa-chkp.c: New.
9526         * ipa-chkp.h: New.
9527         * tree-chkp.c: New.
9528         * tree-chkp.h: New.
9529         * tree-chkp-opt.c: New.
9530         * rtl-chkp.c: New.
9531         * rtl-chkp.h: New.
9532         * Makefile.in (OBJS): Add ipa-chkp.o, rtl-chkp.o, tree-chkp.o
9533         tree-chkp-opt.o.
9534         (GTFILES): Add tree-chkp.c.
9535         * mode-classes.def (MODE_POINTER_BOUNDS): New.
9536         * tree.def (POINTER_BOUNDS_TYPE): New.
9537         * genmodes.c (complete_mode): Support MODE_POINTER_BOUNDS.
9538         (POINTER_BOUNDS_MODE): New.
9539         (make_pointer_bounds_mode): New.
9540         * machmode.h (POINTER_BOUNDS_MODE_P): New.
9541         * stor-layout.c (int_mode_for_mode): Support MODE_POINTER_BOUNDS.
9542         (layout_type): Support POINTER_BOUNDS_TYPE.
9543         * tree-pretty-print.c (dump_generic_node): Support POINTER_BOUNDS_TYPE.
9544         * tree-core.h (tree_index): Add TI_POINTER_BOUNDS_TYPE.
9545         * tree.c (build_int_cst_wide): Support POINTER_BOUNDS_TYPE.
9546         (type_contains_placeholder_1): Likewise.
9547         (build_common_tree_nodes): Initialize
9548         pointer_bounds_type_node.
9549         * tree.h (POINTER_BOUNDS_TYPE_P): New.
9550         (pointer_bounds_type_node): New.
9551         (POINTER_BOUNDS_P): New.
9552         (BOUNDED_TYPE_P): New.
9553         (BOUNDED_P): New.
9554         (CALL_WITH_BOUNDS_P): New.
9555         * gimple.h (gf_mask): Add GF_CALL_WITH_BOUNDS.
9556         (gimple_call_with_bounds_p): New.
9557         (gimple_call_set_with_bounds): New.
9558         (gimple_return_retbnd): New.
9559         (gimple_return_set_retbnd): New
9560         * gimple.c (gimple_build_return): Increase number of ops
9561         for return statement.
9562         (gimple_build_call_from_tree): Propagate CALL_WITH_BOUNDS_P
9563         flag.
9564         * gimple-pretty-print.c (dump_gimple_return): Print second op.
9565         * rtl.h (CALL_EXPR_WITH_BOUNDS_P): New.
9566         * gimplify.c (gimplify_init_constructor): Avoid infinite
9567         loop during gimplification of bounds initializer.
9568         * calls.c: Include tree-chkp.h, rtl-chkp.h, bitmap.h.
9569         (special_function_p): Use original decl name when analyzing
9570         instrumentation clone.
9571         (arg_data): Add fields special_slot, pointer_arg and
9572         pointer_offset.
9573         (store_bounds): New.
9574         (emit_call_1): Propagate instrumentation flag for CALL.
9575         (initialize_argument_information): Compute pointer_arg,
9576         pointer_offset and special_slot for pointer bounds arguments.
9577         (finalize_must_preallocate): Preallocate when storing bounds
9578         in bounds table.
9579         (compute_argument_addresses): Skip pointer bounds.
9580         (expand_call): Store bounds into tables separately.  Return
9581         result joined with resulting bounds.
9582         * cfgexpand.c: Include tree-chkp.h, rtl-chkp.h.
9583         (expand_call_stmt): Propagate bounds flag for CALL_EXPR.
9584         (expand_return): Add returned bounds arg.  Handle returned bounds.
9585         (expand_gimple_stmt_1): Adjust to new expand_return signature.
9586         (gimple_expand_cfg): Reset rtx bounds map.
9587         * expr.c: Include tree-chkp.h, rtl-chkp.h.
9588         (expand_assignment): Handle returned bounds.
9589         (store_expr_with_bounds): New.  Replaces store_expr with new bounds
9590         target argument.  Handle bounds returned by calls.
9591         (store_expr): Now wraps store_expr_with_bounds.
9592         * expr.h (store_expr_with_bounds): New.
9593         * function.c: Include tree-chkp.h, rtl-chkp.h.
9594         (bounds_parm_data): New.
9595         (use_register_for_decl): Do not registerize decls used for bounds
9596         stores and loads.
9597         (assign_parms_augmented_arg_list): Add bounds of the result
9598         structure pointer as the second argument.
9599         (assign_parm_find_entry_rtl): Mark bounds are never passed on
9600         the stack.
9601         (assign_parm_is_stack_parm): Likewise.
9602         (assign_parm_load_bounds): New.
9603         (assign_bounds): New.
9604         (assign_parms): Load bounds and determine a location for
9605         returned bounds.
9606         (diddle_return_value_1): New.
9607         (diddle_return_value): Handle returned bounds.
9608         * function.h (rtl_data): Add field for returned bounds.
9609         * varasm.c: Include tree-chkp.h.
9610         (output_constant): Support POINTER_BOUNDS_TYPE.
9611         (output_constant_pool_2): Support MODE_POINTER_BOUNDS.
9612         (ultimate_transparent_alias_target): Move up.
9613         (make_decl_rtl): For instrumented function use
9614         name of the original decl.
9615         (assemble_start_function): Mark function as global
9616         in case it is instrumentation clone of the global
9617         function.
9618         (do_assemble_alias): Follow transparent alias chain
9619         for identifier.  Check if original alias is public.
9620         (maybe_assemble_visibility): Use visibility of the
9621         original function for instrumented version.
9622         (default_unique_section): Likewise.
9623         * emit-rtl.c (immed_double_const): Support MODE_POINTER_BOUNDS.
9624         (init_emit_once): Build pointer bounds zero constants.
9625         * explow.c (trunc_int_for_mode): Support MODE_POINTER_BOUNDS.
9626         * target.def (builtin_chkp_function): New.
9627         (chkp_bound_type): New.
9628         (chkp_bound_mode): New.
9629         (chkp_make_bounds_constant): New.
9630         (chkp_initialize_bounds): New.
9631         (load_bounds_for_arg): New.
9632         (store_bounds_for_arg): New.
9633         (load_returned_bounds): New.
9634         (store_returned_bounds): New.
9635         (chkp_function_value_bounds): New.
9636         (setup_incoming_vararg_bounds): New.
9637         (function_arg): Update hook description with new possible return
9638         value CONST_INT.
9639         * targhooks.h (default_load_bounds_for_arg): New.
9640         (default_store_bounds_for_arg): New.
9641         (default_load_returned_bounds): New.
9642         (default_store_returned_bounds): New.
9643         (default_chkp_bound_type): New.
9644         (default_chkp_bound_mode): New.
9645         (default_builtin_chkp_function): New.
9646         (default_chkp_function_value_bounds): New.
9647         (default_chkp_make_bounds_constant): New.
9648         (default_chkp_initialize_bounds): New.
9649         (default_setup_incoming_vararg_bounds): New.
9650         * targhooks.c (default_load_bounds_for_arg): New.
9651         (default_store_bounds_for_arg): New.
9652         (default_load_returned_bounds): New.
9653         (default_store_returned_bounds): New.
9654         (default_chkp_bound_type): New.
9655         (default_chkp_bound_mode); New.
9656         (default_builtin_chkp_function): New.
9657         (default_chkp_function_value_bounds): New.
9658         (default_chkp_make_bounds_constant): New.
9659         (default_chkp_initialize_bounds): New.
9660         (default_setup_incoming_vararg_bounds): New.
9661         * builtin-types.def (BT_BND): New.
9662         (BT_FN_PTR_CONST_PTR): New.
9663         (BT_FN_CONST_PTR_CONST_PTR): New.
9664         (BT_FN_BND_CONST_PTR): New.
9665         (BT_FN_CONST_PTR_BND): New.
9666         (BT_FN_PTR_CONST_PTR_SIZE): New.
9667         (BT_FN_PTR_CONST_PTR_CONST_PTR): New.
9668         (BT_FN_VOID_PTRPTR_CONST_PTR): New.
9669         (BT_FN_VOID_CONST_PTR_SIZE): New.
9670         (BT_FN_VOID_PTR_BND): New.
9671         (BT_FN_CONST_PTR_CONST_PTR_CONST_PTR): New.
9672         (BT_FN_BND_CONST_PTR_SIZE): New.
9673         (BT_FN_PTR_CONST_PTR_CONST_PTR_SIZE): New.
9674         (BT_FN_VOID_CONST_PTR_BND_CONST_PTR): New.
9675         * chkp-builtins.def: New.
9676         * builtins.def: include chkp-builtins.def.
9677         (DEF_CHKP_BUILTIN): New.
9678         * builtins.c: Include tree-chkp.h and rtl-chkp.h.
9679         (expand_builtin): Support BUILT_IN_CHKP_INIT_PTR_BOUNDS,
9680         BUILT_IN_CHKP_NULL_PTR_BOUNDS, BUILT_IN_CHKP_COPY_PTR_BOUNDS,
9681         BUILT_IN_CHKP_CHECK_PTR_LBOUNDS, BUILT_IN_CHKP_CHECK_PTR_UBOUNDS,
9682         BUILT_IN_CHKP_CHECK_PTR_BOUNDS, BUILT_IN_CHKP_SET_PTR_BOUNDS,
9683         BUILT_IN_CHKP_NARROW_PTR_BOUNDS, BUILT_IN_CHKP_STORE_PTR_BOUNDS,
9684         BUILT_IN_CHKP_GET_PTR_LBOUND, BUILT_IN_CHKP_GET_PTR_UBOUND,
9685         BUILT_IN_CHKP_BNDMK, BUILT_IN_CHKP_BNDSTX, BUILT_IN_CHKP_BNDCL,
9686         BUILT_IN_CHKP_BNDCU, BUILT_IN_CHKP_BNDLDX, BUILT_IN_CHKP_BNDRET,
9687         BUILT_IN_CHKP_INTERSECT, BUILT_IN_CHKP_NARROW,
9688         BUILT_IN_CHKP_EXTRACT_LOWER, BUILT_IN_CHKP_EXTRACT_UPPER.
9689         (std_expand_builtin_va_start): Init bounds for va_list.
9690         * cppbuiltin.c (define_builtin_macros_for_compilation_flags): Add
9691         __CHKP__ macro when Pointer Bounds Checker is on.
9692         * params.def (PARAM_CHKP_MAX_CTOR_SIZE): New.
9693         * passes.def (pass_ipa_chkp_versioning): New.
9694         (pass_early_local_passes): Renamed to pass_build_ssa_passes.
9695         (pass_fixup_cfg): Moved to pass_chkp_instrumentation_passes.
9696         (pass_chkp_instrumentation_passes): New.
9697         (pass_ipa_chkp_produce_thunks): New.
9698         (pass_local_optimization_passes): New.
9699         (pass_chkp_opt): New.
9700         * tree-pass.h (make_pass_ipa_chkp_versioning): New.
9701         (make_pass_ipa_chkp_produce_thunks): New.
9702         (make_pass_chkp): New.
9703         (make_pass_chkp_opt): New.
9704         (make_pass_early_local_passes): Renamed to ...
9705         (make_pass_build_ssa_passes): This.
9706         (make_pass_chkp_instrumentation_passes): New.
9707         (make_pass_local_optimization_passes): New.
9708         * passes.c (pass_manager::execute_early_local_passes): Execute
9709         early passes in three steps.
9710         (execute_all_early_local_passes): Renamed to ...
9711         (execute_build_ssa_passes): This.
9712         (pass_data_early_local_passes): Renamed to ...
9713         (pass_data_build_ssa_passes): This.
9714         (pass_early_local_passes): Renamed to ...
9715         (pass_build_ssa_passes): This.
9716         (pass_data_chkp_instrumentation_passes): New.
9717         (pass_chkp_instrumentation_passes): New.
9718         (pass_data_local_optimization_passes): New.
9719         (pass_local_optimization_passes): New.
9720         (make_pass_early_local_passes): Renamed to ...
9721         (make_pass_build_ssa_passes): This.
9722         (make_pass_chkp_instrumentation_passes): New.
9723         (make_pass_local_optimization_passes): New.
9724         * c-family/c.opt (fcheck-pointer-bounds): New.
9725         (fchkp-check-incomplete-type): New.
9726         (fchkp-zero-input-bounds-for-main): New.
9727         (fchkp-first-field-has-own-bounds): New.
9728         (fchkp-narrow-bounds): New.
9729         (fchkp-narrow-to-innermost-array): New.
9730         (fchkp-optimize): New.
9731         (fchkp-use-fast-string-functions): New.
9732         (fchkp-use-nochk-string-functions): New.
9733         (fchkp-use-static-bounds): New.
9734         (fchkp-use-static-const-bounds): New.
9735         (fchkp-treat-zero-dynamic-size-as-infinite): New.
9736         (fchkp-check-read): New.
9737         (fchkp-check-write): New.
9738         (fchkp-store-bounds): New.
9739         (fchkp-instrument-calls): New.
9740         (fchkp-instrument-marked-only): New.
9741         (Wchkp): New.
9742         * c-family/c-common.c (handle_bnd_variable_size_attribute): New.
9743         (handle_bnd_legacy): New.
9744         (handle_bnd_instrument): New.
9745         (c_common_attribute_table): Add bnd_variable_size, bnd_legacy
9746         and bnd_instrument.  Fix documentation.
9747         (c_common_format_attribute_table): Likewsie.
9748         * toplev.c: include tree-chkp.h.
9749         (process_options): Check Pointer Bounds Checker is supported.
9750         (compile_file): Add chkp_finish_file call.
9751         * ipa-cp.c (initialize_node_lattices): Use cgraph_local_p
9752         to handle instrumentation clones properly.
9753         (propagate_constants_accross_call): Do not propagate
9754         through instrumentation thunks.
9755         * ipa-pure-const.c (propagate_pure_const): Support
9756         IPA_REF_CHKP.
9757         * ipa-inline.c (early_inliner): Check edge has summary allocated.
9758         * ipa-split.c: Include tree-chkp.h.
9759         (find_retbnd): New.
9760         (split_part_set_ssa_name_p): New.
9761         (consider_split): Do not split retbnd and retval
9762         producers.
9763         (insert_bndret_call_after): new.
9764         (split_function): Propagate Pointer Bounds Checker
9765         instrumentation marks and handle returned bounds.
9766         * tree-ssa-sccvn.h (vn_reference_op_struct): Transform opcode
9767         into bit field and add with_bounds field.
9768         * tree-ssa-sccvn.c (copy_reference_ops_from_call): Set
9769         with_bounds field for instrumented calls.
9770         * tree-ssa-pre.c (create_component_ref_by_pieces_1): Restore
9771         CALL_WITH_BOUNDS_P flag for calls.
9772         * tree-ssa-ccp.c: Include tree-chkp.h.
9773         (insert_clobber_before_stack_restore): Handle
9774         BUILT_IN_CHKP_BNDRET calls.
9775         * tree-ssa-dce.c: Include tree-chkp.h.
9776         (propagate_necessity): For free call fed by alloc check
9777         bounds are also provided by the same alloc.
9778         (eliminate_unnecessary_stmts): Handle BUILT_IN_CHKP_BNDRET
9779         used by free calls.
9780         * tree-inline.c: Include tree-chkp.h.
9781         (declare_return_variable): Add arg holding
9782         returned bounds slot.  Create and initialize returned bounds var.
9783         (remap_gimple_stmt): Handle returned bounds.
9784         Return sequence of statements instead of a single statement.
9785         (insert_init_stmt): Add declaration.
9786         (remap_gimple_seq): Adjust to new remap_gimple_stmt signature.
9787         (copy_bb): Adjust to changed return type of remap_gimple_stmt.
9788         Properly handle bounds in va_arg_pack and va_arg_pack_len.
9789         (expand_call_inline): Handle returned bounds.  Add bounds copy
9790         for generated mem to mem assignments.
9791         * tree-inline.h (copy_body_data): Add fields retbnd and
9792         assign_stmts.
9793         * value-prof.c: Include tree-chkp.h.
9794         (gimple_ic): Support returned bounds.
9795         * ipa.c (cgraph_build_static_cdtor_1): Support contructors
9796         with "chkp ctor" and "bnd_legacy" attributes.
9797         (symtab_remove_unreachable_nodes): Keep initial values for
9798         pointer bounds to be used for checks eliminations.
9799         (process_references): Handle IPA_REF_CHKP.
9800         (walk_polymorphic_call_targets): Likewise.
9801         * ipa-visibility.c (cgraph_externally_visible_p): Mark
9802         instrumented 'main' as externally visible.
9803         (function_and_variable_visibility): Filter instrumentation
9804         thunks.
9805         * cgraph.h (cgraph_thunk_info): Add add_pointer_bounds_args
9806         field.
9807         (cgraph_node): Add instrumented_version, orig_decl and
9808         instrumentation_clone fields.
9809         (symtab_node::get_alias_target): Allow IPA_REF_CHKP reference.
9810         (varpool_node): Add need_bounds_init field.
9811         (cgraph_local_p): New.
9812         * cgraph.c: Include tree-chkp.h.
9813         (cgraph_node::remove): Fix instrumented_version
9814         of the referenced node if any.
9815         (cgraph_node::dump): Dump instrumentation_clone and
9816         instrumented_version fields.
9817         (cgraph_node::verify_node): Check correctness of IPA_REF_CHKP
9818         references and instrumentation thunks.
9819         (cgraph_can_remove_if_no_direct_calls_and_refs_p): Keep
9820         all not instrumented instrumentation clones alive.
9821         (cgraph_redirect_edge_call_stmt_to_callee): Support
9822         returned bounds.
9823         * cgraphbuild.c (rebuild_cgraph_edges): Rebuild IPA_REF_CHKP
9824         reference.
9825         (cgraph_rebuild_references): Likewise.
9826         * cgraphunit.c: Include tree-chkp.h.
9827         (assemble_thunks_and_aliases): Skip thunks calling instrumneted
9828         function version.
9829         (varpool_finalize_decl): Register statically initialized decls
9830         in Pointer Bounds Checker.
9831         (walk_polymorphic_call_targets): Do not mark generated call to
9832         __builtin_unreachable as with_bounds.
9833         (output_weakrefs): If there are both instrumented and original
9834         versions, output only one of them.
9835         (cgraph_node::expand_thunk): Set with_bounds flag
9836         for created call statement.
9837         * ipa-ref.h (ipa_ref_use): Add IPA_REF_CHKP.
9838         (ipa_ref): increase size of use field.
9839         * symtab.c (ipa_ref_use_name): Add element for IPA_REF_CHKP.
9840         * varpool.c (dump_varpool_node): Dump need_bounds_init field.
9841         (ctor_for_folding): Do not fold constant bounds vars.
9842         * lto-streamer.h (LTO_minor_version): Change minor version from
9843         0 to 1.
9844         * lto-cgraph.c (compute_ltrans_boundary): Keep initial values for
9845         pointer bounds.
9846         (lto_output_node): Output instrumentation_clone,
9847         thunk.add_pointer_bounds_args and orig_decl field.
9848         (lto_output_ref): Adjust to new ipa_ref::use field size.
9849         (input_overwrite_node): Read instrumentation_clone field.
9850         (input_node): Read thunk.add_pointer_bounds_args and orig_decl
9851         fields.
9852         (input_ref): Adjust to new ipa_ref::use field size.
9853         (input_cgraph_1): Compute instrumented_version fields and restore
9854         IDENTIFIER_TRANSPARENT_ALIAS chains.
9855         (lto_output_varpool_node): Output
9856         need_bounds_init value.
9857         (input_varpool_node): Read need_bounds_init value.
9858         * lto-partition.c (add_symbol_to_partition_1): Keep original
9859         and instrumented versions together.
9860         (privatize_symbol_name): Restore transparent alias chain if required.
9861         (add_references_to_partition): Add references to pointer bounds vars.
9862         * dbxout.c (dbxout_type): Ignore POINTER_BOUNDS_TYPE.
9863         * dwarf2out.c (gen_subprogram_die): Ignore bound args.
9864         (gen_type_die_with_usage): Skip pointer bounds.
9865         (dwarf2out_global_decl): Likewise.
9866         (is_base_type): Support POINTER_BOUNDS_TYPE.
9867         (gen_formal_types_die): Skip pointer bounds.
9868         (gen_decl_die): Likewise.
9869         * var-tracking.c (vt_add_function_parameters): Skip
9870         bounds parameters.
9871         * ipa-icf.c (sem_function::merge): Do not merge when instrumentation
9872         thunk still exists.
9873         (sem_variable::merge): Reset need_bounds_init flag.
9874         * doc/extend.texi: Document Pointer Bounds Checker built-in functions
9875         and attributes.
9876         * doc/tm.texi.in (TARGET_LOAD_BOUNDS_FOR_ARG): New.
9877         (TARGET_STORE_BOUNDS_FOR_ARG): New.
9878         (TARGET_LOAD_RETURNED_BOUNDS): New.
9879         (TARGET_STORE_RETURNED_BOUNDS): New.
9880         (TARGET_CHKP_FUNCTION_VALUE_BOUNDS): New.
9881         (TARGET_SETUP_INCOMING_VARARG_BOUNDS): New.
9882         (TARGET_BUILTIN_CHKP_FUNCTION): New.
9883         (TARGET_CHKP_BOUND_TYPE): New.
9884         (TARGET_CHKP_BOUND_MODE): New.
9885         (TARGET_CHKP_MAKE_BOUNDS_CONSTANT): New.
9886         (TARGET_CHKP_INITIALIZE_BOUNDS): New.
9887         * doc/tm.texi: Regenerated.
9888         * doc/rtl.texi (MODE_POINTER_BOUNDS): New.
9889         (BND32mode): New.
9890         (BND64mode): New.
9891         * doc/invoke.texi (-mmpx): New.
9892         (-mno-mpx): New.
9893         (chkp-max-ctor-size): New.
9894         * config/i386/constraints.md (w): New.
9895         (Ti): New.
9896         (Tb): New.
9897         * config/i386/i386-c.c (ix86_target_macros_internal): Add __MPX__.
9898         * config/i386/i386-modes.def (BND32): New.
9899         (BND64): New.
9900         * config/i386/i386-protos.h (ix86_bnd_prefixed_insn_p): New.
9901         * config/i386/i386.c: Include tree-chkp.h, rtl-chkp.h, tree-iterator.h.
9902         (regclass_map): Add bound registers.
9903         (dbx_register_map): Likewise.
9904         (dbx64_register_map): Likewise.
9905         (svr4_dbx_register_map): Likewise.
9906         (isa_opts): Add -mmpx.
9907         (PTA_MPX): New.
9908         (ix86_option_override_internal): Support MPX ISA.
9909         (ix86_conditional_register_usage): Support bound registers.
9910         (ix86_code_end): Add MPX bnd prefix.
9911         (output_set_got): Likewise.
9912         (print_reg): Avoid prefixes for bound registers.
9913         (ix86_print_operand): Add '!' (MPX bnd) print prefix support.
9914         (ix86_print_operand_punct_valid_p): Likewise.
9915         (ix86_print_operand_address): Support UNSPEC_BNDMK_ADDR and
9916         UNSPEC_BNDLDX_ADDR.
9917         (ix86_output_call_insn): Add MPX bnd prefix to branch instructions.
9918         (ix86_class_likely_spilled_p): Add bound regs support.
9919         (ix86_hard_regno_mode_ok): Likewise.
9920         (x86_order_regs_for_local_alloc): Likewise.
9921         (ix86_bnd_prefixed_insn_p): New.
9922         (ix86_builtins): Add
9923         IX86_BUILTIN_BNDMK, IX86_BUILTIN_BNDSTX,
9924         IX86_BUILTIN_BNDLDX, IX86_BUILTIN_BNDCL,
9925         IX86_BUILTIN_BNDCU, IX86_BUILTIN_BNDRET,
9926         IX86_BUILTIN_BNDNARROW, IX86_BUILTIN_BNDINT,
9927         IX86_BUILTIN_SIZEOF, IX86_BUILTIN_BNDLOWER,
9928         IX86_BUILTIN_BNDUPPER.
9929         (builtin_isa): Add leaf_p and nothrow_p fields.
9930         (def_builtin): Initialize leaf_p and nothrow_p.
9931         (ix86_add_new_builtins): Handle leaf_p and nothrow_p
9932         flags.
9933         (bdesc_mpx): New.
9934         (bdesc_mpx_const): New.
9935         (ix86_init_mpx_builtins): New.
9936         (ix86_init_builtins): Call ix86_init_mpx_builtins.
9937         (ix86_emit_cmove): New.
9938         (ix86_emit_move_max): New.
9939         (ix86_expand_builtin): Expand IX86_BUILTIN_BNDMK,
9940         IX86_BUILTIN_BNDSTX, IX86_BUILTIN_BNDLDX,
9941         IX86_BUILTIN_BNDCL, IX86_BUILTIN_BNDCU,
9942         IX86_BUILTIN_BNDRET, IX86_BUILTIN_BNDNARROW,
9943         IX86_BUILTIN_BNDINT, IX86_BUILTIN_SIZEOF,
9944         IX86_BUILTIN_BNDLOWER, IX86_BUILTIN_BNDUPPER.
9945         (ix86_function_value_bounds): New.
9946         (ix86_builtin_mpx_function): New.
9947         (ix86_get_arg_address_for_bt): New.
9948         (ix86_load_bounds): New.
9949         (ix86_store_bounds): New.
9950         (ix86_load_returned_bounds): New.
9951         (ix86_store_returned_bounds): New.
9952         (ix86_mpx_bound_mode): New.
9953         (ix86_make_bounds_constant): New.
9954         (ix86_initialize_bounds):
9955         (TARGET_LOAD_BOUNDS_FOR_ARG): New.
9956         (TARGET_STORE_BOUNDS_FOR_ARG): New.
9957         (TARGET_LOAD_RETURNED_BOUNDS): New.
9958         (TARGET_STORE_RETURNED_BOUNDS): New.
9959         (TARGET_CHKP_BOUND_MODE): New.
9960         (TARGET_BUILTIN_CHKP_FUNCTION): New.
9961         (TARGET_CHKP_FUNCTION_VALUE_BOUNDS): New.
9962         (TARGET_CHKP_MAKE_BOUNDS_CONSTANT): New.
9963         (TARGET_CHKP_INITIALIZE_BOUNDS): New.
9964         (ix86_option_override_internal): Do not
9965         support x32 with MPX.
9966         (init_cumulative_args): Init stdarg, bnd_regno, bnds_in_bt
9967         and force_bnd_pass.
9968         (function_arg_advance_32): Return number of used integer
9969         registers.
9970         (function_arg_advance_64): Likewise.
9971         (function_arg_advance_ms_64): Likewise.
9972         (ix86_function_arg_advance): Handle pointer bounds.
9973         (ix86_function_arg): Likewise.
9974         (ix86_function_value_regno_p): Mark fisrt bounds registers as
9975         possible function value.
9976         (ix86_function_value_1): Handle pointer bounds type/mode
9977         (ix86_return_in_memory): Likewise.
9978         (ix86_print_operand): Analyse insn to decide abounf "bnd" prefix.
9979         (ix86_expand_call): Generate returned bounds.
9980         (ix86_setup_incoming_vararg_bounds): New.
9981         (ix86_va_start): Initialize bounds for pointers in va_list.
9982         (TARGET_SETUP_INCOMING_VARARG_BOUNDS): New.
9983         * config/i386/i386.h (TARGET_MPX): New.
9984         (TARGET_MPX_P): New.
9985         (FIRST_PSEUDO_REGISTER): Fix to new value.
9986         (FIXED_REGISTERS): Add bound registers.
9987         (CALL_USED_REGISTERS): Likewise.
9988         (REG_ALLOC_ORDER): Likewise.
9989         (HARD_REGNO_NREGS): Likewise.
9990         (VALID_BND_REG_MODE): New.
9991         (FIRST_BND_REG): New.
9992         (LAST_BND_REG): New.
9993         (reg_class): Add BND_REGS.
9994         (REG_CLASS_NAMES): Likewise.
9995         (REG_CLASS_CONTENTS): Likewise.
9996         (BND_REGNO_P): New.
9997         (ANY_BND_REG_P): New.
9998         (BNDmode): New.
9999         (HI_REGISTER_NAMES): Add bound registers.
10000         (ix86_args): Add bnd_regno, bnds_in_bt, force_bnd_pass and
10001         stdarg fields.
10002         * config/i386/i386.md (UNSPEC_BNDMK): New.
10003         (UNSPEC_BNDMK_ADDR): New.
10004         (UNSPEC_BNDSTX): New.
10005         (UNSPEC_BNDLDX): New.
10006         (UNSPEC_BNDLDX_ADDR): New.
10007         (UNSPEC_BNDCL): New.
10008         (UNSPEC_BNDCU): New.
10009         (UNSPEC_BNDCN): New.
10010         (UNSPEC_MPX_FENCE): New.
10011         (UNSPEC_SIZEOF): New.
10012         (BND0_REG): New.
10013         (BND1_REG): New.
10014         (type): Add mpxmov, mpxmk, mpxchk, mpxld, mpxst.
10015         (length_immediate): Support mpxmov, mpxmk, mpxchk, mpxld, mpxst.
10016         (prefix_rep): Check for bnd prefix.
10017         (prefix_0f): Support mpxmov, mpxmk, mpxchk, mpxld, mpxst.
10018         (length_nobnd): New.
10019         (length): Use length_nobnd when specified.
10020         (memory): Support mpxmov, mpxmk, mpxchk, mpxld, mpxst.
10021         (BND): New.
10022         (bnd_ptr): New.
10023         (BNDCHECK): New.
10024         (bndcheck): New.
10025         (*jcc_1): Add MPX bnd prefix.
10026         (*jcc_2): Likewise.
10027         (jump): Likewise.
10028         (*indirect_jump): Likewise.
10029         (*tablejump_1): Likewise.
10030         (simple_return_internal): Likewise.
10031         (simple_return_internal_long): Likewise.
10032         (simple_return_pop_internal): Likewise.
10033         (simple_return_indirect_internal): Likewise.
10034         (<mode>_mk): New.
10035         (*<mode>_mk): New.
10036         (mov<mode>): New.
10037         (*mov<mode>_internal_mpx): New.
10038         (<mode>_<bndcheck>): New.
10039         (*<mode>_<bndcheck>): New.
10040         (<mode>_ldx): New.
10041         (*<mode>_ldx): New.
10042         (<mode>_stx): New.
10043         (*<mode>_stx): New.
10044         move_size_reloc_<mode>): New.
10045         * config/i386/predicates.md (address_mpx_no_base_operand): New.
10046         (address_mpx_no_index_operand): New.
10047         (bnd_mem_operator): New.
10048         (symbol_operand): New.
10049         (x86_64_immediate_size_operand): New.
10050         * config/i386/i386.opt (mmpx): New.
10051         * config/i386/i386-builtin-types.def (BND): New.
10052         (ULONG): New.
10053         (BND_FTYPE_PCVOID_ULONG): New.
10054         (VOID_FTYPE_BND_PCVOID): New.
10055         (VOID_FTYPE_PCVOID_PCVOID_BND): New.
10056         (BND_FTYPE_PCVOID_PCVOID): New.
10057         (BND_FTYPE_PCVOID): New.
10058         (BND_FTYPE_BND_BND): New.
10059         (PVOID_FTYPE_PVOID_PVOID_ULONG): New.
10060         (PVOID_FTYPE_PCVOID_BND_ULONG): New.
10061         (ULONG_FTYPE_VOID): New.
10062         (PVOID_FTYPE_BND): New.
10063
10064 2014-11-05  Bernd Schmidt  <bernds@codesourcery.com>
10065
10066         * passes.def (pass_compute_alignments, pass_duplicate_computed_gotos,
10067         pass_variable_tracking, pass_free_cfg, pass_machine_reorg,
10068         pass_cleanup_barriers, pass_delay_slots,
10069         pass_split_for_shorten_branches, pass_convert_to_eh_region_ranges,
10070         pass_shorten_branches, pass_est_nothrow_function_flags,
10071         pass_dwarf2_frame, pass_final): Move outside of pass_postreload and
10072         into pass_late_compilation.
10073         (pass_late_compilation): Add.
10074         * passes.c (pass_data_late_compilation, pass_late_compilation,
10075         make_pass_late_compilation): New.
10076         * timevar.def (TV_LATE_COMPILATION): New.
10077
10078         * target.def (omit_struct_return_reg): New data hook.
10079         * doc/tm.texi.in: Add @hook TARGET_OMIT_STRUCT_RETURN_REG.
10080         * doc/tm.texi: Regenerate.
10081         * function.c (expand_function_end): Use it.
10082
10083         * target.def (no_register_allocation): New data hook.
10084         * doc/tm.texi.in: Add @hook TARGET_NO_REGISTER_ALLOCATION.
10085         * doc/tm.texi: Regenerate.
10086         * ira.c (gate_ira): New function.
10087         (pass_data_ira): Set has_gate.
10088         (pass_ira): Add a gate function.
10089         (pass_data_reload): Likewise.
10090         (pass_reload): Add a gate function.
10091         (pass_ira): Use it.
10092         * reload1.c (eliminate_regs): If reg_eliminate_is NULL, assert that
10093         no register allocation happens on the target and return.
10094         * final.c (alter_subreg): Ensure register is not a pseudo before
10095         calling simplify_subreg.
10096         (output_operand): Assert that x isn't a pseudo only if doing
10097         register allocation.
10098
10099         * dbxout.c (dbxout_symbol): Don't call eliminate_regs on decls for
10100         global vars.
10101
10102         * optabs.c (emit_indirect_jump): Test HAVE_indirect_jump and emit a
10103         sorry if necessary.
10104
10105 2014-11-05  Alex Velenko  <Alex.Velenko@arm.com>
10106
10107         * simplify-rtx.c (simplify_binary_operation_1): Div check added.
10108         * rtl.h (SUBREG_P): New macro added.
10109
10110 2014-11-05  Tejas Belagod  <tejas.belagod@arm.com>
10111
10112         * config/aarch64/aarch64-builtins.c
10113         (aarch64_build_scalar_type): Remove.
10114         (aarch64_scalar_builtin_types, aarch64_simd_type,
10115         aarch64_simd_type, aarch64_mangle_builtin_scalar_type,
10116         aarch64_mangle_builtin_vector_type,
10117         aarch64_mangle_builtin_type, aarch64_simd_builtin_std_type,
10118         aarch64_lookup_simd_builtin_type, aarch64_simd_builtin_type,
10119         aarch64_init_simd_builtin_types,
10120         aarch64_init_simd_builtin_scalar_types): New.
10121         (aarch64_init_simd_builtins): Refactor.
10122         (aarch64_init_crc32_builtins): Fixup with qualifier.
10123         * config/aarch64/aarch64-protos.h
10124         (aarch64_mangle_builtin_type): Export.
10125         * config/aarch64/aarch64-simd-builtin-types.def: New.
10126         * config/aarch64/aarch64.c (aarch64_simd_mangle_map): Remove.
10127         (aarch64_mangle_type): Refactor.
10128         * config/aarch64/arm_neon.h: Declare vector types based on
10129         internal types.
10130         * config/aarch64/t-aarch64: Update dependency.
10131
10132 2014-11-04  Pat Haugen  <pthaugen@us.ibm.com>
10133
10134         * config/rs6000/rs6000.c (atomic_hold_decl, atomic_clear_decl,
10135         atomic_update_decl): Guard declaration with #ifdef.
10136
10137 2014-11-04  Marek Polacek  <polacek@redhat.com>
10138
10139         * sanopt.c (sanopt_optimize_walker): Remove unused variables.
10140
10141 2014-11-04  Marek Polacek  <polacek@redhat.com>
10142
10143         * Makefile.in (OBJS): Add sanopt.o.
10144         (GTFILES): Add sanopt.c.
10145         * asan.h (asan_expand_check_ifn): Declare.
10146         * asan.c (asan_expand_check_ifn): No longer static.
10147         (class pass_sanopt, pass_sanopt::execute, make_pass_sanopt): Move...
10148         * sanopt.c: ...here.  New file.
10149
10150 2014-11-04  Jiong Wang  <jiong.wang@arm.com>
10151             Wilco Dijkstra  <wilco.dijkstra@arm.com>
10152
10153         PR target/63293
10154         * config/aarch64/aarch64.c (aarch64_expand_epiloue): Add barriers before
10155         stack adjustment.
10156
10157 2014-11-04  Bernd Schmidt  <bernds@codesourcery.com>
10158
10159         * combine.c (combine_simplify_rtx): In STORE_FLAG_VALUE == -1 case,
10160         also verify that mode is equal to the mode of op0.
10161
10162         * bb-reorder.c (get_uncond_jump_length): Avoid using delete_insn,
10163         emit into a sequence instead.
10164
10165 2014-11-04  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
10166
10167         * config/sh/sh.c (emit_fpu_switch): Drop unused automatic variable.
10168
10169 2014-11-04  Alan Lawrence  <alan.lawrence@arm.com>
10170
10171         config/arm/neon.md (reduc_smin_<mode> *2): Rename to...
10172         (reduc_smin_scal_<mode> *2): ...this; extract scalar result.
10173         (reduc_smax_<mode> *2): Rename to...
10174         (reduc_smax_scal_<mode> *2): ...this; extract scalar result.
10175         (reduc_umin_<mode> *2): Rename to...
10176         (reduc_umin_scal_<mode> *2): ...this; extract scalar result.
10177         (reduc_umax_<mode> *2): Rename to...
10178         (reduc_umax_scal_<mode> *2): ...this; extract scalar result.
10179
10180 2014-11-04  Alan Lawrence  <alan.lawrence@arm.com>
10181
10182         config/arm/neon.md (reduc_plus_*): Rename to...
10183         (reduc_plus_scal_*): ...this; reduce to temp and extract scalar result.
10184
10185 2014-11-04  Michael Collison <michael.collison@linaro.org>
10186
10187         * config/aarch64/iterators.md (lconst_atomic): New mode attribute
10188         to support constraints for CONST_INT in atomic operations.
10189         * config/aarch64/atomics.md
10190         (atomic_<atomic_optab><mode>): Use lconst_atomic constraint.
10191         (atomic_nand<mode>): Likewise.
10192         (atomic_fetch_<atomic_optab><mode>): Likewise.
10193         (atomic_fetch_nand<mode>): Likewise.
10194         (atomic_<atomic_optab>_fetch<mode>): Likewise.
10195         (atomic_nand_fetch<mode>): Likewise.
10196
10197 2014-11-04  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
10198
10199         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Fix typo in definition
10200         of __ARM_FEATURE_IDIV.
10201
10202 2014-11-04  Marek Polacek  <polacek@redhat.com>
10203
10204         * ubsan.c (instrument_object_size): Optimize [x & CST] array accesses.
10205
10206 2014-11-03  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
10207
10208         * config/rx/rx.c (rx_handle_func_attribute): Mark unused argument.
10209
10210 2014-11-04  Zhenqiang Chen  <zhenqiang.chen@arm.com>
10211
10212         Revert:
10213         2014-11-03  Zhenqiang Chen  <zhenqiang.chen@arm.com>
10214         * ifcvt.c (noce_emit_cmove, noce_get_alt_condition, noce_get_condition):
10215         Allow CC mode if HAVE_cbranchcc4.
10216
10217 2014-11-03  Dominik Vogt  <vogt@linux.vnet.ibm.com>
10218
10219         * godump.c (go_format_type): Rewrite RECORD_TYPE nad UNION_TYPE support
10220         with -fdump-go-spec.  Anonymous substructures are now flattened and
10221         replaced by their fields (record) or the first named, non-bitfield
10222         field (union).
10223
10224 2014-11-04  Manuel López-Ibáñez  <manu@gcc.gnu.org>
10225
10226         * input.c (expand_location_to_spelling_point): Fix typo.
10227         (expansion_point_location_if_in_system_header): Fix comment.
10228
10229 2014-11-03  Pitchumani Sivanupandi <pitchumani.s@atmel.com>
10230
10231         * config/avr/gen-avr-mmcu-specs.c: Remove unnecessary format specifier.
10232
10233 2014-11-03  Richard Biener  <rguenther@suse.de>
10234
10235         * tree-eh.c (operation_could_trap_helper_p): Handle conversions
10236         like ordinary operations.
10237         * gimplify.c (gimplify_conversion): Gimplify CONVERT_EXPR
10238         as NOP_EXPR.
10239
10240 2014-11-03  Joseph Myers  <joseph@codesourcery.com>
10241
10242         * configure.ac (TARGET_GLIBC_MAJOR, TARGET_GLIBC_MINOR): Define
10243         macros.
10244         * configure, config.h.in: Regenerate.
10245         * config/rs6000/linux.h [TARGET_GLIBC_MAJOR > 2 ||
10246         (TARGET_GLIBC_MAJOR == 2 && TARGET_GLIBC_MINOR >= 19)]
10247         (RS6000_GLIBC_ATOMIC_FENV): New macro.
10248         * config/rs6000/linux64.h [TARGET_GLIBC_MAJOR > 2 ||
10249         (TARGET_GLIBC_MAJOR == 2 && TARGET_GLIBC_MINOR >= 19)]
10250         (RS6000_GLIBC_ATOMIC_FENV): New macro.
10251         * config/rs6000/rs6000.c (atomic_hold_decl, atomic_clear_decl)
10252         (atomic_update_decl): New static variables.
10253         (rs6000_atomic_assign_expand_fenv) [RS6000_GLIBC_ATOMIC_FENV]:
10254         Generate calls to __atomic_feholdexcept, __atomic_feclearexcept
10255         and __atomic_feupdateenv for soft-float and no-FPRs.
10256
10257 2014-11-03  Richard Biener  <rguenther@suse.de>
10258
10259         * match.pd: Add two abs patterns.  Announce tree_expr_nonnegative_p.
10260         Also drop bogus FLOAT_EXPR and FIX_TRUNC_EXPR.
10261         * fold-const.c (fold_unary_loc): Remove them here.
10262         (tree_unary_nonnegative_warnv_p): Use CASE_CONVERT.
10263         * gimple-fold.c (fold_gimple_assign): Remove now obsolete
10264         GIMPLE_UNARY_RHS case.
10265         (gimple_fold_stmt_to_constant_1): Likewise.
10266         (replace_stmt_with_simplification): Fix inverted comparison.
10267
10268 2014-11-03  Marc Glisse  <marc.glisse@inria.fr>
10269
10270         PR tree-optimization/60770
10271         * tree-into-ssa.c (rewrite_update_stmt): Return whether the
10272         statement should be removed.
10273         (maybe_register_def): Likewise. Replace clobbers with default
10274         definitions.
10275         (rewrite_dom_walker::before_dom_children): Remove statement if
10276         rewrite_update_stmt says so.
10277         * tree-ssa-live.c: Include tree-ssa.h.
10278         (set_var_live_on_entry): Do not mark undefined variables as live.
10279         (verify_live_on_entry): Do not check undefined variables.
10280         * tree-ssa.h (ssa_undefined_value_p): New parameter for the case
10281         of partially undefined variables.
10282         * tree-ssa.c (ssa_undefined_value_p): Likewise.
10283         (execute_update_addresses_taken): Do not drop clobbers.
10284
10285 2014-11-03  Marc Glisse  <marc.glisse@inria.fr>
10286
10287         PR tree-optimization/63666
10288         * fold-const.c: Include "optabs.h".
10289         (fold_ternary_loc) <VEC_PERM_EXPR>: Avoid canonicalizing a
10290         can_vec_perm_p permutation to one that is not.
10291
10292 2014-11-03  Zhenqiang Chen  <zhenqiang.chen@arm.com>
10293
10294         * ifcvt.c (noce_try_store_flag_mask): Check rtx cost.
10295
10296 2014-11-03  Andrew Pinski  <apinski@cavium.com>
10297
10298         * config/mips/mips-cpus.def (octeon3): New cpu.
10299         * config/mips/mips.c (mips_rtx_cost_data): Add octeon3.
10300         (mips_print_operand <case 'T', case 't'>): Fix a bug as the mode
10301         of the comparison no longer matches mode of the operands.
10302         (mips_issue_rate): Handle PROCESSOR_OCTEON3.
10303         * config/mips/mips.h (TARGET_OCTEON):  Add Octeon3.
10304         (TARGET_OCTEON2): Likewise.
10305         (TUNE_OCTEON): Add Octeon3.
10306         * config/mips/mips.md (processor): Add octeon3.
10307         * config/mips/octeon.md (octeon_fpu): New automaton and cpu_unit.
10308         (octeon_arith): Add octeon3.
10309         (octeon_condmove): Remove.
10310         (octeon_condmove_o1): New reservation.
10311         (octeon_condmove_o2): New reservation.
10312         (octeon_condmove_o3_int_on_cc): New reservation.
10313         (octeon_load_o2): Add octeon3.
10314         (octeon_cop_o2): Likewise.
10315         (octeon_store): Likewise.
10316         (octeon_brj_o2): Likewise.
10317         (octeon_imul3_o2): Likewise.
10318         (octeon_imul_o2): Likewise.
10319         (octeon_mfhilo_o2): Likewise.
10320         (octeon_imadd_o2): Likewise.
10321         (octeon_idiv_o2_si): Likewise.
10322         (octeon_idiv_o2_di): Likewise.
10323         (octeon_fpu): Add to the automaton.
10324         (octeon_fpu): New cpu unit.
10325         (octeon_condmove_o2): Check for non floating point modes.
10326         (octeon_load_o2): Add prefetchx.
10327         (octeon_cop_o2): Don't check for octeon3.
10328         (octeon3_faddsubcvt): New reservation.
10329         (octeon3_fmul): Likewise.
10330         (octeon3_fmadd): Likewise.
10331         (octeon3_div_sf): Likewise.
10332         (octeon3_div_df): Likewise.
10333         (octeon3_sqrt_sf): Likewise.
10334         (octeon3_sqrt_df): Likewise.
10335         (octeon3_rsqrt_sf): Likewise.
10336         (octeon3_rsqrt_df): Likewise.
10337         (octeon3_fabsnegmov): Likewise.
10338         (octeon_fcond): Likewise.
10339         (octeon_fcondmov): Likewise.
10340         (octeon_fpmtc1): Likewise.
10341         (octeon_fpmfc1): Likewise.
10342         (octeon_fpload): Likewise.
10343         (octeon_fpstore): Likewise.
10344         * config/mips/mips-tables.opt: Regenerate.
10345         * doc/invoke.texi (-march=@var{arch}): Add octeon3.
10346
10347 2014-11-03  Zhenqiang Chen  <zhenqiang.chen@arm.com>
10348
10349         * ifcvt.c (noce_emit_cmove, noce_get_alt_condition, noce_get_condition):
10350         Allow CC mode if HAVE_cbranchcc4.
10351
10352 2014-11-02  Richard Sandiford  <richard.sandiford@arm.com>
10353
10354         * config/arc/arc.c (write_ext_corereg_1): Delete.
10355         (arc_write_ext_corereg): Use FOR_EACH_SUBRTX.
10356
10357 2014-11-02  Richard Sandiford  <richard.sandiford@arm.com>
10358
10359         * config/arc/arc.c (arc600_corereg_hazard_1): Delete.
10360         (arc600_corereg_hazard): Use FOR_EACH_SUBRTX.
10361
10362 2014-11-02  Richard Sandiford  <richard.sandiford@arm.com>
10363
10364         * config/arc/arc.c (arc_rewrite_small_data_p): Constify argument.
10365         (small_data_pattern_1): Delete.
10366         (small_data_pattern): Use FOR_EACH_SUBRTX.
10367
10368 2014-11-02  Richard Sandiford  <richard.sandiford@arm.com>
10369
10370         * config/arc/arc.c: Include rtl-iter.h.
10371         (arc_rewrite_small_data_1): Delete.
10372         (arc_rewrite_small_data): Use FOR_EACH_SUBRTX_PTR.
10373
10374 2014-11-02  Michael Collison  <michael.collison@linaro.org>
10375
10376         * config/arm/arm.h (CLZ_DEFINED_VALUE_AT_ZERO) : Update
10377         to support vector modes.
10378         (CTZ_DEFINED_VALUE_AT_ZERO): Ditto.
10379
10380 2014-11-01  Andrew MacLeod  <amacleod@redhat,com>
10381
10382         * optabs.h: Flatten insn-codes.h to source files.  Move some prototypes
10383         and structs to genopinit.c.  Adjust protyoptypes to match optabs.c.
10384         * genopinit.c (main): Emit prototypes and structs into insn-opinit.h.
10385         * optabs.c: (gen_move_insn): Move to expr.c.
10386         * expr.h: Move protypes and enums to optabs.h.
10387         * expr.c: (gen_move_insn): Relocate from optabs.c.
10388         * genemit.c (main): Include insn-codes.h.
10389         * gengtype.c (open_base_files): Include insn-codes.h.
10390         * asan.c: Include insn-codes.h.
10391         * bb-reorder.c: Ditto.
10392         * builtins.c: Ditto.
10393         * calls.c: Ditto.
10394         * cfgexpand.c: Ditto.
10395         * cilk-common.c: Ditto.
10396         * combine.c: Ditto.
10397         * dojump.c: Ditto.
10398         * dse.c: Ditto.
10399         * except.c: Ditto.
10400         * explow.c: Ditto.
10401         * expmed.c: Ditto.
10402         * function.c: Ditto.
10403         * ifcvt.c: Ditto.
10404         * internal-fn.c: Ditto.
10405         * loop-unroll.c: Ditto.
10406         * lra.c: Ditto.
10407         * modulo-sched.c: Ditto.
10408         * omp-low.c: Ditto.
10409         * postreload.c: Ditto.
10410         * ree.c: Ditto.
10411         * reload.c: Ditto.
10412         * reload1.c: Ditto.
10413         * shrink-wrap.c: Ditto.
10414         * simplify-rtx.c: Ditto.
10415         * stmt.c: Ditto.
10416         * target-globals.c: Ditto.
10417         * targhooks.c: Ditto.
10418         * toplev.c: Ditto.
10419         * tree-if-conv.c: Ditto.
10420         * tree-ssa-forwprop.c: Ditto.
10421         * tree-ssa-loop-prefetch.c: Ditto.
10422         * tree-ssa-math-opts.c: Ditto.
10423         * tree-ssa-phiopt.c: Ditto.
10424         * tree-ssa-reassoc.c: Ditto.
10425         * tree-switch-conversion.c: Ditto.
10426         * tree-vect-data-refs.c: Ditto.
10427         * tree-vect-generic.c: Ditto.
10428         * tree-vect-loop.c: Ditto.
10429         * tree-vect-patterns.c: Ditto.
10430         * tree-vect-slp.c: Ditto.
10431         * tree-vect-stmts.c: Ditto.
10432         * tree-vrp.c: Ditto.
10433         * value-prof.c: Ditto.
10434         * config/aarch64/aarch64-builtins.c: Ditto.
10435         * config/alpha/alpha.c: Ditto.
10436         * config/arm/arm.c: Ditto.
10437         * config/cris/cris.c: Ditto.
10438         * config/epiphany/epiphany.c: Ditto.
10439         * config/frv/frv.c: Ditto.
10440         * config/h8300/h8300.c: Ditto.
10441         * config/ia64/ia64.c: Ditto.
10442         * config/iq2000/iq2000.c: Ditto.
10443         * config/m32c/m32c.c: Ditto.
10444         * config/mep/mep.c: Ditto.
10445         * config/microblaze/microblaze.c: Ditto.
10446         * config/mips/mips.c: Ditto.
10447         * config/mn10300/mn10300.c: Ditto.
10448         * config/moxie/moxie.c: Ditto.
10449         * config/msp430/msp430.c: Ditto.
10450         * config/nios2/nios2.c: Ditto.
10451         * config/pa/pa.c: Ditto.
10452         * config/rl78/rl78.c: Ditto.
10453         * config/rs6000/rs6000.c: Ditto.
10454         * config/rx/rx.c: Ditto.
10455         * config/s390/s390.c: Ditto.
10456         * config/sh/sh.c: Ditto.
10457         * config/sh/sh_treg_combine.cc: Ditto.
10458         * config/spu/spu.c: Ditto.
10459         * config/stormy16/stormy16.c: Ditto.
10460         * config/tilegx/mul-tables.c: Ditto.
10461         * config/tilegx/tilegx.c: Ditto.
10462         * config/tilepro/mul-tables.c: Ditto.
10463         * config/tilepro/tilepro.c: Ditto.
10464         * config/vax/vax.c: Ditto.
10465
10466 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10467
10468         * doc/tm.texi.in (MOVE_BY_PIECES_P): Remove.
10469         (CLEAR_BY_PIECES_P): Likewise.
10470         (SET_BY_PIECES_P): Likewise.
10471         (STORE_BY_PIECES_P): Likewise.
10472         * doc/tm.texi: Regenerate.
10473         * system.h: Poison MOVE_BY_PIECES_P, CLEAR_BY_PIECES_P,
10474         SET_BY_PIECES_P, STORE_BY_PIECES_P.
10475         * expr.c (MOVE_BY_PIECES_P): Remove.
10476         (CLEAR_BY_PIECES_P): Likewise.
10477         (SET_BY_PIECES_P): Likewise.
10478         (STORE_BY_PIECES_P): Likewise.
10479         (can_move_by_pieces): Rewrite in terms of
10480         targetm.use_by_pieces_infrastructure_p.
10481         (emit_block_move_hints): Likewise.
10482         (can_store_by_pieces): Likewise.
10483         (store_by_pieces): Likewise.
10484         (clear_storage_hints): Likewise.
10485         (emit_push_insn): Likewise.
10486         (expand_constructor): Likewise.
10487
10488 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10489
10490         * config/aarch64/aarch64.c
10491         (aarch64_use_by_pieces_infrastructre_p): New.
10492         (TARGET_USE_BY_PIECES_INFRASTRUCTURE): Likewise.
10493         * config/aarch64/aarch64.h (STORE_BY_PIECES_P): Delete.
10494
10495 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10496
10497         * config/mips/mips.h (MOVE_BY_PIECES_P): Remove.
10498         (STORE_BY_PIECES_P): Likewise.
10499         * config/mips/mips.c (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): New.
10500         (mips_move_by_pieces_p): Rename to...
10501         (mips_use_by_pieces_infrastructure_p): ...this, use new hook
10502         parameters, use the default hook implementation as a
10503         fall-back.
10504
10505 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10506
10507         * config/sh/sh.c (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): New.
10508         (sh_use_by_pieces_infrastructure_p): Likewise.
10509         * config/sh/sh.h (MOVE_BY_PIECES_P): Remove.
10510         (STORE_BY_PIECES_P): Likewise.
10511         (SET_BY_PIECES_P): Likewise.
10512
10513 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10514
10515         * config/arc/arc.c (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): New.
10516         (arc_use_by_pieces_infrastructure_p): Likewise.
10517         * confir/arc/arc.h (MOVE_BY_PIECES_P): Delete.
10518         (CAN_MOVE_BY_PIECES): Likewise.
10519
10520 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10521
10522         * config/s390/s390.c (s390_use_by_pieces_infrastructure_p): New.
10523         (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): Likewise.
10524         * config/s390/s390.h (MOVE_BY_PIECES_P): Remove.
10525         (CLEAR_BY_PIECES): Likewise.
10526         (SET_BY_PIECES): Likewise.
10527         (STORE_BY_PIECES): Likewise.
10528
10529 2014-11-01  James Greenhalgh  <james.greenhalgh@arm.com>
10530
10531         * target.def (use_by_pieces_infrastructure_p): New.
10532         * doc/tm.texi.in (MOVE_BY_PIECES_P): Describe that this macro
10533         is deprecated.
10534         (STORE_BY_PIECES_P): Likewise.
10535         (CLEAR_BY_PIECES_P): Likewise.
10536         (SET_BY_PIECES_P): Likewise.
10537         (TARGET_MOVE_BY_PIECES_PROFITABLE_P): Add hook.
10538         * doc/tm.texi: Regenerate.
10539         * expr.c (MOVE_BY_PIECES_P): Rewrite in terms of
10540         TARGET_USE_BY_PIECES_INFRASTRUCTURE_P.
10541         (STORE_BY_PIECES_P): Likewise.
10542         (CLEAR_BY_PIECES_P): Likewise.
10543         (SET_BY_PIECES_P): Likewise.
10544         (STORE_MAX_PIECES): Move to...
10545         * defaults.h (STORE_MAX_PIECES): ...here.
10546         * targhooks.c (get_move_ratio): New.
10547         (default_use_by_pieces_infrastructure_p): Likewise.
10548         * targhooks.h (default_use_by_pieces_infrastructure_p): New.
10549         * target.h (by_pieces_operation): New.
10550
10551 2014-10-31  Uros Bizjak  <ubizjak@gmail.com>
10552
10553         PR target/63702
10554         * config/i386/i386.c (ix86_expand_args_builtin): Remove extra
10555         assignment to 'nargs' variable.
10556
10557 2014-10-31  Uros Bizjak  <ubizjak@gmail.com>
10558
10559         PR target/63620
10560         * config/i386/i386-protos.h (ix86_use_pseudo_pic_reg): Declare.
10561         * config/i386/i386.c (ix86_use_pseudo_pic_reg): Export.
10562         * config/i386/i386.md (*pushtf): Allow only CONST_DOUBLEs that won't
10563         be reloaded through memory.
10564         (*pushxf): Ditto.
10565         (*pushdf): Ditto.
10566
10567 2014-10-31  Jakub Jelinek  <jakub@redhat.com>
10568
10569         PR rtl-optimization/63659
10570         * ree.c (update_reg_equal_equiv_notes): New function.
10571         (combine_set_extension, transform_ifelse): Use it.
10572
10573 2014-10-31  Jeff Law  <law@redhat.com>
10574
10575         * doc/contrib.texi: Add contribution notes for Balaji Iyer (Cilk+)
10576         and Jonny Grant (collect2).
10577
10578 2014-10-31  Richard Biener  <rguenther@suse.de>
10579
10580         * builtins.c (fold_builtin_atomic_always_lock_free): Use
10581         CONVERT_EXPR_P, CONVERT_EXPR_CODE_P and CASE_CONVERT where
10582         approprate.
10583         (fold_builtin_expect): Likewise.
10584         (integer_valued_real_p): Likewise.
10585         * cfgexpand.c (expand_debug_expr): Likewise.
10586         * ipa-inline-analysis.c (eliminated_by_inlining_prob): Likewise.
10587         (find_foldable_builtin_expect): Likewise.
10588         * trans-mem.c (thread_private_new_memory): Likewise.
10589         * tree-affine.c (aff_combination_expand): Likewise.
10590         * tree-data-ref.c (initialize_matrix_A): Likewise.
10591         * tree-inline.c (copy_bb): Likewise.
10592         * tree-pretty-print.c (dump_function_name): Likewise.
10593         (print_call_name): Likewise.
10594         * tree-ssa-forwprop.c (constant_pointer_difference): Likewise.
10595         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Likewise.
10596         * tree-vect-generic.c (expand_vector_operations_1): Likewise.
10597         * tree-vect-patterns.c (vect_handle_widen_op_by_const): Likewise.
10598         (vect_recog_widen_mult_pattern): Likewise.
10599         (vect_operation_fits_smaller_type): Likewise.
10600         * tree-vrp.c (find_assert_locations_1): Likewise.
10601         * tree-ssa-dom.c (initialize_hash_element): Canonicalize
10602         converts to NOP_EXPR.
10603
10604 2014-10-31  Richard Biener  <rguenther@suse.de>
10605
10606         * genmatch.c (expr::gen_transform): Use NOP_EXPRs instead of
10607         CONVERT_EXPRs in generated code.
10608         (dt_simplify::gen): Likewise.
10609
10610 2014-10-31  Evgeny Stupachenko  <evstupac@gmail.com>
10611
10612         PR target/63534
10613         * config/i386/i386.c (ix86_init_pic_reg): Emit SET_GOT to
10614         REAL_PIC_OFFSET_TABLE_REGNUM for mcount profiling.
10615         (ix86_save_reg): Save REAL_PIC_OFFSET_TABLE_REGNUM when profiling
10616         using mcount in 32bit PIC mode.
10617         (ix86_elim_entry_set_got): New.
10618         (ix86_expand_prologue): For the mcount profiling emit new SET_GOT
10619         in PROLOGUE, delete initial if possible.
10620
10621 2014-10-31  Eric Botcazou  <ebotcazou@adacore.com>
10622
10623         * ipa-inline.c (want_inline_small_function_p): Fix typo and formatting.
10624         (want_inline_function_to_all_callers_p): Fix formatting and simplify.
10625
10626 2014-10-31  Thomas Preud'homme  <thomas.preudhomme@arm.com>
10627
10628         PR tree-optimization/63259
10629         * tree-ssa-math-opts.c (bswap_replace): Replace expression by a
10630         rotation left if it is a 16 bit byte swap.
10631         (pass_optimize_bswap::execute): Also consider bswap in LROTATE_EXPR
10632         and RROTATE_EXPR statements if it is a byte rotation.
10633
10634 2014-10-31  Jakub Jelinek  <jakub@redhat.com>
10635
10636         PR sanitizer/63697
10637         * tree-vrp.c (simplify_internal_call_using_ranges): For subcode ==
10638         MINUS_EXPR, check overflow on vr0.min - vr1.max and vr0.max - vr1.min
10639         instead of vr0.min - vr1.min and vr0.max - vr1.max.
10640
10641 2014-10-31  Max Ostapenko  <m.ostapenko@partner.samsung.com>
10642
10643         PR ipa/63696
10644         * ipa-icf.c (sem_function::~sem_function): Change free to delete
10645         to avoid alloc-dealloc mismatch with new, called in
10646         ipa_icf::sem_function::init.
10647
10648 2014-10-30  Felix Yang  <felix.yang@huawei.com>
10649
10650         * config/xtensa/xtensa.h (TARGET_LOOPS): New Macro.
10651         * config/xtensa/xtensa.c: Include dumpfile.h and hw-doloop.h.
10652         (xtensa_reorg, xtensa_reorg_loops): New.
10653         (xtensa_can_use_doloop_p, xtensa_invalid_within_doloop): New.
10654         (hwloop_optimize, hwloop_fail, hwloop_pattern_reg): New.
10655         (xtensa_emit_loop_end): Emit the zero-overhead loop end label.
10656         (xtensa_doloop_hooks): Define.
10657         * config/xtensa/xtensa.md (doloop_end, loop_end): New
10658         (zero_cost_loop_start): Rewritten.
10659         (zero_cost_loop_end): Likewise.
10660
10661 2014-10-30  Steve Ellcey  <sellcey@imgtec.com>
10662
10663         * config.gcc (mips*-*-linux*): Combine 32 and 64 bit cases.
10664
10665 2014-10-30  Richard Biener  <rguenther@suse.de>
10666
10667         * genmatch.c: Remove <map>, <utility> and <string> includes.
10668         Include ggc.h and hash-map.h.
10669         (ggc_internal_cleared_alloc): Provide stub definition.
10670         (ggc_free): Likewise.
10671         (struct capture_id_map_hasher): New traits for hash_map.
10672         (cid_map_t): New typedef.
10673         (everywhere else): Replace std::map use with cid_map_t.
10674         * hash-map.h (hash_map::elements): New member function.
10675         * Makefile.in (build/genmatch.o): Add $(HASH_TABLE_H),
10676         hash-map.h and $(GGC_H) as dependency.
10677
10678 2014-10-30  Richard Biener  <rguenther@suse.de>
10679
10680         * genmatch.c (capture_info::walk_c_expr): Ignore capture
10681         uses inside TREE_TYPE ().
10682         * gimple-ssa-strength-reduction.c (stmt_cost): Use CASE_CONVERT.
10683         (find_candidates_dom_walker::before_dom_children): Likewise.
10684         (replace_mult_candidate): Use CONVERT_EXPR_CODE_P.
10685         (replace_profitable_candidates): Likewise.
10686         * tree-ssa-dom.c (initialize_hash_element): Canonicalize
10687         CONVERT_EXPR_CODE_P to CONVERT_EXPR.
10688         * convert.c (convert_to_integer): Use CASE_CONVERT.
10689
10690 2014-10-30  Richard Biener  <rguenther@suse.de>
10691
10692         * match.pd: Implement more patterns that simplify to a single value.
10693         * fold-const.c (fold_binary_loc): Remove them here.
10694         * tree-ssa-forwprop.c (simplify_bitwise_binary): Likewise.
10695         (fwprop_ssa_val): Remove restriction on single uses.
10696
10697 2014-10-30  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
10698
10699         * config/avr/driver-avr.c (avr_set_current_device): Remove.
10700
10701 2014-10-30  Martin Liska  <mliska@suse.cz>
10702
10703         PR ipa/63574
10704         PR ipa/63664
10705         * ipa-icf-gimple.c (func_checker::parse_labels): Missing comment added.
10706         (func_checker::compare_gimple_label): Simlified comparison introduced.
10707         * ipa-icf-gimple.h: Missing comment added.
10708
10709 2014-10-30  Jeff Law  <law@redhat.com>
10710
10711         * config/pa/pa-protos.h (pa_output_arg_descriptor): Strengthen
10712         argument from rtx to rtx_insn *.
10713         (compute_movmem_length, compute_clrmem_length): Likewise.
10714         (copy_fp_args, length_fp_args): Likewise.
10715         * config/pa/pa.c (legitimize_pic_address): Promote local variable
10716         "insn" from rtx to rtx_insn *.
10717         (legitimize_tls_address, pa_emit_move_sequence): Likewise.
10718         (pa_output_block_move, store_reg, store_reg_modify): Likewise.
10719         (set_reg_plus_d, pa_expand_prologue, hppa_profile_hook): Likewise.
10720         (branch_to_delay_slot_p, branch_needs_nop_p, use_skip_p): Likewise.
10721         (pa_output_arg_descriptor): Strengthen argument to an rtx_insn *.
10722         (compute_movmem_length, compute_clrmem_length): Likewise.
10723         (copy_fp-args, length_fp_args): Likewise.
10724
10725 2014-10-29  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
10726
10727         * config/arm/arm.h (MACHMODE): Treat machine_mode as a
10728         scalar typedef.
10729         (CUMULATIVE_ARGS): Guard against target includes.
10730         (machine_function): Likewise.
10731
10732 2014-10-29  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
10733
10734         * config/aarch64/aarch64.c (aarch64_madd_needs_nop): Restore
10735         recog state after aarch64_prev_real_insn call.
10736
10737 2014-10-29  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
10738
10739         * config/aarch64/aarch64.h (MACHMODE): Add 'enum' to machine_mode.
10740
10741 2014-10-29  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
10742
10743         * config/arm/arm.h (MACHMODE): Add 'enum' to machine_mode.
10744         (struct machine_function): Gate definition on
10745         !defined(USED_FOR_TARGET).
10746
10747 2014-10-29  DJ Delorie  <dj@redhat.com>
10748
10749         * expmed.c (strict_volatile_bitfield_p): Fix off-by-one error.
10750
10751 2014-10-29  Martin Liska  <mliska@suse.cz>
10752
10753         PR ipa/63587
10754         * cgraphunit.c (cgraph_node::expand_thunk): Only VAR_DECLs are put
10755         to local declarations.
10756         * function.c (add_local_decl): Implementation moved from header
10757         file, assert introduced for tree type.
10758         * function.h: Likewise.
10759
10760 2014-10-29  Dominik Vogt  <vogt@linux.vnet.ibm.com>
10761
10762         * godump.c (go_format_type): Represent "float _Complex" and
10763         "double _Complex" as complex64 or complex128 in Go, as appropriate.
10764
10765 2014-10-29  Richard Biener  <rguenther@suse.de>
10766
10767         * match.pd: Implement a first set of conversion patterns.
10768         * fold-const.c (fold_unary_loc): Remove them here.
10769         * tree-ssa-forwprop.c (simplify_vce): Remove.
10770         (pass_forwprop::execute): Do not call simplify_vce.
10771
10772 2014-10-29  Richard Sandiford  <richard.sandiford@arm.com>
10773
10774         * addresses.h, alias.c, asan.c, auto-inc-dec.c, bt-load.c, builtins.c,
10775         builtins.h, caller-save.c, calls.c, calls.h, cfgexpand.c, cfgloop.h,
10776         cfgrtl.c, combine.c, compare-elim.c, config/aarch64/aarch64-builtins.c,
10777         config/aarch64/aarch64-protos.h, config/aarch64/aarch64-simd.md,
10778         config/aarch64/aarch64.c, config/aarch64/aarch64.h,
10779         config/aarch64/aarch64.md, config/alpha/alpha-protos.h,
10780         config/alpha/alpha.c, config/arc/arc-protos.h, config/arc/arc.c,
10781         config/arc/arc.h, config/arc/predicates.md,
10782         config/arm/aarch-common-protos.h, config/arm/aarch-common.c,
10783         config/arm/arm-protos.h, config/arm/arm.c, config/arm/arm.h,
10784         config/arm/arm.md, config/arm/neon.md, config/arm/thumb2.md,
10785         config/avr/avr-log.c, config/avr/avr-protos.h, config/avr/avr.c,
10786         config/avr/avr.md, config/bfin/bfin-protos.h, config/bfin/bfin.c,
10787         config/c6x/c6x-protos.h, config/c6x/c6x.c, config/c6x/c6x.md,
10788         config/cr16/cr16-protos.h, config/cr16/cr16.c,
10789         config/cris/cris-protos.h, config/cris/cris.c, config/cris/cris.md,
10790         config/darwin-protos.h, config/darwin.c,
10791         config/epiphany/epiphany-protos.h, config/epiphany/epiphany.c,
10792         config/epiphany/epiphany.md, config/fr30/fr30.c,
10793         config/frv/frv-protos.h, config/frv/frv.c, config/frv/predicates.md,
10794         config/h8300/h8300-protos.h, config/h8300/h8300.c,
10795         config/i386/i386-builtin-types.awk, config/i386/i386-protos.h,
10796         config/i386/i386.c, config/i386/i386.md, config/i386/predicates.md,
10797         config/i386/sse.md, config/i386/sync.md, config/ia64/ia64-protos.h,
10798         config/ia64/ia64.c, config/iq2000/iq2000-protos.h,
10799         config/iq2000/iq2000.c, config/iq2000/iq2000.md,
10800         config/lm32/lm32-protos.h, config/lm32/lm32.c,
10801         config/m32c/m32c-protos.h, config/m32c/m32c.c,
10802         config/m32r/m32r-protos.h, config/m32r/m32r.c,
10803         config/m68k/m68k-protos.h, config/m68k/m68k.c,
10804         config/mcore/mcore-protos.h, config/mcore/mcore.c,
10805         config/mcore/mcore.md, config/mep/mep-protos.h, config/mep/mep.c,
10806         config/microblaze/microblaze-protos.h, config/microblaze/microblaze.c,
10807         config/mips/mips-protos.h, config/mips/mips.c,
10808         config/mmix/mmix-protos.h, config/mmix/mmix.c,
10809         config/mn10300/mn10300-protos.h, config/mn10300/mn10300.c,
10810         config/moxie/moxie.c, config/msp430/msp430-protos.h,
10811         config/msp430/msp430.c, config/nds32/nds32-cost.c,
10812         config/nds32/nds32-intrinsic.c, config/nds32/nds32-md-auxiliary.c,
10813         config/nds32/nds32-protos.h, config/nds32/nds32.c,
10814         config/nios2/nios2-protos.h, config/nios2/nios2.c,
10815         config/pa/pa-protos.h, config/pa/pa.c, config/pdp11/pdp11-protos.h,
10816         config/pdp11/pdp11.c, config/rl78/rl78-protos.h, config/rl78/rl78.c,
10817         config/rs6000/altivec.md, config/rs6000/rs6000-c.c,
10818         config/rs6000/rs6000-protos.h, config/rs6000/rs6000.c,
10819         config/rs6000/rs6000.h, config/rx/rx-protos.h, config/rx/rx.c,
10820         config/s390/predicates.md, config/s390/s390-protos.h,
10821         config/s390/s390.c, config/s390/s390.h, config/s390/s390.md,
10822         config/sh/predicates.md, config/sh/sh-protos.h, config/sh/sh.c,
10823         config/sh/sh.md, config/sparc/predicates.md,
10824         config/sparc/sparc-protos.h, config/sparc/sparc.c,
10825         config/sparc/sparc.md, config/spu/spu-protos.h, config/spu/spu.c,
10826         config/stormy16/stormy16-protos.h, config/stormy16/stormy16.c,
10827         config/tilegx/tilegx-protos.h, config/tilegx/tilegx.c,
10828         config/tilegx/tilegx.md, config/tilepro/tilepro-protos.h,
10829         config/tilepro/tilepro.c, config/v850/v850-protos.h,
10830         config/v850/v850.c, config/v850/v850.md, config/vax/vax-protos.h,
10831         config/vax/vax.c, config/vms/vms-c.c, config/xtensa/xtensa-protos.h,
10832         config/xtensa/xtensa.c, coverage.c, cprop.c, cse.c, cselib.c, cselib.h,
10833         dbxout.c, ddg.c, df-problems.c, dfp.c, dfp.h, doc/md.texi,
10834         doc/rtl.texi, doc/tm.texi, doc/tm.texi.in, dojump.c, dse.c,
10835         dwarf2cfi.c, dwarf2out.c, dwarf2out.h, emit-rtl.c, emit-rtl.h,
10836         except.c, explow.c, expmed.c, expmed.h, expr.c, expr.h, final.c,
10837         fixed-value.c, fixed-value.h, fold-const.c, function.c, function.h,
10838         fwprop.c, gcse.c, gengenrtl.c, genmodes.c, genopinit.c, genoutput.c,
10839         genpreds.c, genrecog.c, gensupport.c, gimple-ssa-strength-reduction.c,
10840         graphite-clast-to-gimple.c, haifa-sched.c, hooks.c, hooks.h, ifcvt.c,
10841         internal-fn.c, ira-build.c, ira-color.c, ira-conflicts.c, ira-costs.c,
10842         ira-emit.c, ira-int.h, ira-lives.c, ira.c, ira.h, jump.c, langhooks.h,
10843         libfuncs.h, lists.c, loop-doloop.c, loop-invariant.c, loop-iv.c,
10844         loop-unroll.c, lower-subreg.c, lower-subreg.h, lra-assigns.c,
10845         lra-constraints.c, lra-eliminations.c, lra-int.h, lra-lives.c,
10846         lra-spills.c, lra.c, lra.h, machmode.h, omp-low.c, optabs.c, optabs.h,
10847         output.h, postreload.c, print-tree.c, read-rtl.c, real.c, real.h,
10848         recog.c, recog.h, ree.c, reg-stack.c, regcprop.c, reginfo.c,
10849         regrename.c, regs.h, reload.c, reload.h, reload1.c, rtl.c, rtl.h,
10850         rtlanal.c, rtlhash.c, rtlhooks-def.h, rtlhooks.c, sched-deps.c,
10851         sel-sched-dump.c, sel-sched-ir.c, sel-sched-ir.h, sel-sched.c,
10852         simplify-rtx.c, stmt.c, stor-layout.c, stor-layout.h, target.def,
10853         targhooks.c, targhooks.h, tree-affine.c, tree-call-cdce.c,
10854         tree-complex.c, tree-data-ref.c, tree-dfa.c, tree-if-conv.c,
10855         tree-inline.c, tree-outof-ssa.c, tree-scalar-evolution.c,
10856         tree-ssa-address.c, tree-ssa-ccp.c, tree-ssa-loop-ivopts.c,
10857         tree-ssa-loop-ivopts.h, tree-ssa-loop-manip.c,
10858         tree-ssa-loop-prefetch.c, tree-ssa-math-opts.c, tree-ssa-reassoc.c,
10859         tree-ssa-sccvn.c, tree-streamer-in.c, tree-switch-conversion.c,
10860         tree-vect-data-refs.c, tree-vect-generic.c, tree-vect-loop.c,
10861         tree-vect-patterns.c, tree-vect-slp.c, tree-vect-stmts.c,
10862         tree-vrp.c, tree.c, tree.h, tsan.c, ubsan.c, valtrack.c,
10863         var-tracking.c, varasm.c: Remove redundant enum from
10864         machine_mode.
10865         * gengtype.c (main): Treat machine_mode as a scalar typedef.
10866         * genmodes.c (emit_insn_modes_h): Hide inline functions if
10867         USED_FOR_TARGET.
10868
10869 2014-10-29  Richard Sandiford  <richard.sandiford@arm.com>
10870
10871         PR rtl-optimization/63340 (part 2)
10872         * rtl.h (invalid_mode_change_p): Delete.
10873         (valid_mode_changes_for_regno): New function.
10874         * reginfo.c (invalid_mode_change_p): Delete.
10875         (valid_mode_changes_for_regno): New function.
10876         * ira-costs.c (setup_regno_cost_classes_by_aclass): Restrict the
10877         classes to registers that are allowed by valid_mode_changes_for_regno.
10878         (setup_regno_cost_classes_by_mode): Likewise.
10879         (print_allocno_costs): Remove invalid_mode_change_p test.
10880         (print_pseudo_costs, find_costs_and_classes): Likewise.
10881
10882 2014-10-29  Richard Sandiford  <richard.sandiford@arm.com>
10883
10884         PR rtl-optimization/63340 (part 1)
10885         * ira-costs.c (all_cost_classes): New variable.
10886         (complete_cost_classes): New function, split out from...
10887         (setup_cost_classes): ...here.
10888         (initiate_regno_cost_classes): Set up all_cost_classes.
10889         (restrict_cost_classes): New function.
10890         (setup_regno_cost_classes_by_aclass): Restrict the cost classes to
10891         registers that are valid for the register's mode.
10892         (setup_regno_cost_classes_by_mode): Model the mode cache as a
10893         restriction of all_cost_classes to a particular mode.
10894         (print_allocno_costs): Remove contains_reg_of_mode check.
10895         (print_pseudo_costs, find_costs_and_classes): Likewise.
10896
10897 2014-10-29  Richard Biener  <rguenther@suse.de>
10898
10899         PR tree-optimization/63666
10900         * tree-vect-slp.c (vect_get_mask_element): Properly handle
10901         accessing out-of-bound elements.
10902
10903 2014-10-29  Alexander Ivchenko  <alexander.ivchenko@intel.com>
10904             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
10905             Anna Tikhonova  <anna.tikhonova@intel.com>
10906             Ilya Tocar  <ilya.tocar@intel.com>
10907             Andrey Turetskiy  <andrey.turetskiy@intel.com>
10908             Ilya Verbin  <ilya.verbin@intel.com>
10909             Kirill Yukhin  <kirill.yukhin@intel.com>
10910             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
10911
10912         * config/i386/i386.md
10913         (movhi_internal): Always detect maskmov.
10914         (movqi_internal): Fix target check.
10915
10916 2014-10-29  Alexander Ivchenko  <alexander.ivchenko@intel.com>
10917             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
10918             Anna Tikhonova  <anna.tikhonova@intel.com>
10919             Ilya Tocar  <ilya.tocar@intel.com>
10920             Andrey Turetskiy  <andrey.turetskiy@intel.com>
10921             Ilya Verbin  <ilya.verbin@intel.com>
10922             Kirill Yukhin  <kirill.yukhin@intel.com>
10923             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
10924
10925         * config/i386/avx512bwintrin.h: Add new intrinsics.
10926         * config/i386/avx512vlbwintrin.h: Ditto.
10927         * config/i386/avx512vlintrin.h: Ditto.
10928
10929 2014-10-28  Dominik Vogt  <vogt@linux.vnet.ibm.com>
10930
10931         * godump.c (precision_to_units): New helper function.
10932         (go_append_artificial_name): Ditto.
10933         (go_append_decl_name): Ditto.
10934         (go_append_bitfield): Ditto.
10935         (go_get_uinttype_for_precision): Ditto.
10936         (go_append_padding): Ditto.
10937         (go_force_record_alignment): Ditto.
10938         (go_format_type): Represent unions with an array of uints of the size
10939         of the alignment in go.  This fixes the 'random' size of the union's
10940         representation using just the first field.
10941         (go_format_type): Add argument that indicates whether a record is
10942         nested (used for generation of artificial go names).
10943         (go_output_fndecl): Adapt to new go_format_type signature.
10944         (go_output_typedef): Ditto.
10945         (go_output_var): Ditto.
10946         (go_output_var): Prefer to output type as alias (typedef).
10947         (go_format_type): Bitfields in records are simulated as arrays of bytes
10948         in go.
10949
10950         * godump.c (go_format_type): Fix handling of arrays with zero elements.
10951
10952 2014-10-28  Andrew MacLeod  <amacleod@redhat.com>
10953
10954         * cgraph.h: Flatten.  Remove all include files.
10955         (symbol_table::initialize): Move to cgraph.c.
10956         * cgraph.c: Adjust include files.
10957         (symbol_table::initialize): Relocate from cgraph.h.
10958         * gengtype.c (open_base_files): Adjust include files.
10959         * gccplugin.h: Add hash-map.h, is-a.h, plugin-api.h, and ipa-ref.h to
10960         included files.
10961         * ipa-inline.h: Remove all include files.
10962         * ipa-prop.h: Ditto.
10963         * ipa-reference.h: Ditto.
10964         * ipa-utils.h: Ditto:
10965         * lto-streamer.h: Remove cgraph.h from include list.
10966         * asan.c: Adjust include files.
10967         * auto-profile.c: Ditto.
10968         * bb-reorder.c: Ditto.
10969         * calls.c: Ditto.
10970         * cfgexpand.c: Ditto.
10971         * cgraphbuild.c: Ditto.
10972         * cgraphclones.c: Ditto.
10973         * cgraphunit.c: Ditto.
10974         * combine.c: Ditto.
10975         * coverage.c: Ditto.
10976         * data-streamer.c: Ditto.
10977         * data-streamer-in.c: Ditto.
10978         * data-streamer-out.c: Ditto.
10979         * dbxout.c: Ditto.
10980         * dwarf2out.c: Ditto.
10981         * except.c: Ditto.
10982         * expr.c: Ditto.
10983         * final.c: Ditto.
10984         * fold-const.c: Ditto.
10985         * ggc-page.c: Ditto.
10986         * gimple-fold.c: Ditto.
10987         * gimple-iterator.c: Ditto.
10988         * gimple-pretty-print.c: Ditto.
10989         * gimple-streamer-in.c: Ditto.
10990         * gimple-streamer-out.c: Ditto.
10991         * gimplify.c: Ditto.
10992         * ipa.c: Ditto.
10993         * ipa-comdats.c: Ditto.
10994         * ipa-cp.c: Ditto.
10995         * ipa-devirt.c: Ditto.
10996         * ipa-icf.c: Ditto.
10997         * ipa-icf-gimple.c: Ditto.
10998         * ipa-inline-analysis.c: Ditto.
10999         * ipa-inline.c: Ditto.
11000         * ipa-inline-transform.c: Ditto.
11001         * ipa-polymorphic-call.c: Ditto.
11002         * ipa-profile.c: Ditto.
11003         * ipa-prop.c: Ditto.
11004         * ipa-pure-const.c: Ditto.
11005         * ipa-ref.c: Ditto.
11006         * ipa-reference.c: Ditto.
11007         * ipa-split.c: Ditto.
11008         * ipa-utils.c: Ditto.
11009         * ipa-visibility.c: Ditto.
11010         * langhooks.c: Ditto.
11011         * lto-cgraph.c: Ditto.
11012         * lto-compress.c: Ditto.
11013         * lto-opts.c: Ditto.
11014         * lto-section-in.c: Ditto.
11015         * lto-section-out.c: Ditto.
11016         * lto-streamer.c: Ditto.
11017         * lto-streamer-in.c: Ditto.
11018         * lto-streamer-out.c: Ditto.
11019         * omp-low.c: Ditto.
11020         * opts-global.c: Ditto.
11021         * passes.c: Ditto.
11022         * predict.c: Ditto.
11023         * print-tree.c: Ditto.
11024         * profile.c: Ditto.
11025         * ree.c: Ditto.
11026         * stor-layout.c: Ditto.
11027         * symtab.c: Ditto.
11028         * toplev.c: Ditto.
11029         * trans-mem.c: Ditto.
11030         * tree.c: Ditto.
11031         * tree-cfg.c: Ditto.
11032         * tree-eh.c: Ditto.
11033         * tree-emutls.c: Ditto.
11034         * tree-inline.c: Ditto.
11035         * tree-nested.c: Ditto.
11036         * tree-pretty-print.c: Ditto.
11037         * tree-profile.c: Ditto.
11038         * tree-sra.c: Ditto.
11039         * tree-ssa-alias.c: Ditto.
11040         * tree-ssa-loop-ivcanon.c: Ditto.
11041         * tree-ssa-loop-ivopts.c: Ditto.
11042         * tree-ssa-pre.c: Ditto.
11043         * tree-ssa-structalias.c: Ditto.
11044         * tree-streamer.c: Ditto.
11045         * tree-streamer-in.c: Ditto.
11046         * tree-streamer-out.c: Ditto.
11047         * tree-switch-conversion.c: Ditto.
11048         * tree-tailcall.c: Ditto.
11049         * tree-vect-data-refs.c: Ditto.
11050         * tree-vectorizer.c: Ditto.
11051         * tree-vect-stmts.c: Ditto.
11052         * tsan.c: Ditto.
11053         * ubsan.c: Ditto.
11054         * value-prof.c: Ditto.
11055         * varasm.c: Ditto.
11056         * varpool.c: Ditto.
11057         * config/arm/arm.c: Ditto.
11058         * config/bfin/bfin.c: Ditto.
11059         * config/c6x/c6x.c: Ditto.
11060         * config/cris/cris.c: Ditto.
11061         * config/darwin.c: Ditto.
11062         * config/darwin-c.c: Ditto.
11063         * config/i386/i386.c: Ditto.
11064         * config/i386/winnt.c: Ditto.
11065         * config/microblaze/microblaze.c: Ditto.
11066         * config/mips/mips.c: Ditto.
11067         * config/rs6000/rs6000.c: Ditto.
11068         * config/rx/rx.c: Ditto.
11069
11070 2014-10-28  Richard Biener  <rguenther@suse.de>
11071
11072         * gimple-fold.h (follow_single_use_edges): Declare.
11073         * gimple-fold.c (follow_single_use_edges): New function.
11074         (gimple_fold_stmt_to_constant_1): Dispatch to gimple_simplify.
11075         * tree-ssa-propagate.c
11076         (substitute_and_fold_dom_walker::before_dom_children): Allow
11077         following single-use edges when folding stmts we propagated into.
11078
11079 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11080             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11081             Anna Tikhonova  <anna.tikhonova@intel.com>
11082             Ilya Tocar  <ilya.tocar@intel.com>
11083             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11084             Ilya Verbin  <ilya.verbin@intel.com>
11085             Kirill Yukhin  <kirill.yukhin@intel.com>
11086             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11087
11088         * config/i386/avx512bwintrin.h: New.
11089         * config/i386/avx512dqintrin.h: Ditto.
11090         * config/i386/avx512vlbwintrin.h: Ditto.
11091         * config/i386/avx512vldqintrin.h: Ditto.
11092         * config/i386/avx512vlintrin.h: Ditto.
11093         * config/i386/immintrin.h: Include avx512vlintrin.h, avx512bwintrin.h,
11094         avx512dqintrin.h, avx512vlbwintrin.h, avx512vldqintrin.h.
11095
11096 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11097             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11098             Anna Tikhonova  <anna.tikhonova@intel.com>
11099             Ilya Tocar  <ilya.tocar@intel.com>
11100             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11101             Ilya Verbin  <ilya.verbin@intel.com>
11102             Kirill Yukhin  <kirill.yukhin@intel.com>
11103             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11104
11105         * config/i386/i386.c
11106         (ix86_expand_args_builtin): Handle avx_vpermilv4df_mask,
11107         avx_shufpd256_mask, avx_vpermilv2df_mask.
11108
11109 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11110             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11111             Anna Tikhonova  <anna.tikhonova@intel.com>
11112             Ilya Tocar  <ilya.tocar@intel.com>
11113             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11114             Ilya Verbin  <ilya.verbin@intel.com>
11115             Kirill Yukhin  <kirill.yukhin@intel.com>
11116             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11117
11118         * config/i386/i386.c
11119         (ix86_init_mmx_sse_builtins):
11120         Define __builtin_ia32_gather3siv2df, __builtin_ia32_gather3siv4df,
11121         __builtin_ia32_gather3div2df, __builtin_ia32_gather3div4df,
11122         __builtin_ia32_gather3siv4sf, __builtin_ia32_gather3siv8sf,
11123         __builtin_ia32_gather3div4sf, __builtin_ia32_gather3div8sf,
11124         __builtin_ia32_gather3siv2di, __builtin_ia32_gather3siv4di,
11125         __builtin_ia32_gather3div2di, __builtin_ia32_gather3div4di,
11126         __builtin_ia32_gather3siv4si, __builtin_ia32_gather3siv8si,
11127         __builtin_ia32_gather3div4si, __builtin_ia32_gather3div8si,
11128         __builtin_ia32_gather3altsiv4df, __builtin_ia32_gather3altdiv8sf,
11129         __builtin_ia32_gather3altsiv4di, __builtin_ia32_gather3altdiv8si,
11130         __builtin_ia32_scattersiv8sf, __builtin_ia32_scattersiv4sf,
11131         __builtin_ia32_scattersiv4df, __builtin_ia32_scattersiv2df,
11132         __builtin_ia32_scatterdiv8sf, __builtin_ia32_scatterdiv4sf,
11133         __builtin_ia32_scatterdiv4df, __builtin_ia32_scatterdiv2df,
11134         __builtin_ia32_scattersiv8si, __builtin_ia32_scattersiv4si,
11135         __builtin_ia32_scattersiv4di, __builtin_ia32_scattersiv2di,
11136         __builtin_ia32_scatterdiv8si, __builtin_ia32_scatterdiv4si,
11137         __builtin_ia32_scatterdiv4di, __builtin_ia32_scatterdiv2di.
11138
11139 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11140             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11141             Anna Tikhonova  <anna.tikhonova@intel.com>
11142             Ilya Tocar  <ilya.tocar@intel.com>
11143             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11144             Ilya Verbin  <ilya.verbin@intel.com>
11145             Kirill Yukhin  <kirill.yukhin@intel.com>
11146             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11147
11148         * config/i386/i386.c
11149         (ix86_builtins): Add IX86_BUILTIN_GATHER3ALTSIV4DF,
11150         IX86_BUILTIN_GATHER3ALTDIV8SF, IX86_BUILTIN_GATHER3ALTSIV4DI,
11151         IX86_BUILTIN_GATHER3ALTDIV8SI.
11152         (ix86_expand_builtin):
11153         Handle IX86_BUILTIN_GATHER3ALTDIV8SF, IX86_BUILTIN_GATHER3ALTDIV8SI,
11154         IX86_BUILTIN_SCATTERSIV4DF, IX86_BUILTIN_SCATTERSIV4DI,
11155         IX86_BUILTIN_SCATTERDIV2DF, IX86_BUILTIN_SCATTERDIV4DF,
11156         IX86_BUILTIN_GATHER3ALTSIV4DI, IX86_BUILTIN_GATHER3ALTSIV4DF,
11157         IX86_BUILTIN_SCATTERDIV4DI, IX86_BUILTIN_SCATTERDIV2DI,
11158         IX86_BUILTIN_GATHER3SIV8SI, IX86_BUILTIN_GATHER3DIV8SI,
11159         IX86_BUILTIN_GATHER3SIV4DF, IX86_BUILTIN_GATHER3SIV4DI,
11160         IX86_BUILTIN_GATHER3DIV8SF, IX86_BUILTIN_GATHER3SIV8SF,
11161         IX86_BUILTIN_GATHER3DIV4DF, IX86_BUILTIN_GATHER3DIV2DF,
11162         IX86_BUILTIN_GATHER3DIV2DI, IX86_BUILTIN_GATHER3DIV4DI,
11163         IX86_BUILTIN_SCATTERDIV4SF, IX86_BUILTIN_SCATTERSIV2DI,
11164         IX86_BUILTIN_GATHER3SIV2DI, IX86_BUILTIN_GATHER3SIV4SI,
11165         IX86_BUILTIN_GATHER3SIV4SF, IX86_BUILTIN_GATHER3SIV2DF,
11166         IX86_BUILTIN_SCATTERSIV2DF, IX86_BUILTIN_SCATTERDIV4SI,
11167         IX86_BUILTIN_SCATTERSIV4SF, IX86_BUILTIN_SCATTERSIV4SI,
11168         IX86_BUILTIN_SCATTERDIV8SI, IX86_BUILTIN_GATHER3DIV4SI,
11169         IX86_BUILTIN_SCATTERSIV8SI, IX86_BUILTIN_SCATTERSIV8SF,
11170         IX86_BUILTIN_GATHER3DIV4SF, IX86_BUILTIN_SCATTERDIV8SF.
11171         (ix86_vectorize_builtin_gather): Update V2DFmode, V4DFmode, V2DImode,
11172         V4DImode, V4SFmode, V8SFmode, V4SImode, V8SImode.
11173
11174 2014-10-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
11175             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
11176             Anna Tikhonova  <anna.tikhonova@intel.com>
11177             Ilya Tocar  <ilya.tocar@intel.com>
11178             Andrey Turetskiy  <andrey.turetskiy@intel.com>
11179             Ilya Verbin  <ilya.verbin@intel.com>
11180             Kirill Yukhin  <kirill.yukhin@intel.com>
11181             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
11182
11183         * config/i386/i386-builtin-types.def
11184         (SHORT): New.
11185         (V32HI): Ditto.
11186         (V12QI): Ditto.
11187         (V14QI): Ditto.
11188         (V32SI): Ditto.
11189         (V8UDI): Ditto.
11190         (V16USI): Ditto.
11191         (V32UHI): Ditto.
11192         (PSHORT): Ditto.
11193         (PV32QI): Ditto.
11194         (PV32HI): Ditto.
11195         (PV64QI): Ditto.
11196         (PCV8HI): Ditto.
11197         (PCV16QI): Ditto.
11198         (PCV16HI): Ditto.
11199         (PCV32QI): Ditto.
11200         (PCV32HI): Ditto.
11201         (PCV64QI): Ditto.
11202         (V4SF_FTYPE_V2DF_V4SF_QI): Ditto.
11203         (V4SF_FTYPE_V4DF_V4SF_QI): Ditto.
11204         (V4SF_FTYPE_V8HI_V4SF_QI): Ditto.
11205         (V8SF_FTYPE_V8HI_V8SF_QI): Ditto.
11206         (V16SF_FTYPE_V16HI): Ditto.
11207         (V16SF_FTYPE_V16HI_V16SF_HI): Ditto.
11208         (V16SF_FTYPE_V16SI): Ditto.
11209         (V4DI_FTYPE_V4DI): Ditto.
11210         (V16SI_FTYPE_V16SF): Ditto.
11211         (V8DI_FTYPE_PV2DI): Ditto.
11212         (V8DF_FTYPE_PV2DF): Ditto.
11213         (V4DI_FTYPE_PV2DI): Ditto.
11214         (V4DF_FTYPE_PV2DF): Ditto.
11215         (V16SI_FTYPE_PV2SI): Ditto.
11216         (V16SF_FTYPE_PV2SF): Ditto.
11217         (V8SF_FTYPE_FLOAT): Ditto.
11218         (V4SF_FTYPE_FLOAT): Ditto.
11219         (V4DF_FTYPE_DOUBLE): Ditto.
11220         (V8SF_FTYPE_PV4SF): Ditto.
11221         (V8SI_FTYPE_PV4SI): Ditto.
11222         (V4SI_FTYPE_PV2SI): Ditto.
11223         (V8SF_FTYPE_PV2SF): Ditto.
11224         (V8SI_FTYPE_PV2SI): Ditto.
11225         (V16SF_FTYPE_PV8SF): Ditto.
11226         (V16SI_FTYPE_PV8SI): Ditto.
11227         (V8DI_FTYPE_V8SF): Ditto.
11228         (V4DI_FTYPE_V4SF): Ditto.
11229         (V2DI_FTYPE_V4SF): Ditto.
11230         (V64QI_FTYPE_QI): Ditto.
11231         (V32HI_FTYPE_HI): Ditto.
11232         (V16UHI_FTYPE_V16UHI): Ditto.
11233         (V32UHI_FTYPE_V32UHI): Ditto.
11234         (V2UDI_FTYPE_V2UDI): Ditto.
11235         (V4UDI_FTYPE_V4UDI): Ditto.
11236         (V8UDI_FTYPE_V8UDI): Ditto.
11237         (V4USI_FTYPE_V4USI): Ditto.
11238         (V16USI_FTYPE_V16USI): Ditto.
11239         (V2DF_FTYPE_V4DF_INT_V2DF_QI): Ditto.
11240         (V2DF_FTYPE_V8DF_INT): Ditto.
11241         (V2DF_FTYPE_V8DF_INT_V2DF_QI): Ditto.
11242         (V2DI_FTYPE_V2DI_INT_V2DI_QI): Ditto.
11243         (V8DF_FTYPE_V8DF_INT): Ditto.
11244         (V4SF_FTYPE_V8SF_INT_V4SF_QI): Ditto.
11245         (V4SI_FTYPE_V2DF_V4SI_QI): Ditto.
11246         (V4SI_FTYPE_V4SI_INT_V4SI_QI): Ditto.
11247         (V4SI_FTYPE_V8HI_V8HI_V4SI_QI): Ditto.
11248         (V4SI_FTYPE_V8SI_INT_V4SI_QI): Ditto.
11249         (V8HI_FTYPE_V16QI_V16QI_V8HI_QI): Ditto.
11250         (V8DI_FTYPE_V8DI_INT): Ditto.
11251         (V8HI_FTYPE_V8SF_INT_V8HI_QI): Ditto.
11252         (V8HI_FTYPE_V4SF_INT_V8HI_QI): Ditto.
11253         (V8SF_FTYPE_V16SF_INT): Ditto.
11254         (V8SF_FTYPE_V16SF_INT_V8SF_QI): Ditto.
11255         (V64QI_FTYPE_V32HI_V32HI): Ditto.
11256         (V32HI_FTYPE_V16SI_V16SI): Ditto.
11257         (V8DF_FTYPE_V8DF_V2DF_INT): Ditto.
11258         (V8DF_FTYPE_V8DF_V2DF_INT_V8DF_QI): Ditto.
11259         (V8DF_FTYPE_V8DF_V8DF_INT): Ditto.
11260         (V8DF_FTYPE_V8DF_V8DF_INT_V8DF_QI_INT): Ditto.
11261         (V8DF_FTYPE_V8DF_V8DF_V8DI_INT): Ditto.
11262         (V8DF_FTYPE_V8DF_V8DF_V8DI_INT_QI): Ditto.
11263         (V4DF_FTYPE_V4DF_V4DF_V4DI_INT_QI): Ditto.
11264         (V2DF_FTYPE_V2DF_V2DF_V2DI_INT_QI): Ditto.
11265         (V16SF_FTYPE_V16SF_V16SF_INT_V16SF_HI_INT): Ditto.
11266         (V8SF_FTYPE_V8SF_V8SF_V8SI_INT_QI): Ditto.
11267         (V16SF_FTYPE_V16SF_V8SF_INT_V16SF_HI): Ditto.
11268         (V32HI_FTYPE_V64QI_V64QI): Ditto.
11269         (V16HI_FTYPE_V32QI_V32QI_V16HI_HI): Ditto.
11270         (V32HI_FTYPE_V64QI_V64QI_V32HI_SI): Ditto.
11271         (V32HI_FTYPE_V32HI_V32HI): Ditto.
11272         (V32HI_FTYPE_V32HI_INT): Ditto.
11273         (V16SI_FTYPE_V16SI_V8SI_INT_V16SI_HI): Ditto.
11274         (V16SI_FTYPE_V32HI_V32HI): Ditto.
11275         (V8SI_FTYPE_V16HI_V16HI_V8SI_QI): Ditto.
11276         (V16SI_FTYPE_V32HI_V32HI_V16SI_HI): Ditto.
11277         (V8SI_FTYPE_V8SI_INT_V8SI_QI): Ditto.
11278         (V8SI_FTYPE_V16SI_INT): Ditto.
11279         (V8SI_FTYPE_V16SI_INT_V8SI_QI): Ditto.
11280         (V8DI_FTYPE_V8DI_V8DI_INT_V8DI_DI): Ditto.
11281         (V4DI_FTYPE_V4DI_V4DI_INT_V4DI_SI): Ditto.
11282         (V2DI_FTYPE_V2DI_V2DI_INT_V2DI_HI): Ditto.
11283         (V8DI_FTYPE_V8DI_V4DI_INT): Ditto.
11284         (V8DI_FTYPE_V8DI_V2DI_INT): Ditto.
11285         (V8DI_FTYPE_V8DI_V2DI_INT_V8DI_QI): Ditto.
11286         (V8DI_FTYPE_V16SI_V16SI): Ditto.
11287         (V8DI_FTYPE_V64QI_V64QI): Ditto.
11288         (V4DI_FTYPE_V4DI_INT_V4DI_QI): Ditto.
11289         (V2DI_FTYPE_V4DI_INT_V2DI_QI): Ditto.
11290         (V2DI_FTYPE_V8DI_INT): Ditto.
11291         (V2DI_FTYPE_V8DI_INT_V2DI_QI): Ditto.
11292         (QI_FTYPE_QI): Ditto.
11293         (SI_FTYPE_SI): Ditto.
11294         (DI_FTYPE_DI): Ditto.
11295         (HI_FTYPE_V16QI): Ditto.
11296         (SI_FTYPE_V32QI): Ditto.
11297         (DI_FTYPE_V64QI): Ditto.
11298         (QI_FTYPE_V8HI): Ditto.
11299         (HI_FTYPE_V16HI): Ditto.
11300         (SI_FTYPE_V32HI): Ditto.
11301         (QI_FTYPE_V4SI): Ditto.
11302         (QI_FTYPE_V8SI): Ditto.
11303         (HI_FTYPE_V16SI): Ditto.
11304         (QI_FTYPE_V2DI): Ditto.
11305         (QI_FTYPE_V4DI): Ditto.
11306         (QI_FTYPE_V8DI): Ditto.
11307         (V16QI_FTYPE_HI): Ditto.
11308         (V32QI_FTYPE_SI): Ditto.
11309         (V64QI_FTYPE_DI): Ditto.
11310         (V8HI_FTYPE_QI): Ditto.
11311         (V16HI_FTYPE_HI): Ditto.
11312         (V32HI_FTYPE_SI): Ditto.
11313         (V4SI_FTYPE_QI): Ditto.
11314         (V4SI_FTYPE_HI): Ditto.
11315         (V8SI_FTYPE_QI): Ditto.
11316         (V8SI_FTYPE_HI): Ditto.
11317         (V2DI_FTYPE_QI): Ditto.
11318         (V4DI_FTYPE_QI): Ditto.
11319         (QI_FTYPE_QI_QI): Ditto.
11320         (SI_FTYPE_SI_SI): Ditto.
11321         (DI_FTYPE_DI_DI): Ditto.
11322         (QI_FTYPE_QI_INT): Ditto.
11323         (SI_FTYPE_SI_INT): Ditto.
11324         (DI_FTYPE_DI_INT): Ditto.
11325         (HI_FTYPE_V16QI_V16QI): Ditto.
11326         (HI_FTYPE_V16QI_V16QI_HI): Ditto.
11327         (HI_FTYPE_V16QI_V16QI_INT_HI): Ditto.
11328         (SI_FTYPE_V32QI_V32QI): Ditto.
11329         (SI_FTYPE_V32QI_V32QI_SI): Ditto.
11330         (SI_FTYPE_V32QI_V32QI_INT_SI): Ditto.
11331         (DI_FTYPE_V64QI_V64QI): Ditto.
11332         (DI_FTYPE_V64QI_V64QI_DI): Ditto.
11333         (DI_FTYPE_V64QI_V64QI_INT_DI): Ditto.
11334         (QI_FTYPE_V8HI_V8HI): Ditto.
11335         (QI_FTYPE_V8HI_V8HI_QI): Ditto.
11336         (QI_FTYPE_V8HI_V8HI_INT_QI): Ditto.
11337         (HI_FTYPE_V16HI_V16HI): Ditto.
11338         (HI_FTYPE_V16HI_V16HI_HI): Ditto.
11339         (HI_FTYPE_V16HI_V16HI_INT_HI): Ditto.
11340         (SI_FTYPE_V32HI_V32HI): Ditto.
11341         (SI_FTYPE_V32HI_V32HI_SI): Ditto.
11342         (SI_FTYPE_V32HI_V32HI_INT_SI): Ditto.
11343         (QI_FTYPE_V4SI_V4SI): Ditto.
11344         (QI_FTYPE_V4SI_V4SI_QI): Ditto.
11345         (QI_FTYPE_V4SI_V4SI_INT_QI): Ditto.
11346         (QI_FTYPE_V8SI_V8SI): Ditto.
11347         (QI_FTYPE_V8SI_V8SI_QI): Ditto.
11348         (QI_FTYPE_V8SI_V8SI_INT_QI): Ditto.
11349         (QI_FTYPE_V2DI_V2DI): Ditto.
11350         (QI_FTYPE_V2DI_V2DI_QI): Ditto.
11351         (QI_FTYPE_V2DI_V2DI_INT_QI): Ditto.
11352         (QI_FTYPE_V4DI_V4DI): Ditto.
11353         (QI_FTYPE_V4DI_V4DI_QI): Ditto.
11354         (QI_FTYPE_V4DI_V4DI_INT_QI): Ditto.
11355         (V32HI_FTYPE_V32HI_V32HI_V32HI): Ditto.
11356         (V4DF_FTYPE_V4DF_V4DI_INT): Ditto.
11357         (V2DF_FTYPE_V2DI_V2DF_V2DF_QI): Ditto.
11358         (V2DF_FTYPE_V2DF_V2DI_V2DF_QI): Ditto.
11359         (V4DF_FTYPE_V4DF_V2DF_INT_V4DF_QI): Ditto.
11360         (V8DI_FTYPE_V8DI_V8DI_INT): Ditto.
11361         (V4SF_FTYPE_V4SI_V4SF_V4SF_QI): Ditto.
11362         (V4SF_FTYPE_V4SF_V4SI_V4SF_QI): Ditto.
11363         (V4SF_FTYPE_V4SF_V4SF_V4SF_QI): Ditto.
11364         (V4SF_FTYPE_V4SF_V2DF_V4SF_QI): Ditto.
11365         (V8SF_FTYPE_V8SF_V4SF_INT_V8SF_QI): Ditto.
11366         (V8SI_FTYPE_V8SI_V4SI_INT_V8SI_QI): Ditto.
11367         (V4DI_FTYPE_V4DI_V2DI_INT_V4DI_QI): Ditto.
11368         (V2DF_FTYPE_V2DF_V2DF_QI): Ditto.
11369         (V2DF_FTYPE_V4SF_V2DF_QI): Ditto.
11370         (V2DF_FTYPE_V4SI_V2DF_QI): Ditto.
11371         (V4DF_FTYPE_V4DF_V4DF_QI): Ditto.
11372         (V4DF_FTYPE_V4SF_V4DF_QI): Ditto.
11373         (V4DF_FTYPE_V4SI_V4DF_QI): Ditto.
11374         (V2DI_FTYPE_V4SI_V2DI_QI): Ditto.
11375         (V2DI_FTYPE_V8HI_V2DI_QI): Ditto.
11376         (V8DI_FTYPE_V8DF_V8DI_QI): Ditto.
11377         (V4DI_FTYPE_V4DF_V4DI_QI): Ditto.
11378         (V2DI_FTYPE_V2DF_V2DI_QI): Ditto.
11379         (V2DI_FTYPE_V2DI_V2DI_V2DI_QI): Ditto.
11380         (V2DI_FTYPE_V2DI_V2DI_INT_V2DI_QI): Ditto.
11381         (V4DI_FTYPE_V4DI_V4DI_V4DI_QI): Ditto.
11382         (V4DI_FTYPE_V4DI_V4DI_INT_V4DI_QI): Ditto.
11383         (V2DI_FTYPE_V16QI_V2DI_QI): Ditto.
11384         (V4DI_FTYPE_V16QI_V4DI_QI): Ditto.
11385         (V4DI_FTYPE_V4DI_V4DI_QI): Ditto.
11386         (V4DI_FTYPE_V4SI_V4DI_QI): Ditto.
11387         (V4DI_FTYPE_V8HI_V4DI_QI): Ditto.
11388         (V4DF_FTYPE_V4DI_V4DF_V4DF_QI): Ditto.
11389         (V4DF_FTYPE_V4DF_V4DI_V4DF_QI): Ditto.
11390         (V4DF_FTYPE_V4DF_V4DF_V4DF_QI): Ditto.
11391         (V16QI_FTYPE_V16QI_V16QI_V16QI_HI): Ditto.
11392         (V16HI_FTYPE_V16HI_V16HI_V16HI_HI): Ditto.
11393         (V32HI_FTYPE_V32HI_V32HI_V32HI_SI): Ditto.
11394         (V64QI_FTYPE_V64QI_V64QI_V64QI_DI): Ditto.
11395         (V32QI_FTYPE_V32QI_V32QI_V32QI_SI): Ditto.
11396         (V8HI_FTYPE_V8HI_V8HI_V8HI_QI): Ditto.
11397         (V4SF_FTYPE_V4SF_V4SF_QI): Ditto.
11398         (V4SF_FTYPE_V4SI_V4SF_QI): Ditto.
11399         (V8SF_FTYPE_V8SF_V8SF_QI): Ditto.
11400         (V8SF_FTYPE_V8SI_V8SF_QI): Ditto.
11401         (V4SI_FTYPE_V16QI_V4SI_QI): Ditto.
11402         (V4SI_FTYPE_V8HI_V4SI_QI): Ditto.
11403         (V8SI_FTYPE_V8SI_V8SI_QI): Ditto.
11404         (V8SI_FTYPE_V8HI_V8SI_QI): Ditto.
11405         (V8SI_FTYPE_V16QI_V8SI_QI): Ditto.
11406         (V4SI_FTYPE_V4SI_V4SI_V4SI_QI): Ditto.
11407         (V4SI_FTYPE_V4SI_V4SI_INT_V4SI_QI): Ditto.
11408         (V8SF_FTYPE_V8SF_V8SF_V8SF_QI): Ditto.
11409         (V8SF_FTYPE_V8SI_V8SF_V8SF_QI): Ditto.
11410         (V8SF_FTYPE_V8SF_V8SI_V8SF_QI): Ditto.
11411         (V8SI_FTYPE_V8SI_V8SI_V8SI_QI): Ditto.
11412         (V8SI_FTYPE_V8SI_V8SI_INT_V8SI_QI): Ditto.
11413         (V16SF_FTYPE_V8SF_V16SF_HI): Ditto.
11414         (V16SI_FTYPE_V8SI_V16SI_HI): Ditto.
11415         (V4SI_FTYPE_V4DF_V4SI_QI): Ditto.
11416         (V8DI_FTYPE_PCCHAR_V8DI_QI): Ditto.
11417         (V8SF_FTYPE_PCFLOAT_V8SF_QI): Ditto.
11418         (V4SF_FTYPE_PCFLOAT_V4SF_QI): Ditto.
11419         (V4DF_FTYPE_PCDOUBLE_V4DF_QI): Ditto.
11420         (V2DF_FTYPE_PCDOUBLE_V2DF_QI): Ditto.
11421         (V8SI_FTYPE_PCCHAR_V8SI_QI): Ditto.
11422         (V4SI_FTYPE_PCCHAR_V4SI_QI): Ditto.
11423         (V4DI_FTYPE_PCCHAR_V4DI_QI): Ditto.
11424         (V2DI_FTYPE_PCCHAR_V2DI_QI): Ditto.
11425         (V16QI_FTYPE_V16SI_V16QI_HI): Ditto.
11426         (V16QI_FTYPE_V8DI_V16QI_QI): Ditto.
11427         (V32HI_FTYPE_V32HI_V32HI_SI): Ditto.
11428         (V32HI_FTYPE_V64QI_V64QI_INT): Ditto.
11429         (V32HI_FTYPE_V32QI_V32HI_SI): Ditto.
11430         (V16HI_FTYPE_V16HI_V16HI_HI): Ditto.
11431         (V16HI_FTYPE_V32QI_V32QI_INT): Ditto.
11432         (V16HI_FTYPE_V16QI_V16HI_HI): Ditto.
11433         (V8HI_FTYPE_V16QI_V8HI_QI): Ditto.
11434         (V8HI_FTYPE_V16QI_V16QI_INT): Ditto.
11435         (V8SF_FTYPE_V4SF_V8SF_QI): Ditto.
11436         (V4DF_FTYPE_V2DF_V4DF_QI): Ditto.
11437         (V8SI_FTYPE_V4SI_V8SI_QI): Ditto.
11438         (V8SI_FTYPE_SI_V8SI_QI): Ditto.
11439         (V4SI_FTYPE_V4SI_V4SI_QI): Ditto.
11440         (V4SI_FTYPE_SI_V4SI_QI): Ditto.
11441         (V4DI_FTYPE_V2DI_V4DI_QI): Ditto.
11442         (V4DI_FTYPE_DI_V4DI_QI): Ditto.
11443         (V2DI_FTYPE_V2DI_V2DI_QI): Ditto.
11444         (V2DI_FTYPE_DI_V2DI_QI): Ditto.
11445         (V64QI_FTYPE_V64QI_V64QI_DI): Ditto.
11446         (V64QI_FTYPE_V16QI_V64QI_DI): Ditto.
11447         (V64QI_FTYPE_QI_V64QI_DI): Ditto.
11448         (V32QI_FTYPE_V32QI_V32QI_SI): Ditto.
11449         (V32QI_FTYPE_V16QI_V32QI_SI): Ditto.
11450         (V32QI_FTYPE_QI_V32QI_SI): Ditto.
11451         (V16QI_FTYPE_V16QI_V16QI_HI): Ditto.
11452         (V16QI_FTYPE_QI_V16QI_HI): Ditto.
11453         (V32HI_FTYPE_V8HI_V32HI_SI): Ditto.
11454         (V32HI_FTYPE_HI_V32HI_SI): Ditto.
11455         (V16HI_FTYPE_V8HI_V16HI_HI): Ditto.
11456         (V16HI_FTYPE_HI_V16HI_HI): Ditto.
11457         (V8HI_FTYPE_V8HI_V8HI_QI): Ditto.
11458         (V8HI_FTYPE_HI_V8HI_QI): Ditto.
11459         (V64QI_FTYPE_PCV64QI_V64QI_DI): Ditto.
11460         (V32HI_FTYPE_PCV32HI_V32HI_SI): Ditto.
11461         (V32QI_FTYPE_PCV32QI_V32QI_SI): Ditto.
11462         (V16SF_FTYPE_PCV8SF_V16SF_HI): Ditto.
11463         (V16SI_FTYPE_PCV8SI_V16SI_HI): Ditto.
11464         (V16HI_FTYPE_PCV16HI_V16HI_HI): Ditto.
11465         (V16QI_FTYPE_PCV16QI_V16QI_HI): Ditto.
11466         (V8DF_FTYPE_PCV2DF_V8DF_QI): Ditto.
11467         (V8SF_FTYPE_PCV8SF_V8SF_QI): Ditto.
11468         (V8SF_FTYPE_PCV4SF_V8SF_QI): Ditto.
11469         (V8DI_FTYPE_PCV2DI_V8DI_QI): Ditto.
11470         (V8SI_FTYPE_PCV8SI_V8SI_QI): Ditto.
11471         (V8SI_FTYPE_PCV4SI_V8SI_QI): Ditto.
11472         (V8HI_FTYPE_PCV8HI_V8HI_QI): Ditto.
11473         (V4DF_FTYPE_PCV2DF_V4DF_QI): Ditto.
11474         (V4DF_FTYPE_PCV4DF_V4DF_QI): Ditto.
11475         (V4SF_FTYPE_PCV4SF_V4SF_QI): Ditto.
11476         (V4DI_FTYPE_PCV4DI_V4DI_QI): Ditto.
11477         (V4DI_FTYPE_PCV2DI_V4DI_QI): Ditto.
11478         (V4SI_FTYPE_PCV4SI_V4SI_QI): Ditto.
11479         (V2DF_FTYPE_PCV2DF_V2DF_QI): Ditto.
11480         (V2DI_FTYPE_PCV2DI_V2DI_QI): Ditto.
11481         (V16QI_FTYPE_V8HI_V16QI_QI): Ditto.
11482         (V16QI_FTYPE_V16HI_V16QI_HI): Ditto.
11483         (V16QI_FTYPE_V4SI_V16QI_QI): Ditto.
11484         (V16QI_FTYPE_V8SI_V16QI_QI): Ditto.
11485         (V8HI_FTYPE_V4SI_V8HI_QI): Ditto.
11486         (V8HI_FTYPE_V8SI_V8HI_QI): Ditto.
11487         (V16QI_FTYPE_V2DI_V16QI_QI): Ditto.
11488         (V16QI_FTYPE_V4DI_V16QI_QI): Ditto.
11489         (V8HI_FTYPE_V2DI_V8HI_QI): Ditto.
11490         (V8HI_FTYPE_V4DI_V8HI_QI): Ditto.
11491         (V4SI_FTYPE_V2DI_V4SI_QI): Ditto.
11492         (V4SI_FTYPE_V4DI_V4SI_QI): Ditto.
11493         (V32QI_FTYPE_V32HI_V32QI_SI): Ditto.
11494         (V2DF_FTYPE_V2DF_INT_V2DF_QI): Ditto.
11495         (V4DF_FTYPE_V4DF_INT_V4DF_QI): Ditto.
11496         (V4SF_FTYPE_V4SF_INT_V4SF_QI): Ditto.
11497         (V8SF_FTYPE_V8SF_INT_V8SF_QI): Ditto.
11498         (V4DF_FTYPE_V4DF_V4DF_INT_V4DF_QI): Ditto.
11499         (V2DF_FTYPE_V2DF_V2DF_INT_V2DF_QI): Ditto.
11500         (V8SF_FTYPE_V8SF_V8SF_INT_V8SF_QI): Ditto.
11501         (V4SF_FTYPE_V4SF_V4SF_INT_V4SF_QI): Ditto.
11502         (VOID_FTYPE_PV8HI_V4DI_QI): Ditto.
11503         (VOID_FTYPE_PV8HI_V2DI_QI): Ditto.
11504         (VOID_FTYPE_PV4SI_V4DI_QI): Ditto.
11505         (VOID_FTYPE_PV4SI_V2DI_QI): Ditto.
11506         (VOID_FTYPE_PV8HI_V8SI_QI): Ditto.
11507         (VOID_FTYPE_PV8HI_V4SI_QI): Ditto.
11508         (VOID_FTYPE_PV4DF_V4DF_QI): Ditto.
11509         (VOID_FTYPE_PV2DF_V2DF_QI): Ditto.
11510         (VOID_FTYPE_PV8SF_V8SF_QI): Ditto.
11511         (VOID_FTYPE_PV4SF_V4SF_QI): Ditto.
11512         (VOID_FTYPE_PV4DI_V4DI_QI): Ditto.
11513         (VOID_FTYPE_PV2DI_V2DI_QI): Ditto.
11514         (VOID_FTYPE_PV16QI_V8SI_QI): Ditto.
11515         (VOID_FTYPE_PV16QI_V4SI_QI): Ditto.
11516         (VOID_FTYPE_PV16QI_V4DI_QI): Ditto.
11517         (VOID_FTYPE_PV16QI_V2DI_QI): Ditto.
11518         (VOID_FTYPE_PV8SI_V8SI_QI): Ditto.
11519         (VOID_FTYPE_PV4SI_V4SI_QI): Ditto.
11520         (VOID_FTYPE_PV32HI_V32HI_SI): Ditto.
11521         (VOID_FTYPE_PV16HI_V16HI_HI): Ditto.
11522         (VOID_FTYPE_PV8HI_V8HI_QI): Ditto.
11523         (VOID_FTYPE_PV64QI_V64QI_DI): Ditto.
11524         (VOID_FTYPE_PV32QI_V32QI_SI): Ditto.
11525         (VOID_FTYPE_PV16QI_V16QI_HI): Ditto.
11526         (V8SI_FTYPE_V8SF_V8SI_QI): Ditto.
11527         (V4SI_FTYPE_V4SF_V4SI_QI): Ditto.
11528         (V8DI_FTYPE_V8SF_V8DI_QI): Ditto.
11529         (V4DI_FTYPE_V4SF_V4DI_QI): Ditto.
11530         (V2DI_FTYPE_V4SF_V2DI_QI): Ditto.
11531         (V8SF_FTYPE_V8DI_V8SF_QI): Ditto.
11532         (V4SF_FTYPE_V4DI_V4SF_QI): Ditto.
11533         (V4SF_FTYPE_V2DI_V4SF_QI): Ditto.
11534         (V8DF_FTYPE_V8DI_V8DF_QI): Ditto.
11535         (V4DF_FTYPE_V4DI_V4DF_QI): Ditto.
11536         (V2DF_FTYPE_V2DI_V2DF_QI): Ditto.
11537         (V32HI_FTYPE_V32HI_INT_V32HI_SI): Ditto.
11538         (V32HI_FTYPE_V32HI_V8HI_V32HI_SI): Ditto.
11539         (V16HI_FTYPE_V16HI_INT_V16HI_HI): Ditto.
11540         (V16HI_FTYPE_V16HI_V8HI_V16HI_HI): Ditto.
11541         (V8HI_FTYPE_V8HI_INT_V8HI_QI): Ditto.
11542         (V32HI_FTYPE_V64QI_V64QI_INT_V32HI_SI): Ditto.
11543         (V16HI_FTYPE_V32QI_V32QI_INT_V16HI_HI): Ditto.
11544         (V8HI_FTYPE_V16QI_V16QI_INT_V8HI_QI): Ditto.
11545         (V64QI_FTYPE_V32HI_V32HI_V64QI_DI): Ditto.
11546         (V32QI_FTYPE_V16HI_V16HI_V32QI_SI): Ditto.
11547         (V16QI_FTYPE_V8HI_V8HI_V16QI_HI): Ditto.
11548         (V32HI_FTYPE_V16SI_V16SI_V32HI_SI): Ditto.
11549         (V16HI_FTYPE_V8SI_V8SI_V16HI_HI): Ditto.
11550         (V8HI_FTYPE_V4SI_V4SI_V8HI_QI): Ditto.
11551         (V8DI_FTYPE_V16SI_V16SI_V8DI_QI): Ditto.
11552         (V4DI_FTYPE_V8SI_V8SI_V4DI_QI): Ditto.
11553         (V2DI_FTYPE_V4SI_V4SI_V2DI_QI): Ditto.
11554         (V8SI_FTYPE_V8SI_V8SI_V8SI_INT_QI): Ditto.
11555         (V4DI_FTYPE_V4DI_V4DI_V4DI_INT_QI): Ditto.
11556         (V4SI_FTYPE_V4SI_V4SI_V4SI_INT_QI): Ditto.
11557         (V2DI_FTYPE_V2DI_V2DI_V2DI_INT_QI): Ditto.
11558         (V2DF_FTYPE_V2DF_V2DI_V2DF): Ditto.
11559         (V4DF_FTYPE_V4DF_V4DI_V4DF): Ditto.
11560         (V4SF_FTYPE_V4SF_V4SI_V4SF): Ditto.
11561         (V8SF_FTYPE_V8SF_V8SI_V8SF): Ditto.
11562         (V8SI_FTYPE_V8SI_V4SI_V8SI_QI): Ditto.
11563         (V4DI_FTYPE_V4DI_V2DI_V4DI_QI): Ditto.
11564         (QI_FTYPE_V8DF_INT): Ditto.
11565         (QI_FTYPE_V4DF_INT): Ditto.
11566         (QI_FTYPE_V4DF_V4DF_INT_QI): Ditto.
11567         (QI_FTYPE_V2DF_INT): Ditto.
11568         (HI_FTYPE_V16SF_INT): Ditto.
11569         (QI_FTYPE_V8SF_INT): Ditto.
11570         (QI_FTYPE_V8SF_V8SF_INT_QI): Ditto.
11571         (QI_FTYPE_V4SF_INT): Ditto.
11572         (QI_FTYPE_V8DF_INT_QI): Ditto.
11573         (QI_FTYPE_V4DF_INT_QI): Ditto.
11574         (QI_FTYPE_V2DF_INT_QI): Ditto.
11575         (HI_FTYPE_V16SF_INT_HI): Ditto.
11576         (QI_FTYPE_V8SF_INT_QI): Ditto.
11577         (QI_FTYPE_V4SF_INT_QI): Ditto.
11578         (V8DI_FTYPE_V8DF_V8DI_QI_INT): Ditto.
11579         (V8DI_FTYPE_V8SF_V8DI_QI_INT): Ditto.
11580         (V8DF_FTYPE_V8DI_V8DF_QI_INT): Ditto.
11581         (V8SF_FTYPE_V8DI_V8SF_QI_INT): Ditto.
11582         (V2DF_FTYPE_V2DF_PCDOUBLE_V4SI_QI_INT): Ditto.
11583         (V4DF_FTYPE_V4DF_PCDOUBLE_V4SI_QI_INT): Ditto.
11584         (V4DF_FTYPE_V4DF_PCDOUBLE_V8SI_QI_INT): Ditto.
11585         (V2DF_FTYPE_V2DF_PCDOUBLE_V2DI_QI_INT): Ditto.
11586         (V4DF_FTYPE_V4DF_PCDOUBLE_V4DI_QI_INT): Ditto.
11587         (V4SF_FTYPE_V4SF_PCFLOAT_V4SI_QI_INT): Ditto.
11588         (V8SF_FTYPE_V8SF_PCFLOAT_V8SI_QI_INT): Ditto.
11589         (V4SF_FTYPE_V4SF_PCFLOAT_V2DI_QI_INT): Ditto.
11590         (V4SF_FTYPE_V4SF_PCFLOAT_V4DI_QI_INT): Ditto.
11591         (V8SF_FTYPE_V8SF_PCFLOAT_V4DI_QI_INT): Ditto.
11592         (V2DI_FTYPE_V2DI_PCINT64_V4SI_QI_INT): Ditto.
11593         (V4DI_FTYPE_V4DI_PCINT64_V4SI_QI_INT): Ditto.
11594         (V4DI_FTYPE_V4DI_PCINT64_V8SI_QI_INT): Ditto.
11595         (V2DI_FTYPE_V2DI_PCINT64_V2DI_QI_INT): Ditto.
11596         (V4DI_FTYPE_V4DI_PCINT64_V4DI_QI_INT): Ditto.
11597         (V4SI_FTYPE_V4SI_PCINT_V4SI_QI_INT): Ditto.
11598         (V8SI_FTYPE_V8SI_PCINT_V8SI_QI_INT): Ditto.
11599         (V4SI_FTYPE_V4SI_PCINT_V2DI_QI_INT): Ditto.
11600         (V4SI_FTYPE_V4SI_PCINT_V4DI_QI_INT): Ditto.
11601         (V8SI_FTYPE_V8SI_PCINT_V4DI_QI_INT): Ditto.
11602         (VOID_FTYPE_PFLOAT_QI_V8SI_V8SF_INT): Ditto.
11603         (VOID_FTYPE_PFLOAT_QI_V4SI_V4SF_INT): Ditto.
11604         (VOID_FTYPE_PDOUBLE_QI_V4SI_V4DF_INT): Ditto.
11605         (VOID_FTYPE_PDOUBLE_QI_V4SI_V2DF_INT): Ditto.
11606         (VOID_FTYPE_PFLOAT_QI_V4DI_V4SF_INT): Ditto.
11607         (VOID_FTYPE_PFLOAT_QI_V2DI_V4SF_INT): Ditto.
11608         (VOID_FTYPE_PDOUBLE_QI_V4DI_V4DF_INT): Ditto.
11609         (VOID_FTYPE_PDOUBLE_QI_V2DI_V2DF_INT): Ditto.
11610         (VOID_FTYPE_PINT_QI_V8SI_V8SI_INT): Ditto.
11611         (VOID_FTYPE_PINT_QI_V4SI_V4SI_INT): Ditto.
11612         (VOID_FTYPE_PLONGLONG_QI_V4SI_V4DI_INT): Ditto.
11613         (VOID_FTYPE_PLONGLONG_QI_V4SI_V2DI_INT): Ditto.
11614         (VOID_FTYPE_PINT_QI_V4DI_V4SI_INT): Ditto.
11615         (VOID_FTYPE_PINT_QI_V2DI_V4SI_INT): Ditto.
11616         (VOID_FTYPE_PLONGLONG_QI_V4DI_V4DI_INT): Ditto.
11617         (VOID_FTYPE_PLONGLONG_QI_V2DI_V2DI_INT): Ditto.
11618         (V8DI_FTYPE_V8DI_INT): Ditto.
11619         (V8DI_FTYPE_V8DI_V8DI_INT): Ditto.
11620         (V8DI_FTYPE_V8DI_V8DI_INT_V8DI_DI): Ditto.
11621         (V4DI_FTYPE_V4DI_V4DI_INT_V4DI_SI): Ditto.
11622         (V2DI_FTYPE_V2DI_V2DI_INT_V2DI_HI): Ditto.
11623         (V2DF_FTYPE_ V2DF_ V2DF_ V2DI_ INT_ QI): Remove.
11624         (V4SF_FTYPE_ V4SF_ V2DF_ V4SF_ QI): Ditto.
11625         (V4SF_FTYPE_ V4SF_ V4SF_ V4SF_ QI): Ditto.
11626         (V2DF_FTYPE_ PCDOUBLE_ V2DF_ QI): Ditto.
11627         (V4SF_FTYPE_ PCFLOAT_ V4SF_ QI): Ditto.
11628         (V16QI_FTYPE_ V16SI_ V16QI_ HI): Ditto.
11629         (V16QI_FTYPE_ V8DI_ V16QI_ QI): Ditto.
11630         (V4SF_FTYPE_ V4SF_ V4SF_ INT_ V4SF_ QI): Ditto.
11631         (V2DF_FTYPE_ V2DF_ V2DF_ INT_ V2DF_ QI): Ditto.
11632         (V8DI_FTYPE_ V16SI_ V16SI_ V8DI_ QI): Ditto.
11633         * config/i386/i386.c (ix86_builtins):
11634         Add IX86_BUILTIN_PMOVUSQD256_MEM, IX86_BUILTIN_PMOVUSQD128_MEM,
11635         IX86_BUILTIN_PMOVSQD256_MEM, IX86_BUILTIN_PMOVSQD128_MEM,
11636         IX86_BUILTIN_PMOVQD256_MEM, IX86_BUILTIN_PMOVQD128_MEM,
11637         IX86_BUILTIN_PMOVUSQW256_MEM, IX86_BUILTIN_PMOVUSQW128_MEM,
11638         IX86_BUILTIN_PMOVSQW256_MEM, IX86_BUILTIN_PMOVSQW128_MEM,
11639         IX86_BUILTIN_PMOVQW256_MEM, IX86_BUILTIN_PMOVQW128_MEM,
11640         IX86_BUILTIN_PMOVUSQB256_MEM, IX86_BUILTIN_PMOVUSQB128_MEM,
11641         IX86_BUILTIN_PMOVSQB256_MEM, IX86_BUILTIN_PMOVSQB128_MEM,
11642         IX86_BUILTIN_PMOVQB256_MEM, IX86_BUILTIN_PMOVQB128_MEM,
11643         IX86_BUILTIN_PMOVUSDW256_MEM, IX86_BUILTIN_PMOVUSDW128_MEM,
11644         IX86_BUILTIN_PMOVSDW256_MEM, IX86_BUILTIN_PMOVSDW128_MEM,
11645         IX86_BUILTIN_PMOVDW256_MEM, IX86_BUILTIN_PMOVDW128_MEM,
11646         IX86_BUILTIN_PMOVUSDB256_MEM, IX86_BUILTIN_PMOVUSDB128_MEM,
11647         IX86_BUILTIN_PMOVSDB256_MEM, IX86_BUILTIN_PMOVSDB128_MEM,
11648         IX86_BUILTIN_PMOVDB256_MEM, IX86_BUILTIN_PMOVDB128_MEM,
11649         IX86_BUILTIN_MOVDQA64LOAD256_MASK, IX86_BUILTIN_MOVDQA64LOAD128_MASK,
11650         IX86_BUILTIN_MOVDQA32LOAD256_MASK, IX86_BUILTIN_MOVDQA32LOAD128_MASK,
11651         IX86_BUILTIN_MOVDQA64STORE256_MASK, IX86_BUILTIN_MOVDQA64STORE128_MASK,
11652         IX86_BUILTIN_MOVDQA32STORE256_MASK, IX86_BUILTIN_MOVDQA32STORE128_MASK,
11653         IX86_BUILTIN_LOADAPD256_MASK, IX86_BUILTIN_LOADAPD128_MASK,
11654         IX86_BUILTIN_LOADAPS256_MASK, IX86_BUILTIN_LOADAPS128_MASK,
11655         IX86_BUILTIN_STOREAPD256_MASK, IX86_BUILTIN_STOREAPD128_MASK,
11656         IX86_BUILTIN_STOREAPS256_MASK, IX86_BUILTIN_STOREAPS128_MASK,
11657         IX86_BUILTIN_LOADUPD256_MASK, IX86_BUILTIN_LOADUPD128_MASK,
11658         IX86_BUILTIN_LOADUPS256_MASK, IX86_BUILTIN_LOADUPS128_MASK,
11659         IX86_BUILTIN_STOREUPD256_MASK, IX86_BUILTIN_STOREUPD128_MASK,
11660         IX86_BUILTIN_STOREUPS256_MASK, IX86_BUILTIN_STOREUPS128_MASK,
11661         IX86_BUILTIN_LOADDQUDI256_MASK, IX86_BUILTIN_LOADDQUDI128_MASK,
11662         IX86_BUILTIN_LOADDQUSI256_MASK, IX86_BUILTIN_LOADDQUSI128_MASK,
11663         IX86_BUILTIN_LOADDQUHI256_MASK, IX86_BUILTIN_LOADDQUHI128_MASK,
11664         IX86_BUILTIN_LOADDQUQI256_MASK, IX86_BUILTIN_LOADDQUQI128_MASK,
11665         IX86_BUILTIN_STOREDQUDI256_MASK, IX86_BUILTIN_STOREDQUDI128_MASK,
11666         IX86_BUILTIN_STOREDQUSI256_MASK, IX86_BUILTIN_STOREDQUSI128_MASK,
11667         IX86_BUILTIN_STOREDQUHI256_MASK, IX86_BUILTIN_STOREDQUHI128_MASK,
11668         IX86_BUILTIN_STOREDQUQI256_MASK, IX86_BUILTIN_STOREDQUQI128_MASK,
11669         IX86_BUILTIN_COMPRESSPDSTORE256, IX86_BUILTIN_COMPRESSPDSTORE128,
11670         IX86_BUILTIN_COMPRESSPSSTORE256, IX86_BUILTIN_COMPRESSPSSTORE128,
11671         IX86_BUILTIN_PCOMPRESSQSTORE256, IX86_BUILTIN_PCOMPRESSQSTORE128,
11672         IX86_BUILTIN_PCOMPRESSDSTORE256, IX86_BUILTIN_PCOMPRESSDSTORE128,
11673         IX86_BUILTIN_EXPANDPDLOAD256, IX86_BUILTIN_EXPANDPDLOAD128,
11674         IX86_BUILTIN_EXPANDPSLOAD256, IX86_BUILTIN_EXPANDPSLOAD128,
11675         IX86_BUILTIN_PEXPANDQLOAD256, IX86_BUILTIN_PEXPANDQLOAD128,
11676         IX86_BUILTIN_PEXPANDDLOAD256, IX86_BUILTIN_PEXPANDDLOAD128,
11677         IX86_BUILTIN_EXPANDPDLOAD256Z, IX86_BUILTIN_EXPANDPDLOAD128Z,
11678         IX86_BUILTIN_EXPANDPSLOAD256Z, IX86_BUILTIN_EXPANDPSLOAD128Z,
11679         IX86_BUILTIN_PEXPANDQLOAD256Z, IX86_BUILTIN_PEXPANDQLOAD128Z,
11680         IX86_BUILTIN_PEXPANDDLOAD256Z, IX86_BUILTIN_PEXPANDDLOAD128Z,
11681         IX86_BUILTIN_PALIGNR256_MASK, IX86_BUILTIN_PALIGNR128_MASK,
11682         IX86_BUILTIN_MOVDQA64_256_MASK, IX86_BUILTIN_MOVDQA64_128_MASK,
11683         IX86_BUILTIN_MOVDQA32_256_MASK, IX86_BUILTIN_MOVDQA32_128_MASK,
11684         IX86_BUILTIN_MOVAPD256_MASK, IX86_BUILTIN_MOVAPD128_MASK,
11685         IX86_BUILTIN_MOVAPS256_MASK, IX86_BUILTIN_MOVAPS128_MASK,
11686         IX86_BUILTIN_MOVDQUHI256_MASK, IX86_BUILTIN_MOVDQUHI128_MASK,
11687         IX86_BUILTIN_MOVDQUQI256_MASK, IX86_BUILTIN_MOVDQUQI128_MASK,
11688         IX86_BUILTIN_MINPS128_MASK, IX86_BUILTIN_MAXPS128_MASK,
11689         IX86_BUILTIN_MINPD128_MASK, IX86_BUILTIN_MAXPD128_MASK,
11690         IX86_BUILTIN_MAXPD256_MASK, IX86_BUILTIN_MAXPS256_MASK,
11691         IX86_BUILTIN_MINPD256_MASK, IX86_BUILTIN_MINPS256_MASK,
11692         IX86_BUILTIN_MULPS128_MASK, IX86_BUILTIN_DIVPS128_MASK,
11693         IX86_BUILTIN_MULPD128_MASK, IX86_BUILTIN_DIVPD128_MASK,
11694         IX86_BUILTIN_DIVPD256_MASK, IX86_BUILTIN_DIVPS256_MASK,
11695         IX86_BUILTIN_MULPD256_MASK, IX86_BUILTIN_MULPS256_MASK,
11696         IX86_BUILTIN_ADDPD128_MASK, IX86_BUILTIN_ADDPD256_MASK,
11697         IX86_BUILTIN_ADDPS128_MASK, IX86_BUILTIN_ADDPS256_MASK,
11698         IX86_BUILTIN_SUBPD128_MASK, IX86_BUILTIN_SUBPD256_MASK,
11699         IX86_BUILTIN_SUBPS128_MASK, IX86_BUILTIN_SUBPS256_MASK,
11700         IX86_BUILTIN_XORPD256_MASK, IX86_BUILTIN_XORPD128_MASK,
11701         IX86_BUILTIN_XORPS256_MASK, IX86_BUILTIN_XORPS128_MASK,
11702         IX86_BUILTIN_ORPD256_MASK, IX86_BUILTIN_ORPD128_MASK,
11703         IX86_BUILTIN_ORPS256_MASK, IX86_BUILTIN_ORPS128_MASK,
11704         IX86_BUILTIN_BROADCASTF32x2_256, IX86_BUILTIN_BROADCASTI32x2_256,
11705         IX86_BUILTIN_BROADCASTI32x2_128, IX86_BUILTIN_BROADCASTF64X2_256,
11706         IX86_BUILTIN_BROADCASTI64X2_256, IX86_BUILTIN_BROADCASTF32X4_256,
11707         IX86_BUILTIN_BROADCASTI32X4_256, IX86_BUILTIN_EXTRACTF32X4_256,
11708         IX86_BUILTIN_EXTRACTI32X4_256, IX86_BUILTIN_DBPSADBW256,
11709         IX86_BUILTIN_DBPSADBW128, IX86_BUILTIN_CVTTPD2QQ256,
11710         IX86_BUILTIN_CVTTPD2QQ128, IX86_BUILTIN_CVTTPD2UQQ256,
11711         IX86_BUILTIN_CVTTPD2UQQ128, IX86_BUILTIN_CVTPD2QQ256,
11712         IX86_BUILTIN_CVTPD2QQ128, IX86_BUILTIN_CVTPD2UQQ256,
11713         IX86_BUILTIN_CVTPD2UQQ128, IX86_BUILTIN_CVTPD2UDQ256_MASK,
11714         IX86_BUILTIN_CVTPD2UDQ128_MASK, IX86_BUILTIN_CVTTPS2QQ256,
11715         IX86_BUILTIN_CVTTPS2QQ128, IX86_BUILTIN_CVTTPS2UQQ256,
11716         IX86_BUILTIN_CVTTPS2UQQ128, IX86_BUILTIN_CVTTPS2DQ256_MASK,
11717         IX86_BUILTIN_CVTTPS2DQ128_MASK, IX86_BUILTIN_CVTTPS2UDQ256,
11718         IX86_BUILTIN_CVTTPS2UDQ128, IX86_BUILTIN_CVTTPD2DQ256_MASK,
11719         IX86_BUILTIN_CVTTPD2DQ128_MASK, IX86_BUILTIN_CVTTPD2UDQ256_MASK,
11720         IX86_BUILTIN_CVTTPD2UDQ128_MASK, IX86_BUILTIN_CVTPD2DQ256_MASK,
11721         IX86_BUILTIN_CVTPD2DQ128_MASK, IX86_BUILTIN_CVTDQ2PD256_MASK,
11722         IX86_BUILTIN_CVTDQ2PD128_MASK, IX86_BUILTIN_CVTUDQ2PD256_MASK,
11723         IX86_BUILTIN_CVTUDQ2PD128_MASK, IX86_BUILTIN_CVTDQ2PS256_MASK,
11724         IX86_BUILTIN_CVTDQ2PS128_MASK, IX86_BUILTIN_CVTUDQ2PS256_MASK,
11725         IX86_BUILTIN_CVTUDQ2PS128_MASK, IX86_BUILTIN_CVTPS2PD256_MASK,
11726         IX86_BUILTIN_CVTPS2PD128_MASK, IX86_BUILTIN_PBROADCASTB256_MASK,
11727         IX86_BUILTIN_PBROADCASTB256_GPR_MASK, IX86_BUILTIN_PBROADCASTB128_MASK,
11728         IX86_BUILTIN_PBROADCASTB128_GPR_MASK, IX86_BUILTIN_PBROADCASTW256_MASK,
11729         IX86_BUILTIN_PBROADCASTW256_GPR_MASK, IX86_BUILTIN_PBROADCASTW128_MASK,
11730         IX86_BUILTIN_PBROADCASTW128_GPR_MASK, IX86_BUILTIN_PBROADCASTD256_MASK,
11731         IX86_BUILTIN_PBROADCASTD256_GPR_MASK, IX86_BUILTIN_PBROADCASTD128_MASK,
11732         IX86_BUILTIN_PBROADCASTD128_GPR_MASK, IX86_BUILTIN_PBROADCASTQ256_MASK,
11733         IX86_BUILTIN_PBROADCASTQ256_GPR_MASK, IX86_BUILTIN_PBROADCASTQ256_MEM_MASK,
11734         IX86_BUILTIN_PBROADCASTQ128_MASK, IX86_BUILTIN_PBROADCASTQ128_GPR_MASK,
11735         IX86_BUILTIN_PBROADCASTQ128_MEM_MASK, IX86_BUILTIN_BROADCASTSS256,
11736         IX86_BUILTIN_BROADCASTSS128, IX86_BUILTIN_BROADCASTSD256,
11737         IX86_BUILTIN_EXTRACTF64X2_256, IX86_BUILTIN_EXTRACTI64X2_256,
11738         IX86_BUILTIN_INSERTF32X4_256, IX86_BUILTIN_INSERTI32X4_256,
11739         IX86_BUILTIN_PMOVSXBW256_MASK, IX86_BUILTIN_PMOVSXBW128_MASK,
11740         IX86_BUILTIN_PMOVSXBD256_MASK, IX86_BUILTIN_PMOVSXBD128_MASK,
11741         IX86_BUILTIN_PMOVSXBQ256_MASK, IX86_BUILTIN_PMOVSXBQ128_MASK,
11742         IX86_BUILTIN_PMOVSXWD256_MASK, IX86_BUILTIN_PMOVSXWD128_MASK,
11743         IX86_BUILTIN_PMOVSXWQ256_MASK, IX86_BUILTIN_PMOVSXWQ128_MASK,
11744         IX86_BUILTIN_PMOVSXDQ256_MASK, IX86_BUILTIN_PMOVSXDQ128_MASK,
11745         IX86_BUILTIN_PMOVZXBW256_MASK, IX86_BUILTIN_PMOVZXBW128_MASK,
11746         IX86_BUILTIN_PMOVZXBD256_MASK, IX86_BUILTIN_PMOVZXBD128_MASK,
11747         IX86_BUILTIN_PMOVZXBQ256_MASK, IX86_BUILTIN_PMOVZXBQ128_MASK,
11748         IX86_BUILTIN_PMOVZXWD256_MASK, IX86_BUILTIN_PMOVZXWD128_MASK,
11749         IX86_BUILTIN_PMOVZXWQ256_MASK, IX86_BUILTIN_PMOVZXWQ128_MASK,
11750         IX86_BUILTIN_PMOVZXDQ256_MASK, IX86_BUILTIN_PMOVZXDQ128_MASK,
11751         IX86_BUILTIN_REDUCEPD256_MASK, IX86_BUILTIN_REDUCEPD128_MASK,
11752         IX86_BUILTIN_REDUCEPS256_MASK, IX86_BUILTIN_REDUCEPS128_MASK,
11753         IX86_BUILTIN_REDUCESD_MASK, IX86_BUILTIN_REDUCESS_MASK,
11754         IX86_BUILTIN_VPERMVARHI256_MASK, IX86_BUILTIN_VPERMVARHI128_MASK,
11755         IX86_BUILTIN_VPERMT2VARHI256, IX86_BUILTIN_VPERMT2VARHI256_MASKZ,
11756         IX86_BUILTIN_VPERMT2VARHI128, IX86_BUILTIN_VPERMT2VARHI128_MASKZ,
11757         IX86_BUILTIN_VPERMI2VARHI256, IX86_BUILTIN_VPERMI2VARHI128,
11758         IX86_BUILTIN_RCP14PD256, IX86_BUILTIN_RCP14PD128,
11759         IX86_BUILTIN_RCP14PS256, IX86_BUILTIN_RCP14PS128,
11760         IX86_BUILTIN_RSQRT14PD256_MASK, IX86_BUILTIN_RSQRT14PD128_MASK,
11761         IX86_BUILTIN_RSQRT14PS256_MASK, IX86_BUILTIN_RSQRT14PS128_MASK,
11762         IX86_BUILTIN_SQRTPD256_MASK, IX86_BUILTIN_SQRTPD128_MASK,
11763         IX86_BUILTIN_SQRTPS256_MASK, IX86_BUILTIN_SQRTPS128_MASK,
11764         IX86_BUILTIN_PADDB128_MASK, IX86_BUILTIN_PADDW128_MASK,
11765         IX86_BUILTIN_PADDD128_MASK, IX86_BUILTIN_PADDQ128_MASK,
11766         IX86_BUILTIN_PSUBB128_MASK, IX86_BUILTIN_PSUBW128_MASK,
11767         IX86_BUILTIN_PSUBD128_MASK, IX86_BUILTIN_PSUBQ128_MASK,
11768         IX86_BUILTIN_PADDSB128_MASK, IX86_BUILTIN_PADDSW128_MASK,
11769         IX86_BUILTIN_PSUBSB128_MASK, IX86_BUILTIN_PSUBSW128_MASK,
11770         IX86_BUILTIN_PADDUSB128_MASK, IX86_BUILTIN_PADDUSW128_MASK,
11771         IX86_BUILTIN_PSUBUSB128_MASK, IX86_BUILTIN_PSUBUSW128_MASK,
11772         IX86_BUILTIN_PADDB256_MASK, IX86_BUILTIN_PADDW256_MASK,
11773         IX86_BUILTIN_PADDD256_MASK, IX86_BUILTIN_PADDQ256_MASK,
11774         IX86_BUILTIN_PADDSB256_MASK, IX86_BUILTIN_PADDSW256_MASK,
11775         IX86_BUILTIN_PADDUSB256_MASK, IX86_BUILTIN_PADDUSW256_MASK,
11776         IX86_BUILTIN_PSUBB256_MASK, IX86_BUILTIN_PSUBW256_MASK,
11777         IX86_BUILTIN_PSUBD256_MASK, IX86_BUILTIN_PSUBQ256_MASK,
11778         IX86_BUILTIN_PSUBSB256_MASK, IX86_BUILTIN_PSUBSW256_MASK,
11779         IX86_BUILTIN_PSUBUSB256_MASK, IX86_BUILTIN_PSUBUSW256_MASK,
11780         IX86_BUILTIN_SHUF_F64x2_256, IX86_BUILTIN_SHUF_I64x2_256,
11781         IX86_BUILTIN_SHUF_I32x4_256, IX86_BUILTIN_SHUF_F32x4_256,
11782         IX86_BUILTIN_PMOVWB128, IX86_BUILTIN_PMOVWB256,
11783         IX86_BUILTIN_PMOVSWB128, IX86_BUILTIN_PMOVSWB256,
11784         IX86_BUILTIN_PMOVUSWB128, IX86_BUILTIN_PMOVUSWB256,
11785         IX86_BUILTIN_PMOVDB128, IX86_BUILTIN_PMOVDB256,
11786         IX86_BUILTIN_PMOVSDB128, IX86_BUILTIN_PMOVSDB256,
11787         IX86_BUILTIN_PMOVUSDB128, IX86_BUILTIN_PMOVUSDB256,
11788         IX86_BUILTIN_PMOVDW128, IX86_BUILTIN_PMOVDW256,
11789         IX86_BUILTIN_PMOVSDW128, IX86_BUILTIN_PMOVSDW256,
11790         IX86_BUILTIN_PMOVUSDW128, IX86_BUILTIN_PMOVUSDW256,
11791         IX86_BUILTIN_PMOVQB128, IX86_BUILTIN_PMOVQB256,
11792         IX86_BUILTIN_PMOVSQB128, IX86_BUILTIN_PMOVSQB256,
11793         IX86_BUILTIN_PMOVUSQB128, IX86_BUILTIN_PMOVUSQB256,
11794         IX86_BUILTIN_PMOVQW128, IX86_BUILTIN_PMOVQW256,
11795         IX86_BUILTIN_PMOVSQW128, IX86_BUILTIN_PMOVSQW256,
11796         IX86_BUILTIN_PMOVUSQW128, IX86_BUILTIN_PMOVUSQW256,
11797         IX86_BUILTIN_PMOVQD128, IX86_BUILTIN_PMOVQD256,
11798         IX86_BUILTIN_PMOVSQD128, IX86_BUILTIN_PMOVSQD256,
11799         IX86_BUILTIN_PMOVUSQD128, IX86_BUILTIN_PMOVUSQD256,
11800         IX86_BUILTIN_RANGEPD256, IX86_BUILTIN_RANGEPD128,
11801         IX86_BUILTIN_RANGEPS256, IX86_BUILTIN_RANGEPS128,
11802         IX86_BUILTIN_GETEXPPS256, IX86_BUILTIN_GETEXPPD256,
11803         IX86_BUILTIN_GETEXPPS128, IX86_BUILTIN_GETEXPPD128,
11804         IX86_BUILTIN_FIXUPIMMPD256_MASK, IX86_BUILTIN_FIXUPIMMPD256_MASKZ,
11805         IX86_BUILTIN_FIXUPIMMPS256_MASK, IX86_BUILTIN_FIXUPIMMPS256_MASKZ,
11806         IX86_BUILTIN_FIXUPIMMPD128_MASK, IX86_BUILTIN_FIXUPIMMPD128_MASKZ,
11807         IX86_BUILTIN_FIXUPIMMPS128_MASK, IX86_BUILTIN_FIXUPIMMPS128_MASKZ,
11808         IX86_BUILTIN_PABSQ256, IX86_BUILTIN_PABSQ128,
11809         IX86_BUILTIN_PABSD256_MASK, IX86_BUILTIN_PABSD128_MASK,
11810         IX86_BUILTIN_PMULHRSW256_MASK, IX86_BUILTIN_PMULHRSW128_MASK,
11811         IX86_BUILTIN_PMULHUW128_MASK, IX86_BUILTIN_PMULHUW256_MASK,
11812         IX86_BUILTIN_PMULHW256_MASK, IX86_BUILTIN_PMULHW128_MASK,
11813         IX86_BUILTIN_PMULLW256_MASK, IX86_BUILTIN_PMULLW128_MASK,
11814         IX86_BUILTIN_PMULLQ256, IX86_BUILTIN_PMULLQ128,
11815         IX86_BUILTIN_ANDPD256_MASK, IX86_BUILTIN_ANDPD128_MASK,
11816         IX86_BUILTIN_ANDPS256_MASK, IX86_BUILTIN_ANDPS128_MASK,
11817         IX86_BUILTIN_ANDNPD256_MASK, IX86_BUILTIN_ANDNPD128_MASK,
11818         IX86_BUILTIN_ANDNPS256_MASK, IX86_BUILTIN_ANDNPS128_MASK,
11819         IX86_BUILTIN_PSLLWI128_MASK, IX86_BUILTIN_PSLLDI128_MASK,
11820         IX86_BUILTIN_PSLLQI128_MASK, IX86_BUILTIN_PSLLW128_MASK,
11821         IX86_BUILTIN_PSLLD128_MASK, IX86_BUILTIN_PSLLQ128_MASK,
11822         IX86_BUILTIN_PSLLWI256_MASK , IX86_BUILTIN_PSLLW256_MASK,
11823         IX86_BUILTIN_PSLLDI256_MASK, IX86_BUILTIN_PSLLD256_MASK,
11824         IX86_BUILTIN_PSLLQI256_MASK, IX86_BUILTIN_PSLLQ256_MASK,
11825         IX86_BUILTIN_PSRADI128_MASK, IX86_BUILTIN_PSRAD128_MASK,
11826         IX86_BUILTIN_PSRADI256_MASK, IX86_BUILTIN_PSRAD256_MASK,
11827         IX86_BUILTIN_PSRAQI128_MASK, IX86_BUILTIN_PSRAQ128_MASK,
11828         IX86_BUILTIN_PSRAQI256_MASK, IX86_BUILTIN_PSRAQ256_MASK,
11829         IX86_BUILTIN_PANDD256, IX86_BUILTIN_PANDD128,
11830         IX86_BUILTIN_PSRLDI128_MASK, IX86_BUILTIN_PSRLD128_MASK,
11831         IX86_BUILTIN_PSRLDI256_MASK, IX86_BUILTIN_PSRLD256_MASK,
11832         IX86_BUILTIN_PSRLQI128_MASK, IX86_BUILTIN_PSRLQ128_MASK,
11833         IX86_BUILTIN_PSRLQI256_MASK, IX86_BUILTIN_PSRLQ256_MASK,
11834         IX86_BUILTIN_PANDQ256, IX86_BUILTIN_PANDQ128,
11835         IX86_BUILTIN_PANDND256, IX86_BUILTIN_PANDND128,
11836         IX86_BUILTIN_PANDNQ256, IX86_BUILTIN_PANDNQ128,
11837         IX86_BUILTIN_PORD256, IX86_BUILTIN_PORD128,
11838         IX86_BUILTIN_PORQ256, IX86_BUILTIN_PORQ128,
11839         IX86_BUILTIN_PXORD256, IX86_BUILTIN_PXORD128,
11840         IX86_BUILTIN_PXORQ256, IX86_BUILTIN_PXORQ128,
11841         IX86_BUILTIN_PACKSSWB256_MASK, IX86_BUILTIN_PACKSSWB128_MASK,
11842         IX86_BUILTIN_PACKUSWB256_MASK, IX86_BUILTIN_PACKUSWB128_MASK,
11843         IX86_BUILTIN_RNDSCALEPS256, IX86_BUILTIN_RNDSCALEPD256,
11844         IX86_BUILTIN_RNDSCALEPS128, IX86_BUILTIN_RNDSCALEPD128,
11845         IX86_BUILTIN_VTERNLOGQ256_MASK, IX86_BUILTIN_VTERNLOGQ256_MASKZ,
11846         IX86_BUILTIN_VTERNLOGD256_MASK, IX86_BUILTIN_VTERNLOGD256_MASKZ,
11847         IX86_BUILTIN_VTERNLOGQ128_MASK, IX86_BUILTIN_VTERNLOGQ128_MASKZ,
11848         IX86_BUILTIN_VTERNLOGD128_MASK, IX86_BUILTIN_VTERNLOGD128_MASKZ,
11849         IX86_BUILTIN_SCALEFPD256, IX86_BUILTIN_SCALEFPS256,
11850         IX86_BUILTIN_SCALEFPD128, IX86_BUILTIN_SCALEFPS128,
11851         IX86_BUILTIN_VFMADDPD256_MASK, IX86_BUILTIN_VFMADDPD256_MASK3,
11852         IX86_BUILTIN_VFMADDPD256_MASKZ, IX86_BUILTIN_VFMADDPD128_MASK,
11853         IX86_BUILTIN_VFMADDPD128_MASK3, IX86_BUILTIN_VFMADDPD128_MASKZ,
11854         IX86_BUILTIN_VFMADDPS256_MASK, IX86_BUILTIN_VFMADDPS256_MASK3,
11855         IX86_BUILTIN_VFMADDPS256_MASKZ, IX86_BUILTIN_VFMADDPS128_MASK,
11856         IX86_BUILTIN_VFMADDPS128_MASK3, IX86_BUILTIN_VFMADDPS128_MASKZ,
11857         IX86_BUILTIN_VFMSUBPD256_MASK3, IX86_BUILTIN_VFMSUBPD128_MASK3,
11858         IX86_BUILTIN_VFMSUBPS256_MASK3, IX86_BUILTIN_VFMSUBPS128_MASK3,
11859         IX86_BUILTIN_VFNMADDPD256_MASK, IX86_BUILTIN_VFNMADDPD128_MASK,
11860         IX86_BUILTIN_VFNMADDPS256_MASK, IX86_BUILTIN_VFNMADDPS128_MASK,
11861         IX86_BUILTIN_VFNMSUBPD256_MASK, IX86_BUILTIN_VFNMSUBPD256_MASK3,
11862         IX86_BUILTIN_VFNMSUBPD128_MASK, IX86_BUILTIN_VFNMSUBPD128_MASK3,
11863         IX86_BUILTIN_VFNMSUBPS256_MASK, IX86_BUILTIN_VFNMSUBPS256_MASK3,
11864         IX86_BUILTIN_VFNMSUBPS128_MASK, IX86_BUILTIN_VFNMSUBPS128_MASK3,
11865         IX86_BUILTIN_VFMADDSUBPD256_MASK, IX86_BUILTIN_VFMADDSUBPD256_MASK3,
11866         IX86_BUILTIN_VFMADDSUBPD256_MASKZ, IX86_BUILTIN_VFMADDSUBPD128_MASK,
11867         IX86_BUILTIN_VFMADDSUBPD128_MASK3, IX86_BUILTIN_VFMADDSUBPD128_MASKZ,
11868         IX86_BUILTIN_VFMADDSUBPS256_MASK, IX86_BUILTIN_VFMADDSUBPS256_MASK3,
11869         IX86_BUILTIN_VFMADDSUBPS256_MASKZ, IX86_BUILTIN_VFMADDSUBPS128_MASK,
11870         IX86_BUILTIN_VFMADDSUBPS128_MASK3, IX86_BUILTIN_VFMADDSUBPS128_MASKZ,
11871         IX86_BUILTIN_VFMSUBADDPD256_MASK3, IX86_BUILTIN_VFMSUBADDPD128_MASK3,
11872         IX86_BUILTIN_VFMSUBADDPS256_MASK3, IX86_BUILTIN_VFMSUBADDPS128_MASK3,
11873         IX86_BUILTIN_INSERTF64X2_256, IX86_BUILTIN_INSERTI64X2_256,
11874         IX86_BUILTIN_PSRAVV16HI, IX86_BUILTIN_PSRAVV8HI,
11875         IX86_BUILTIN_PMADDUBSW256_MASK, IX86_BUILTIN_PMADDUBSW128_MASK,
11876         IX86_BUILTIN_PMADDWD256_MASK, IX86_BUILTIN_PMADDWD128_MASK,
11877         IX86_BUILTIN_PSRLVV16HI, IX86_BUILTIN_PSRLVV8HI,
11878         IX86_BUILTIN_CVTPS2DQ256_MASK, IX86_BUILTIN_CVTPS2DQ128_MASK,
11879         IX86_BUILTIN_CVTPS2UDQ256, IX86_BUILTIN_CVTPS2UDQ128,
11880         IX86_BUILTIN_CVTPS2QQ256, IX86_BUILTIN_CVTPS2QQ128,
11881         IX86_BUILTIN_CVTPS2UQQ256, IX86_BUILTIN_CVTPS2UQQ128,
11882         IX86_BUILTIN_GETMANTPS256, IX86_BUILTIN_GETMANTPS128,
11883         IX86_BUILTIN_GETMANTPD256, IX86_BUILTIN_GETMANTPD128,
11884         IX86_BUILTIN_MOVDDUP256_MASK, IX86_BUILTIN_MOVDDUP128_MASK,
11885         IX86_BUILTIN_MOVSHDUP256_MASK, IX86_BUILTIN_MOVSHDUP128_MASK,
11886         IX86_BUILTIN_MOVSLDUP256_MASK, IX86_BUILTIN_MOVSLDUP128_MASK,
11887         IX86_BUILTIN_CVTQQ2PS256, IX86_BUILTIN_CVTQQ2PS128,
11888         IX86_BUILTIN_CVTUQQ2PS256, IX86_BUILTIN_CVTUQQ2PS128,
11889         IX86_BUILTIN_CVTQQ2PD256, IX86_BUILTIN_CVTQQ2PD128,
11890         IX86_BUILTIN_CVTUQQ2PD256, IX86_BUILTIN_CVTUQQ2PD128,
11891         IX86_BUILTIN_VPERMT2VARQ256, IX86_BUILTIN_VPERMT2VARQ256_MASKZ,
11892         IX86_BUILTIN_VPERMT2VARD256, IX86_BUILTIN_VPERMT2VARD256_MASKZ,
11893         IX86_BUILTIN_VPERMI2VARQ256, IX86_BUILTIN_VPERMI2VARD256,
11894         IX86_BUILTIN_VPERMT2VARPD256, IX86_BUILTIN_VPERMT2VARPD256_MASKZ,
11895         IX86_BUILTIN_VPERMT2VARPS256, IX86_BUILTIN_VPERMT2VARPS256_MASKZ,
11896         IX86_BUILTIN_VPERMI2VARPD256, IX86_BUILTIN_VPERMI2VARPS256,
11897         IX86_BUILTIN_VPERMT2VARQ128, IX86_BUILTIN_VPERMT2VARQ128_MASKZ,
11898         IX86_BUILTIN_VPERMT2VARD128, IX86_BUILTIN_VPERMT2VARD128_MASKZ,
11899         IX86_BUILTIN_VPERMI2VARQ128, IX86_BUILTIN_VPERMI2VARD128,
11900         IX86_BUILTIN_VPERMT2VARPD128, IX86_BUILTIN_VPERMT2VARPD128_MASKZ,
11901         IX86_BUILTIN_VPERMT2VARPS128, IX86_BUILTIN_VPERMT2VARPS128_MASKZ,
11902         IX86_BUILTIN_VPERMI2VARPD128, IX86_BUILTIN_VPERMI2VARPS128,
11903         IX86_BUILTIN_PSHUFB256_MASK, IX86_BUILTIN_PSHUFB128_MASK,
11904         IX86_BUILTIN_PSHUFHW256_MASK, IX86_BUILTIN_PSHUFHW128_MASK,
11905         IX86_BUILTIN_PSHUFLW256_MASK, IX86_BUILTIN_PSHUFLW128_MASK,
11906         IX86_BUILTIN_PSHUFD256_MASK, IX86_BUILTIN_PSHUFD128_MASK,
11907         IX86_BUILTIN_SHUFPD256_MASK, IX86_BUILTIN_SHUFPD128_MASK,
11908         IX86_BUILTIN_SHUFPS256_MASK, IX86_BUILTIN_SHUFPS128_MASK,
11909         IX86_BUILTIN_PROLVQ256, IX86_BUILTIN_PROLVQ128,
11910         IX86_BUILTIN_PROLQ256, IX86_BUILTIN_PROLQ128,
11911         IX86_BUILTIN_PRORVQ256, IX86_BUILTIN_PRORVQ128,
11912         IX86_BUILTIN_PRORQ256, IX86_BUILTIN_PRORQ128,
11913         IX86_BUILTIN_PSRAVQ128, IX86_BUILTIN_PSRAVQ256,
11914         IX86_BUILTIN_PSLLVV4DI_MASK, IX86_BUILTIN_PSLLVV2DI_MASK,
11915         IX86_BUILTIN_PSLLVV8SI_MASK, IX86_BUILTIN_PSLLVV4SI_MASK,
11916         IX86_BUILTIN_PSRAVV8SI_MASK, IX86_BUILTIN_PSRAVV4SI_MASK,
11917         IX86_BUILTIN_PSRLVV4DI_MASK, IX86_BUILTIN_PSRLVV2DI_MASK,
11918         IX86_BUILTIN_PSRLVV8SI_MASK, IX86_BUILTIN_PSRLVV4SI_MASK,
11919         IX86_BUILTIN_PSRAWI256_MASK, IX86_BUILTIN_PSRAW256_MASK,
11920         IX86_BUILTIN_PSRAWI128_MASK, IX86_BUILTIN_PSRAW128_MASK,
11921         IX86_BUILTIN_PSRLWI256_MASK, IX86_BUILTIN_PSRLW256_MASK,
11922         IX86_BUILTIN_PSRLWI128_MASK, IX86_BUILTIN_PSRLW128_MASK,
11923         IX86_BUILTIN_PRORVD256, IX86_BUILTIN_PROLVD256,
11924         IX86_BUILTIN_PRORD256, IX86_BUILTIN_PROLD256,
11925         IX86_BUILTIN_PRORVD128, IX86_BUILTIN_PROLVD128,
11926         IX86_BUILTIN_PRORD128, IX86_BUILTIN_PROLD128,
11927         IX86_BUILTIN_FPCLASSPD256, IX86_BUILTIN_FPCLASSPD128,
11928         IX86_BUILTIN_FPCLASSSD, IX86_BUILTIN_FPCLASSPS256,
11929         IX86_BUILTIN_FPCLASSPS128, IX86_BUILTIN_FPCLASSSS,
11930         IX86_BUILTIN_CVTB2MASK128, IX86_BUILTIN_CVTB2MASK256,
11931         IX86_BUILTIN_CVTW2MASK128, IX86_BUILTIN_CVTW2MASK256,
11932         IX86_BUILTIN_CVTD2MASK128, IX86_BUILTIN_CVTD2MASK256,
11933         IX86_BUILTIN_CVTQ2MASK128, IX86_BUILTIN_CVTQ2MASK256,
11934         IX86_BUILTIN_CVTMASK2B128, IX86_BUILTIN_CVTMASK2B256,
11935         IX86_BUILTIN_CVTMASK2W128, IX86_BUILTIN_CVTMASK2W256,
11936         IX86_BUILTIN_CVTMASK2D128, IX86_BUILTIN_CVTMASK2D256,
11937         IX86_BUILTIN_CVTMASK2Q128, IX86_BUILTIN_CVTMASK2Q256,
11938         IX86_BUILTIN_PCMPEQB128_MASK, IX86_BUILTIN_PCMPEQB256_MASK,
11939         IX86_BUILTIN_PCMPEQW128_MASK, IX86_BUILTIN_PCMPEQW256_MASK,
11940         IX86_BUILTIN_PCMPEQD128_MASK, IX86_BUILTIN_PCMPEQD256_MASK,
11941         IX86_BUILTIN_PCMPEQQ128_MASK, IX86_BUILTIN_PCMPEQQ256_MASK,
11942         IX86_BUILTIN_PCMPGTB128_MASK, IX86_BUILTIN_PCMPGTB256_MASK,
11943         IX86_BUILTIN_PCMPGTW128_MASK, IX86_BUILTIN_PCMPGTW256_MASK,
11944         IX86_BUILTIN_PCMPGTD128_MASK, IX86_BUILTIN_PCMPGTD256_MASK,
11945         IX86_BUILTIN_PCMPGTQ128_MASK, IX86_BUILTIN_PCMPGTQ256_MASK,
11946         IX86_BUILTIN_PTESTMB128, IX86_BUILTIN_PTESTMB256,
11947         IX86_BUILTIN_PTESTMW128, IX86_BUILTIN_PTESTMW256,
11948         IX86_BUILTIN_PTESTMD128, IX86_BUILTIN_PTESTMD256,
11949         IX86_BUILTIN_PTESTMQ128, IX86_BUILTIN_PTESTMQ256,
11950         IX86_BUILTIN_PTESTNMB128, IX86_BUILTIN_PTESTNMB256,
11951         IX86_BUILTIN_PTESTNMW128, IX86_BUILTIN_PTESTNMW256,
11952         IX86_BUILTIN_PTESTNMD128, IX86_BUILTIN_PTESTNMD256,
11953         IX86_BUILTIN_PTESTNMQ128, IX86_BUILTIN_PTESTNMQ256,
11954         IX86_BUILTIN_PBROADCASTMB128, IX86_BUILTIN_PBROADCASTMB256,
11955         IX86_BUILTIN_PBROADCASTMW128, IX86_BUILTIN_PBROADCASTMW256,
11956         IX86_BUILTIN_COMPRESSPD256, IX86_BUILTIN_COMPRESSPD128,
11957         IX86_BUILTIN_COMPRESSPS256, IX86_BUILTIN_COMPRESSPS128,
11958         IX86_BUILTIN_PCOMPRESSQ256, IX86_BUILTIN_PCOMPRESSQ128,
11959         IX86_BUILTIN_PCOMPRESSD256, IX86_BUILTIN_PCOMPRESSD128,
11960         IX86_BUILTIN_EXPANDPD256, IX86_BUILTIN_EXPANDPD128,
11961         IX86_BUILTIN_EXPANDPS256, IX86_BUILTIN_EXPANDPS128,
11962         IX86_BUILTIN_PEXPANDQ256, IX86_BUILTIN_PEXPANDQ128,
11963         IX86_BUILTIN_PEXPANDD256, IX86_BUILTIN_PEXPANDD128,
11964         IX86_BUILTIN_EXPANDPD256Z, IX86_BUILTIN_EXPANDPD128Z,
11965         IX86_BUILTIN_EXPANDPS256Z, IX86_BUILTIN_EXPANDPS128Z,
11966         IX86_BUILTIN_PEXPANDQ256Z, IX86_BUILTIN_PEXPANDQ128Z,
11967         IX86_BUILTIN_PEXPANDD256Z, IX86_BUILTIN_PEXPANDD128Z,
11968         IX86_BUILTIN_PMAXSD256_MASK, IX86_BUILTIN_PMINSD256_MASK,
11969         IX86_BUILTIN_PMAXUD256_MASK, IX86_BUILTIN_PMINUD256_MASK,
11970         IX86_BUILTIN_PMAXSD128_MASK, IX86_BUILTIN_PMINSD128_MASK,
11971         IX86_BUILTIN_PMAXUD128_MASK, IX86_BUILTIN_PMINUD128_MASK,
11972         IX86_BUILTIN_PMAXSQ256_MASK, IX86_BUILTIN_PMINSQ256_MASK,
11973         IX86_BUILTIN_PMAXUQ256_MASK, IX86_BUILTIN_PMINUQ256_MASK,
11974         IX86_BUILTIN_PMAXSQ128_MASK, IX86_BUILTIN_PMINSQ128_MASK,
11975         IX86_BUILTIN_PMAXUQ128_MASK, IX86_BUILTIN_PMINUQ128_MASK,
11976         IX86_BUILTIN_PMINSB256_MASK, IX86_BUILTIN_PMINUB256_MASK,
11977         IX86_BUILTIN_PMAXSB256_MASK, IX86_BUILTIN_PMAXUB256_MASK,
11978         IX86_BUILTIN_PMINSB128_MASK, IX86_BUILTIN_PMINUB128_MASK,
11979         IX86_BUILTIN_PMAXSB128_MASK, IX86_BUILTIN_PMAXUB128_MASK,
11980         IX86_BUILTIN_PMINSW256_MASK, IX86_BUILTIN_PMINUW256_MASK,
11981         IX86_BUILTIN_PMAXSW256_MASK, IX86_BUILTIN_PMAXUW256_MASK,
11982         IX86_BUILTIN_PMINSW128_MASK, IX86_BUILTIN_PMINUW128_MASK,
11983         IX86_BUILTIN_PMAXSW128_MASK, IX86_BUILTIN_PMAXUW128_MASK,
11984         IX86_BUILTIN_VPCONFLICTQ256, IX86_BUILTIN_VPCONFLICTD256,
11985         IX86_BUILTIN_VPCLZCNTQ256, IX86_BUILTIN_VPCLZCNTD256,
11986         IX86_BUILTIN_UNPCKHPD256_MASK, IX86_BUILTIN_UNPCKHPD128_MASK,
11987         IX86_BUILTIN_UNPCKHPS256_MASK, IX86_BUILTIN_UNPCKHPS128_MASK,
11988         IX86_BUILTIN_UNPCKLPD256_MASK, IX86_BUILTIN_UNPCKLPD128_MASK,
11989         IX86_BUILTIN_UNPCKLPS256_MASK, IX86_BUILTIN_VPCONFLICTQ128,
11990         IX86_BUILTIN_VPCONFLICTD128, IX86_BUILTIN_VPCLZCNTQ128,
11991         IX86_BUILTIN_VPCLZCNTD128, IX86_BUILTIN_UNPCKLPS128_MASK,
11992         IX86_BUILTIN_ALIGND256, IX86_BUILTIN_ALIGNQ256,
11993         IX86_BUILTIN_ALIGND128, IX86_BUILTIN_ALIGNQ128,
11994         IX86_BUILTIN_CVTPS2PH256_MASK, IX86_BUILTIN_CVTPS2PH_MASK,
11995         IX86_BUILTIN_CVTPH2PS_MASK, IX86_BUILTIN_CVTPH2PS256_MASK,
11996         IX86_BUILTIN_PUNPCKHDQ128_MASK, IX86_BUILTIN_PUNPCKHDQ256_MASK,
11997         IX86_BUILTIN_PUNPCKHQDQ128_MASK, IX86_BUILTIN_PUNPCKHQDQ256_MASK,
11998         IX86_BUILTIN_PUNPCKLDQ128_MASK, IX86_BUILTIN_PUNPCKLDQ256_MASK,
11999         IX86_BUILTIN_PUNPCKLQDQ128_MASK, IX86_BUILTIN_PUNPCKLQDQ256_MASK,
12000         IX86_BUILTIN_PUNPCKHBW128_MASK, IX86_BUILTIN_PUNPCKHBW256_MASK,
12001         IX86_BUILTIN_PUNPCKHWD128_MASK, IX86_BUILTIN_PUNPCKHWD256_MASK,
12002         IX86_BUILTIN_PUNPCKLBW128_MASK, IX86_BUILTIN_PUNPCKLBW256_MASK,
12003         IX86_BUILTIN_PUNPCKLWD128_MASK, IX86_BUILTIN_PUNPCKLWD256_MASK,
12004         IX86_BUILTIN_PSLLVV16HI, IX86_BUILTIN_PSLLVV8HI,
12005         IX86_BUILTIN_PACKSSDW256_MASK, IX86_BUILTIN_PACKSSDW128_MASK,
12006         IX86_BUILTIN_PACKUSDW256_MASK, IX86_BUILTIN_PACKUSDW128_MASK,
12007         IX86_BUILTIN_PAVGB256_MASK, IX86_BUILTIN_PAVGW256_MASK,
12008         IX86_BUILTIN_PAVGB128_MASK, IX86_BUILTIN_PAVGW128_MASK,
12009         IX86_BUILTIN_VPERMVARSF256_MASK, IX86_BUILTIN_VPERMVARDF256_MASK,
12010         IX86_BUILTIN_VPERMDF256_MASK, IX86_BUILTIN_PABSB256_MASK,
12011         IX86_BUILTIN_PABSB128_MASK, IX86_BUILTIN_PABSW256_MASK,
12012         IX86_BUILTIN_PABSW128_MASK, IX86_BUILTIN_VPERMILVARPD_MASK,
12013         IX86_BUILTIN_VPERMILVARPS_MASK, IX86_BUILTIN_VPERMILVARPD256_MASK,
12014         IX86_BUILTIN_VPERMILVARPS256_MASK, IX86_BUILTIN_VPERMILPD_MASK,
12015         IX86_BUILTIN_VPERMILPS_MASK, IX86_BUILTIN_VPERMILPD256_MASK,
12016         IX86_BUILTIN_VPERMILPS256_MASK, IX86_BUILTIN_BLENDMQ256,
12017         IX86_BUILTIN_BLENDMD256, IX86_BUILTIN_BLENDMPD256,
12018         IX86_BUILTIN_BLENDMPS256, IX86_BUILTIN_BLENDMQ128,
12019         IX86_BUILTIN_BLENDMD128, IX86_BUILTIN_BLENDMPD128,
12020         IX86_BUILTIN_BLENDMPS128, IX86_BUILTIN_BLENDMW256,
12021         IX86_BUILTIN_BLENDMB256, IX86_BUILTIN_BLENDMW128,
12022         IX86_BUILTIN_BLENDMB128, IX86_BUILTIN_PMULLD256_MASK,
12023         IX86_BUILTIN_PMULLD128_MASK, IX86_BUILTIN_PMULUDQ256_MASK,
12024         IX86_BUILTIN_PMULDQ256_MASK, IX86_BUILTIN_PMULDQ128_MASK,
12025         IX86_BUILTIN_PMULUDQ128_MASK, IX86_BUILTIN_CVTPD2PS256_MASK,
12026         IX86_BUILTIN_CVTPD2PS_MASK, IX86_BUILTIN_VPERMVARSI256_MASK,
12027         IX86_BUILTIN_VPERMVARDI256_MASK, IX86_BUILTIN_VPERMDI256_MASK,
12028         IX86_BUILTIN_CMPQ256, IX86_BUILTIN_CMPD256,
12029         IX86_BUILTIN_UCMPQ256, IX86_BUILTIN_UCMPD256,
12030         IX86_BUILTIN_CMPB256, IX86_BUILTIN_CMPW256,
12031         IX86_BUILTIN_UCMPB256, IX86_BUILTIN_UCMPW256,
12032         IX86_BUILTIN_CMPPD256_MASK, IX86_BUILTIN_CMPPS256_MASK,
12033         IX86_BUILTIN_CMPQ128, IX86_BUILTIN_CMPD128,
12034         IX86_BUILTIN_UCMPQ128, IX86_BUILTIN_UCMPD128,
12035         IX86_BUILTIN_CMPB128, IX86_BUILTIN_CMPW128,
12036         IX86_BUILTIN_UCMPB128, IX86_BUILTIN_UCMPW128,
12037         IX86_BUILTIN_CMPPD128_MASK, IX86_BUILTIN_CMPPS128_MASK,
12038         IX86_BUILTIN_GATHER3SIV8SF, IX86_BUILTIN_GATHER3SIV4SF,
12039         IX86_BUILTIN_GATHER3SIV4DF, IX86_BUILTIN_GATHER3SIV2DF,
12040         IX86_BUILTIN_GATHER3DIV8SF, IX86_BUILTIN_GATHER3DIV4SF,
12041         IX86_BUILTIN_GATHER3DIV4DF, IX86_BUILTIN_GATHER3DIV2DF,
12042         IX86_BUILTIN_GATHER3SIV8SI, IX86_BUILTIN_GATHER3SIV4SI,
12043         IX86_BUILTIN_GATHER3SIV4DI, IX86_BUILTIN_GATHER3SIV2DI,
12044         IX86_BUILTIN_GATHER3DIV8SI, IX86_BUILTIN_GATHER3DIV4SI,
12045         IX86_BUILTIN_GATHER3DIV4DI, IX86_BUILTIN_GATHER3DIV2DI,
12046         IX86_BUILTIN_SCATTERSIV8SF, IX86_BUILTIN_SCATTERSIV4SF,
12047         IX86_BUILTIN_SCATTERSIV4DF, IX86_BUILTIN_SCATTERSIV2DF,
12048         IX86_BUILTIN_SCATTERDIV8SF, IX86_BUILTIN_SCATTERDIV4SF,
12049         IX86_BUILTIN_SCATTERDIV4DF, IX86_BUILTIN_SCATTERDIV2DF,
12050         IX86_BUILTIN_SCATTERSIV8SI, IX86_BUILTIN_SCATTERSIV4SI,
12051         IX86_BUILTIN_SCATTERSIV4DI, IX86_BUILTIN_SCATTERSIV2DI,
12052         IX86_BUILTIN_SCATTERDIV8SI, IX86_BUILTIN_SCATTERDIV4SI,
12053         IX86_BUILTIN_SCATTERDIV4DI, IX86_BUILTIN_SCATTERDIV2DI,
12054         IX86_BUILTIN_RANGESD128, IX86_BUILTIN_RANGESS128,
12055         IX86_BUILTIN_KUNPCKWD, IX86_BUILTIN_KUNPCKDQ,
12056         IX86_BUILTIN_BROADCASTF32x2_512, IX86_BUILTIN_BROADCASTI32x2_512,
12057         IX86_BUILTIN_BROADCASTF64X2_512, IX86_BUILTIN_BROADCASTI64X2_512,
12058         IX86_BUILTIN_BROADCASTF32X8_512, IX86_BUILTIN_BROADCASTI32X8_512,
12059         IX86_BUILTIN_EXTRACTF64X2_512, IX86_BUILTIN_EXTRACTF32X8,
12060         IX86_BUILTIN_EXTRACTI64X2_512, IX86_BUILTIN_EXTRACTI32X8,
12061         IX86_BUILTIN_REDUCEPD512_MASK, IX86_BUILTIN_REDUCEPS512_MASK,
12062         IX86_BUILTIN_PMULLQ512, IX86_BUILTIN_XORPD512,
12063         IX86_BUILTIN_XORPS512, IX86_BUILTIN_ORPD512,
12064         IX86_BUILTIN_ORPS512, IX86_BUILTIN_ANDPD512,
12065         IX86_BUILTIN_ANDPS512, IX86_BUILTIN_ANDNPD512,
12066         IX86_BUILTIN_ANDNPS512, IX86_BUILTIN_INSERTF32X8,
12067         IX86_BUILTIN_INSERTI32X8, IX86_BUILTIN_INSERTF64X2_512,
12068         IX86_BUILTIN_INSERTI64X2_512, IX86_BUILTIN_FPCLASSPD512,
12069         IX86_BUILTIN_FPCLASSPS512, IX86_BUILTIN_CVTD2MASK512,
12070         IX86_BUILTIN_CVTQ2MASK512, IX86_BUILTIN_CVTMASK2D512,
12071         IX86_BUILTIN_CVTMASK2Q512, IX86_BUILTIN_CVTPD2QQ512,
12072         IX86_BUILTIN_CVTPS2QQ512, IX86_BUILTIN_CVTPD2UQQ512,
12073         IX86_BUILTIN_CVTPS2UQQ512, IX86_BUILTIN_CVTQQ2PS512,
12074         IX86_BUILTIN_CVTUQQ2PS512, IX86_BUILTIN_CVTQQ2PD512,
12075         IX86_BUILTIN_CVTUQQ2PD512, IX86_BUILTIN_CVTTPS2QQ512,
12076         IX86_BUILTIN_CVTTPS2UQQ512, IX86_BUILTIN_CVTTPD2QQ512,
12077         IX86_BUILTIN_CVTTPD2UQQ512, IX86_BUILTIN_RANGEPS512,
12078         IX86_BUILTIN_RANGEPD512, IX86_BUILTIN_PACKUSDW512,
12079         IX86_BUILTIN_PACKSSDW512, IX86_BUILTIN_LOADDQUHI512_MASK,
12080         IX86_BUILTIN_LOADDQUQI512_MASK, IX86_BUILTIN_PSLLDQ512,
12081         IX86_BUILTIN_PSRLDQ512, IX86_BUILTIN_STOREDQUHI512_MASK,
12082         IX86_BUILTIN_STOREDQUQI512_MASK, IX86_BUILTIN_PALIGNR512,
12083         IX86_BUILTIN_PALIGNR512_MASK, IX86_BUILTIN_MOVDQUHI512_MASK,
12084         IX86_BUILTIN_MOVDQUQI512_MASK, IX86_BUILTIN_PSADBW512,
12085         IX86_BUILTIN_DBPSADBW512, IX86_BUILTIN_PBROADCASTB512,
12086         IX86_BUILTIN_PBROADCASTB512_GPR, IX86_BUILTIN_PBROADCASTW512,
12087         IX86_BUILTIN_PBROADCASTW512_GPR, IX86_BUILTIN_PMOVSXBW512_MASK,
12088         IX86_BUILTIN_PMOVZXBW512_MASK, IX86_BUILTIN_VPERMVARHI512_MASK,
12089         IX86_BUILTIN_VPERMT2VARHI512, IX86_BUILTIN_VPERMT2VARHI512_MASKZ,
12090         IX86_BUILTIN_VPERMI2VARHI512, IX86_BUILTIN_PAVGB512,
12091         IX86_BUILTIN_PAVGW512, IX86_BUILTIN_PADDB512,
12092         IX86_BUILTIN_PSUBB512, IX86_BUILTIN_PSUBSB512,
12093         IX86_BUILTIN_PADDSB512, IX86_BUILTIN_PSUBUSB512,
12094         IX86_BUILTIN_PADDUSB512, IX86_BUILTIN_PSUBW512,
12095         IX86_BUILTIN_PADDW512, IX86_BUILTIN_PSUBSW512,
12096         IX86_BUILTIN_PADDSW512, IX86_BUILTIN_PSUBUSW512,
12097         IX86_BUILTIN_PADDUSW512, IX86_BUILTIN_PMAXUW512,
12098         IX86_BUILTIN_PMAXSW512, IX86_BUILTIN_PMINUW512,
12099         IX86_BUILTIN_PMINSW512, IX86_BUILTIN_PMAXUB512,
12100         IX86_BUILTIN_PMAXSB512, IX86_BUILTIN_PMINUB512,
12101         IX86_BUILTIN_PMINSB512, IX86_BUILTIN_PMOVWB512,
12102         IX86_BUILTIN_PMOVSWB512, IX86_BUILTIN_PMOVUSWB512,
12103         IX86_BUILTIN_PMULHRSW512_MASK, IX86_BUILTIN_PMULHUW512_MASK,
12104         IX86_BUILTIN_PMULHW512_MASK, IX86_BUILTIN_PMULLW512_MASK,
12105         IX86_BUILTIN_PSLLWI512_MASK, IX86_BUILTIN_PSLLW512_MASK,
12106         IX86_BUILTIN_PACKSSWB512, IX86_BUILTIN_PACKUSWB512,
12107         IX86_BUILTIN_PSRAVV32HI, IX86_BUILTIN_PMADDUBSW512_MASK,
12108         IX86_BUILTIN_PMADDWD512_MASK, IX86_BUILTIN_PSRLVV32HI,
12109         IX86_BUILTIN_PUNPCKHBW512, IX86_BUILTIN_PUNPCKHWD512,
12110         IX86_BUILTIN_PUNPCKLBW512, IX86_BUILTIN_PUNPCKLWD512,
12111         IX86_BUILTIN_PSHUFB512, IX86_BUILTIN_PSHUFHW512,
12112         IX86_BUILTIN_PSHUFLW512, IX86_BUILTIN_PSRAWI512,
12113         IX86_BUILTIN_PSRAW512, IX86_BUILTIN_PSRLWI512,
12114         IX86_BUILTIN_PSRLW512, IX86_BUILTIN_CVTB2MASK512,
12115         IX86_BUILTIN_CVTW2MASK512, IX86_BUILTIN_CVTMASK2B512,
12116         IX86_BUILTIN_CVTMASK2W512, IX86_BUILTIN_PCMPEQB512_MASK,
12117         IX86_BUILTIN_PCMPEQW512_MASK, IX86_BUILTIN_PCMPGTB512_MASK,
12118         IX86_BUILTIN_PCMPGTW512_MASK, IX86_BUILTIN_PTESTMB512,
12119         IX86_BUILTIN_PTESTMW512, IX86_BUILTIN_PTESTNMB512,
12120         IX86_BUILTIN_PTESTNMW512, IX86_BUILTIN_PSLLVV32HI,
12121         IX86_BUILTIN_PABSB512, IX86_BUILTIN_PABSW512,
12122         IX86_BUILTIN_BLENDMW512, IX86_BUILTIN_BLENDMB512,
12123         IX86_BUILTIN_CMPB512, IX86_BUILTIN_CMPW512,
12124         IX86_BUILTIN_UCMPB512, IX86_BUILTIN_UCMPW512.
12125         (bdesc_special_args):
12126         Add __builtin_ia32_loaddquhi512_mask, __builtin_ia32_loaddquqi512_mask,
12127         __builtin_ia32_storedquhi512_mask, __builtin_ia32_storedquqi512_mask,
12128         __builtin_ia32_loaddquhi256_mask, __builtin_ia32_loaddquhi128_mask,
12129         __builtin_ia32_loaddquqi256_mask, __builtin_ia32_loaddquqi128_mask,
12130         __builtin_ia32_movdqa64load256_mask, __builtin_ia32_movdqa64load128_mask,
12131         __builtin_ia32_movdqa32load256_mask, __builtin_ia32_movdqa32load128_mask,
12132         __builtin_ia32_movdqa64store256_mask, __builtin_ia32_movdqa64store128_mask,
12133         __builtin_ia32_movdqa32store256_mask, __builtin_ia32_movdqa32store128_mask,
12134         __builtin_ia32_loadapd256_mask, __builtin_ia32_loadapd128_mask,
12135         __builtin_ia32_loadaps256_mask, __builtin_ia32_loadaps128_mask,
12136         __builtin_ia32_storeapd256_mask, __builtin_ia32_storeapd128_mask,
12137         __builtin_ia32_storeaps256_mask, __builtin_ia32_storeaps128_mask,
12138         __builtin_ia32_loadupd256_mask, __builtin_ia32_loadupd128_mask,
12139         __builtin_ia32_loadups256_mask, __builtin_ia32_loadups128_mask,
12140         __builtin_ia32_storeupd256_mask, __builtin_ia32_storeupd128_mask,
12141         __builtin_ia32_storeups256_mask, __builtin_ia32_storeups128_mask,
12142         __builtin_ia32_loaddqudi256_mask, __builtin_ia32_loaddqudi128_mask,
12143         __builtin_ia32_loaddqusi256_mask, __builtin_ia32_loaddqusi128_mask,
12144         __builtin_ia32_storedqudi256_mask, __builtin_ia32_storedqudi128_mask,
12145         __builtin_ia32_storedqusi256_mask, __builtin_ia32_storedqusi128_mask,
12146         __builtin_ia32_storedquhi256_mask, __builtin_ia32_storedquhi128_mask,
12147         __builtin_ia32_storedquqi256_mask, __builtin_ia32_storedquqi128_mask,
12148         __builtin_ia32_compressstoredf256_mask, __builtin_ia32_compressstoredf128_mask,
12149         __builtin_ia32_compressstoresf256_mask, __builtin_ia32_compressstoresf128_mask,
12150         __builtin_ia32_compressstoredi256_mask, __builtin_ia32_compressstoredi128_mask,
12151         __builtin_ia32_compressstoresi256_mask, __builtin_ia32_compressstoresi128_mask,
12152         __builtin_ia32_expandloaddf256_mask, __builtin_ia32_expandloaddf128_mask,
12153         __builtin_ia32_expandloadsf256_mask, __builtin_ia32_expandloadsf128_mask,
12154         __builtin_ia32_expandloaddi256_mask, __builtin_ia32_expandloaddi128_mask,
12155         __builtin_ia32_expandloadsi256_mask, __builtin_ia32_expandloadsi128_mask,
12156         __builtin_ia32_expandloaddf256_maskz, __builtin_ia32_expandloaddf128_maskz,
12157         __builtin_ia32_expandloadsf256_maskz, __builtin_ia32_expandloadsf128_maskz,
12158         __builtin_ia32_expandloaddi256_maskz, __builtin_ia32_expandloaddi128_maskz,
12159         __builtin_ia32_expandloadsi256_maskz, __builtin_ia32_expandloadsi128_maskz,
12160         __builtin_ia32_pmovqd256mem_mask, __builtin_ia32_pmovqd128mem_mask,
12161         __builtin_ia32_pmovsqd256mem_mask, __builtin_ia32_pmovsqd128mem_mask,
12162         __builtin_ia32_pmovusqd256mem_mask, __builtin_ia32_pmovusqd128mem_mask,
12163         __builtin_ia32_pmovqw256mem_mask, __builtin_ia32_pmovqw128mem_mask,
12164         __builtin_ia32_pmovsqw256mem_mask, __builtin_ia32_pmovsqw128mem_mask,
12165         __builtin_ia32_pmovusqw256mem_mask, __builtin_ia32_pmovusqw128mem_mask,
12166         __builtin_ia32_pmovqb256mem_mask, __builtin_ia32_pmovqb128mem_mask,
12167         __builtin_ia32_pmovsqb256mem_mask, __builtin_ia32_pmovsqb128mem_mask,
12168         __builtin_ia32_pmovusqb256mem_mask, __builtin_ia32_pmovusqb128mem_mask,
12169         __builtin_ia32_pmovdb256mem_mask, __builtin_ia32_pmovdb128mem_mask,
12170         __builtin_ia32_pmovsdb256mem_mask, __builtin_ia32_pmovsdb128mem_mask,
12171         __builtin_ia32_pmovusdb256mem_mask, __builtin_ia32_pmovusdb128mem_mask,
12172         __builtin_ia32_pmovdw256mem_mask, __builtin_ia32_pmovdw128mem_mask,
12173         __builtin_ia32_pmovsdw256mem_mask, __builtin_ia32_pmovsdw128mem_mask,
12174         __builtin_ia32_pmovusdw256mem_mask, __builtin_ia32_pmovusdw128mem_mask,
12175         __builtin_ia32_palignr256_mask, __builtin_ia32_palignr128_mask,
12176         __builtin_ia32_movdqa64_256_mask, __builtin_ia32_movdqa64_128_mask,
12177         __builtin_ia32_movdqa32_256_mask, __builtin_ia32_movdqa32_128_mask,
12178         __builtin_ia32_movapd256_mask, __builtin_ia32_movapd128_mask,
12179         __builtin_ia32_movaps256_mask, __builtin_ia32_movaps128_mask,
12180         __builtin_ia32_movdquhi256_mask, __builtin_ia32_movdquhi128_mask,
12181         __builtin_ia32_movdquqi256_mask, __builtin_ia32_movdquqi128_mask,
12182         __builtin_ia32_minps_mask, __builtin_ia32_maxps_mask,
12183         __builtin_ia32_minpd_mask, __builtin_ia32_maxpd_mask,
12184         __builtin_ia32_maxpd256_mask, __builtin_ia32_maxps256_mask,
12185         __builtin_ia32_minpd256_mask, __builtin_ia32_minps256_mask,
12186         __builtin_ia32_mulps_mask, __builtin_ia32_divps_mask,
12187         __builtin_ia32_mulpd_mask, __builtin_ia32_divpd_mask,
12188         __builtin_ia32_divpd256_mask, __builtin_ia32_divps256_mask,
12189         __builtin_ia32_mulpd256_mask, __builtin_ia32_mulps256_mask,
12190         __builtin_ia32_addpd128_mask, __builtin_ia32_addpd256_mask,
12191         __builtin_ia32_addps128_mask, __builtin_ia32_addps256_mask,
12192         __builtin_ia32_subpd128_mask, __builtin_ia32_subpd256_mask,
12193         __builtin_ia32_subps128_mask, __builtin_ia32_subps256_mask,
12194         __builtin_ia32_xorpd256_mask, __builtin_ia32_xorpd128_mask,
12195         __builtin_ia32_xorps256_mask, __builtin_ia32_xorps128_mask,
12196         __builtin_ia32_orpd256_mask, __builtin_ia32_orpd128_mask,
12197         __builtin_ia32_orps256_mask, __builtin_ia32_orps128_mask,
12198         __builtin_ia32_broadcastf32x2_256_mask, __builtin_ia32_broadcasti32x2_256_mask,
12199         __builtin_ia32_broadcasti32x2_128_mask, __builtin_ia32_broadcastf64x2_256_mask,
12200         __builtin_ia32_broadcasti64x2_256_mask, __builtin_ia32_broadcastf32x4_256_mask,
12201         __builtin_ia32_broadcasti32x4_256_mask, __builtin_ia32_extractf32x4_256_mask,
12202         __builtin_ia32_extracti32x4_256_mask, __builtin_ia32_dbpsadbw256_mask,
12203         __builtin_ia32_dbpsadbw128_mask, __builtin_ia32_cvttpd2qq256_mask,
12204         __builtin_ia32_cvttpd2qq128_mask, __builtin_ia32_cvttpd2uqq256_mask,
12205         __builtin_ia32_cvttpd2uqq128_mask, __builtin_ia32_cvtpd2qq256_mask,
12206         __builtin_ia32_cvtpd2qq128_mask, __builtin_ia32_cvtpd2uqq256_mask,
12207         __builtin_ia32_cvtpd2uqq128_mask, __builtin_ia32_cvtpd2udq256_mask,
12208         __builtin_ia32_cvtpd2udq128_mask, __builtin_ia32_cvttps2qq256_mask,
12209         __builtin_ia32_cvttps2qq128_mask, __builtin_ia32_cvttps2uqq256_mask,
12210         __builtin_ia32_cvttps2uqq128_mask, __builtin_ia32_cvttps2dq256_mask,
12211         __builtin_ia32_cvttps2dq128_mask, __builtin_ia32_cvttps2udq256_mask,
12212         __builtin_ia32_cvttps2udq128_mask, __builtin_ia32_cvttpd2dq256_mask,
12213         __builtin_ia32_cvttpd2dq128_mask, __builtin_ia32_cvttpd2udq256_mask,
12214         __builtin_ia32_cvttpd2udq128_mask, __builtin_ia32_cvtpd2dq256_mask,
12215         __builtin_ia32_cvtpd2dq128_mask, __builtin_ia32_cvtdq2pd256_mask,
12216         __builtin_ia32_cvtdq2pd128_mask, __builtin_ia32_cvtudq2pd256_mask,
12217         __builtin_ia32_cvtudq2pd128_mask, __builtin_ia32_cvtdq2ps256_mask,
12218         __builtin_ia32_cvtdq2ps128_mask, __builtin_ia32_cvtudq2ps256_mask,
12219         __builtin_ia32_cvtudq2ps128_mask, __builtin_ia32_cvtps2pd256_mask,
12220         __builtin_ia32_cvtps2pd128_mask, __builtin_ia32_pbroadcastb256_mask,
12221         __builtin_ia32_pbroadcastb256_gpr_mask, __builtin_ia32_pbroadcastb128_mask,
12222         __builtin_ia32_pbroadcastb128_gpr_mask, __builtin_ia32_pbroadcastw256_mask,
12223         __builtin_ia32_pbroadcastw256_gpr_mask, __builtin_ia32_pbroadcastw128_mask,
12224         __builtin_ia32_pbroadcastw128_gpr_mask, __builtin_ia32_pbroadcastd256_mask,
12225         __builtin_ia32_pbroadcastd256_gpr_mask, __builtin_ia32_pbroadcastd128_mask,
12226         __builtin_ia32_pbroadcastd128_gpr_mask, __builtin_ia32_pbroadcastq256_mask,
12227         __builtin_ia32_pbroadcastq256_gpr_mask, __builtin_ia32_pbroadcastq256_mem_mask,
12228         __builtin_ia32_pbroadcastq128_mask, __builtin_ia32_pbroadcastq128_gpr_mask,
12229         __builtin_ia32_pbroadcastq128_mem_mask, __builtin_ia32_broadcastss256_mask,
12230         __builtin_ia32_broadcastss128_mask, __builtin_ia32_broadcastsd256_mask,
12231         __builtin_ia32_extractf64x2_256_mask, __builtin_ia32_extracti64x2_256_mask,
12232         __builtin_ia32_insertf32x4_256_mask, __builtin_ia32_inserti32x4_256_mask,
12233         __builtin_ia32_pmovsxbw256_mask, __builtin_ia32_pmovsxbw128_mask,
12234         __builtin_ia32_pmovsxbd256_mask, __builtin_ia32_pmovsxbd128_mask,
12235         __builtin_ia32_pmovsxbq256_mask, __builtin_ia32_pmovsxbq128_mask,
12236         __builtin_ia32_pmovsxwd256_mask, __builtin_ia32_pmovsxwd128_mask,
12237         __builtin_ia32_pmovsxwq256_mask, __builtin_ia32_pmovsxwq128_mask,
12238         __builtin_ia32_pmovsxdq256_mask, __builtin_ia32_pmovsxdq128_mask,
12239         __builtin_ia32_pmovzxbw256_mask, __builtin_ia32_pmovzxbw128_mask,
12240         __builtin_ia32_pmovzxbd256_mask, __builtin_ia32_pmovzxbd128_mask,
12241         __builtin_ia32_pmovzxbq256_mask, __builtin_ia32_pmovzxbq128_mask,
12242         __builtin_ia32_pmovzxwd256_mask, __builtin_ia32_pmovzxwd128_mask,
12243         __builtin_ia32_pmovzxwq256_mask, __builtin_ia32_pmovzxwq128_mask,
12244         __builtin_ia32_pmovzxdq256_mask, __builtin_ia32_pmovzxdq128_mask,
12245         __builtin_ia32_reducepd256_mask, __builtin_ia32_reducepd128_mask,
12246         __builtin_ia32_reduceps256_mask, __builtin_ia32_reduceps128_mask,
12247         __builtin_ia32_reducesd, __builtin_ia32_reducess,
12248         __builtin_ia32_permvarhi256_mask, __builtin_ia32_permvarhi128_mask,
12249         __builtin_ia32_vpermt2varhi256_mask, __builtin_ia32_vpermt2varhi256_maskz,
12250         __builtin_ia32_vpermt2varhi128_mask, __builtin_ia32_vpermt2varhi128_maskz,
12251         __builtin_ia32_vpermi2varhi256_mask, __builtin_ia32_vpermi2varhi128_mask,
12252         __builtin_ia32_rcp14pd256_mask, __builtin_ia32_rcp14pd128_mask,
12253         __builtin_ia32_rcp14ps256_mask, __builtin_ia32_rcp14ps128_mask,
12254         __builtin_ia32_rsqrt14pd256_mask, __builtin_ia32_rsqrt14pd128_mask,
12255         __builtin_ia32_rsqrt14ps256_mask, __builtin_ia32_rsqrt14ps128_mask,
12256         __builtin_ia32_sqrtpd256_mask, __builtin_ia32_sqrtpd128_mask,
12257         __builtin_ia32_sqrtps256_mask, __builtin_ia32_sqrtps128_mask,
12258         __builtin_ia32_paddb128_mask, __builtin_ia32_paddw128_mask,
12259         __builtin_ia32_paddd128_mask, __builtin_ia32_paddq128_mask,
12260         __builtin_ia32_psubb128_mask, __builtin_ia32_psubw128_mask,
12261         __builtin_ia32_psubd128_mask, __builtin_ia32_psubq128_mask,
12262         __builtin_ia32_paddsb128_mask, __builtin_ia32_paddsw128_mask,
12263         __builtin_ia32_psubsb128_mask, __builtin_ia32_psubsw128_mask,
12264         __builtin_ia32_paddusb128_mask, __builtin_ia32_paddusw128_mask,
12265         __builtin_ia32_psubusb128_mask, __builtin_ia32_psubusw128_mask,
12266         __builtin_ia32_paddb256_mask, __builtin_ia32_paddw256_mask,
12267         __builtin_ia32_paddd256_mask, __builtin_ia32_paddq256_mask,
12268         __builtin_ia32_paddsb256_mask, __builtin_ia32_paddsw256_mask,
12269         __builtin_ia32_paddusb256_mask, __builtin_ia32_paddusw256_mask,
12270         __builtin_ia32_psubb256_mask, __builtin_ia32_psubw256_mask,
12271         __builtin_ia32_psubd256_mask, __builtin_ia32_psubq256_mask,
12272         __builtin_ia32_psubsb256_mask, __builtin_ia32_psubsw256_mask,
12273         __builtin_ia32_psubusb256_mask, __builtin_ia32_psubusw256_mask,
12274         __builtin_ia32_shuf_f64x2_256_mask, __builtin_ia32_shuf_i64x2_256_mask,
12275         __builtin_ia32_shuf_i32x4_256_mask, __builtin_ia32_shuf_f32x4_256_mask,
12276         __builtin_ia32_pmovwb128_mask, __builtin_ia32_pmovwb256_mask,
12277         __builtin_ia32_pmovswb128_mask, __builtin_ia32_pmovswb256_mask,
12278         __builtin_ia32_pmovuswb128_mask, __builtin_ia32_pmovuswb256_mask,
12279         __builtin_ia32_pmovdb128_mask, __builtin_ia32_pmovdb256_mask,
12280         __builtin_ia32_pmovsdb128_mask, __builtin_ia32_pmovsdb256_mask,
12281         __builtin_ia32_pmovusdb128_mask, __builtin_ia32_pmovusdb256_mask,
12282         __builtin_ia32_pmovdw128_mask, __builtin_ia32_pmovdw256_mask,
12283         __builtin_ia32_pmovsdw128_mask, __builtin_ia32_pmovsdw256_mask,
12284         __builtin_ia32_pmovusdw128_mask, __builtin_ia32_pmovusdw256_mask,
12285         __builtin_ia32_pmovqb128_mask, __builtin_ia32_pmovqb256_mask,
12286         __builtin_ia32_pmovsqb128_mask, __builtin_ia32_pmovsqb256_mask,
12287         __builtin_ia32_pmovusqb128_mask, __builtin_ia32_pmovusqb256_mask,
12288         __builtin_ia32_pmovqw128_mask, __builtin_ia32_pmovqw256_mask,
12289         __builtin_ia32_pmovsqw128_mask, __builtin_ia32_pmovsqw256_mask,
12290         __builtin_ia32_pmovusqw128_mask, __builtin_ia32_pmovusqw256_mask,
12291         __builtin_ia32_pmovqd128_mask, __builtin_ia32_pmovqd256_mask,
12292         __builtin_ia32_pmovsqd128_mask, __builtin_ia32_pmovsqd256_mask,
12293         __builtin_ia32_pmovusqd128_mask, __builtin_ia32_pmovusqd256_mask,
12294         __builtin_ia32_rangepd256_mask, __builtin_ia32_rangepd128_mask,
12295         __builtin_ia32_rangeps256_mask, __builtin_ia32_rangeps128_mask,
12296         __builtin_ia32_getexpps256_mask, __builtin_ia32_getexppd256_mask,
12297         __builtin_ia32_getexpps128_mask, __builtin_ia32_getexppd128_mask,
12298         __builtin_ia32_fixupimmpd256, __builtin_ia32_fixupimmpd256_mask,
12299         __builtin_ia32_fixupimmpd256_maskz, __builtin_ia32_fixupimmps256,
12300         __builtin_ia32_fixupimmps256_mask, __builtin_ia32_fixupimmps256_maskz,
12301         __builtin_ia32_fixupimmpd128, __builtin_ia32_fixupimmpd128_mask,
12302         __builtin_ia32_fixupimmpd128_maskz, __builtin_ia32_fixupimmps128,
12303         __builtin_ia32_fixupimmps128_mask, __builtin_ia32_fixupimmps128_maskz,
12304         __builtin_ia32_pabsq256_mask, __builtin_ia32_pabsq128_mask,
12305         __builtin_ia32_pabsd256_mask, __builtin_ia32_pabsd128_mask,
12306         __builtin_ia32_pmulhrsw256_mask, __builtin_ia32_pmulhrsw128_mask,
12307         __builtin_ia32_pmulhuw128_mask, __builtin_ia32_pmulhuw256_mask,
12308         __builtin_ia32_pmulhw256_mask, __builtin_ia32_pmulhw128_mask,
12309         __builtin_ia32_pmullw256_mask, __builtin_ia32_pmullw128_mask,
12310         __builtin_ia32_pmullq256_mask, __builtin_ia32_pmullq128_mask,
12311         __builtin_ia32_andpd256_mask, __builtin_ia32_andpd128_mask,
12312         __builtin_ia32_andps256_mask, __builtin_ia32_andps128_mask,
12313         __builtin_ia32_andnpd256_mask, __builtin_ia32_andnpd128_mask,
12314         __builtin_ia32_andnps256_mask, __builtin_ia32_andnps128_mask,
12315         __builtin_ia32_psllwi128_mask, __builtin_ia32_pslldi128_mask,
12316         __builtin_ia32_psllqi128_mask, __builtin_ia32_psllw128_mask,
12317         __builtin_ia32_pslld128_mask, __builtin_ia32_psllq128_mask,
12318         __builtin_ia32_psllwi256_mask, __builtin_ia32_psllw256_mask,
12319         __builtin_ia32_pslldi256_mask, __builtin_ia32_pslld256_mask,
12320         __builtin_ia32_psllqi256_mask, __builtin_ia32_psllq256_mask,
12321         __builtin_ia32_psradi128_mask, __builtin_ia32_psrad128_mask,
12322         __builtin_ia32_psradi256_mask, __builtin_ia32_psrad256_mask,
12323         __builtin_ia32_psraqi128_mask, __builtin_ia32_psraq128_mask,
12324         __builtin_ia32_psraqi256_mask, __builtin_ia32_psraq256_mask,
12325         __builtin_ia32_pandd256_mask, __builtin_ia32_pandd128_mask,
12326         __builtin_ia32_psrldi128_mask, __builtin_ia32_psrld128_mask,
12327         __builtin_ia32_psrldi256_mask, __builtin_ia32_psrld256_mask,
12328         __builtin_ia32_psrlqi128_mask, __builtin_ia32_psrlq128_mask,
12329         __builtin_ia32_psrlqi256_mask, __builtin_ia32_psrlq256_mask,
12330         __builtin_ia32_pandq256_mask, __builtin_ia32_pandq128_mask,
12331         __builtin_ia32_pandnd256_mask, __builtin_ia32_pandnd128_mask,
12332         __builtin_ia32_pandnq256_mask, __builtin_ia32_pandnq128_mask,
12333         __builtin_ia32_pord256_mask, __builtin_ia32_pord128_mask,
12334         __builtin_ia32_porq256_mask, __builtin_ia32_porq128_mask,
12335         __builtin_ia32_pxord256_mask, __builtin_ia32_pxord128_mask,
12336         __builtin_ia32_pxorq256_mask, __builtin_ia32_pxorq128_mask,
12337         __builtin_ia32_packsswb256_mask, __builtin_ia32_packsswb128_mask,
12338         __builtin_ia32_packuswb256_mask, __builtin_ia32_packuswb128_mask,
12339         __builtin_ia32_rndscaleps_256_mask, __builtin_ia32_rndscalepd_256_mask,
12340         __builtin_ia32_rndscaleps_128_mask, __builtin_ia32_rndscalepd_128_mask,
12341         __builtin_ia32_pternlogq256_mask, __builtin_ia32_pternlogq256_maskz,
12342         __builtin_ia32_pternlogd256_mask, __builtin_ia32_pternlogd256_maskz,
12343         __builtin_ia32_pternlogq128_mask, __builtin_ia32_pternlogq128_maskz,
12344         __builtin_ia32_pternlogd128_mask, __builtin_ia32_pternlogd128_maskz,
12345         __builtin_ia32_scalefpd256_mask, __builtin_ia32_scalefps256_mask,
12346         __builtin_ia32_scalefpd128_mask, __builtin_ia32_scalefps128_mask,
12347         __builtin_ia32_vfmaddpd256_mask, __builtin_ia32_vfmaddpd256_mask3,
12348         __builtin_ia32_vfmaddpd256_maskz, __builtin_ia32_vfmaddpd128_mask,
12349         __builtin_ia32_vfmaddpd128_mask3, __builtin_ia32_vfmaddpd128_maskz,
12350         __builtin_ia32_vfmaddps256_mask, __builtin_ia32_vfmaddps256_mask3,
12351         __builtin_ia32_vfmaddps256_maskz, __builtin_ia32_vfmaddps128_mask,
12352         __builtin_ia32_vfmaddps128_mask3, __builtin_ia32_vfmaddps128_maskz,
12353         __builtin_ia32_vfmsubpd256_mask3, __builtin_ia32_vfmsubpd128_mask3,
12354         __builtin_ia32_vfmsubps256_mask3, __builtin_ia32_vfmsubps128_mask3,
12355         __builtin_ia32_vfnmaddpd256_mask, __builtin_ia32_vfnmaddpd128_mask,
12356         __builtin_ia32_vfnmaddps256_mask, __builtin_ia32_vfnmaddps128_mask,
12357         __builtin_ia32_vfnmsubpd256_mask, __builtin_ia32_vfnmsubpd256_mask3,
12358         __builtin_ia32_vfnmsubpd128_mask, __builtin_ia32_vfnmsubpd128_mask3,
12359         __builtin_ia32_vfnmsubps256_mask, __builtin_ia32_vfnmsubps256_mask3,
12360         __builtin_ia32_vfnmsubps128_mask, __builtin_ia32_vfnmsubps128_mask3,
12361         __builtin_ia32_vfmaddsubpd256_mask, __builtin_ia32_vfmaddsubpd256_mask3,
12362         __builtin_ia32_vfmaddsubpd256_maskz, __builtin_ia32_vfmaddsubpd128_mask,
12363         __builtin_ia32_vfmaddsubpd128_mask3, __builtin_ia32_vfmaddsubpd128_maskz,
12364         __builtin_ia32_vfmaddsubps256_mask, __builtin_ia32_vfmaddsubps256_mask3,
12365         __builtin_ia32_vfmaddsubps256_maskz, __builtin_ia32_vfmaddsubps128_mask,
12366         __builtin_ia32_vfmaddsubps128_mask3, __builtin_ia32_vfmaddsubps128_maskz,
12367         __builtin_ia32_vfmsubaddpd256_mask3, __builtin_ia32_vfmsubaddpd128_mask3,
12368         __builtin_ia32_vfmsubaddps256_mask3, __builtin_ia32_vfmsubaddps128_mask3,
12369         __builtin_ia32_insertf64x2_256_mask, __builtin_ia32_inserti64x2_256_mask,
12370         __builtin_ia32_psrav16hi_mask, __builtin_ia32_psrav8hi_mask,
12371         __builtin_ia32_pmaddubsw256_mask, __builtin_ia32_pmaddubsw128_mask,
12372         __builtin_ia32_pmaddwd256_mask, __builtin_ia32_pmaddwd128_mask,
12373         __builtin_ia32_psrlv16hi_mask, __builtin_ia32_psrlv8hi_mask,
12374         __builtin_ia32_cvtps2dq256_mask, __builtin_ia32_cvtps2dq128_mask,
12375         __builtin_ia32_cvtps2udq256_mask, __builtin_ia32_cvtps2udq128_mask,
12376         __builtin_ia32_cvtps2qq256_mask, __builtin_ia32_cvtps2qq128_mask,
12377         __builtin_ia32_cvtps2uqq256_mask, __builtin_ia32_cvtps2uqq128_mask,
12378         __builtin_ia32_getmantps256_mask, __builtin_ia32_getmantps128_mask,
12379         __builtin_ia32_getmantpd256_mask, __builtin_ia32_getmantpd128_mask,
12380         __builtin_ia32_movddup256_mask, __builtin_ia32_movddup128_mask,
12381         __builtin_ia32_movshdup256_mask, __builtin_ia32_movshdup128_mask,
12382         __builtin_ia32_movsldup256_mask, __builtin_ia32_movsldup128_mask,
12383         __builtin_ia32_cvtqq2ps256_mask, __builtin_ia32_cvtqq2ps128_mask,
12384         __builtin_ia32_cvtuqq2ps256_mask, __builtin_ia32_cvtuqq2ps128_mask,
12385         __builtin_ia32_cvtqq2pd256_mask, __builtin_ia32_cvtqq2pd128_mask,
12386         __builtin_ia32_cvtuqq2pd256_mask, __builtin_ia32_cvtuqq2pd128_mask,
12387         __builtin_ia32_vpermt2varq256_mask, __builtin_ia32_vpermt2varq256_maskz,
12388         __builtin_ia32_vpermt2vard256_mask, __builtin_ia32_vpermt2vard256_maskz,
12389         __builtin_ia32_vpermi2varq256_mask, __builtin_ia32_vpermi2vard256_mask,
12390         __builtin_ia32_vpermt2varpd256_mask, __builtin_ia32_vpermt2varpd256_maskz,
12391         __builtin_ia32_vpermt2varps256_mask, __builtin_ia32_vpermt2varps256_maskz,
12392         __builtin_ia32_vpermi2varpd256_mask, __builtin_ia32_vpermi2varps256_mask,
12393         __builtin_ia32_vpermt2varq128_mask, __builtin_ia32_vpermt2varq128_maskz,
12394         __builtin_ia32_vpermt2vard128_mask, __builtin_ia32_vpermt2vard128_maskz,
12395         __builtin_ia32_vpermi2varq128_mask, __builtin_ia32_vpermi2vard128_mask,
12396         __builtin_ia32_vpermt2varpd128_mask, __builtin_ia32_vpermt2varpd128_maskz,
12397         __builtin_ia32_vpermt2varps128_mask, __builtin_ia32_vpermt2varps128_maskz,
12398         __builtin_ia32_vpermi2varpd128_mask, __builtin_ia32_vpermi2varps128_mask,
12399         __builtin_ia32_pshufb256_mask, __builtin_ia32_pshufb128_mask,
12400         __builtin_ia32_pshufhw256_mask, __builtin_ia32_pshufhw128_mask,
12401         __builtin_ia32_pshuflw256_mask, __builtin_ia32_pshuflw128_mask,
12402         __builtin_ia32_pshufd256_mask, __builtin_ia32_pshufd128_mask,
12403         __builtin_ia32_shufpd256_mask, __builtin_ia32_shufpd128_mask,
12404         __builtin_ia32_shufps256_mask, __builtin_ia32_shufps128_mask,
12405         __builtin_ia32_prolvq256_mask, __builtin_ia32_prolvq128_mask,
12406         __builtin_ia32_prolq256_mask, __builtin_ia32_prolq128_mask,
12407         __builtin_ia32_prorvq256_mask, __builtin_ia32_prorvq128_mask,
12408         __builtin_ia32_prorq256_mask, __builtin_ia32_prorq128_mask,
12409         __builtin_ia32_psravq128_mask, __builtin_ia32_psravq256_mask,
12410         __builtin_ia32_psllv4di_mask, __builtin_ia32_psllv2di_mask,
12411         __builtin_ia32_psllv8si_mask, __builtin_ia32_psllv4si_mask,
12412         __builtin_ia32_psrav8si_mask, __builtin_ia32_psrav4si_mask,
12413         __builtin_ia32_psrlv4di_mask, __builtin_ia32_psrlv2di_mask,
12414         __builtin_ia32_psrlv8si_mask, __builtin_ia32_psrlv4si_mask,
12415         __builtin_ia32_psrawi256_mask, __builtin_ia32_psraw256_mask,
12416         __builtin_ia32_psrawi128_mask, __builtin_ia32_psraw128_mask,
12417         __builtin_ia32_psrlwi256_mask, __builtin_ia32_psrlw256_mask,
12418         __builtin_ia32_psrlwi128_mask, __builtin_ia32_psrlw128_mask,
12419         __builtin_ia32_prorvd256_mask, __builtin_ia32_prolvd256_mask,
12420         __builtin_ia32_prord256_mask, __builtin_ia32_prold256_mask,
12421         __builtin_ia32_prorvd128_mask, __builtin_ia32_prolvd128_mask,
12422         __builtin_ia32_prord128_mask, __builtin_ia32_prold128_mask,
12423         __builtin_ia32_fpclasspd256_mask, __builtin_ia32_fpclasspd128_mask,
12424         __builtin_ia32_fpclasssd, __builtin_ia32_fpclassps256_mask,
12425         __builtin_ia32_fpclassps128_mask, __builtin_ia32_fpclassss,
12426         __builtin_ia32_cvtb2mask128, __builtin_ia32_cvtb2mask256,
12427         __builtin_ia32_cvtw2mask128, __builtin_ia32_cvtw2mask256,
12428         __builtin_ia32_cvtd2mask128, __builtin_ia32_cvtd2mask256,
12429         __builtin_ia32_cvtq2mask128, __builtin_ia32_cvtq2mask256,
12430         __builtin_ia32_cvtmask2b128, __builtin_ia32_cvtmask2b256,
12431         __builtin_ia32_cvtmask2w128, __builtin_ia32_cvtmask2w256,
12432         __builtin_ia32_cvtmask2d128, __builtin_ia32_cvtmask2d256,
12433         __builtin_ia32_cvtmask2q128, __builtin_ia32_cvtmask2q256,
12434         __builtin_ia32_pcmpeqb128_mask, __builtin_ia32_pcmpeqb256_mask,
12435         __builtin_ia32_pcmpeqw128_mask, __builtin_ia32_pcmpeqw256_mask,
12436         __builtin_ia32_pcmpeqd128_mask, __builtin_ia32_pcmpeqd256_mask,
12437         __builtin_ia32_pcmpeqq128_mask, __builtin_ia32_pcmpeqq256_mask,
12438         __builtin_ia32_pcmpgtb128_mask, __builtin_ia32_pcmpgtb256_mask,
12439         __builtin_ia32_pcmpgtw128_mask, __builtin_ia32_pcmpgtw256_mask,
12440         __builtin_ia32_pcmpgtd128_mask, __builtin_ia32_pcmpgtd256_mask,
12441         __builtin_ia32_pcmpgtq128_mask, __builtin_ia32_pcmpgtq256_mask,
12442         __builtin_ia32_ptestmb128, __builtin_ia32_ptestmb256,
12443         __builtin_ia32_ptestmw128, __builtin_ia32_ptestmw256,
12444         __builtin_ia32_ptestmd128, __builtin_ia32_ptestmd256,
12445         __builtin_ia32_ptestmq128, __builtin_ia32_ptestmq256,
12446         __builtin_ia32_ptestnmb128, __builtin_ia32_ptestnmb256,
12447         __builtin_ia32_ptestnmw128, __builtin_ia32_ptestnmw256,
12448         __builtin_ia32_ptestnmd128, __builtin_ia32_ptestnmd256,
12449         __builtin_ia32_ptestnmq128, __builtin_ia32_ptestnmq256,
12450         __builtin_ia32_broadcastmb128, __builtin_ia32_broadcastmb256,
12451         __builtin_ia32_broadcastmw128, __builtin_ia32_broadcastmw256,
12452         __builtin_ia32_compressdf256_mask, __builtin_ia32_compressdf128_mask,
12453         __builtin_ia32_compresssf256_mask, __builtin_ia32_compresssf128_mask,
12454         __builtin_ia32_compressdi256_mask, __builtin_ia32_compressdi128_mask,
12455         __builtin_ia32_compresssi256_mask, __builtin_ia32_compresssi128_mask,
12456         __builtin_ia32_expanddf256_mask, __builtin_ia32_expanddf128_mask,
12457         __builtin_ia32_expandsf256_mask, __builtin_ia32_expandsf128_mask,
12458         __builtin_ia32_expanddi256_mask, __builtin_ia32_expanddi128_mask,
12459         __builtin_ia32_expandsi256_mask, __builtin_ia32_expandsi128_mask,
12460         __builtin_ia32_expanddf256_maskz, __builtin_ia32_expanddf128_maskz,
12461         __builtin_ia32_expandsf256_maskz, __builtin_ia32_expandsf128_maskz,
12462         __builtin_ia32_expanddi256_maskz, __builtin_ia32_expanddi128_maskz,
12463         __builtin_ia32_expandsi256_maskz, __builtin_ia32_expandsi128_maskz,
12464         __builtin_ia32_pmaxsd256_mask, __builtin_ia32_pminsd256_mask,
12465         __builtin_ia32_pmaxud256_mask, __builtin_ia32_pminud256_mask,
12466         __builtin_ia32_pmaxsd128_mask, __builtin_ia32_pminsd128_mask,
12467         __builtin_ia32_pmaxud128_mask, __builtin_ia32_pminud128_mask,
12468         __builtin_ia32_pmaxsq256_mask, __builtin_ia32_pminsq256_mask,
12469         __builtin_ia32_pmaxuq256_mask, __builtin_ia32_pminuq256_mask,
12470         __builtin_ia32_pmaxsq128_mask, __builtin_ia32_pminsq128_mask,
12471         __builtin_ia32_pmaxuq128_mask, __builtin_ia32_pminuq128_mask,
12472         __builtin_ia32_pminsb256_mask, __builtin_ia32_pminub256_mask,
12473         __builtin_ia32_pmaxsb256_mask, __builtin_ia32_pmaxub256_mask,
12474         __builtin_ia32_pminsb128_mask, __builtin_ia32_pminub128_mask,
12475         __builtin_ia32_pmaxsb128_mask, __builtin_ia32_pmaxub128_mask,
12476         __builtin_ia32_pminsw256_mask, __builtin_ia32_pminuw256_mask,
12477         __builtin_ia32_pmaxsw256_mask, __builtin_ia32_pmaxuw256_mask,
12478         __builtin_ia32_pminsw128_mask, __builtin_ia32_pminuw128_mask,
12479         __builtin_ia32_pmaxsw128_mask, __builtin_ia32_pmaxuw128_mask,
12480         __builtin_ia32_vpconflictdi_256_mask, __builtin_ia32_vpconflictsi_256_mask,
12481         __builtin_ia32_vplzcntq_256_mask, __builtin_ia32_vplzcntd_256_mask,
12482         __builtin_ia32_unpckhpd256_mask, __builtin_ia32_unpckhpd128_mask,
12483         __builtin_ia32_unpckhps256_mask, __builtin_ia32_unpckhps128_mask,
12484         __builtin_ia32_unpcklpd256_mask, __builtin_ia32_unpcklpd128_mask,
12485         __builtin_ia32_unpcklps256_mask, __builtin_ia32_vpconflictdi_128_mask,
12486         __builtin_ia32_vpconflictsi_128_mask, __builtin_ia32_vplzcntq_128_mask,
12487         __builtin_ia32_vplzcntd_128_mask, __builtin_ia32_unpcklps128_mask,
12488         __builtin_ia32_alignd256_mask, __builtin_ia32_alignq256_mask,
12489         __builtin_ia32_alignd128_mask, __builtin_ia32_alignq128_mask,
12490         __builtin_ia32_vcvtps2ph256_mask, __builtin_ia32_vcvtps2ph_mask,
12491         __builtin_ia32_vcvtph2ps_mask, __builtin_ia32_vcvtph2ps256_mask,
12492         __builtin_ia32_punpckhdq128_mask, __builtin_ia32_punpckhdq256_mask,
12493         __builtin_ia32_punpckhqdq128_mask, __builtin_ia32_punpckhqdq256_mask,
12494         __builtin_ia32_punpckldq128_mask, __builtin_ia32_punpckldq256_mask,
12495         __builtin_ia32_punpcklqdq128_mask, __builtin_ia32_punpcklqdq256_mask,
12496         __builtin_ia32_punpckhbw128_mask, __builtin_ia32_punpckhbw256_mask,
12497         __builtin_ia32_punpckhwd128_mask, __builtin_ia32_punpckhwd256_mask,
12498         __builtin_ia32_punpcklbw128_mask, __builtin_ia32_punpcklbw256_mask,
12499         __builtin_ia32_punpcklwd128_mask, __builtin_ia32_punpcklwd256_mask,
12500         __builtin_ia32_psllv16hi_mask, __builtin_ia32_psllv8hi_mask,
12501         __builtin_ia32_packssdw256_mask, __builtin_ia32_packssdw128_mask,
12502         __builtin_ia32_packusdw256_mask, __builtin_ia32_packusdw128_mask,
12503         __builtin_ia32_pavgb256_mask, __builtin_ia32_pavgw256_mask,
12504         __builtin_ia32_pavgb128_mask, __builtin_ia32_pavgw128_mask,
12505         __builtin_ia32_permvarsf256_mask, __builtin_ia32_permvardf256_mask,
12506         __builtin_ia32_permdf256_mask, __builtin_ia32_pabsb256_mask,
12507         __builtin_ia32_pabsb128_mask, __builtin_ia32_pabsw256_mask,
12508         __builtin_ia32_pabsw128_mask, __builtin_ia32_vpermilvarpd_mask,
12509         __builtin_ia32_vpermilvarps_mask, __builtin_ia32_vpermilvarpd256_mask,
12510         __builtin_ia32_vpermilvarps256_mask, __builtin_ia32_vpermilpd_mask,
12511         __builtin_ia32_vpermilps_mask, __builtin_ia32_vpermilpd256_mask,
12512         __builtin_ia32_vpermilps256_mask, __builtin_ia32_blendmq_256_mask,
12513         __builtin_ia32_blendmd_256_mask, __builtin_ia32_blendmpd_256_mask,
12514         __builtin_ia32_blendmps_256_mask, __builtin_ia32_blendmq_128_mask,
12515         __builtin_ia32_blendmd_128_mask, __builtin_ia32_blendmpd_128_mask,
12516         __builtin_ia32_blendmps_128_mask, __builtin_ia32_blendmw_256_mask,
12517         __builtin_ia32_blendmb_256_mask, __builtin_ia32_blendmw_128_mask,
12518         __builtin_ia32_blendmb_128_mask, __builtin_ia32_pmulld256_mask,
12519         __builtin_ia32_pmulld128_mask, __builtin_ia32_pmuludq256_mask,
12520         __builtin_ia32_pmuldq256_mask, __builtin_ia32_pmuldq128_mask,
12521         __builtin_ia32_pmuludq128_mask, __builtin_ia32_cvtpd2ps256_mask,
12522         __builtin_ia32_cvtpd2ps_mask, __builtin_ia32_permvarsi256_mask,
12523         __builtin_ia32_permvardi256_mask, __builtin_ia32_permdi256_mask,
12524         __builtin_ia32_cmpq256_mask, __builtin_ia32_cmpd256_mask,
12525         __builtin_ia32_ucmpq256_mask, __builtin_ia32_ucmpd256_mask,
12526         __builtin_ia32_cmpb256_mask, __builtin_ia32_cmpw256_mask,
12527         __builtin_ia32_ucmpb256_mask, __builtin_ia32_ucmpw256_mask,
12528         __builtin_ia32_cmppd256_mask, __builtin_ia32_cmpps256_mask,
12529         __builtin_ia32_cmpq128_mask, __builtin_ia32_cmpd128_mask,
12530         __builtin_ia32_ucmpq128_mask, __builtin_ia32_ucmpd128_mask,
12531         __builtin_ia32_cmpb128_mask, __builtin_ia32_cmpw128_mask,
12532         __builtin_ia32_ucmpb128_mask, __builtin_ia32_ucmpw128_mask,
12533         __builtin_ia32_cmppd128_mask, __builtin_ia32_cmpps128_mask,
12534         __builtin_ia32_broadcastf32x2_512_mask, __builtin_ia32_broadcasti32x2_512_mask,
12535         __builtin_ia32_broadcastf64x2_512_mask, __builtin_ia32_broadcasti64x2_512_mask,
12536         __builtin_ia32_broadcastf32x8_512_mask, __builtin_ia32_broadcasti32x8_512_mask,
12537         __builtin_ia32_extractf64x2_512_mask, __builtin_ia32_extractf32x8_mask,
12538         __builtin_ia32_extracti64x2_512_mask, __builtin_ia32_extracti32x8_mask,
12539         __builtin_ia32_reducepd512_mask, __builtin_ia32_reduceps512_mask,
12540         __builtin_ia32_pmullq512_mask, __builtin_ia32_xorpd512_mask,
12541         __builtin_ia32_xorps512_mask, __builtin_ia32_orpd512_mask,
12542         __builtin_ia32_orps512_mask, __builtin_ia32_andpd512_mask,
12543         __builtin_ia32_andps512_mask, __builtin_ia32_andnpd512_mask,
12544         __builtin_ia32_andnps512_mask, __builtin_ia32_insertf32x8_mask,
12545         __builtin_ia32_inserti32x8_mask, __builtin_ia32_insertf64x2_512_mask,
12546         __builtin_ia32_inserti64x2_512_mask, __builtin_ia32_fpclasspd512_mask,
12547         __builtin_ia32_fpclassps512_mask, __builtin_ia32_cvtd2mask512,
12548         __builtin_ia32_cvtq2mask512, __builtin_ia32_cvtmask2d512,
12549         __builtin_ia32_cvtmask2q512, __builtin_ia32_kunpcksi,
12550         __builtin_ia32_kunpckdi, __builtin_ia32_packusdw512_mask,
12551         __builtin_ia32_pslldq512, __builtin_ia32_psrldq512,
12552         __builtin_ia32_packssdw512_mask, __builtin_ia32_palignr512,
12553         __builtin_ia32_palignr512_mask, __builtin_ia32_movdquhi512_mask,
12554         __builtin_ia32_movdquqi512_mask, __builtin_ia32_psadbw512,
12555         __builtin_ia32_dbpsadbw512_mask, __builtin_ia32_pbroadcastb512_mask,
12556         __builtin_ia32_pbroadcastb512_gpr_mask, __builtin_ia32_pbroadcastw512_mask,
12557         __builtin_ia32_pbroadcastw512_gpr_mask, __builtin_ia32_pmovsxbw512_mask,
12558         __builtin_ia32_pmovzxbw512_mask, __builtin_ia32_permvarhi512_mask,
12559         __builtin_ia32_vpermt2varhi512_mask, __builtin_ia32_vpermt2varhi512_maskz,
12560         __builtin_ia32_vpermi2varhi512_mask, __builtin_ia32_pavgb512_mask,
12561         __builtin_ia32_pavgw512_mask, __builtin_ia32_paddb512_mask,
12562         __builtin_ia32_psubb512_mask, __builtin_ia32_psubsb512_mask,
12563         __builtin_ia32_paddsb512_mask, __builtin_ia32_psubusb512_mask,
12564         __builtin_ia32_paddusb512_mask, __builtin_ia32_psubw512_mask,
12565         __builtin_ia32_paddw512_mask, __builtin_ia32_psubsw512_mask,
12566         __builtin_ia32_paddsw512_mask, __builtin_ia32_psubusw512_mask,
12567         __builtin_ia32_paddusw512_mask, __builtin_ia32_pmaxuw512_mask,
12568         __builtin_ia32_pmaxsw512_mask, __builtin_ia32_pminuw512_mask,
12569         __builtin_ia32_pminsw512_mask, __builtin_ia32_pmaxub512_mask,
12570         __builtin_ia32_pmaxsb512_mask, __builtin_ia32_pminub512_mask,
12571         __builtin_ia32_pminsb512_mask, __builtin_ia32_pmovwb512_mask,
12572         __builtin_ia32_pmovswb512_mask, __builtin_ia32_pmovuswb512_mask,
12573         __builtin_ia32_pmulhrsw512_mask, __builtin_ia32_pmulhuw512_mask,
12574         __builtin_ia32_pmulhw512_mask, __builtin_ia32_pmullw512_mask,
12575         __builtin_ia32_psllwi512_mask, __builtin_ia32_psllw512_mask,
12576         __builtin_ia32_packsswb512_mask, __builtin_ia32_packuswb512_mask,
12577         __builtin_ia32_psrav32hi_mask, __builtin_ia32_pmaddubsw512_mask,
12578         __builtin_ia32_pmaddwd512_mask, __builtin_ia32_psrlv32hi_mask,
12579         __builtin_ia32_punpckhbw512_mask, __builtin_ia32_punpckhwd512_mask,
12580         __builtin_ia32_punpcklbw512_mask, __builtin_ia32_punpcklwd512_mask,
12581         __builtin_ia32_pshufb512_mask, __builtin_ia32_pshufhw512_mask,
12582         __builtin_ia32_pshuflw512_mask, __builtin_ia32_psrawi512_mask,
12583         __builtin_ia32_psraw512_mask, __builtin_ia32_psrlwi512_mask,
12584         __builtin_ia32_psrlw512_mask, __builtin_ia32_cvtb2mask512,
12585         __builtin_ia32_cvtw2mask512, __builtin_ia32_cvtmask2b512,
12586         __builtin_ia32_cvtmask2w512, __builtin_ia32_pcmpeqb512_mask,
12587         __builtin_ia32_pcmpeqw512_mask, __builtin_ia32_pcmpgtb512_mask,
12588         __builtin_ia32_pcmpgtw512_mask, __builtin_ia32_ptestmb512,
12589         __builtin_ia32_ptestmw512, __builtin_ia32_ptestnmb512,
12590         __builtin_ia32_ptestnmw512, __builtin_ia32_psllv32hi_mask,
12591         __builtin_ia32_pabsb512_mask, __builtin_ia32_pabsw512_mask,
12592         __builtin_ia32_blendmw_512_mask, __builtin_ia32_blendmb_512_mask,
12593         __builtin_ia32_cmpb512_mask, __builtin_ia32_cmpw512_mask,
12594         __builtin_ia32_ucmpb512_mask, __builtin_ia32_ucmpw512_mask,
12595         __builtin_ia32_rangesd128_round, __builtin_ia32_rangess128_round,
12596         __builtin_ia32_cvtpd2qq512_mask, __builtin_ia32_cvtps2qq512_mask,
12597         __builtin_ia32_cvtpd2uqq512_mask, __builtin_ia32_cvtps2uqq512_mask,
12598         __builtin_ia32_cvtqq2ps512_mask, __builtin_ia32_cvtuqq2ps512_mask,
12599         __builtin_ia32_cvtqq2pd512_mask, __builtin_ia32_cvtuqq2pd512_mask,
12600         __builtin_ia32_cvttps2qq512_mask, __builtin_ia32_cvttps2uqq512_mask,
12601         __builtin_ia32_cvttpd2qq512_mask, __builtin_ia32_cvttpd2uqq512_mask,
12602         __builtin_ia32_rangeps512_mask, __builtin_ia32_rangepd512_mask.
12603         (ix86_expand_args_builtin): Handle HI_FTYPE_V16QI, SI_FTYPE_V32QI,
12604         DI_FTYPE_V64QI, V16QI_FTYPE_HI, V32QI_FTYPE_SI, V64QI_FTYPE_DI,
12605         V8HI_FTYPE_QI, V16HI_FTYPE_HI, V32HI_FTYPE_SI, V4SI_FTYPE_QI,
12606         V8SI_FTYPE_QI, V4SI_FTYPE_HI, V8SI_FTYPE_HI, QI_FTYPE_V8HI,
12607         HI_FTYPE_V16HI, SI_FTYPE_V32HI, QI_FTYPE_V4SI, QI_FTYPE_V8SI,
12608         HI_FTYPE_V16SI, QI_FTYPE_V2DI, QI_FTYPE_V4DI, QI_FTYPE_V8DI,
12609         V2DI_FTYPE_QI, V4DI_FTYPE_QI, V8DI_FTYPE_V64QI_V64QI,
12610         SI_FTYPE_SI_SI,DI_FTYPE_DI_DI, V8DI_FTYPE_V8DI_INT_CONVERT,
12611         QI_FTYPE_V4SF_INT, QI_FTYPE_V2DF_INT,
12612         V8SF_FTYPE_V4SF_V8SF_QI, V4DF_FTYPE_V2DF_V4DF_QI,
12613         V8SI_FTYPE_V4SI_V8SI_QI, V8SI_FTYPE_SI_V8SI_QI,
12614         V4SI_FTYPE_V4SI_V4SI_QI, V4SI_FTYPE_SI_V4SI_QI,
12615         V4DI_FTYPE_V2DI_V4DI_QI, V4DI_FTYPE_DI_V4DI_QI,
12616         V2DI_FTYPE_V2DI_V2DI_QI, V2DI_FTYPE_DI_V2DI_QI,
12617         V64QI_FTYPE_V64QI_V64QI_DI, V64QI_FTYPE_V16QI_V64QI_DI,
12618         V64QI_FTYPE_QI_V64QI_DI, V32QI_FTYPE_V32QI_V32QI_SI,
12619         V32QI_FTYPE_V16QI_V32QI_SI, V32QI_FTYPE_QI_V32QI_SI,
12620         V16QI_FTYPE_V16QI_V16QI_HI, V16QI_FTYPE_QI_V16QI_HI,
12621         V32HI_FTYPE_V8HI_V32HI_SI, V32HI_FTYPE_HI_V32HI_SI,
12622         V16HI_FTYPE_V8HI_V16HI_HI, V16HI_FTYPE_HI_V16HI_HI,
12623         V8HI_FTYPE_V8HI_V8HI_QI, V8HI_FTYPE_HI_V8HI_QI,
12624         V8SF_FTYPE_V8HI_V8SF_QI, V4SF_FTYPE_V8HI_V4SF_QI,
12625         V8SI_FTYPE_V8SF_V8SI_QI, V4SI_FTYPE_V4SF_V4SI_QI,
12626         V8DI_FTYPE_V8SF_V8DI_QI, V4DI_FTYPE_V4SF_V4DI_QI,
12627         V2DI_FTYPE_V4SF_V2DI_QI, V8SF_FTYPE_V8DI_V8SF_QI,
12628         V4SF_FTYPE_V4DI_V4SF_QI, V4SF_FTYPE_V2DI_V4SF_QI,
12629         V8DF_FTYPE_V8DI_V8DF_QI, V4DF_FTYPE_V4DI_V4DF_QI,
12630         V2DF_FTYPE_V2DI_V2DF_QI, V16QI_FTYPE_V8HI_V16QI_QI,
12631         V16QI_FTYPE_V16HI_V16QI_HI, V16QI_FTYPE_V4SI_V16QI_QI,
12632         V16QI_FTYPE_V8SI_V16QI_QI, V8HI_FTYPE_V4SI_V8HI_QI,
12633         V8HI_FTYPE_V8SI_V8HI_QI, V16QI_FTYPE_V2DI_V16QI_QI,
12634         V16QI_FTYPE_V4DI_V16QI_QI, V8HI_FTYPE_V2DI_V8HI_QI,
12635         V8HI_FTYPE_V4DI_V8HI_QI, V4SI_FTYPE_V2DI_V4SI_QI,
12636         V4SI_FTYPE_V4DI_V4SI_QI, V32QI_FTYPE_V32HI_V32QI_SI,
12637         HI_FTYPE_V16QI_V16QI_HI, SI_FTYPE_V32QI_V32QI_SI,
12638         DI_FTYPE_V64QI_V64QI_DI, QI_FTYPE_V8HI_V8HI_QI,
12639         HI_FTYPE_V16HI_V16HI_HI, SI_FTYPE_V32HI_V32HI_SI,
12640         QI_FTYPE_V4SI_V4SI_QI, QI_FTYPE_V8SI_V8SI_QI,
12641         QI_FTYPE_V2DI_V2DI_QI, QI_FTYPE_V4DI_V4DI_QI,
12642         V4SF_FTYPE_V2DF_V4SF_QI, V4SF_FTYPE_V4DF_V4SF_QI,
12643         V2DI_FTYPE_V4SI_V2DI_QI, V2DI_FTYPE_V8HI_V2DI_QI,
12644         V2DI_FTYPE_V16QI_V2DI_QI, V4DI_FTYPE_V4DI_V4DI_QI,
12645         V4DI_FTYPE_V4SI_V4DI_QI, V4DI_FTYPE_V8HI_V4DI_QI,
12646         V4DI_FTYPE_V16QI_V4DI_QI, V8DI_FTYPE_V8DF_V8DI_QI,
12647         V4DI_FTYPE_V4DF_V4DI_QI, V2DI_FTYPE_V2DF_V2DI_QI,
12648         V4SI_FTYPE_V4DF_V4SI_QI, V4SI_FTYPE_V2DF_V4SI_QI,
12649         V4SI_FTYPE_V8HI_V4SI_QI, V4SI_FTYPE_V16QI_V4SI_QI,
12650         V8SI_FTYPE_V8SI_V8SI_V8SI, V8SF_FTYPE_V8SF_V8SF_QI,
12651         V8SF_FTYPE_V8SI_V8SF_QI, V4DF_FTYPE_V4DF_V4DF_QI,
12652         V4SF_FTYPE_V4SF_V4SF_QI, V2DF_FTYPE_V2DF_V2DF_QI,
12653         V2DF_FTYPE_V4SF_V2DF_QI, V2DF_FTYPE_V4SI_V2DF_QI,
12654         V4SF_FTYPE_V4SI_V4SF_QI, V4DF_FTYPE_V4SF_V4DF_QI,
12655         V4DF_FTYPE_V4SI_V4DF_QI, V8SI_FTYPE_V8SI_V8SI_QI,
12656         V8SI_FTYPE_V8HI_V8SI_QI, V8SI_FTYPE_V16QI_V8SI_QI,
12657         V16SF_FTYPE_V8SF_V16SF_HI, V16SI_FTYPE_V8SI_V16SI_HI,
12658         V16HI_FTYPE_V16HI_V16HI_HI, V8HI_FTYPE_V16QI_V8HI_QI,
12659         V16HI_FTYPE_V16QI_V16HI_HI, V32HI_FTYPE_V32HI_V32HI_SI,
12660         V32HI_FTYPE_V32QI_V32HI_SI, V8DI_FTYPE_V8DI_V8DI_INT_CONVERT,
12661         V8DI_FTYPE_V8DI_V8DI_INT_V8DI_DI_CONVERT, QI_FTYPE_V8DF_INT_QI,
12662         QI_FTYPE_V4DF_INT_QI, QI_FTYPE_V2DF_INT_QI,
12663         HI_FTYPE_V16SF_INT_HI, QI_FTYPE_V8SF_INT_QI,
12664         QI_FTYPE_V4SF_INT_QI, V4DI_FTYPE_V4DI_V4DI_INT_V4DI_SI_CONVERT,
12665         V2DI_FTYPE_V2DI_V2DI_INT_V2DI_HI_CONVERT, V32QI_FTYPE_V32QI_V32QI_V32QI_SI,
12666         V32HI_FTYPE_V32HI_V32HI_V32HI_SI, V32HI_FTYPE_V64QI_V64QI_V32HI_SI,
12667         V16SI_FTYPE_V32HI_V32HI_V16SI_HI, V64QI_FTYPE_V64QI_V64QI_V64QI_DI,
12668         V32HI_FTYPE_V32HI_V8HI_V32HI_SI, V16HI_FTYPE_V16HI_V8HI_V16HI_HI,
12669         V8SI_FTYPE_V8SI_V4SI_V8SI_QI, V4DI_FTYPE_V4DI_V2DI_V4DI_QI,
12670         V64QI_FTYPE_V32HI_V32HI_V64QI_DI, V32QI_FTYPE_V16HI_V16HI_V32QI_SI,
12671         V16QI_FTYPE_V8HI_V8HI_V16QI_HI, V32HI_FTYPE_V16SI_V16SI_V32HI_SI,
12672         V16HI_FTYPE_V8SI_V8SI_V16HI_HI, V8HI_FTYPE_V4SI_V4SI_V8HI_QI,
12673         V4DF_FTYPE_V4DF_V4DI_V4DF_QI, V8SF_FTYPE_V8SF_V8SI_V8SF_QI,
12674         V4SF_FTYPE_V4SF_V4SI_V4SF_QI, V2DF_FTYPE_V2DF_V2DI_V2DF_QI,
12675         V2DI_FTYPE_V4SI_V4SI_V2DI_QI, V4DI_FTYPE_V8SI_V8SI_V4DI_QI,
12676         V4DF_FTYPE_V4DI_V4DF_V4DF_QI, V8SF_FTYPE_V8SI_V8SF_V8SF_QI,
12677         V2DF_FTYPE_V2DI_V2DF_V2DF_QI, V4SF_FTYPE_V4SI_V4SF_V4SF_QI,
12678         V8HI_FTYPE_V8HI_V8HI_V8HI_QI, V8SI_FTYPE_V8SI_V8SI_V8SI_QI,
12679         V4SI_FTYPE_V4SI_V4SI_V4SI_QI, V8SF_FTYPE_V8SF_V8SF_V8SF_QI,
12680         V16QI_FTYPE_V16QI_V16QI_V16QI_HI, V16HI_FTYPE_V16HI_V16HI_V16HI_HI,
12681         V2DI_FTYPE_V2DI_V2DI_V2DI_QI, V4DI_FTYPE_V4DI_V4DI_V4DI_QI,
12682         V4DF_FTYPE_V4DF_V4DF_V4DF_QI, V8HI_FTYPE_V16QI_V16QI_V8HI_QI,
12683         V16HI_FTYPE_V32QI_V32QI_V16HI_HI, V8SI_FTYPE_V16HI_V16HI_V8SI_QI,
12684         V4SI_FTYPE_V8HI_V8HI_V4SI_QI, QI_FTYPE_V4DI_V4DI_INT_QI,
12685         QI_FTYPE_V8SI_V8SI_INT_QI, QI_FTYPE_V4DF_V4DF_INT_QI,
12686         QI_FTYPE_V8SF_V8SF_INT_QI, QI_FTYPE_V2DI_V2DI_INT_QI,
12687         QI_FTYPE_V4SI_V4SI_INT_QI, DI_FTYPE_V64QI_V64QI_INT_DI,
12688         SI_FTYPE_V32QI_V32QI_INT_SI, HI_FTYPE_V16QI_V16QI_INT_HI,
12689         SI_FTYPE_V32HI_V32HI_INT_SI, HI_FTYPE_V16HI_V16HI_INT_HI,
12690         QI_FTYPE_V8HI_V8HI_INT_QI, V8SF_FTYPE_V8SF_INT_V8SF_QI,
12691         V4SF_FTYPE_V4SF_INT_V4SF_QI, V2DF_FTYPE_V4DF_INT_V2DF_QI,
12692         V2DI_FTYPE_V4DI_INT_V2DI_QI, V8SF_FTYPE_V16SF_INT_V8SF_QI,
12693         V8SI_FTYPE_V16SI_INT_V8SI_QI, V2DF_FTYPE_V8DF_INT_V2DF_QI,
12694         V2DI_FTYPE_V8DI_INT_V2DI_QI, V4SF_FTYPE_V8SF_INT_V4SF_QI,
12695         V4SI_FTYPE_V8SI_INT_V4SI_QI, V8HI_FTYPE_V8SF_INT_V8HI_QI,
12696         V8HI_FTYPE_V4SF_INT_V8HI_QI, V32HI_FTYPE_V32HI_INT_V32HI_SI,
12697         V16HI_FTYPE_V16HI_INT_V16HI_HI, V8HI_FTYPE_V8HI_INT_V8HI_QI,
12698         V4DI_FTYPE_V4DI_INT_V4DI_QI, V2DI_FTYPE_V2DI_INT_V2DI_QI,
12699         V8SI_FTYPE_V8SI_INT_V8SI_QI, V4SI_FTYPE_V4SI_INT_V4SI_QI,
12700         V4DF_FTYPE_V4DF_INT_V4DF_QI, V2DF_FTYPE_V2DF_INT_V2DF_QI,
12701         V4DF_FTYPE_V4DF_V4DF_INT_V4DF_QI, V8SF_FTYPE_V8SF_V8SF_INT_V8SF_QI,
12702         V8DF_FTYPE_V8DF_V2DF_INT_V8DF_QI, V8DI_FTYPE_V8DI_V2DI_INT_V8DI_QI,
12703         V8SI_FTYPE_V8SI_V8SI_INT_V8SI_QI, V4DI_FTYPE_V4DI_V4DI_INT_V4DI_QI,
12704         V4SI_FTYPE_V4SI_V4SI_INT_V4SI_QI, V2DI_FTYPE_V2DI_V2DI_INT_V2DI_QI,
12705         V32HI_FTYPE_V64QI_V64QI_INT_V32HI_SI, V16HI_FTYPE_V32QI_V32QI_INT_V16HI_HI,
12706         V8HI_FTYPE_V16QI_V16QI_INT_V8HI_QI, V16SF_FTYPE_V16SF_V8SF_INT_V16SF_HI,
12707         V16SI_FTYPE_V16SI_V8SI_INT_V16SI_HI, V8SF_FTYPE_V8SF_V4SF_INT_V8SF_QI,
12708         V8SI_FTYPE_V8SI_V4SI_INT_V8SI_QI, V4DI_FTYPE_V4DI_V2DI_INT_V4DI_QI,
12709         V4DF_FTYPE_V4DF_V2DF_INT_V4DF_QI, V8SF_FTYPE_V8SF_V8SF_V8SI_INT_QI,
12710         V8SI_FTYPE_V8SI_V8SI_V8SI_INT_QI, V4DF_FTYPE_V4DF_V4DF_V4DI_INT_QI,
12711         V4DI_FTYPE_V4DI_V4DI_V4DI_INT_QI, V4SI_FTYPE_V4SI_V4SI_V4SI_INT_QI,
12712         V2DI_FTYPE_V2DI_V2DI_V2DI_INT_QI, V8DI_FTYPE_V8DF_V8DI_QI_INT,
12713         V8SF_FTYPE_V8DI_V8SF_QI_INT, V8DF_FTYPE_V8DI_V8DF_QI_INT,
12714         V8DI_FTYPE_V8SF_V8DI_QI_INT, V16SF_FTYPE_V16SF_V16SF_INT_V16SF_HI_INT,
12715         V8DF_FTYPE_V8DF_V8DF_INT_V8DF_QI_INT, VOID_FTYPE_PV4DI_V4DI_QI,
12716         VOID_FTYPE_PV2DI_V2DI_QI, VOID_FTYPE_PV8SI_V8SI_QI,
12717         VOID_FTYPE_PV4SI_V4SI_QI, VOID_FTYPE_PV4SI_V4DI_QI,
12718         VOID_FTYPE_PV4SI_V2DI_QI, VOID_FTYPE_PV8HI_V4DI_QI,
12719         VOID_FTYPE_PV8HI_V2DI_QI, VOID_FTYPE_PV8HI_V8SI_QI,
12720         VOID_FTYPE_PV8HI_V4SI_QI, VOID_FTYPE_PV16QI_V4DI_QI,
12721         VOID_FTYPE_PV16QI_V2DI_QI, VOID_FTYPE_PV16QI_V8SI_QI,
12722         VOID_FTYPE_PV16QI_V4SI_QI, VOID_FTYPE_PV8HI_V8HI_QI,
12723         VOID_FTYPE_PV16HI_V16HI_HI, VOID_FTYPE_PV32HI_V32HI_SI,
12724         VOID_FTYPE_PV16QI_V16QI_HI, VOID_FTYPE_PV32QI_V32QI_SI,
12725         VOID_FTYPE_PV64QI_V64QI_DI, VOID_FTYPE_PV4DF_V4DF_QI,
12726         VOID_FTYPE_PV2DF_V2DF_QI, VOID_FTYPE_PV8SF_V8SF_QI,
12727         VOID_FTYPE_PV4SF_V4SF_QI, V4SF_FTYPE_PCV4SF_V4SF_QI,
12728         V8SF_FTYPE_PCV8SF_V8SF_QI, V4SI_FTYPE_PCV4SI_V4SI_QI,
12729         V8SI_FTYPE_PCV8SI_V8SI_QI, V2DF_FTYPE_PCV2DF_V2DF_QI,
12730         V4DF_FTYPE_PCV4DF_V4DF_QI, V2DI_FTYPE_PCV2DI_V2DI_QI,
12731         V4DI_FTYPE_PCV4DI_V4DI_QI, V8HI_FTYPE_PCV8HI_V8HI_QI,
12732         V16HI_FTYPE_PCV16HI_V16HI_HI, V32HI_FTYPE_PCV32HI_V32HI_SI,
12733         V16QI_FTYPE_PCV16QI_V16QI_HI, V32QI_FTYPE_PCV32QI_V32QI_SI,
12734         V64QI_FTYPE_PCV64QI_V64QI_DI, do not handle V8USI_FTYPE_V8USI.
12735
12736 2014-10-28  Jakub Jelinek  <jakub@redhat.com>
12737
12738         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Use uint64_t
12739         type for the left shift in CASE_CONVERT case.
12740
12741 2014-10-28  Max Ostapenko  <m.ostapenko@partner.samsung.com>
12742
12743         * asan.h (asan_intercepted_p): New function.
12744         * asan.c (asan_mem_ref_hasher::hash): Remove MEM_REF access size from
12745         hash value construction.  Call iterative_hash_expr instead of explicit
12746         hash building.
12747         (asan_mem_ref_hasher::equal): Change condition.
12748         (has_mem_ref_been_instrumented): Likewise.
12749         (update_mem_ref_hash_table): Likewise.
12750         (maybe_update_mem_ref_hash_table): New function.
12751         (instrument_strlen_call): Removed.
12752         (get_mem_refs_of_builtin_call): Handle new parameter.
12753         (instrument_builtin_call): Call maybe_update_mem_ref_hash_table instead
12754         of instrument_mem_region_access if intercepted_p is true.
12755         (instrument_mem_region_access): Instrument only base with len instead of
12756         base and end with 1.
12757         (build_check_stmt): Remove start_instrumented and end_instrumented
12758         parameters.
12759         (enum asan_check_flags): Remove ASAN_CHECK_START_INSTRUMENTED and
12760         ASAN_CHECK_END_INSTRUMENTED.  Change ASAN_CHECK_LAST.
12761         (asan_expand_check_ifn): Remove start_instrumented and end_instrumented.
12762         * builtins.c (expand_builtin): Include asan.h.  Don't expand
12763         string/memory builtin functions that have interceptors if ASan is
12764         enabled.
12765
12766 2014-10-28  Richard Biener  <rguenther@suse.de>
12767
12768         PR middle-end/63665
12769         * fold-const.c (fold_comparison): Properly guard simplifying
12770         against INT_MAX/INT_MIN with !TYPE_OVERFLOW_WRAPS.
12771
12772 2014-10-28  Alan Lawrence  <alan.lawrence@arm.com>
12773
12774         * expr.c (expand_expr_real_2): Remove code handling VEC_LSHIFT_EXPR.
12775         * fold-const.c (const_binop): Likewise.
12776         * cfgexpand.c (expand_debug_expr): Likewise.
12777         * tree-inline.c (estimate_operator_cost): Likewise.
12778         * tree-vect-generic.c (expand_vector_operations_1): Likewise.
12779         * optabs.c (optab_for_tree_code): Likewise.
12780         (expand_vec_shift_expr): Likewise, update comment.
12781         * tree.def: Delete VEC_LSHIFT_EXPR, remove comment.
12782         * optabs.h (expand_vec_shift_expr): Remove comment re. VEC_LSHIFT_EXPR.
12783         * optabs.def: Remove vec_shl_optab.
12784         * doc/md.texi: Remove references to vec_shr_m.
12785
12786 2014-10-28  Yury Gribov  <y.gribov@samsung.com>
12787
12788         * asan.c (report_error_func): Add noabort path.
12789         (check_func): Ditto.  Formatting.
12790         (asan_expand_check_ifn): Handle noabort path.
12791         * common.opt (flag_sanitize_recover): Add SANITIZE_KERNEL_ADDRESS
12792         to default value.
12793         * doc/invoke.texi (-fsanitize-recover=): Mention KASan.
12794         * opts.c (finish_options): Reword comment.
12795         * sanitizer.def: Add noabort ASan builtins.
12796
12797 2014-10-28  Yury Gribov  <y.gribov@samsung.com>
12798
12799         * asan.c (set_asan_shadow_offset): New function.
12800         (asan_shadow_offset): Likewise.
12801         (asan_emit_stack_protection): Call asan_shadow_offset.
12802         (build_shadow_mem_access): Likewise.
12803         * asan.h (set_asan_shadow_offset): Declare.
12804         * common.opt (fasan-shadow-offset): New option.
12805         (frandom-seed): Fixed parameter name.
12806         * doc/invoke.texi (fasan-shadow-offset): Describe new option.
12807         (frandom-seed): Fixed parameter name.
12808         * opts-global.c (handle_common_deferred_options): Handle
12809         -fasan-shadow-offset.
12810         * opts.c (common_handle_option): Likewise.
12811
12812 2014-10-27  Jiong Wang <jiong.wang@arm.com>
12813
12814         PR target/63442
12815         * optabs.c (prepare_cmp_insn): Use "ret_mode" instead of "word_mode".
12816
12817 2014-10-27  DJ Delorie  <dj@redhat.com>
12818
12819         * tree.c (build_common_tree_nodes): Don't even store the
12820         __int128 types if they're not supported.
12821
12822 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12823
12824         * config/i386/i386.c (ix86_loop_memcount): Delete.
12825         (ix86_loop_unroll_adjust): Use FOR_EACH_SUBRTX.
12826
12827 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12828
12829         * config/i386/i386.c (find_constant_1): Delete.
12830         (find_constant): Use FOR_EACH_SUBRTX.
12831
12832 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12833
12834         * config/i386/i386.c (extended_reg_mentioned_1): Delete.
12835         (x86_extended_reg_mentioned_p): Use FOR_EACH_SUBRTX.
12836
12837 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12838
12839         * config/i386/i386.c: Include rtl-iter.h
12840         (ix86_check_avx256_register): Take a const_rtx and return a bool.
12841         (ix86_check_avx256_stores): Update call accordingly.
12842         (ix86_avx_u128_mode_entry, ix86_avx_u128_mode_exit): Likewise.
12843         (ix86_avx_u128_mode_needed): Likewise.  Use FOR_EACH_SUBRTX.
12844
12845 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12846
12847         * config/alpha/alpha-protos.h (some_small_symbolic_operand_int):
12848         Take an rtx and return a bool.
12849         * config/alpha/alpha.c (some_small_symbolic_operand_int): Likewise.
12850         Use FOR_EACH_SUBRTX_VAR.
12851         * config/alpha/predicates.md (some_small_symbolic_operand): Update
12852         accordingly.
12853
12854 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12855
12856         * config/alpha/alpha-protos.h (alpha_find_lo_sum_using_gp): Return
12857         a bool.
12858         * config/alpha/alpha.c (find_lo_sum_using_gp): Delete.
12859         (alpha_find_lo_sum_using_gp): Use FOR_EACH_SUBRTX.  Return a bool.
12860
12861 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12862
12863         * config/alpha/alpha.c (alpha_set_memflags_1): Delete.
12864         (alpha_set_memflags): Use FOR_EACH_SUBRTX_VAR.
12865
12866 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12867
12868         * config/alpha/alpha.c: Include rtl-iter.h.
12869         (split_small_symbolic_operand_1): Delete.
12870         (split_small_symbolic_operand): Use FOR_EACH_SUBRTX_PTR.
12871
12872 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12873
12874         * config/s390/s390.c: Include rtl-iter.h.
12875         (check_dpu): Delete.
12876         (s390_loop_unroll_adjust): Only iterate over patterns.
12877         Use FOR_EACH_SUBRTX.
12878
12879 2014-10-27  Richard Sandiford  <richard.sandiford@arm.com>
12880
12881         * config/spu/spu.c: Include rtl-iter.h
12882         (ea_symbol_ref): Replace with...
12883         (ea_symbol_ref_p): ...this new function.
12884         (spu_legitimate_address_p): Update call accordingly.
12885         (spu_legitimate_constant_p): Likewise.  Use FOR_EACH_SUBRTX.
12886
12887 2014-10-27  Phil Muldoon  <pmuldoon@redhat.com>
12888             Tom Tromey  <tromey@redhat.com>
12889
12890         * aclocal.m4, configure: Rebuild.
12891         * Makefile.in (aclocal_deps): Add gcc-plugin.m4.
12892         * configure.ac: Use GCC_ENABLE_PLUGINS.
12893         * stor-layout.c (finish_bitfield_layout): Now public.  Change
12894         argument type to 'tree'.
12895         (finish_record_layout): Update.
12896         * stor-layout.h (finish_bitfield_layout): Declare.
12897
12898 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12899
12900         * config/aarch64/aarch64.c (TARGET_GIMPLE_FOLD_BUILTIN): Define again.
12901         * config/aarch64/aarch64-builtins.c (aarch64_gimple_fold_builtin):
12902         Restore, enable for bigendian, update to use __builtin..._scal...
12903
12904 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12905
12906         * config/aarch64/aarch64-simd-builtins.def (reduc_smax_, reduc_smin_,
12907         reduc_umax_, reduc_umin_, reduc_smax_nan_, reduc_smin_nan_): Remove.
12908         (reduc_smax_scal_, reduc_smin_scal_, reduc_umax_scal_,
12909         reduc_umin_scal_, reduc_smax_nan_scal_, reduc_smin_nan_scal_): New.
12910
12911         * config/aarch64/aarch64-simd.md
12912         (reduc_<maxmin_uns>_<mode>): Rename VDQV_S variant to...
12913         (reduc_<maxmin_uns>_internal<mode>): ...this.
12914         (reduc_<maxmin_uns>_<mode>): New (VDQ_BHSI).
12915         (reduc_<maxmin_uns>_scal_<mode>): New (*2).
12916
12917         (reduc_<maxmin_uns>_v2si): Combine with below, renaming...
12918         (reduc_<maxmin_uns>_<mode>): Combine V2F with above, renaming...
12919         (reduc_<maxmin_uns>_internal_<mode>): ...to this (VDQF).
12920
12921         * config/aarch64/arm_neon.h (vmaxv_f32, vmaxv_s8, vmaxv_s16,
12922         vmaxv_s32, vmaxv_u8, vmaxv_u16, vmaxv_u32, vmaxvq_f32, vmaxvq_f64,
12923         vmaxvq_s8, vmaxvq_s16, vmaxvq_s32, vmaxvq_u8, vmaxvq_u16, vmaxvq_u32,
12924         vmaxnmv_f32, vmaxnmvq_f32, vmaxnmvq_f64, vminv_f32, vminv_s8,
12925         vminv_s16, vminv_s32, vminv_u8, vminv_u16, vminv_u32, vminvq_f32,
12926         vminvq_f64, vminvq_s8, vminvq_s16, vminvq_s32, vminvq_u8, vminvq_u16,
12927         vminvq_u32, vminnmv_f32, vminnmvq_f32, vminnmvq_f64): Update to use
12928         __builtin_aarch64_reduc_..._scal; remove vget_lane wrapper.
12929
12930 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12931
12932         * config/aarch64/aarch64-simd-builtins.def
12933         (reduc_splus_<mode>/VDQF, reduc_uplus_<mode>/VDQF, reduc_splus_v4sf):
12934         Remove.
12935         (reduc_plus_scal_<mode>, reduc_plus_scal_v4sf): New.
12936
12937         * config/aarch64/aarch64-simd.md (reduc_<sur>plus_mode): Remove.
12938         (reduc_splus_<mode>, reduc_uplus_<mode>, reduc_plus_scal_<mode>): New.
12939
12940         (reduc_<sur>plus_mode): Change SUADDV -> UNSPEC_ADDV, rename to...
12941         (aarch64_reduc_plus_internal<mode>): ...this.
12942
12943         (reduc_<sur>plus_v2si): Change SUADDV -> UNSPEC_ADDV, rename to...
12944         (aarch64_reduc_plus_internalv2si): ...this.
12945
12946         (reduc_splus_<mode>/V2F): Rename to...
12947         (aarch64_reduc_plus_internal<mode>): ...this.
12948
12949         * config/aarch64/iterators.md
12950         (UNSPEC_SADDV, UNSPEC_UADDV, SUADDV): Remove.
12951         (UNSPEC_ADDV): New.
12952         (sur): Remove elements for UNSPEC_SADDV and UNSPEC_UADDV.
12953
12954         * config/aarch64/arm_neon.h (vaddv_s8, vaddv_s16, vaddv_s32, vaddv_u8,
12955         vaddv_u16, vaddv_u32, vaddvq_s8, vaddvq_s16, vaddvq_s32, vaddvq_s64,
12956         vaddvq_u8, vaddvq_u16, vaddvq_u32, vaddvq_u64, vaddv_f32, vaddvq_f32,
12957         vaddvq_f64): Change __builtin_aarch64_reduc_[us]plus_... to
12958         __builtin_aarch64_reduc_plus_scal, remove vget_lane wrapper.
12959
12960 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12961
12962         PR tree-optimization/61114
12963         * doc/md.texi (Standard Names): Add reduc_(plus,[us](min|max))|scal
12964         optabs, and note in reduc_[us](plus|min|max) to prefer the former.
12965
12966         * expr.c (expand_expr_real_2): Use reduc_..._scal if available, fall
12967         back to old reduc_... + BIT_FIELD_REF only if not.
12968
12969         * optabs.c (optab_for_tree_code): for REDUC_(MAX,MIN,PLUS)_EXPR,
12970         return the reduce-to-scalar (reduc_..._scal) optab.
12971         (scalar_reduc_to_vector): New.
12972
12973         * optabs.def (reduc_smax_scal_optab, reduc_smin_scal_optab,
12974         reduc_plus_scal_optab, reduc_umax_scal_optab, reduc_umin_scal_optab):
12975         New.
12976
12977         * optabs.h (scalar_reduc_to_vector): Declare.
12978
12979         * tree-vect-loop.c (vectorizable_reduction): Look for optabs reducing
12980         to either scalar or vector.
12981
12982 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
12983
12984         PR tree-optimization/61114
12985         * expr.c (expand_expr_real_2): For REDUC_{MIN,MAX,PLUS}_EXPR, add
12986         extract_bit_field around optab result.
12987
12988         * fold-const.c (fold_unary_loc): For REDUC_{MIN,MAX,PLUS}_EXPR, produce
12989         scalar not vector.
12990
12991         * tree-cfg.c (verify_gimple_assign_unary): Check result vs operand type
12992         for REDUC_{MIN,MAX,PLUS}_EXPR.
12993
12994         * tree-vect-loop.c (vect_analyze_loop): Update comment.
12995         (vect_create_epilog_for_reduction): For direct vector reduction, use
12996         result of tree code directly without extract_bit_field.
12997
12998         * tree.def (REDUC_MAX_EXPR, REDUC_MIN_EXPR, REDUC_PLUS_EXPR): Update
12999         comment.
13000
13001 2014-10-27  Andrew MacLeod  <amacleod@redhat.com>
13002
13003         * basic-block.h: Remove all includes.
13004         (enum profile_status_d, struct control_flow_graph): Move to cfg.h
13005         * cfg.h (profile_status_d, struct control_flow_graph): Relocate here.
13006         * Makefile.in (GTFILES): Add cfg.h to list.
13007         * cgraph.h (symbol_table::create_empty): Move to cgraph.c.
13008         * cgraph.c (symbol_table::create_empty): Relocate from cgraph.h.
13009         * genconditions.c (write_header): Add predict.h and basic-block.h to
13010         lits of includes.
13011         * genemit.c (main): Ditto.
13012         * genpreds.c (write_insn_preds_c): Ditto.
13013         * genrecog.c (write_header): Ditto.
13014         * gengtype.c (open_base_files): Add predict.h, basic-block.h, and cfg.h
13015         to list of includes.
13016         * alias.c: Adjust include files.
13017         * asan.c: Ditto.
13018         * auto-inc-dec.c: Ditto.
13019         * auto-profile.c: Ditto.
13020         * bb-reorder.c: Ditto.
13021         * bt-load.c: Ditto.
13022         * builtins.c: Ditto.
13023         * caller-save.c: Ditto.
13024         * calls.c: Ditto.
13025         * cfg.c: Ditto.
13026         * cfganal.c: Ditto.
13027         * cfgbuild.c: Ditto.
13028         * cfgcleanup.c: Ditto.
13029         * cfgexpand.c: Ditto.
13030         * cfghooks.c: Ditto.
13031         * cfgloop.c: Ditto.
13032         * cfgloopanal.c: Ditto.
13033         * cfgloopmanip.c: Ditto.
13034         * cfgrtl.c: Ditto.
13035         * cgraphbuild.c: Ditto.
13036         * cgraphclones.c: Ditto.
13037         * cgraphunit.c: Ditto.
13038         * combine-stack-adj.c: Ditto.
13039         * combine.c: Ditto.
13040         * compare-elim.c: Ditto.
13041         * coverage.c: Ditto.
13042         * cprop.c: Ditto.
13043         * cse.c: Ditto.
13044         * cselib.c: Ditto.
13045         * data-streamer-in.c: Ditto.
13046         * data-streamer-out.c: Ditto.
13047         * data-streamer.c: Ditto.
13048         * dce.c: Ditto.
13049         * ddg.c: Ditto.
13050         * ddg.h: Ditto.
13051         * df-core.c: Ditto.
13052         * df-problems.c: Ditto.
13053         * df-scan.c: Ditto.
13054         * df.h: Ditto.
13055         * dojump.c: Ditto.
13056         * dominance.c: Ditto.
13057         * domwalk.c: Ditto.
13058         * dse.c: Ditto.
13059         * dwarf2cfi.c: Ditto.
13060         * emit-rtl.c: Ditto.
13061         * et-forest.c: Ditto.
13062         * except.c: Ditto.
13063         * expmed.c: Ditto.
13064         * expr.c: Ditto.
13065         * final.c: Ditto.
13066         * fold-const.c: Ditto.
13067         * function.c: Ditto.
13068         * fwprop.c: Ditto.
13069         * gcc-plugin.h: Ditto.
13070         * gcse.c: Ditto.
13071         * generic-match-head.c: Ditto.
13072         * ggc-page.c: Ditto.
13073         * gimple-builder.c: Ditto.
13074         * gimple-expr.c: Ditto.
13075         * gimple-fold.c: Ditto.
13076         * gimple-iterator.c: Ditto.
13077         * gimple-low.c: Ditto.
13078         * gimple-match-head.c: Ditto.
13079         * gimple-pretty-print.c: Ditto.
13080         * gimple-ssa-isolate-paths.c: Ditto.
13081         * gimple-ssa-strength-reduction.c: Ditto.
13082         * gimple-streamer-in.c: Ditto.
13083         * gimple-streamer-out.c: Ditto.
13084         * gimple-streamer.h: Ditto.
13085         * gimple-walk.c: Ditto.
13086         * gimple.c: Ditto.
13087         * gimplify-me.c: Ditto.
13088         * gimplify.c: Ditto.
13089         * graph.c: Ditto.
13090         * graphite-blocking.c: Ditto.
13091         * graphite-clast-to-gimple.c: Ditto.
13092         * graphite-dependences.c: Ditto.
13093         * graphite-interchange.c: Ditto.
13094         * graphite-isl-ast-to-gimple.c: Ditto.
13095         * graphite-optimize-isl.c: Ditto.
13096         * graphite-poly.c: Ditto.
13097         * graphite-scop-detection.c: Ditto.
13098         * graphite-sese-to-poly.c: Ditto.
13099         * graphite.c: Ditto.
13100         * haifa-sched.c: Ditto.
13101         * hw-doloop.c: Ditto.
13102         * ifcvt.c: Ditto.
13103         * init-regs.c: Ditto.
13104         * internal-fn.c: Ditto.
13105         * ipa-cp.c: Ditto.
13106         * ipa-devirt.c: Ditto.
13107         * ipa-icf-gimple.c: Ditto.
13108         * ipa-icf.c: Ditto.
13109         * ipa-inline-analysis.c: Ditto.
13110         * ipa-inline.c: Ditto.
13111         * ipa-polymorphic-call.c: Ditto.
13112         * ipa-profile.c: Ditto.
13113         * ipa-prop.c: Ditto.
13114         * ipa-pure-const.c: Ditto.
13115         * ipa-reference.c: Ditto.
13116         * ipa-split.c: Ditto.
13117         * ipa-utils.c: Ditto.
13118         * ipa.c: Ditto.
13119         * ira-build.c: Ditto.
13120         * ira-color.c: Ditto.
13121         * ira-conflicts.c: Ditto.
13122         * ira-costs.c: Ditto.
13123         * ira-emit.c: Ditto.
13124         * ira-lives.c: Ditto.
13125         * ira.c: Ditto.
13126         * jump.c: Ditto.
13127         * lcm.c: Ditto.
13128         * loop-doloop.c: Ditto.
13129         * loop-init.c: Ditto.
13130         * loop-invariant.c: Ditto.
13131         * loop-iv.c: Ditto.
13132         * loop-unroll.c: Ditto.
13133         * lower-subreg.c: Ditto.
13134         * lra-assigns.c: Ditto.
13135         * lra-coalesce.c: Ditto.
13136         * lra-constraints.c: Ditto.
13137         * lra-eliminations.c: Ditto.
13138         * lra-lives.c: Ditto.
13139         * lra-spills.c: Ditto.
13140         * lra.c: Ditto.
13141         * lto-cgraph.c: Ditto.
13142         * lto-compress.c: Ditto.
13143         * lto-opts.c: Ditto.
13144         * lto-section-in.c: Ditto.
13145         * lto-section-out.c: Ditto.
13146         * lto-streamer-in.c: Ditto.
13147         * lto-streamer-out.c: Ditto.
13148         * lto-streamer.c: Ditto.
13149         * mcf.c: Ditto.
13150         * mode-switching.c: Ditto.
13151         * modulo-sched.c: Ditto.
13152         * omp-low.c: Ditto.
13153         * optabs.c: Ditto.
13154         * opts-global.c: Ditto.
13155         * passes.c: Ditto.
13156         * postreload-gcse.c: Ditto.
13157         * postreload.c: Ditto.
13158         * predict.c: Ditto.
13159         * print-rtl.c: Ditto.
13160         * profile.c: Ditto.
13161         * recog.c: Ditto.
13162         * ree.c: Ditto.
13163         * reg-stack.c: Ditto.
13164         * regcprop.c: Ditto.
13165         * regcprop.h: Ditto.
13166         * reginfo.c: Ditto.
13167         * regrename.c: Ditto.
13168         * regstat.c: Ditto.
13169         * reload.c: Ditto.
13170         * reload1.c: Ditto.
13171         * reorg.c: Ditto.
13172         * resource.c: Ditto.
13173         * rtlanal.c: Ditto.
13174         * sched-deps.c: Ditto.
13175         * sched-ebb.c: Ditto.
13176         * sched-int.h: Ditto.
13177         * sched-rgn.c: Ditto.
13178         * sched-vis.c: Ditto.
13179         * sel-sched-dump.c: Ditto.
13180         * sel-sched-ir.c: Ditto.
13181         * sel-sched-ir.h: Ditto.
13182         * sel-sched.c: Ditto.
13183         * sese.c: Ditto.
13184         * shrink-wrap.c: Ditto.
13185         * stack-ptr-mod.c: Ditto.
13186         * stmt.c: Ditto.
13187         * store-motion.c: Ditto.
13188         * symtab.c: Ditto.
13189         * toplev.c: Ditto.
13190         * tracer.c: Ditto.
13191         * trans-mem.c: Ditto.
13192         * tree-affine.c: Ditto.
13193         * tree-call-cdce.c: Ditto.
13194         * tree-cfg.c: Ditto.
13195         * tree-cfgcleanup.c: Ditto.
13196         * tree-chrec.c: Ditto.
13197         * tree-complex.c: Ditto.
13198         * tree-data-ref.c: Ditto.
13199         * tree-dfa.c: Ditto.
13200         * tree-eh.c: Ditto.
13201         * tree-emutls.c: Ditto.
13202         * tree-if-conv.c: Ditto.
13203         * tree-inline.c: Ditto.
13204         * tree-into-ssa.c: Ditto.
13205         * tree-loop-distribution.c: Ditto.
13206         * tree-nested.c: Ditto.
13207         * tree-nrv.c: Ditto.
13208         * tree-object-size.c: Ditto.
13209         * tree-outof-ssa.c: Ditto.
13210         * tree-parloops.c: Ditto.
13211         * tree-phinodes.c: Ditto.
13212         * tree-predcom.c: Ditto.
13213         * tree-pretty-print.c: Ditto.
13214         * tree-profile.c: Ditto.
13215         * tree-scalar-evolution.c: Ditto.
13216         * tree-sra.c: Ditto.
13217         * tree-ssa-address.c: Ditto.
13218         * tree-ssa-alias.c: Ditto.
13219         * tree-ssa-ccp.c: Ditto.
13220         * tree-ssa-coalesce.c: Ditto.
13221         * tree-ssa-copy.c: Ditto.
13222         * tree-ssa-copyrename.c: Ditto.
13223         * tree-ssa-dce.c: Ditto.
13224         * tree-ssa-dom.c: Ditto.
13225         * tree-ssa-dse.c: Ditto.
13226         * tree-ssa-forwprop.c: Ditto.
13227         * tree-ssa-ifcombine.c: Ditto.
13228         * tree-ssa-live.c: Ditto.
13229         * tree-ssa-loop-ch.c: Ditto.
13230         * tree-ssa-loop-im.c: Ditto.
13231         * tree-ssa-loop-ivcanon.c: Ditto.
13232         * tree-ssa-loop-ivopts.c: Ditto.
13233         * tree-ssa-loop-manip.c: Ditto.
13234         * tree-ssa-loop-niter.c: Ditto.
13235         * tree-ssa-loop-prefetch.c: Ditto.
13236         * tree-ssa-loop-unswitch.c: Ditto.
13237         * tree-ssa-loop.c: Ditto.
13238         * tree-ssa-math-opts.c: Ditto.
13239         * tree-ssa-operands.c: Ditto.
13240         * tree-ssa-phiopt.c: Ditto.
13241         * tree-ssa-phiprop.c: Ditto.
13242         * tree-ssa-pre.c: Ditto.
13243         * tree-ssa-propagate.c: Ditto.
13244         * tree-ssa-reassoc.c: Ditto.
13245         * tree-ssa-sccvn.c: Ditto.
13246         * tree-ssa-sink.c: Ditto.
13247         * tree-ssa-strlen.c: Ditto.
13248         * tree-ssa-structalias.c: Ditto.
13249         * tree-ssa-tail-merge.c: Ditto.
13250         * tree-ssa-ter.c: Ditto.
13251         * tree-ssa-threadedge.c: Ditto.
13252         * tree-ssa-threadupdate.c: Ditto.
13253         * tree-ssa-uncprop.c: Ditto.
13254         * tree-ssa-uninit.c: Ditto.
13255         * tree-ssa.c: Ditto.
13256         * tree-ssanames.c: Ditto.
13257         * tree-stdarg.c: Ditto.
13258         * tree-streamer-in.c: Ditto.
13259         * tree-streamer-out.c: Ditto.
13260         * tree-streamer.c: Ditto.
13261         * tree-switch-conversion.c: Ditto.
13262         * tree-tailcall.c: Ditto.
13263         * tree-vect-data-refs.c: Ditto.
13264         * tree-vect-generic.c: Ditto.
13265         * tree-vect-loop-manip.c: Ditto.
13266         * tree-vect-loop.c: Ditto.
13267         * tree-vect-patterns.c: Ditto.
13268         * tree-vect-slp.c: Ditto.
13269         * tree-vect-stmts.c: Ditto.
13270         * tree-vectorizer.c: Ditto.
13271         * tree-vrp.c: Ditto.
13272         * tree.c: Ditto.
13273         * tsan.c: Ditto.
13274         * ubsan.c: Ditto.
13275         * valtrack.c: Ditto.
13276         * valtrack.h: Ditto.
13277         * value-prof.c: Ditto.
13278         * var-tracking.c: Ditto.
13279         * varasm.c: Ditto.
13280         * varpool.c: Ditto.
13281         * vtable-verify.c: Ditto.
13282         * web.c: Ditto.
13283         * config/aarch64/aarch64-builtins.c: Ditto.
13284         * config/aarch64/aarch64.c: Ditto.
13285         * config/alpha/alpha.c: Ditto.
13286         * config/arc/arc.c: Ditto.
13287         * config/arm/arm.c: Ditto.
13288         * config/avr/avr.c: Ditto.
13289         * config/bfin/bfin.c: Ditto.
13290         * config/c6x/c6x.c: Ditto.
13291         * config/cr16/cr16.c: Ditto.
13292         * config/cris/cris.c: Ditto.
13293         * config/darwin-c.c: Ditto.
13294         * config/darwin.c: Ditto.
13295         * config/epiphany/epiphany.c: Ditto.
13296         * config/epiphany/mode-switch-use.c: Ditto.
13297         * config/epiphany/resolve-sw-modes.c: Ditto.
13298         * config/fr30/fr30.c: Ditto.
13299         * config/frv/frv.c: Ditto.
13300         * config/h8300/h8300.c: Ditto.
13301         * config/i386/i386.c: Ditto.
13302         * config/i386/winnt.c: Ditto.
13303         * config/ia64/ia64.c: Ditto.
13304         * config/iq2000/iq2000.c: Ditto.
13305         * config/lm32/lm32.c: Ditto.
13306         * config/m32c/m32c.c: Ditto.
13307         * config/m32r/m32r.c: Ditto.
13308         * config/m68k/m68k.c: Ditto.
13309         * config/mcore/mcore.c: Ditto.
13310         * config/mep/mep.c: Ditto.
13311         * config/microblaze/microblaze.c: Ditto.
13312         * config/mips/mips.c: Ditto.
13313         * config/mmix/mmix.c: Ditto.
13314         * config/mn10300/mn10300.c: Ditto.
13315         * config/moxie/moxie.c: Ditto.
13316         * config/msp430/msp430.c: Ditto.
13317         * config/nds32/nds32-cost.c: Ditto.
13318         * config/nds32/nds32-fp-as-gp.c: Ditto.
13319         * config/nds32/nds32-intrinsic.c: Ditto.
13320         * config/nds32/nds32-isr.c: Ditto.
13321         * config/nds32/nds32-md-auxiliary.c: Ditto.
13322         * config/nds32/nds32-memory-manipulation.c: Ditto.
13323         * config/nds32/nds32-pipelines-auxiliary.c: Ditto.
13324         * config/nds32/nds32-predicates.c: Ditto.
13325         * config/nds32/nds32.c: Ditto.
13326         * config/nios2/nios2.c: Ditto.
13327         * config/pa/pa.c: Ditto.
13328         * config/pdp11/pdp11.c: Ditto.
13329         * config/rl78/rl78.c: Ditto.
13330         * config/rs6000/rs6000.c: Ditto.
13331         * config/rx/rx.c: Ditto.
13332         * config/s390/s390.c: Ditto.
13333         * config/sh/sh-mem.cc: Ditto.
13334         * config/sh/sh.c: Ditto.
13335         * config/sh/sh_optimize_sett_clrt.cc: Ditto.
13336         * config/sh/sh_treg_combine.cc: Ditto.
13337         * config/sparc/sparc.c: Ditto.
13338         * config/spu/spu.c: Ditto.
13339         * config/stormy16/stormy16.c: Ditto.
13340         * config/tilegx/tilegx.c: Ditto.
13341         * config/tilepro/tilepro.c: Ditto.
13342         * config/v850/v850.c: Ditto.
13343         * config/vax/vax.c: Ditto.
13344         * config/xtensa/xtensa.c: Ditto.
13345
13346 2014-10-27  Alan Lawrence  <alan.lawrence@arm.com>
13347
13348         * config/aarch64/aarch64.c (TARGET_GIMPLE_FOLD_BUILTIN): Comment out.
13349         * config/aarch64/aarch64-builtins.c (aarch64_gimple_fold_builtin):
13350         Remove using preprocessor directives.
13351
13352 2014-10-27  Richard Biener  <rguenther@suse.de>
13353
13354         * match.pd (0 % X): Properly use the iterator iterating over
13355         all modulo operators.
13356         (X % 1): Likewise.
13357
13358 2014-10-27  Richard Biener  <rguenther@suse.de>
13359
13360         * tree-ssa-forwprop.c: Include tree-cfgcleanup.h and tree-into-ssa.h.
13361         (lattice): New global.
13362         (fwprop_ssa_val): New function.
13363         (fold_all_stmts): Likewise.
13364         (pass_forwprop::execute): Finally fold all stmts.
13365
13366 2014-10-26  Manuel López-Ibáñez  <manu@gcc.gnu.org>
13367
13368         PR c++/53061
13369         * doc/invoke.texi (fmessage-length): Update text to match reality.
13370
13371 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13372
13373         * config/microblaze/microblaze.c: Include rtl-iter.h.
13374         (microblaze_tls_referenced_p_1): Delete.
13375         (microblaze_tls_referenced_p): Use FOR_EACH_SUBRTX.
13376
13377 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13378
13379         * config/mips/mips.c (mips_at_reg_p): Delete.
13380         (mips_need_noat_wrapper_p): Use FOR_EACH_SUBRTX.
13381
13382 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13383
13384         * config/mips/mips.c (mips_record_lo_sum): Replace with...
13385         (mips_record_lo_sums): ...this new function.
13386         (mips_reorg_process_insns): Update accordingly.
13387
13388 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13389
13390         * config/mips/mips.c (mips_sim_insn): Update comment.
13391         (mips_sim_wait_regs_2): Delete.
13392         (mips_sim_wait_regs_1): Use FOR_EACH_SUBRTX_VAR.
13393
13394 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13395
13396         * config/mips/mips.c (r10k_needs_protection_p_call): Take a const_rtx
13397         and return a bool.  Iterate over all subrtxes here.
13398         (r10k_needs_protection_p): Update accordingly.
13399
13400 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13401
13402         * config/mips/mips.c (r10k_needs_protection_p_1): Take an rtx
13403         rather than an rtx pointer.  Change type of insn from "void *"
13404         to its real type.  Return bool rather than int.  Iterate over
13405         all subrtxes here.
13406         (r10k_needs_protection_p_store): Update accordingly.
13407         (r10k_needs_protection_p): Likewise.
13408
13409 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13410
13411         * config/mips/mips.c (mips16_rewrite_pool_refs_info): Delete.
13412         (mips16_rewrite_pool_refs): Take the insn and constant pool as
13413         parameters.  Iterate over the instruction's pattern and return void.
13414         (mips16_lay_out_constants): Update accordingly.
13415
13416 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13417
13418         * config/mips/mips.c (mips_kernel_reg_p): Replace with...
13419         (mips_refers_to_kernel_reg_p): ...this new function.
13420         (mips_expand_prologue): Update accordingly.
13421
13422 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13423
13424         * config/mips/mips.c (mips_rewrite_small_data_1): Take the context
13425         as a parameter instead of the containing MEM.  Iterate over all
13426         subrtxes.  Don't return a value.
13427         (mips_rewrite_small_data): Update call accordingly.
13428
13429 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13430
13431         * config/mips/mips.c: Include rtl-iter.h.
13432         (mips_small_data_pattern_1): Take an rtx rather than an rtx pointer.
13433         Take the context as a parameter instead of the containing MEM.
13434         Iterate over all subrtxes.
13435         (mips_small_data_pattern_p): Update call accordingly.
13436
13437 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13438
13439         * config/mep/mep.c (mep_mul_hilo_bypass_1): Delete.
13440         (mep_mul_hilo_bypass_p): Use FOR_EACH_SUBRTX.
13441
13442 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13443
13444         * config/mep/mep.c (mep_store_find_set): Take a const_rtx and
13445         return a bool.  Replace "void *" with specific type.  Iterate
13446         over all subrtxes.
13447         (mep_store_data_bypass_1): Update calls accordingly.
13448
13449 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13450
13451         * config/mep/mep.c: Include rtl-iter.h.
13452         (global_reg_mentioned_p_1): Take a const_rtx and return a bool.
13453         (xtensa_tls_referenced_p): Return a bool.  Use FOR_EACH_SUBRTX.
13454
13455 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13456
13457         * config/xtensa/xtensa.c: Include rtl-iter.h.
13458         (xtensa_tls_referenced_p_1): Delete.
13459         (xtensa_tls_referenced_p): Use FOR_EACH_SUBRTX.
13460
13461 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13462
13463         * config/sh/sh.c (sh_contains_memref_p_1): Delete.
13464         (sh_contains_memref_p): Use FOR_EACH_SUBRTX.
13465
13466 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13467
13468         * config/sh/sh-protos.h (shmedia_cleanup_truncate): Take an
13469         rtx as argument and return the number of changes.
13470         * config/sh/sh.c: Include rtl-iter.h.
13471         (shmedia_cleanup_truncate): Take an rtx as argument and iterate
13472         over all subrtxes.  Return the number of changes made.
13473         * config/sh/sh.md: Update caller accordingly.
13474
13475 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13476
13477         * config/m68k/m68k.c (m68k_tls_reference_p_1): Delete.
13478         (m68k_tls_reference_p): Use FOR_EACH_SUBRTX_VAR.
13479
13480 2014-10-26  Richard Sandiford  <richard.sandiford@arm.com>
13481
13482         * config/m68k/m68k.c: Include rtl-iter.h.
13483         (m68k_final_prescan_insn_1): Delete.
13484         (m68k_final_prescan_insn): Use FOR_EACH_SUBRTX_VAR.
13485
13486 2014-10-25  Jakub Jelinek  <jakub@redhat.com>
13487
13488         PR tree-optimization/63641
13489         * tree-ssa-reassoc.c (optimize_range_tests_to_bit_test): Set high
13490         to low + prec - 1 - clz (mask) instead of low + prec - clz (mask).
13491
13492 2014-10-25  Alan Modra  <amodra@gmail.com>
13493
13494         PR rtl-optimization/63615
13495         * simplify-rtx.c (simplify_plus_minus): Set "canonicalized" on
13496         decomposing PLUS or MINUS if operands are not placed adjacent
13497         in the "ops" array.
13498
13499 2014-10-25  Joseph Myers  <joseph@codesourcery.com>
13500
13501         * config/rs6000/rs6000.c (rs6000_hard_regno_nregs_internal): Do
13502         not allow e500 double in registers not satisyfing
13503         SPE_SIMD_REGNO_P.
13504
13505 2014-10-24  Aldy Hernandez  <aldyh@redhat.com>
13506
13507         * dwarf2out.c (declare_in_namespace): Only emit external
13508         declarations in the local scope once.
13509
13510 2014-10-24  Jonathan Wakely  <jwakely@redhat.com>
13511
13512         * ginclude/stdbool.h: Do not define bool, true or false in C++11.
13513
13514 2014-10-24  Charles Baylis  <charles.baylis@linaro.org>
13515
13516         * config/aarch64/arm_neon.h (__LD2_LANE_FUNC): Rewrite using builtins,
13517         update uses to use new macro arguments.
13518         (__LD3_LANE_FUNC): Likewise.
13519         (__LD4_LANE_FUNC): Likewise.
13520
13521 2014-10-24  Charles Baylis  <charles.baylis@linaro.org>
13522
13523         * config/aarch64/aarch64-builtins.c
13524         (aarch64_types_loadstruct_lane_qualifiers): Define.
13525         * config/aarch64/aarch64-simd-builtins.def (ld2_lane, ld3_lane,
13526         ld4_lane): New builtins.
13527         * config/aarch64/aarch64-simd.md (aarch64_vec_load_lanesoi_lane<mode>):
13528         New pattern.
13529         (aarch64_vec_load_lanesci_lane<mode>): Likewise.
13530         (aarch64_vec_load_lanesxi_lane<mode>): Likewise.
13531         (aarch64_ld2_lane<mode>): New expand.
13532         (aarch64_ld3_lane<mode>): Likewise.
13533         (aarch64_ld4_lane<mode>): Likewise.
13534         * config/aarch64/aarch64.md (define_c_enum "unspec"): Add
13535         UNSPEC_LD2_LANE, UNSPEC_LD3_LANE, UNSPEC_LD4_LANE.
13536
13537 2014-10-24  Georg-Johann Lay  <avr@gjlay.de>
13538
13539         * avr-protos.h (avr_out_sign_extend): New.
13540         * avr.c (avr_adjust_insn_length) [ADJUST_LEN_SEXT]: Handle.
13541         (avr_out_sign_extend): New function.
13542         * avr.md (extendqihi2, extendqipsi2, extendqisi2, extendhipsi2)
13543         (extendhisi2, extendpsisi2): Use it.
13544         (adjust_len) [sext]: New.
13545
13546 2014-10-24  Martin Liska  <mliska@suse.cz>
13547
13548         * ipa-icf.c (sem_function::compare_phi_node): PHI result comparison
13549         added.
13550
13551 2014-10-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
13552
13553         * config/aarch64/aarch64-elf-raw.h (CA53_ERR_835769_SPEC): Define.
13554         (LINK_SPEC): Include CA53_ERR_835769_SPEC.
13555         * config/aarch64/aarch64-linux.h (CA53_ERR_835769_SPEC): Define.
13556         (LINK_SPEC): Include CA53_ERR_835769_SPEC.
13557
13558 2014-10-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
13559
13560         * config/aarch64/aarch64.h (ADJUST_INSN_LENGTH): Wrap definition in
13561         do while (0).
13562         * config/aarch64/aarch64.c (is_mem_p): Delete.
13563         (is_memory_op): Rename to...
13564         (has_memory_op): ... This.  Use FOR_EACH_SUBRTX.
13565         (dep_between_memop_and_curr): Assert that the input is a SET.
13566         (aarch64_madd_needs_nop): Add comment.  Do not call
13567         dep_between_memop_and_curr on NULL body.
13568         (aarch64_final_prescan_insn): Add comment.
13569         Include rtl-iter.h.
13570
13571 2014-10-24  Richard Biener  <rguenther@suse.de>
13572
13573         * Makefile.in (BUILD_CPPLIB): Move $(LIBINTL) $(LIBICONV)
13574         to genmatch BUILD_LIBS instead.
13575
13576 2014-10-24  Richard Biener  <rguenther@suse.de>
13577
13578         * genmatch.c (expr::gen_transform): Use fold_buildN_loc
13579         and build_call_expr_loc.
13580         (dt_simplify::gen): Drop non_lvalue for GIMPLE, use
13581         non_lvalue_loc to build it for GENERIC.
13582         (decision_tree::gen_generic): Add location argument to
13583         generic_simplify prototype.
13584         (capture_info): New class.
13585         (capture_info::capture_info): New constructor.
13586         (capture_info::walk_match): New method.
13587         (capture_info::walk_result): New method.
13588         (capture_info::walk_c_expr): New method.
13589         (dt_simplify::gen): Handle preserving side-effects for
13590         GENERIC code generation.
13591         (decision_tree::gen_generic): Do not reject operands
13592         with TREE_SIDE_EFFECTS.
13593         * generic-match.h: New file.
13594         * generic-match-head.c: Include generic-match.h, not gimple-match.h.
13595         * match.pd: Add some constant folding patterns from fold-const.c.
13596         * fold-const.c: Include generic-match.h.
13597         (fold_unary_loc): Dispatch to generic_simplify.
13598         (fold_ternary_loc): Likewise.
13599         (fold_binary_loc): Likewise.  Remove patterns now implemented
13600         by generic_simplify.
13601         * gimple-fold.c (replace_stmt_with_simplification): New function.
13602         (fold_stmt_1): Add valueize parameter, dispatch to gimple_simplify.
13603         (no_follow_ssa_edges): New function.
13604         (fold_stmt): New overload with valueization hook.  Use
13605         no_follow_ssa_edges for the overload without hook.
13606         (fold_stmt_inplace): Likewise.
13607         * gimple-fold.h (no_follow_ssa_edges): Declare.
13608
13609 2014-10-24  Felix Yang  <felix.yang@huawei.com>
13610         Jiji Jiang  <jiangjiji@huawei.com>
13611
13612         PR target/63173
13613         * config/aarch64/arm_neon.h (__LD2R_FUNC): Remove macro.
13614         (__LD3R_FUNC): Ditto.
13615         (__LD4R_FUNC): Ditto.
13616         (vld2_dup_s8, vld2_dup_s16, vld2_dup_s32, vld2_dup_f32, vld2_dup_f64,
13617          vld2_dup_u8, vld2_dup_u16, vld2_dup_u32, vld2_dup_p8, vld2_dup_p16
13618          vld2_dup_s64, vld2_dup_u64, vld2q_dup_s8, vld2q_dup_p8,
13619          vld2q_dup_s16, vld2q_dup_p16, vld2q_dup_s32, vld2q_dup_s64,
13620          vld2q_dup_u8, vld2q_dup_u16, vld2q_dup_u32, vld2q_dup_u64
13621          vld2q_dup_f32, vld2q_dup_f64): Rewrite using builtin functions.
13622         (vld3_dup_s64, vld3_dup_u64, vld3_dup_f64, vld3_dup_s8
13623          vld3_dup_p8, vld3_dup_s16, vld3_dup_p16, vld3_dup_s32
13624          vld3_dup_u8, vld3_dup_u16, vld3_dup_u32, vld3_dup_f32
13625          vld3q_dup_s8, vld3q_dup_p8, vld3q_dup_s16, vld3q_dup_p16
13626          vld3q_dup_s32, vld3q_dup_s64, vld3q_dup_u8, vld3q_dup_u16
13627          vld3q_dup_u32, vld3q_dup_u64, vld3q_dup_f32, vld3q_dup_f64): Likewise.
13628         (vld4_dup_s64, vld4_dup_u64, vld4_dup_f64, vld4_dup_s8
13629          vld4_dup_p8, vld4_dup_s16, vld4_dup_p16, vld4_dup_s32
13630          vld4_dup_u8, vld4_dup_u16, vld4_dup_u32, vld4_dup_f32
13631          vld4q_dup_s8, vld4q_dup_p8, vld4q_dup_s16, vld4q_dup_p16
13632          vld4q_dup_s32, vld4q_dup_s64, vld4q_dup_u8, vld4q_dup_u16
13633          vld4q_dup_u32, vld4q_dup_u64, vld4q_dup_f32, vld4q_dup_f64): Likewise.
13634         * config/aarch64/aarch64.md (define_c_enum "unspec"): Add
13635         UNSPEC_LD2_DUP, UNSPEC_LD3_DUP, UNSPEC_LD4_DUP.
13636         * config/aarch64/aarch64-simd-builtins.def (ld2r, ld3r, ld4r): New
13637         builtins.
13638         * config/aarch64/aarch64-simd.md (aarch64_simd_ld2r<mode>): New pattern.
13639         (aarch64_simd_ld3r<mode>): Likewise.
13640         (aarch64_simd_ld4r<mode>): Likewise.
13641         (aarch64_ld2r<mode>): New expand.
13642         (aarch64_ld3r<mode>): Likewise.
13643         (aarch64_ld4r<mode>): Likewise.
13644
13645 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13646
13647         * rtlanal.c (get_base_term): Handle SCRATCH.
13648
13649 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13650
13651         * haifa-sched.c (sched_init): Disable max_issue when scheduling for
13652         register pressure.
13653
13654 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13655
13656         * haifa-sched.c (cached_first_cycle_multipass_dfa_lookahead,)
13657         (cached_issue_rate): Remove.  Use dfa_lookahead and issue_rate instead.
13658         (max_issue, choose_ready, sched_init): Update.
13659
13660 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13661
13662         * sched-int.h (struct _haifa_insn_data:last_rfs_win): New field.
13663         * haifa-sched.c (INSN_LAST_RFS_WIN): New access macro.
13664         (rfs_result): Set INSN_LAST_RFS_WIN.  Update signature.
13665         (rank_for_schedule): Update calls to rfs_result to pass new parameters.
13666         (print_rank_for_schedule_stats): Print out elements of ready list that
13667         ended up on their respective places due to each of the sorting
13668         heuristics.
13669         (ready_sort): Update.
13670         (debug_ready_list_1): Improve printout for SCHED_PRESSURE_MODEL.
13671         (schedule_block): Update.
13672
13673 2014-10-24  Maxim Kuvyrkov  <maxim.kuvyrkov@gmail.com>
13674
13675         * haifa-sched.c (sched_class_regs_num, call_used_regs_num): New static
13676         arrays.  Use sched_class_regs_num instead of ira_class_hard_regs_num.
13677         (print_curr_reg_pressure, setup_insn_reg_pressure_info,)
13678         (model_update_pressure, model_spill_cost): Use sched_class_regs_num.
13679         (model_start_schedule): Update.
13680         (sched_pressure_start_bb): New static function.  Calculate
13681         sched_class_regs_num.
13682         (schedule_block): Use it.
13683         (alloc_global_sched_pressure_data): Calculate call_used_regs_num.
13684
13685 2014-10-24  Richard Biener  <rguenther@suse.de>
13686
13687         * Makefile.in (BUILD_CPPLIB): When in stage2+ use the
13688         host library and make sure to pull in the required libintl
13689         and libiconv dependencies.
13690
13691 2014-10-24  Richard Biener  <rguenther@suse.de>
13692
13693         * fold-const.c (fold_binary_loc): Fix copy-and-pasto.
13694
13695 2014-10-24  Markus Trippelsdorf  <markus@trippelsdorf.de>
13696
13697         PR bootstrap/63632
13698         * collect2.c (main): Filter out -fno-lto.
13699
13700 2014-10-24  Martin Liska  <mliska@suse.cz>
13701
13702         * ipa-icf.c (sem_item_optimizer::parse_nonsingleton_classes): Guard
13703         division by zero in dumps.
13704         (sem_item_optimizer::merge_classes): Ditto.
13705
13706 2014-10-23  John David Anglin  <danglin@gcc.gnu.org>
13707
13708         * config/pa/pa.c (pa_can_combine_p): Fix typo in last change.
13709
13710 2014-10-23  Ian Lance Taylor  <iant@google.com>
13711
13712         * tree-vrp.c (extract_range_from_assert): Fix typo in comment.
13713
13714 2014-10-23  Ian Lance Taylor  <iant@google.com>
13715
13716         * config/mep/mep.h (TARGET_HAS_F_SETLKW): Don't undefine.
13717
13718 2014-10-23  Jakub Jelinek  <jakub@redhat.com>
13719
13720         PR debug/63623
13721         * var-tracking.c (stack_adjust_offset_pre_post_cb): New function.
13722         (stack_adjust_offset_pre_post): Use it through for_each_inc_dec,
13723         instead of only handling autoinc in dest if it is a MEM.
13724         (vt_stack_adjustments): Fix up formatting.
13725
13726 2014-10-23  DJ Delorie  <dj@redhat.com>
13727
13728         * config/msp430/msp430.c (msp430_print_operand): 'x' modifier is
13729         independend of -mlarge.
13730         * config/msp430/constraints.md (Ys): Update comment.
13731
13732 2014-10-23  Evgeny Stupachenko  <evstupac@gmail.com>
13733
13734         PR target/63534
13735         PR target/63618
13736         * cse.c (delete_trivially_dead_insns): Consider PIC register is used
13737         while it is pseudo.
13738         * dse.c (deletable_insn_p): Likewise.
13739
13740 2014-10-23  Georg-Johann Lay  <avr@gjlay.de>
13741
13742         * config/avr/avr.c: Fix GNU coding rules and typos.
13743         * config/avr/avr.h: Dito.
13744         * config/avr/avr-c.c: Dito.
13745         * config/avr/avr.md: Dito.
13746
13747 2014-10-23  Kirill Yukhin  <kirill.yukhin@intel.com>
13748
13749         * config/i386/sse.md (define_mode_iterator VI1248_AVX512VL_AVX512BW):
13750         New.
13751         (define_insn "*abs<mode>2"): Use VI1248_AVX512VL_AVX512BW mode
13752         iterator.
13753         (define_expand "abs<mode>2"): Ditto.
13754
13755 2014-10-23  Kirill Yukhin  <kirill.yukhin@intel.com>
13756
13757         * tree-core.h (tree_var_decl): Extend `function_code' field
13758         by one bit, move `regdecl_flag' field to ...
13759         (tree_decl_with_vis): Here.
13760         * tree.h (DECL_STATIC_CHAIN): Update struct name.
13761
13762 2014-10-23  Richard Biener  <rguenther@suse.de>
13763
13764         * Makefile.in (BUILD_CPPLIB): Add.
13765         (build/genmatch$(build_exeext)): Use BUILD_CPPLIB, not CPPLIB.
13766         Drop LIBIBERTY.
13767
13768 2014-10-23  Richard Biener  <rguenther@suse.de>
13769
13770         * fold-const.c (fold_binary_loc): Preserve side-effects of
13771         X - X when simplifying to 0.
13772         * stor-layout.c (finish_bitfield_representative): Strip
13773         side-effects of evaluating the difference of two DECL_FIELD_OFFSET.
13774
13775 2014-10-22  Richard Biener  <rguenther@suse.de>
13776             Tobias Burnus <burnus@net-b.de>
13777
13778         PR lto/63603
13779         * gcc.c (LINK_COMMAND_SPEC): Add %{fno-lto}.
13780
13781 2014-10-22  Dehao Chen  <dehao@google.com>
13782
13783         * auto-profile.c: Change order of header files.
13784
13785 2014-10-22  Guozhi Wei  <carrot@google.com>
13786
13787         PR tree-optimization/63530
13788         tree-vect-data-refs.c (vect_create_addr_base_for_vector_ref): Set
13789         pointer alignment according to DR_MISALIGNMENT.
13790
13791 2014-10-22  David Malcolm  <dmalcolm@redhat.com>
13792
13793         * ipa-icf.c (ipa_icf_driver): Set optimizer to NULL when done.
13794
13795 2014-10-22  Andrew MacLeod  <amacleod@redhat.com>
13796
13797         * cfgbuild.h: New.  Add prototypes for cfgbuild.c.
13798         * cfgcleanup.h: New.  Add prototypes for cfgcleanup.c.
13799         * cfgloopmanip.h: New.  Add prototypes for cfgloopmanip.c.
13800         * dominance.h: New.  Add prototypes for dominance.c.
13801         * cfgloop.h: Move some prototypes/enum to cfgloopmanip.h and include it.
13802         * cfghooks.h: (struct profile_record) Relocate here.
13803         Relocate 2 prototypes from basic-block.h.
13804         * basic-block.h: Move prototypes and struct to new header files.
13805         Include cfgbuild.h, cfgcleanup.h, and dominance.h.
13806         * rtl.h: Move a few prototypes to new header files.
13807         * cfgcleanup.c (merge_memattrs): Make static.
13808         * genopinit.c (main): Add predict.h to list of includes.
13809         * predict.h: Update prototype list to match predict.c.
13810         * predict.c (maybe_hot_count_p): Export.
13811         (cgraph_edge::maybe_hot_p): Move to cgraph.c.
13812         (cgraph_node::optimize_for_size_p): Move to cgraph.h.
13813         * cgraph.h (cgraph_node::optimize_for_size_p): Relocate here.
13814         * cgraph.c (cgraph_edge::maybe_hot_p): Relocate here.
13815         * profile.h: Adjust prototypes.
13816         * ifcvt.h: New.  Relocate struct ce_if_block here.
13817         * ifcvt.c: Include ifcvt.h.
13818         * config/frv/frv.c: Include ifcvt.h.
13819         * config/frv/frv-protos.h: Add 'struct' to ce_if_block * parameters.
13820
13821 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13822
13823         * lra.c (lra): Remove call to recog_init.
13824         * config/i386/i386.md (preferred_for_speed): New attribute
13825         (*float<SWI48:mode><MODEF:mode>2_sse): Override it instead of
13826         "enabled".  Remove check for sched1.
13827
13828 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13829
13830         * recog.h (recog_data_d): Remove enabled_alternatives.
13831         * recog.c (extract_insn): Don't set it.
13832         * reload.c (find_reloads): Call get_enabled_alternatives.
13833
13834 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13835
13836         * recog.h (constrain_operands): Add an alternative_mask parameter.
13837         (constrain_operands_cached): Likewise.
13838         (get_preferred_alternatives): Declare new form.
13839         * recog.c (get_preferred_alternatives): New bb-taking instance.
13840         (constrain_operands): Take the set of available alternatives as
13841         a parameter.
13842         (check_asm_operands, insn_invalid_p, extract_constrain_insn)
13843         (extract_constrain_insn_cached): Update calls to constrain_operands.
13844         * caller-save.c (reg_save_code): Likewise.
13845         * ira.c (setup_prohibited_mode_move_regs): Likewise.
13846         * postreload-gcse.c (eliminate_partially_redundant_load): Likewise.
13847         * ree.c (combine_reaching_defs): Likewise.
13848         * reload.c (can_reload_into): Likewise.
13849         * reload1.c (reload, reload_as_needed, inc_for_reload): Likewise.
13850         (gen_reload_chain_without_interm_reg_p, emit_input_reload_insns)
13851         (emit_insn_if_valid_for_reload): Likewise.
13852         * reorg.c (fill_slots_from_thread): Likewise.
13853         * config/i386/i386.c (ix86_attr_length_address_default): Likewise.
13854         * config/pa/pa.c (pa_can_combine_p): Likewise.
13855         * config/rl78/rl78.c (insn_ok_now): Likewise.
13856         * config/sh/sh.md (define_peephole2): Likewise.
13857         * final.c (final_scan_insn): Update call to constrain_operands_cached.
13858
13859 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13860
13861         * doc/md.texi: Document "preferred_for_size" and "preferred_for_speed"
13862         attributes.
13863         * genattr.c (main): Handle "preferred_for_size" and
13864         "preferred_for_speed" in the same way as "enabled".
13865         * recog.h (bool_attr): New enum.
13866         (target_recog): Replace x_enabled_alternatives with x_bool_attr_masks.
13867         (get_preferred_alternatives, check_bool_attrs): Declare.
13868         * recog.c (have_bool_attr, get_bool_attr, get_bool_attr_mask_uncached)
13869         (get_bool_attr_mask, get_preferred_alternatives, check_bool_attrs):
13870         New functions.
13871         (get_enabled_alternatives): Use get_bool_attr_mask.
13872         * ira-costs.c (record_reg_classes): Use get_preferred_alternatives
13873         instead of recog_data.enabled_alternatives.
13874         * ira.c (ira_setup_alts): Likewise.
13875         * postreload.c (reload_cse_simplify_operands): Likewise.
13876         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
13877         * ira-lives.c (preferred_alternatives): New variable.
13878         (process_bb_node_lives): Set it.
13879         (check_and_make_def_conflict, make_early_clobber_and_input_conflicts)
13880         (single_reg_class, ira_implicitly_set_insn_hard_regs): Use it instead
13881         of recog_data.enabled_alternatives.
13882         * lra-int.h (lra_insn_recog_data): Replace enabled_alternatives
13883         to preferred_alternatives.
13884         * lra-constraints.c (process_alt_operands): Update accordingly.
13885         * lra.c (lra_set_insn_recog_data): Likewise.
13886         (lra_update_insn_recog_data): Assert check_bool_attrs.
13887
13888 2014-10-22  Richard Sandiford  <richard.sandiford@arm.com>
13889
13890         * recog.h (extract_constrain_insn): Declare.
13891         * recog.c (extract_constrain_insn): New function.
13892         * lra.c (check_rtl): Use it.
13893         * postreload.c (reload_cse_simplify_operands): Likewise.
13894         * reg-stack.c (check_asm_stack_operands): Likewise.
13895         (subst_asm_stack_regs): Likewise.
13896         * regcprop.c (copyprop_hardreg_forward_1): Likewise.
13897         * regrename.c (build_def_use): Likewise.
13898         * sel-sched.c (get_reg_class): Likewise.
13899         * config/arm/arm.c (note_invalid_constants): Likewise.
13900         * config/s390/predicates.md (execute_operation): Likewise.
13901
13902 2014-10-22  Jakub Jelinek  <jakub@redhat.com>
13903             Yury Gribov  <y.gribov@samsung.com>
13904
13905         * common.opt (flag_sanitize_recover): New variable.
13906         (fsanitize-recover): Remove Var/Init, deprecate.
13907         (fsanitize-recover=): New option.
13908         * doc/invoke.texi (fsanitize-recover): Update docs.
13909         * opts.c (finish_options): Use opts->x_flag_sanitize
13910         instead of flag_sanitize.  Prohibit -fsanitize-recover
13911         for anything besides UBSan.  Formatting.
13912         (common_handle_option): Handle OPT_fsanitize_recover_
13913         and OPT_fsanitize_recover.  Use opts->x_flag_sanitize
13914         instead of flag_sanitize.
13915         * asan.c (pass_sanopt::execute): Fix up formatting.
13916         * ubsan.c (ubsan_expand_bounds_ifn, ubsan_expand_null_ifn,
13917         ubsan_expand_objsize_ifn, ubsan_build_overflow_builtin,
13918         instrument_bool_enum_load, ubsan_instrument_float_cast,
13919         instrument_nonnull_arg, instrument_nonnull_return): Check
13920         bits in flag_sanitize_recover bitmask instead of
13921         flag_sanitize_recover as bool flag.
13922
13923 2014-10-22  Jiong Wang <jiong.wang@arm.com>
13924
13925         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Add missing '\'.
13926
13927 2014-10-22  Renlin Li <renlin.li@arm.com>
13928
13929         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Define
13930         __ARM_FEATURE_IDIV__.
13931
13932 2014-10-22  Richard Biener  <rguenther@suse.de>
13933
13934         * Makefile.in (s-match): Adjust dependencies to only catch
13935         match.pd.
13936
13937 2014-10-22  Richard Biener  <rguenther@suse.de>
13938         Prathamesh Kulkarni  <bilbotheelffriend@gmail.com>
13939
13940         * Makefile.in (OBJS): Add gimple-match.o and generic-match.o.
13941         (MOSTLYCLEANFILES): Add gimple-match.c and generic-match.c.
13942         (gimple-match.c): Generate by triggering s-match.
13943         (generic-match.c): Likewise.
13944         (s-match): Rule to build gimple-match.c and generic-match.c
13945         by running the genmatch generator program.
13946         (build/hash-table.o): Dependencies to build hash-table.c for the host.
13947         (build/genmatch.o): Dependencies to build genmatch.
13948         (genprog): Add match.
13949         (build/genmatch): Likewise.
13950         (TEXI_GCCINT_FILES): Add match-and-simplify.texi.
13951         * generic-match-head.c: New file.
13952         * gimple-match-head.c: Likewise.
13953         * gimple-match.h: Likewise.
13954         * genmatch.c: Likewise.
13955         * match.pd: Likewise.
13956         * builtins.h (fold_builtin_n): Export.
13957         * builtins.c (fold_builtin_n): Likewise.
13958         * gimple-fold.h (gimple_build): Declare various overloads.
13959         (gimple_simplify): Likewise.
13960         (gimple_convert): Re-implement in terms of gimple_build.
13961         * gimple-fold.c (gimple_convert): Remove.
13962         (gimple_build): New functions.
13963         * doc/match-and-simplify.texi: New file.
13964         * doc/gccint.texi: Add menu item Match and Simplify and include
13965         match-and-simplify.texi.
13966
13967 2014-10-22  Jakub Jelinek  <jakub@redhat.com>
13968
13969         PR target/63594
13970         * config/i386/i386.c (ix86_expand_vector_init_duplicate): For
13971         V{8HI,16QI,16HI,32QI}mode call ix86_vector_duplicate_value
13972         even for just TARGET_AVX2, not only for
13973         TARGET_AVX512VL && TARGET_AVX512BW.  For V{32HI,64QI}mode,
13974         call ix86_vector_duplicate_value only if TARGET_AVX512BW,
13975         otherwise build it using concatenation of 256-bit
13976         broadcast.
13977         * config/i386/sse.md (AVX_VEC_DUP_MODE): Moved after
13978         avx512 broadcast patterns.
13979         (vec_dup<mode>): Likewise.  For avx2 use
13980         v<sseintprefix>broadcast<bcstscalarsuff> instead of
13981         vbroadcast<ssescalarmodesuffix>.
13982         (AVX2_VEC_DUP_MODE): New mode iterator.
13983         (*vec_dup<mode>): New TARGET_AVX2 define_insn with
13984         AVX2_VEC_DUP_MODE iterator, add a splitter for that.
13985
13986         PR target/63542
13987         * config/i386/i386.c (ix86_pic_register_p): Also return
13988         true if x is a hard register with ORIGINAL_REGNO equal to
13989         pic_offset_table_rtx pseudo REGNO.
13990         (ix86_delegitimize_address): For ix86_use_pseudo_pic_reg ()
13991         after reload, subtract GOT_SYMBOL_NAME symbol if possible.
13992
13993 2014-10-22  Alan Modra  <amodra@gmail.com>
13994
13995         * gengtype.h (obstack_chunk_alloc, obstack_chunk_free): Remove cast.
13996         * coretypes.h (obstack_chunk_alloc, obstack_chunk_free): Likewise.
13997         (gcc_obstack_init): Use obstack_specify_allocation in place of
13998         _obstack_begin.
13999         * genautomata.c (next_sep_el): Cast result of obstack_base to (char *).
14000         (regexp_representation): Likewise.
14001         * godump.c (go_output_type): Likewise.
14002
14003 2014-10-21  John David Anglin  <danglin@gcc.gnu.org>
14004
14005         * config.gcc: Remove MASK_JUMP_IN_DELAY from target_cpu_default2.
14006         * config/pa/pa.h (TARGET_DEFAULT): Remove MASK_JUMP_IN_DELAY.
14007         * config/pa/pa.opt (mjump-in-delay): Ignore option.  Update comment.
14008
14009 2014-10-21 Manuel López-Ibáñez  <manu@gcc.gnu.org>
14010
14011         * doc/invoke.texi (pedantic-errors): Explain better.
14012
14013 2014-10-21  Joern Rennecke  <joern.rennecke@embecosm.com>
14014             Vidya Praveen <vidya.praveen@atmel.com>
14015             Praveen Kumar Kaushik <Praveen_Kumar.Kaushik@atmel.com>
14016             Senthil Kumar Selvaraj <Senthil_Kumar.Selvaraj@atmel.com>
14017             Pitchumani Sivanupandi <Pitchumani.S@atmel.com>
14018
14019         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Don't define
14020         __MEMX for avrtiny.
14021         * config/avr/avr.c (avr_insert_attributes): Reject __memx for avrtiny.
14022         (avr_nonconst_pointer_addrspace): Likewise.
14023         * config/avr/avr.h (AVR_HAVE_LPM): Define.
14024
14025         Added AVRTINY architecture to avr target.
14026         * config/avr/avr-arch.h (avr_arch): Added AVRTINY architecture.
14027         (base_arch_s): member added for AVRTINY architecture.
14028         * config/avr/avr.c: Added TINY_ADIW, TINY_SBIW macros as AVRTINY
14029         alternate for adiw/sbiw instructions. Added AVR_TMP_REGNO and
14030         AVR_ZERO_REGNO macros for tmp and zero registers. Replaced TMP_REGNO
14031         and ZERO_REGNO occurrences by AVR_TMP_REGNO and AVR_ZERO_REGNO
14032         respectively. LAST_CALLEE_SAVED_REG macro added for the last register
14033         in callee saved register list.
14034         (avr_option_override): CCP address updated for AVRTINY.
14035         (avr_init_expanders): tmp and zero rtx initialized as per arch.
14036         Reset avr_have_dimode if AVRTINY.
14037         (sequent_regs_live): Use LAST_CALLEE_SAVED_REG instead magic number.
14038         (emit_push_sfr): Use AVR_TMP_REGNO for tmp register number.
14039         (avr_prologue_setup_frame): Don't minimize prologue if AVRTINY.
14040         Use LAST_CALLEE_SAVED_REG to refer last callee saved register.
14041         (expand_epilogue): Likewise.
14042         (avr_print_operand): Print CCP address in case of AVRTINY also.
14043         <TBD>bad address
14044         (function_arg_regno_p): Check different register list for arguments
14045         if AVRTINY.
14046         (init_cumulative_args): Check for AVRTINY to update number of argument
14047         registers.
14048         (tiny_valid_direct_memory_access_range): New function. Return false if
14049         direct memory access range is not in accepted range for AVRTINY.
14050         (avr_out_movqi_r_mr_reg_disp_tiny): New function to handle register
14051         indirect load (with displacement) for AVRTINY.
14052         (out_movqi_r_mr): Updated instruction length for AVRTINY. Call
14053         avr_out_movqi_r_mr_reg_disp_tiny for load from reg+displacement.
14054         (avr_out_movhi_r_mr_reg_no_disp_tiny): New function to handle register
14055         indirect load (no displacement) for AVRTINY.
14056         (avr_out_movhi_r_mr_reg_disp_tiny): New function to handle register
14057         indirect load (with displacement) for AVRTINY.
14058         (avr_out_movhi_r_mr_pre_dec_tiny): New function to handle register
14059         indirect load for pre-decrement address.
14060         (out_movhi_r_mr): In case of AVRTINY, call tiny register indirect load
14061         functions. Update instruction length for AVRTINY.
14062         (avr_out_movsi_r_mr_reg_no_disp_tiny): New function. Likewise, for
14063         SImode.
14064         (avr_out_movsi_r_mr_reg_disp_tiny): New function. Likewise, for SImode.
14065         (out_movsi_r_mr): Likewise, for SImode.
14066         (avr_out_movsi_mr_r_reg_no_disp_tiny): New function to handle register
14067         indirect store (no displacement) for AVRTINY.
14068         (avr_out_movsi_mr_r_reg_disp_tiny): New function to handle register
14069         indirect store (with displacement) for AVRTINY.
14070         (out_movsi_mr_r): Emit out insn for IO address store. Update store
14071         instruction's size for AVRTINY. For AVRTINY, call tiny SImode indirect
14072         store functions.
14073         (avr_out_load_psi_reg_no_disp_tiny): New function to handle register
14074         indirect load (no displacement) for PSImode in AVRTINY.
14075         (avr_out_load_psi_reg_disp_tiny): New function to handle register
14076         indirect load (with displacement) for PSImode in AVRTINY.
14077         (avr_out_load_psi): Call PSImode register indirect load functions for
14078         AVRTINY. Update instruction length for AVRTINY.
14079         (avr_out_store_psi_reg_no_disp_tiny): New function to handle register
14080         indirect store (no displacement) for PSImode in AVRTINY.
14081         (avr_out_store_psi_reg_disp_tiny): New function to handle register
14082         indirect store (with displacement) for PSImode in AVRTINY.
14083         (avr_out_store_psi): Update instruction length for AVRTINY. Call tiny
14084         register indirect store functions for AVRTINY.
14085         (avr_out_movqi_mr_r_reg_disp_tiny): New function to handle QImode
14086         register indirect store (with displacement) for AVRTINY.
14087         (out_movqi_mr_r): Update instruction length for AVRTINY. Call tiny
14088         register indirect store function for QImode in AVRTINY.
14089         (avr_out_movhi_mr_r_xmega): Update instruction length for AVRTINY.
14090         (avr_out_movhi_mr_r_reg_no_disp_tiny): New function to handle register
14091         indirect store (no displacement) for HImode in AVRTINY.
14092         (avr_out_movhi_mr_r_reg_disp_tiny): New function to handle register
14093         indirect store (with displacement) for HImode in AVRTINY.
14094         (avr_out_movhi_mr_r_post_inc_tiny): New function to handle register
14095         indirect store for post-increment address in HImode.
14096         (out_movhi_mr_r): Update instruction length for AVRTINY. Call tiny
14097         register indirect store function for HImode in AVRTINY.
14098         (avr_out_compare): Use TINY_SBIW/ TINY_ADIW in place of sbiw/adiw
14099         in case of AVRTINY.
14100         (order_regs_for_local_alloc): Updated register allocation order for
14101         AVRTINY.
14102         (avr_conditional_register_usage): New function. It is a target hook
14103         (TARGET_CONDITIONAL_REGISTER_USAGE) function which updates fixed, call
14104         used registers list and register allocation order for AVRTINY.
14105         (avr_return_in_memory): Update return value size for AVRTINY.
14106         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Added builtin macros
14107         for AVRTINY arch and tiny program memory base address.
14108         * config/avr/avr-devices.c (avr_arch_types): Added AVRTINY arch.
14109         (avr_texinfo): Added description for AVRTINY arch.
14110         * config/avr/avr.h: Added macro to identify AVRTINY arch. Updated
14111         STATIC_CHAIN_REGNUM for AVRTINY.
14112         * config/avr/avr-mcus.def: Added AVRTINY arch devices.
14113         * config/avr/avr.md: Added constants for tmp/ zero registers in
14114         AVRTINY. Attributes for AVRTINY added.
14115         (mov<mode>): Move src/ dest address to register if it is not in AVRTINY
14116         memory access range.
14117         (mov<mode>_insn): Avoid QImode direct load for AVRTINY if address not
14118         in AVRTINY memory access range.
14119         (*mov<mode>): Likewise for HImode and SImode.
14120         (*movsf): Likewise for SFmode.
14121         (delay_cycles_2): Updated instructions to be emitted as AVRTINY does
14122         not have sbiw.
14123         * config/avr/avr-protos.h: Added function prototype for
14124         tiny_valid_direct_memory_access_range.
14125         * config/avr/avr-tables.opt: Regenerate.
14126         * gcc/config/avr/t-multilib: Regenerate.
14127         * doc/avr-mmcu.texi: Regenerate.
14128
14129 2014-10-21  Andrew Pinski  <apinski@cavium.com>
14130
14131         * doc/invoke.texi (AARCH64/mtune): Document thunderx as an
14132         available option also.
14133         * config/aarch64/aarch64-cost-tables.h: New file.
14134         * config/aarch64/aarch64-cores.def (thunderx): New core.
14135         * config/aarch64/aarch64-tune.md: Regenerate.
14136         * config/aarch64/aarch64.c: Include aarch64-cost-tables.h instead
14137         of config/arm/aarch-cost-tables.h.
14138         (thunderx_regmove_cost): New variable.
14139         (thunderx_tunings): New variable.
14140
14141 2014-10-21  Dehao Chen  <dehao@google.com>
14142
14143         * auto-profile.c: New file.
14144         * auto-profile.h: New file.
14145         * basic-block.h (maybe_hot_count_p): New export func.
14146         (add_working_set): New export func.
14147         * gcov-io.h (GCOV_TAG_AFDO_FILE_NAMES): New tag.
14148         (GCOV_TAG_AFDO_FUNCTION): Likewise.
14149         (GCOV_TAG_AFDO_WORKING_SET): Likewise.
14150         * opts.c (enable_fdo_optimizations): New func.
14151         (common_handle_option): Handle -fauto-profile flag.
14152         * ipa-inline.c (want_early_inline_function_p): Iterative-einline.
14153         (class pass_early_inline): Export early_inliner.
14154         (early_inliner): Likewise.
14155         (pass_early_inline::execute): Likewise.
14156         * ipa-inline.h (early_inliner): Likewise.
14157         * predict.c (maybe_hot_count_p): New export func.
14158         (counts_to_freqs): AutoFDO logic.
14159         (rebuild_frequencies): Likewise.
14160         * tree-profile.c (pass_ipa_tree_profile::gate): Likewise.
14161         * profile.c (add_working_set): New func.
14162         * Makefile.in (auto-profile.o): New object file.
14163         * passes.def (pass_ipa_auto_profile): New pass.
14164         * tree-ssa-live.c (remove_unused_scope_block_p): AutoFDO logic.
14165         * tree-pass.h (make_pass_ipa_auto_profile): New pass.
14166         * toplev.c (compile_file): AutoFDO logic.
14167         * doc/invoke.texi (-fauto-profile): New doc.
14168         * coverage.c (coverage_init): AutoFDO logic.
14169         * common.opt (-fauto-profile): New flag.
14170         * timevar.def (TV_IPA_AUTOFDO): New tag.
14171         * value-prof.c (gimple_alloc_histogram_value): New export func.
14172         (check_ic_target): Likewise.
14173         * value-prof.h (gimple_alloc_histogram_value): Likewise.
14174         (check_ic_target): Likewise.
14175
14176 2014-10-21  David Malcolm  <dmalcolm@redhat.com>
14177
14178         * cgraph.c (cgraph_c_finalize): New function.
14179         * cgraph.h (cgraph_c_finalize): New prototype.
14180         (cgraphunit_c_finalize): New prototype.
14181         * cgraphunit.c (first_analyzed): Move from analyze_functions
14182         to file-scope.
14183         (first_analyzed_var): Likewise.
14184         (analyze_functions): Move static variables into file-scope.
14185         (cgraphunit_c_finalize): New function.
14186         * diagnostic.c (diagnostic_finish): Free the memory for
14187         context->classify_diagnostic and context->printer, running the
14188         destructor for the latter.
14189         (bt_stop): Use toplev::main.
14190         * dwarf2out.c (dwarf2out_finalize): New function.
14191         * dwarf2out.h (dwarf2out_c_finalize): New prototype.
14192         * gcse.c (gcse_c_finalize): New function.
14193         * gcse.h (gcse_c_finalize): New prototype.
14194         * ggc-page.c (init_ggc): Make idempotent.
14195         * input.c (input_location): Initialize to UNKNOWN_LOCATION.
14196         * ipa-cp.c (ipa_cp_c_finalize): New function.
14197         * ipa-prop.h (ipa_cp_c_finalize): New prototype.
14198         * ipa-pure-const.c (function_insertion_hook_holder): Move to be
14199         a field of class pass_ipa_pure_const.
14200         (node_duplication_hook_holder): Likewise.
14201         (node_removal_hook_holder): Likewise.
14202         (register_hooks): Convert to method...
14203         (pass_ipa_pure_const::register_hooks): ...here, converting
14204         static variable init_p into...
14205         (pass_ipa_pure_const::init_p): ...new field.
14206         (pure_const_generate_summary): Update invocation of
14207         register_hooks to invoke as a method of current_pass.
14208         (pure_const_read_summary): Likewise.
14209         (propagate): Convert to...
14210         (pass_ipa_pure_const::execute): ...method.
14211         * ipa-reference.c (ipa_init): Move static bool init_p from here
14212         to...
14213         (ipa_init_p): New file-scope variable, so that it can be reset
14214         when repeatedly invoking the compiler within one process by...
14215         (ipa_reference_c_finalize): New function.
14216         * ipa-reference.h (ipa_reference_c_finalize): New.
14217         * main.c (main): Replace invocation of toplev_main with
14218         construction of a toplev instance, and call its "main" method.
14219         * params.c (global_init_params): Add an assert that
14220         params_finished is false.
14221         (params_c_finalize): New.
14222         * params.h (params_c_finalize): New.
14223         * passes.c (execute_ipa_summary_passes): Set "current_pass" before
14224         invoking generate_summary, for the benefit of pass_ipa_pure_const.
14225         (ipa_write_summaries_2): Assign "pass" to "current_pass" global
14226         before calling write_summary hook.
14227         (ipa_write_optimization_summaries_1): Likewise when calling
14228         write_optimization_summary hook.
14229         (ipa_read_summaries_1): Likewise for read_summary hook.
14230         (ipa_read_optimization_summaries_1): Likewise for
14231         read_optimization_summary hook.
14232         (execute_ipa_stmt_fixups): Likewise.
14233         * stringpool.c (init_stringpool): Clean up if we're called more
14234         than once.
14235         * timevar.c (timevar_init): Ignore repeated calls.
14236         * toplev.c: Include "dwarf2out.h", "ipa-reference.h", "gcse.h",
14237         "ipa-prop.h".
14238         (general_init): Reset "input_location" to UNKNOWN_LOCATION.
14239         (initialize_rtl): Move static local "initialized_once"
14240         into file scope, and rename to...
14241         (rtl_initialized): New variable.
14242         (do_compile): Move timevar initialization from here to
14243         toplev::start_timevars.
14244         (toplev::toplev, toplev::~toplev, toplev::start_timevars,
14245         toplev::finalize): New functions.
14246         (toplev_main): Rename to...
14247         (toplev::main): ...this.
14248         * toplev.h (class toplev): New class.
14249
14250 2014-10-21  Andrew MacLeod  <amacleod@redhat.com>
14251
14252         * loop-doloop.c: Include loop-unroll.h.
14253
14254 2014-10-21  Andrew MacLeod  <amacleod@redhat.com>
14255
14256         * cfg.h: New.  Header file for cfg.c.
14257         * cfganal.h: New.  Header file for cfganal.c.
14258         * lcm.h: New.  Header file for lcm.c.
14259         * loop-unroll.h: New.  Header file for loop-unroll.h.
14260         * cfgloop.h: (unroll_loops): Remove prototype.
14261         * basic-block.h: Move prototypes and structs to new header files.
14262         Include cfg.h, cfganal.h, and lcm.h.
14263         * loop-init.c: Include loop-unroll.h.
14264         * loop-unroll.c: (referenced_in_one_insn_in_loop_p): Make static.
14265         * modulo-sched.c: Include loop-unroll.h.
14266
14267 2014-10-21  Thomas Preud'homme  <thomas.preudhomme@arm.com>
14268
14269         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Fix creation of
14270         MARKER_BYTE_UNKNOWN markers when handling casts.
14271
14272 2014-10-21  Richard Biener  <rguenther@suse.de>
14273
14274         * tree-ssa-phiopt.c (value_replacement): Properly verify we
14275         are the non-singleton PHI.
14276
14277 2014-10-21  Jakub Jelinek  <jakub@redhat.com>
14278
14279         PR tree-optimization/63563
14280         * tree-vect-data-refs.c (vect_analyze_data_ref_accesses): Bail out
14281         if either dra or drb stmts are not normal loads/stores.
14282
14283 2014-10-21  Ilya Tocar  <ilya.tocar@intel.com>
14284
14285         * config/i386/i386.c (expand_vec_perm_1): Fix
14286         expand_vec_perm_palignr case.
14287         * config/i386/sse.md (<ssse3_avx2>_palignr<mode>_mask): Use
14288         VI1_AVX512.
14289
14290 2014-10-21  Zhenqiang Chen  <zhenqiang.chen@arm.com>
14291
14292         * cfgloopanal.c (seq_cost): Delete.
14293         * rtl.h (seq_cost): New prototype.
14294         * rtlanal.c (seq_cost): New function.
14295         * tree-ssa-loop-ivopts.c (seq_cost): Delete.
14296
14297 2014-10-20  Andrew MacLeod  <amacleod@redhat.com>
14298
14299         * cfgrtl.h: New.  Add prototypes for cfgrtl.c.
14300         * basic-block.h: Remove prototypes for cfgrtl.c.
14301         * cfghooks.h (cfg_layout_initialize, cfg_layout_finalize): Move
14302         prototypes to cfgrtl.h.
14303         * profile.h (profile_info): Add extern export declaration.
14304         * rtl.h: Remove prototypes for cfgrtl.h.
14305         * tree-cfg.h (gt_ggc_mx, gt_pch_nx): Move prototypes to here.
14306         * ipa-inline.c: Include profile.h.
14307         * loop-unroll.c: Ditto.
14308         * modulo-sched.c: Ditto.
14309         * postreload-gcse.c: Ditto.
14310         * predict.c: Ditto.
14311         * sched-ebb.c: Ditto.
14312         * sched-rgn.c: Ditto.
14313         * tracer.c: Ditto.
14314         * tree-ssa-loop-ivcanon.c: Ditto.
14315
14316 2014-10-20  Richard Biener  <rguenther@suse.de>
14317
14318         * tree-vect-slp.c (vect_get_and_check_slp_defs): Try swapping
14319         operands to get a def operand kind match.  Signal mismatches
14320         to the parent so we can try swapping its operands.
14321         (vect_build_slp_tree): Try swapping operands if they have
14322         a mismatched operand kind.
14323
14324 2014-10-20  Alan Modra  <amodra@gmail.com>
14325
14326         PR debug/60655
14327         * simplify-rtx.c (simplify_plus_minus): Delete unused "input_ops".
14328         Increase "ops" array size.  Correct array size tests.  Init
14329         n_constants in loop.  Break out of innermost loop when finding
14330         a trivial CONST expression.
14331
14332 2014-10-20  Martin Liska  <mliska@suse.cz>
14333
14334         PR ipa/63583
14335         * ipa-icf-gimple.c (func_checker::compare_gimple_asm):
14336         Gimple tempate string is compared.
14337
14338 2014-10-20  Uros Bizjak  <ubizjak@gmail.com>
14339
14340         * varasm.c (const_alias_set): Remove.
14341         (init_varasm_once): Remove initialization of const_alias_set.
14342         (build_constant_desc): Do not set alias set to const_alias_set.
14343
14344 2014-10-19  Ilya Verbin  <ilya.verbin@intel.com>
14345
14346         * configure: Regenerate.
14347         * configure.ac: Move the test for section attribute specifier "e" in GAS
14348         out to all i[34567]86-*-* | x86_64-*-* targets and add --fatal-warnings.
14349         * langhooks.c (lhd_begin_section): Set SECTION_EXCLUDE flag.
14350         * varasm.c (default_elf_asm_named_section): Guard SECTION_EXCLUDE with
14351         ifdef HAVE_GAS_SECTION_EXCLUDE.
14352
14353 2014-10-19  Andreas Schwab  <schwab@linux-m68k.org>
14354
14355         * doc/md.texi (RTL Template) [match_scratch]: Correct equivalent
14356         match_operand expression.
14357
14358 2014-10-19  Adhemerval Zanella  <azanella@linux.vnet.ibm.com>
14359             David Edelsohn  <dje.gcc@gmail.com>
14360
14361         * config/rs6000/rs6000.c (rs6000_atomic_assign_expand_fenv): New
14362         function.
14363         (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): New define.
14364
14365 2014-10-18  Manuel López-Ibáñez  <manu@gcc.gnu.org>
14366
14367         * doc/invoke.texi (Options to Request or Suppress Warnings):
14368         Explain options precedence.
14369         (Wtrampolines): Do not indent paragraph.
14370
14371 2014-10-18  John David Anglin  <danglin@gcc.gnu.org>
14372
14373         * doc/invoke.texi: Update documentation of hppa -mjump-in-delay option.
14374         * config/pa/pa-protos.h (pa_following_call): Delete declaration.
14375         (pa_jump_in_call_delay): Likewise.
14376         * config/pa/pa.c (pa_option_override): Remove jump in call delay
14377         override.
14378         (pa_output_millicode_call): Remove support for jump in call delay.
14379         (pa_output_call): Likewise.
14380         (pa_jump_in_call_delay): Delete.
14381         (pa_following_call): Likewise.
14382         * config/pa/pa.md (in_call_delay): Remove jump in delay check.
14383         (uncond_branch): Remove following call check from attribute length.
14384
14385 2014-10-18  Oleg Endo  <olegendo@gcc.gnu.org>
14386
14387         PR target/53513
14388         * config/sh/sh-modes.def (PSI): Remove.
14389         * config/sh/sh-protos.h (get_fpscr_rtx): Remove.
14390         * config/sh/sh.c (fpscr_rtx, get_fpscr_rtx): Remove.
14391         (sh_reorg): Remove commented out FPSCR code.
14392         (fpscr_set_from_mem): Use SImode instead of PSImode.  Emit lds_fpscr
14393         insn instead of move insn.
14394         (sh_hard_regno_mode_ok): Return SImode for FPSCR.
14395         (sh_legitimate_address_p, sh_legitimize_reload_address): Remove PSImode
14396         handling.
14397         (sh_emit_mode_set): Emit lds_fpscr and sts_fpscr insns.
14398         (sh1_builtin_p): Uncomment.
14399         (SH_BLTIN_UV 25, SH_BLTIN_VU 26): New macros.
14400         (bdesc): Add __builtin_sh_get_fpscr and __builtin_sh_set_fpscr.
14401         * config/sh/sh/predicates.md (fpscr_operand): Simplify.
14402         (fpscr_movsrc_operand, fpscr_movdst_operand): New predicates.
14403         (general_movsrc_operand, general_movdst_operand): Disallow
14404         fpscr_operand.
14405         * config/sh/sh.md (FPSCR_FR): New constant.
14406         (push_fpscr): Emit sts_fpscr insn.
14407         (pop_fpscr): Emit lds_fpscr_insn.
14408         (movsi_ie): Disallow FPSCR operands.
14409         (fpu_switch, unnamed related split, extend_psi_si,
14410         truncate_si_psi): Remove insns.
14411         (lds_fpscr, sts_fpscr): New insns.
14412         (toggle_sz, toggle_pr): Use SImode for FPSCR_REG instead of PSImode.
14413
14414 2014-10-17  Eric Botcazou  <ebotcazou@adacore.com>
14415
14416         * ipa-inline-transform.c (master_clone_with_noninline_clones_p): New.
14417         (clone_inlined_nodes): Do not overwrite the clone if above predicate
14418         returns true.
14419
14420 2014-10-17  Ilya Tocar  <ilya.tocar@intel.com>
14421
14422         * config/i386/i386.c (MAX_VECT_LEN): Move earlier.
14423         (expand_vec_perm_d): Ditto.
14424         (ix86_expand_vec_perm_vpermi2): Handle V8HImode, V16HImode, V32HImode,
14425         V32HImode, V4SImode, V8SImode, V4SFmode, V8SFmode, V2DImode, V4DImode,
14426         V4DFmode.
14427         (ix86_expand_vec_perm): Update call to ix86_expand_vec_perm_vpermi2.
14428         (ix86_expand_sse_unpack): Handle V64QImode.
14429         (expand_vec_perm_blend): Update conditions for TARGET, handle
14430         V8DFmode, V16SFmode, V32HImode, V64QImode, V16SImode, V8DImode.
14431         (expand_vec_perm_pshufb): Handle V64QImode.
14432         (expand_vec_perm_1): Handle V64QImode, V32HImode, V16SImode, V16SFmode,
14433         V8DFmode, V8DImode, V4DFmode, V2DFmode, V8SFmode, V4SFmode.
14434         (ix86_expand_vec_perm_const_1): Call  ix86_expand_vec_perm_vpermi2.
14435         (ix86_vectorize_vec_perm_const_ok): Handle V32HImode, V64QImode.
14436         (ix86_expand_vecop_qihi): Handle V64QImode.
14437         * config/i386/sse.md (define_mode_iterator VI1_AVX512): New.
14438         (define_mode_iterator VEC_PERM_AVX2): Add V32HI.
14439         (define_mode_iterator VEC_PERM_CONST): Add V32HI.
14440         (define_insn "<ssse3_avx2>_pshufb<mode>3<mask_name>"): Add masking.
14441         (mul<mode>3): Use VI1_AVX512.
14442         (<sse2_avx2>_packsswb): Ditto.
14443         (<sse2_avx2>_packuswb): Ditto.
14444         (<ssse3_avx2>_pshufb<mode>3): Ditto.
14445         (<shift_insn><mode>3): Ditto.
14446
14447 2014-10-17  Kirill Yukhin  <kirill.yukhin@intel.com>
14448
14449         * config/i386/i386.c (ix86_expand_sse2_mulvxdi3): Refactor
14450         conditions to fix bootstrap.
14451
14452 2014-10-17  Andrew MacLeod  <amacleod@redhat.com>
14453
14454         gcc-plugin.h:  Add tm.h and flattened includes from function.h.
14455
14456 2014-10-17  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14457             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14458             Anna Tikhonova  <anna.tikhonova@intel.com>
14459             Ilya Tocar  <ilya.tocar@intel.com>
14460             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14461             Ilya Verbin  <ilya.verbin@intel.com>
14462             Kirill Yukhin  <kirill.yukhin@intel.com>
14463             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14464
14465         * config/i386/i386.c (ix86_expand_vector_init_duplicate): Handle V64QI
14466         and V32HI modes, update V8HI, V16QI, V32QI modes handling.
14467         (ix86_expand_vector_init_general): Handle V64QI and V32HI modes.
14468         * config/i386/sse.md (define_mode_iterator VI48F_512): Rename to ...
14469         (define_mode_iterator VF48_I1248): ... this. Extend to AVX-512 modes.
14470         (define_expand "vec_init<mode>"): Use VF48_I1248.
14471
14472 2014-10-17  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14473             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14474             Anna Tikhonova  <anna.tikhonova@intel.com>
14475             Ilya Tocar  <ilya.tocar@intel.com>
14476             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14477             Ilya Verbin  <ilya.verbin@intel.com>
14478             Kirill Yukhin  <kirill.yukhin@intel.com>
14479             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14480
14481         * config/i386/i386.c (ix86_expand_sse2_mulvxdi3): Extend
14482         expand_sse2_mulvxdi3.
14483
14484 2014-10-17  Richard Biener  <rguenther@suse.de>
14485
14486         * fold-const.c (fold_comparison): Remove redundant constant
14487         folding and operand swapping.
14488         (fold_binary_loc): Do comparison operand swapping here.
14489         (fold_ternary_loc): Canonicalize operand order for
14490         commutative ternary operations.
14491         * tree.c (commutative_ternary_tree_code): Add DOT_PROD_EXPR
14492         and FMA_EXPR.
14493
14494 2014-10-17  Jakub Jelinek  <jakub@redhat.com>
14495
14496         PR tree-optimization/63464
14497         * gimple.h (gimple_seq_discard): New prototype.
14498         * gimple.c: Include stringpool.h and tree-ssanames.h.
14499         (gimple_seq_discard): New function.
14500         * optabs.h (lshift_cheap_p): New prototype.
14501         * optabs.c (lshift_cheap_p): New function, moved from...
14502         * tree-switch-conversion.c (lshift_cheap_p): ... here.
14503         * tree-ssa-reassoc.c: Include gimplify.h and optabs.h.
14504         (reassoc_branch_fixups): New variable.
14505         (update_range_test): Add otherrangep and seq arguments.
14506         Unshare exp.  If otherrange is NULL, use for other ranges
14507         array of pointers pointed by otherrangep instead.
14508         Emit seq before gimplified statements for tem.
14509         (optimize_range_tests_diff): Adjust update_range_test
14510         caller.
14511         (optimize_range_tests_xor): Likewise.  Fix up comment.
14512         (extract_bit_test_mask, optimize_range_tests_to_bit_test): New
14513         functions.
14514         (optimize_range_tests): Adjust update_range_test caller.
14515         Call optimize_range_tests_to_bit_test.
14516         (branch_fixup): New function.
14517         (execute_reassoc): Call branch_fixup.
14518
14519         PR tree-optimization/63302
14520         * tree-ssa-reassoc.c (optimize_range_tests_xor,
14521         optimize_range_tests_diff): Use !integer_pow2p () instead of
14522         tree_log2 () < 0.
14523
14524 2014-10-17  Martin Liska  <mliska@suse.cz>
14525
14526         * ipa-icf.c (sem_function::merge): Local flags are set to false
14527         to enforce equal calling convention to be used.
14528         * opts.c (common_handle_option): Indentation fix.
14529
14530 2014-10-17  Marc Glisse  <marc.glisse@inria.fr>
14531
14532         * tree-into-ssa.c (is_old_name): Replace "new" with "old".
14533
14534 2014-10-17  Tom de Vries  <tom@codesourcery.com>
14535
14536         PR rtl-optimization/61605
14537         * regcprop.c (copyprop_hardreg_forward_1): Use
14538         regs_invalidated_by_this_call instead of regs_invalidated_by_call.
14539
14540 2014-10-17  Tom de Vries  <tom@codesourcery.com>
14541
14542         PR rtl-optimization/61605
14543         * regcprop.c (copyprop_hardreg_forward_1): Add copy_p and noop_p.
14544         Don't notice stores for noops.  Don't regard noops as copies.
14545
14546 2014-10-17  Uros Bizjak  <ubizjak@gmail.com>
14547
14548         * config/i386/cpuid.h (__cpuid): Remove definitions that handle %ebx
14549         register in a special way.
14550         (__cpuid_count): Ditto.
14551         * config/i386/driver-i386.h: Protect with
14552         "#if defined(__GNUC__) && (__GNUC__ >= 5 || !defined(__PIC__))".
14553         (host_detect_local_cpu): Mention that GCC with non-fixed %ebx
14554         is required to compile the function.
14555
14556 2014-10-16  DJ Delorie  <dj@redhat.com>
14557
14558         * flag-types.h (sanitize_code): Don't assume targets have 32-bit
14559         integers.
14560
14561         * config/rs6000/rs6000-c.c (rid_int128): New.
14562         (rs6000_macro_to_expand): Use instead of RID_INT128.
14563
14564 2014-10-16  Andrew MacLeod  <amacleod@redhat.com>
14565
14566         * function.h: Flatten file.  Remove includes, adjust prototypes to
14567         reflect only what is in function.h.
14568         (enum direction, struct args_size, struct locate_and_pad_arg_data,
14569         ADD_PARM_SIZE, SUB_PARM_SIZE, ARGS_SIZE_TREE, ARGS_SIZE_RTX): Relocate
14570         from expr.h.
14571         (ASLK_REDUCE_ALIGN, ASLK_RECORD_PAD): Relocate from rtl.h.
14572         (optimize_function_for_size_p, optimize_function_for_speed_p): Move
14573         prototypes to predict.h.
14574         (init_varasm_status): Move prototype to varasm.h.
14575         * expr.h: Adjust include files.
14576         (enum direction, struct args_size, struct locate_and_pad_arg_data,
14577         ADD_PARM_SIZE, SUB_PARM_SIZE, ARGS_SIZE_TREE, ARGS_SIZE_RTX): Move
14578         to function.h.
14579         (locate_and_pad_parm): Move prototype to function.h.
14580         * rtl.h: (assign_stack_local, ASLK_REDUCE_ALIGN, ASLK_RECORD_PAD,
14581         assign_stack_local_1, assign_stack_temp, assign_stack_temp_for_type,
14582         assign_temp, reposition_prologue_and_epilogue_notes,
14583         prologue_epilogue_contains, sibcall_epilogue_contains,
14584         update_temp_slot_address, maybe_copy_prologue_epilogue_insn,
14585         set_return_jump_label): Move prototypes to function.h.
14586         * predict.h (optimize_function_for_size_p,
14587         optimize_function_for_speed_p): Relocate prototypes from function.h.
14588         * shrink-wrap.h (emit_return_into_block, active_insn_between,
14589         convert_jumps_to_returns, emit_return_for_exit): Move prototypes to
14590         function.h.
14591         * varasm.h (init_varasm_status): Relocate prototype from function.h.
14592         * genattrtab.c (write_header): Add predict.h to include list.
14593         * genconditions.c (write_header): Add predict.h to include list.
14594         * genemit.c (main): Adjust header file includes.
14595         * gengtype.c (ifiles): Add flattened function.h header files.
14596         * genoutput.c (output_prologue): Add predict.h to include list.
14597         * genpreds.c (write_insn_preds_c): Adjust header file includes.
14598         * genrecog.c (write_header): Add flattened function.h header files.
14599         * alias.c: Adjust include files.
14600         * auto-inc-dec.c: Likewise.
14601         * basic-block.h: Likewise.
14602         * bb-reorder.c: Likewise.
14603         * bt-load.c: Likewise.
14604         * builtins.c: Likewise.
14605         * caller-save.c: Likewise.
14606         * calls.c: Likewise.
14607         * cfgbuild.c: Likewise.
14608         * cfgcleanup.c: Likewise.
14609         * cfgexpand.c: Likewise.
14610         * cfgloop.c: Likewise.
14611         * cfgloop.h: Likewise.
14612         * cfgrtl.c: Likewise.
14613         * cgraph.h: Likewise.
14614         * cgraphclones.c: Likewise.
14615         * cgraphunit.c: Likewise.
14616         * combine-stack-adj.c: Likewise.
14617         * combine.c: Likewise.
14618         * coverage.c: Likewise.
14619         * cprop.c: Likewise.
14620         * cse.c: Likewise.
14621         * cselib.c: Likewise.
14622         * dbxout.c: Likewise.
14623         * ddg.c: Likewise.
14624         * df-core.c: Likewise.
14625         * df-problems.c: Likewise.
14626         * df-scan.c: Likewise.
14627         * dojump.c: Likewise.
14628         * dwarf2cfi.c: Likewise.
14629         * dwarf2out.c: Likewise.
14630         * emit-rtl.c: Likewise.
14631         * except.c: Likewise.
14632         * explow.c: Likewise.
14633         * expr.c: Likewise.
14634         * final.c: Likewise.
14635         * function.c: Likewise.
14636         * gcse.c: Likewise.
14637         * gimple-fold.c: Likewise.
14638         * gimple-low.c: Likewise.
14639         * gimple-streamer.h: Likewise.
14640         * haifa-sched.c: Likewise.
14641         * ifcvt.c: Likewise.
14642         * ira.c: Likewise.
14643         * jump.c: Likewise.
14644         * lcm.c: Likewise.
14645         * loop-invariant.c: Likewise.
14646         * lra-assigns.c: Likewise.
14647         * lra-coalesce.c: Likewise.
14648         * lra-constraints.c: Likewise.
14649         * lra-eliminations.c: Likewise.
14650         * lra-lives.c: Likewise.
14651         * lra-spills.c: Likewise.
14652         * lra.c: Likewise.
14653         * lto-cgraph.c: Likewise.
14654         * lto-section-in.c: Likewise.
14655         * lto-section-out.c: Likewise.
14656         * lto-streamer-in.c: Likewise.
14657         * lto-streamer-out.c: Likewise.
14658         * mode-switching.c: Likewise.
14659         * modulo-sched.c: Likewise.
14660         * omp-low.c: Likewise.
14661         * optabs.c: Likewise.
14662         * passes.c: Likewise.
14663         * postreload-gcse.c: Likewise.
14664         * postreload.c: Likewise.
14665         * predict.c: Likewise.
14666         * profile.c: Likewise.
14667         * recog.c: Likewise.
14668         * ree.c: Likewise.
14669         * reg-stack.c: Likewise.
14670         * regcprop.c: Likewise.
14671         * reginfo.c: Likewise.
14672         * regrename.c: Likewise.
14673         * reload.c: Likewise.
14674         * reload1.c: Likewise.
14675         * reorg.c: Likewise.
14676         * resource.c: Likewise.
14677         * rtlanal.c: Likewise.
14678         * sched-deps.c: Likewise.
14679         * sched-ebb.c: Likewise.
14680         * sched-rgn.c: Likewise.
14681         * sel-sched-dump.c: Likewise.
14682         * sel-sched-ir.c: Likewise.
14683         * sel-sched.c: Likewise.
14684         * shrink-wrap.c: Likewise.
14685         * simplify-rtx.c: Likewise.
14686         * statistics.c: Likewise.
14687         * stmt.c: Likewise.
14688         * stor-layout.c: Likewise.
14689         * store-motion.c: Likewise.
14690         * symtab.c: Likewise.
14691         * targhooks.c: Likewise.
14692         * toplev.c: Likewise.
14693         * trans-mem.c: Likewise.
14694         * tree-cfg.c: Likewise.
14695         * tree-cfgcleanup.c: Likewise.
14696         * tree-dfa.c: Likewise.
14697         * tree-eh.c: Likewise.
14698         * tree-inline.c: Likewise.
14699         * tree-into-ssa.c: Likewise.
14700         * tree-nested.c: Likewise.
14701         * tree-nrv.c: Likewise.
14702         * tree-profile.c: Likewise.
14703         * tree-ssa-alias.c: Likewise.
14704         * tree-ssa-ccp.c: Likewise.
14705         * tree-ssa-copy.c: Likewise.
14706         * tree-ssa-copyrename.c: Likewise.
14707         * tree-ssa-dom.c: Likewise.
14708         * tree-ssa-operands.c: Likewise.
14709         * tree-ssa-propagate.c: Likewise.
14710         * tree-ssa-structalias.c: Likewise.
14711         * tree-ssa-tail-merge.c: Likewise.
14712         * tree-ssa-threadedge.c: Likewise.
14713         * tree-ssa-threadupdate.c: Likewise.
14714         * tree-ssa-uncprop.c: Likewise.
14715         * tree-ssa-uninit.c: Likewise.
14716         * tree-ssa.c: Likewise.
14717         * tree-stdarg.c: Likewise.
14718         * tree-tailcall.c: Likewise.
14719         * tree.c: Likewise.
14720         * tsan.c: Likewise.
14721         * valtrack.c: Likewise.
14722         * varasm.c: Likewise.
14723         * vmsdbgout.c: Likewise.
14724         * web.c: Likewise.
14725         * config/aarch64/aarch64.c: Add flattened includes from function.h.
14726         * config/alpha/alpha.c: Likewise.
14727         * config/arc/arc.c: Likewise.
14728         * config/arm/arm.c: Likewise.
14729         * config/avr/avr-log.c: Likewise.
14730         * config/avr/avr.c: Likewise.
14731         * config/bfin/bfin.c: Likewise.
14732         * config/c6x/c6x.c: Likewise.
14733         * config/cr16/cr16.c: Likewise.
14734         * config/cris/cris.c: Likewise.
14735         * config/darwin.c: Likewise.
14736         * config/epiphany/epiphany.c: Likewise.
14737         * config/epiphany/mode-switch-use.c: Likewise.
14738         * config/epiphany/resolve-sw-modes.c: Likewise.
14739         * config/fr30/fr30.c: Likewise.
14740         * config/frv/frv.c: Likewise.
14741         * config/h8300/h8300.c: Likewise.
14742         * config/i386/i386.c: Likewise.
14743         * config/ia64/ia64.c: Likewise.
14744         * config/iq2000/iq2000.c: Likewise.
14745         * config/lm32/lm32.c: Likewise.
14746         * config/m32c/m32c.c: Likewise.
14747         * config/m32r/m32r.c: Likewise.
14748         * config/m68k/m68k.c: Likewise.
14749         * config/mcore/mcore.c: Likewise.
14750         * config/mep/mep-pragma.c: Likewise.
14751         * config/mep/mep.c: Likewise.
14752         * config/microblaze/microblaze.c: Likewise.
14753         * config/mips/mips.c: Likewise.
14754         * config/mmix/mmix.c: Likewise.
14755         * config/mn10300/mn10300.c: Likewise.
14756         * config/moxie/moxie.c: Likewise.
14757         * config/msp430/msp430.c: Likewise.
14758         * config/nds32/nds32-cost.c: Likewise.
14759         * config/nds32/nds32-fp-as-gp.c: Likewise.
14760         * config/nds32/nds32-intrinsic.c: Likewise.
14761         * config/nds32/nds32-isr.c: Likewise.
14762         * config/nds32/nds32-md-auxiliary.c: Likewise.
14763         * config/nds32/nds32-memory-manipulation.c: Likewise.
14764         * config/nds32/nds32-pipelines-auxiliary.c: Likewise.
14765         * config/nds32/nds32-predicates.c: Likewise.
14766         * config/nds32/nds32.c: Likewise.
14767         * config/nios2/nios2.c: Likewise.
14768         * config/pa/pa.c: Likewise.
14769         * config/pdp11/pdp11.c: Likewise.
14770         * config/rl78/rl78.c: Likewise.
14771         * config/rs6000/rs6000.c: Likewise.
14772         * config/rx/rx.c: Likewise.
14773         * config/s390/s390.c: Likewise.
14774         * config/score/score.c: Likewise.
14775         * config/sh/sh.c: Likewise.
14776         * config/sparc/sparc.c: Likewise.
14777         * config/spu/spu.c: Likewise.
14778         * config/stormy16/stormy16.c: Likewise.
14779         * config/tilegx/tilegx.c: Likewise.
14780         * config/tilepro/tilepro.c: Likewise.
14781         * config/v850/v850.c: Likewise.
14782         * config/vax/vax.c: Likewise.
14783         * config/xtensa/xtensa.c: Likewise.
14784
14785 2014-10-16  Richard Earnshaw  <rearnsha@arm.com>
14786
14787         * config/aarch64/aarch64.c (aarch64_legitimize_address): New function.
14788         (TARGET_LEGITIMIZE_ADDRESS): Redefine.
14789
14790 2014-10-16  Oleg Endo  <olegendo@gcc.gnu.org>
14791
14792         * config/sh/sh-protos.h (fldi_ok): Remove.
14793         * config/sh/sh.c (fldi_ok): Likewise.
14794         (sh_secondary_reload): Don't use fldi_ok.
14795         * config/sh/constraints.md (G constraint, H constraint): Don't use
14796         fldi_ok.
14797
14798 2014-10-16  Martin Liska  <mliska@suse.cz>
14799
14800         * ipa-icf.c (sem_item_optimizer::process_cong_reduction):
14801         Cast to unsigned long.
14802         (sem_item_optimizer::dump_cong_classes): Likewise.
14803
14804 2014-10-16  Tom de Vries  <tom@codesourcery.com>
14805
14806         * tree-into-ssa.c (update_ssa): Assert that there's no ssa use operand
14807         with SSA_NAME_IN_FREELIST.
14808
14809 2014-10-16  Richard Biener  <rguenther@suse.de>
14810
14811         PR middle-end/63554
14812         * builtins.c (fold_builtin_4): Do not call fold_builtin_strncat_chk.
14813         (fold_builtin_strncat_chk): Move ...
14814         * gimple-fold.c (gimple_fold_builtin_strncat_chk): ... here.
14815         (gimple_fold_builtin): Call gimple_fold_builtin_strncat_chk.
14816
14817 2014-10-16  Oleg Endo  <olegendo@gcc.gnu.org>
14818
14819         PR target/59401
14820         * config/sh/sh.h (CALL_REALLY_USED_REGISTERS): Expand macro and set
14821         GBR to 0.
14822
14823 2014-10-16  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14824             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14825             Anna Tikhonova  <anna.tikhonova@intel.com>
14826             Ilya Tocar  <ilya.tocar@intel.com>
14827             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14828             Ilya Verbin  <ilya.verbin@intel.com>
14829             Kirill Yukhin  <kirill.yukhin@intel.com>
14830             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14831
14832         * config/i386/i386.c (ix86_expand_mul_widen_hilo): Handle V32HI, V16SI,
14833         V64QI modes.
14834
14835 2014-10-16  Alexander Ivchenko  <alexander.ivchenko@intel.com>
14836             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
14837             Anna Tikhonova  <anna.tikhonova@intel.com>
14838             Ilya Tocar  <ilya.tocar@intel.com>
14839             Andrey Turetskiy  <andrey.turetskiy@intel.com>
14840             Ilya Verbin  <ilya.verbin@intel.com>
14841             Kirill Yukhin  <kirill.yukhin@intel.com>
14842             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
14843
14844         * config/i386/i386.c (ix86_expand_vector_set): Handle V8DF, V8DI, V16SF,
14845         V16SI, V32HI, V64QI modes.
14846
14847 2014-10-16  Oleg Endo  <olegendo@gcc.gnu.org>
14848
14849         PR target/53513
14850         * config/sh/sh-protos.h (emit_sf_insn, emit_df_insn, expand_sf_unop,
14851         expand_sf_binop, expand_df_unop, expand_df_binop): Remove.
14852
14853         * config/sh/sh.c (sh_emit_set_t_insn): Adjust generated insn pattern
14854         to match fp insn patterns.
14855         (calc_live_regs): Add FPSCR_MODES_REG and FPSCR_STAT_REG to the ignore
14856         list.
14857         (emit_sf_insn, emit_df_insn, expand_sf_unop, expand_sf_binop,
14858         expand_df_unop, expand_df_binop): Remove.
14859         (sh_conditional_register_usage): Mark FPSCR_MODES_REG and
14860         FPSCR_STAT_REG as not call clobbered.
14861         (sh_emit_mode_set): Emit fpscr store-modify-load sequence instead of
14862         invoking fpscr_set_from_mem.
14863
14864         * config/sh/sh.h (MAX_REGISTER_NAME_LENGTH): Increase to 6.
14865         (SH_REGISTER_NAMES_INITIALIZER): Add names for FPSCR_MODES_REG and
14866         FPSCR_STAT_REG.
14867         (REGISTER_NAMES): Adjust.
14868         (SPECIAL_REGISTER_P): Add FPSCR_MODES_REG and FPSCR_STAT_REG.
14869         (FIRST_PSEUDO_REGISTER): Increase to 156.
14870         (DWARF_FRAME_REGISTERS): Define as 153 to keep the original value.
14871         (FIXED_REGISTERS, CALL_USED_REGISTERS): Add FPSCR_MODES_REG and
14872         FPSCR_STAT_REG.
14873         (REG_CLASS_CONTENTS): Adjust ALL_REGS bit mask to include
14874         FPSCR_MODES_REG and FPSCR_STAT_REG.
14875         (REG_ALLOC_ORDER): Add FPSCR_MODES_REG and FPSCR_STAT_REG.
14876
14877         * config/sh/sh.md (FPSCR_MODES_REG, FPSCR_STAT_REG, FPSCR_PR,
14878         FPSCR_SZ): Add new constants.
14879         (UNSPECV_FPSCR_MODES, UNSPECV_FPSCR_STAT): Add new unspecv constants.
14880
14881         (movpsi): Use TARGET_FPU_ANY condition, invoke gen_fpu_switch.
14882         (fpu_switch): Add use and set of FPSCR_STAT_REG and FPSCR_MODES_REG.
14883         Use TARGET_FPU_ANY condition.
14884         (fpu_switch peephole2): Remove.
14885         (fpu_switch split): Use simple_mem_operand to capture the mem and
14886         adjust split implementation.
14887         (extend_psi_si, truncate_si_psi): New insns.
14888         (toggle_sz, toggle_pr): Use FPSCR_SZ, FPSCR_PR constants.  Add
14889         set of FPSCR_MODES_REG.
14890
14891         (push_e, push_4, pop_e, pop_4, movdf_i4, reload_indf__frn, movsf_ie,
14892         reload_insf__frn, force_mode_for_call, calli, calli_tbr_rel,
14893         calli_pcrel, call_pcrel, call_compact, call_compact_rettramp,
14894         call_valuei, call_valuei_tbr_rel, call_valuei_pcrel, call_value_pcrel,
14895         call_value_compact, call_value_compact_rettramp, call,
14896         call_pop_compact, call_pop_compact_rettramp, call_value, sibcalli,
14897         sibcalli_pcrel, sibcalli_thunk, sibcall_pcrel, sibcall_compact,
14898         sibcall, sibcall_valuei, sibcall_valuei_pcrel, sibcall_value_pcrel,
14899         sibcall_value_compact, sibcall_value, call_value_pop_compact,
14900         call_value_pop_compact_rettramp, various unnamed splits):
14901         Replace use of FPSCR_REG with use of FPSCR_MODES_REG.  Adjust gen_*
14902         function uses.
14903
14904         (floatsisf2_i4, *floatsisf2_ie): Merge into floatsisf2_i4.
14905         (fix_truncsfsi2_i4, *fixsfsi): Merge into fix_truncsfsi2_i4.
14906         (cmpgtsf_t, cmpgtsf_t_i4): Merge into cmpgtsf_t.
14907         (cmpeqsf_t, cmpeqsf_t_i4): Merge into cmpeqsf_t.
14908         (ieee_ccmpeqsf_t, *ieee_ccmpeqsf_t_4): Merge into ieee_ccmpeqsf_t.
14909
14910         (udivsi3_i4, divsi3_i4, addsf3_i, subsf3_i, mulsf3_i, fmasf4_i,
14911         *fmasf4, divsf3_i, floatsisf2_i4, fix_truncsfsi2_i4, cmpgtsf_t,
14912         cmpeqsf_t, ieee_ccmpeqsf_t, sqrtsf2_i, rsqrtsf2, fsca, adddf3_i,
14913         subdf3_i, muldf3_i, divdf3_i, floatsidf2_i, fix_truncdfsi2_i,
14914         cmpgtdf_t, cmpeqdf_t, *ieee_ccmpeqdf_t, sqrtdf2_i, extendsfdf2_i4,
14915         truncdfsf2_i4): Replace use of FPSCR_REG with clobber of FPSCR_STAT_REG
14916         and use of FPSCR_MODES_REG.  Adjust gen_* function uses.
14917
14918 2014-10-16  Martin Liska  <mliska@suse.cz>
14919             Jan Hubicka  <hubicka@ucw.cz>
14920
14921         * Makefile.in: New object files included.
14922         * cgraph.c (cgraph_node::dump): New cgraph_node flag icf_merged
14923         is printed.
14924         (verify_edge_corresponds_to_fndecl): More sensitive verification
14925         of nodes that are merged by IPA ICF.
14926         * cgraph.h (cgraph_node::num_references): New function.
14927         * cgraphunit.c (cgraph_node::expand_thunk): White space fixed.
14928         * common.opt: New options ipa-icf, ipa-icf-functions and
14929         ipa-icf-variables introduced.
14930         * doc/invoke.texi: Documentation of new options introduced.
14931         * ipa-icf-gimple.c: New file.
14932         * ipa-icf-gimple.h: New file.
14933         * ipa-icf.c: New file.
14934         * ipa-icf.h: New file.
14935         * lto-cgraph.c (lto_output_node): Streaming of icf_merged flag added.
14936         (input_overwrite_node): Likewise.
14937         * lto-section-in.c: New icf section added.
14938         * lto-streamer.h (enum lto_section_type): Likewise.
14939         * opts.c (common_handle_option): New option added.
14940         * passes.def: New pass included.
14941         * timevar.def: Time variable for IPA ICF added.
14942         * tree-pass.h: New IPA ICF pass entry point added.
14943
14944 2014-10-16  Richard Biener  <rguenther@suse.de>
14945
14946         PR tree-optimization/63168
14947         * tree-cfg.c (gimple_can_merge_blocks_p): Only protect
14948         latches if after merging they are no longer simple.
14949         * cfghooks.c (merge_blocks): Handle merging a latch block
14950         into another block.
14951
14952 2014-10-16  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>
14960
14961         * config/i386/sse.md
14962         (define_expand "floatuns<sseintvecmodelower><mode>2"): Extend to
14963         support AVX-512VL instructions.
14964
14965 2014-10-16  DJ Delorie  <dj@redhat.com>
14966
14967         * tree-core.h: Fix comment to not assume pointers are multiples of
14968         bytes.
14969
14970 2014-10-15  Tom Tromey  <tromey@redhat.com>
14971
14972         * timevar.h (class auto_timevar): New class.
14973
14974 2014-10-15  Uros Bizjak  <ubizjak@gmail.com>
14975
14976         PR go/59432
14977         * config/i386/sync.md (atomic_compare_and_swap<dwi>_doubleword):
14978         Remove the second alternative.
14979         (regprefix): Remove mode attribute.
14980         (atomic_compare_and_swap<mode>): Do not fixup operand 2.
14981         * config/i386/predicates.md (cmpxchg8b_pic_memory_operand): Remove.
14982
14983         Revert:
14984         2013-11-05  Ian Lance Taylor  <iant@google.com>
14985
14986         * config/i386/sync.md (atomic_compare_and_swap<dwi>_doubleword):
14987         If possible, add .cfi directives to record change to bx.
14988         * config/i386/i386.c (ix86_emit_cfi): New function.
14989         * config/i386/i386-protos.h (ix86_emit_cfi): Declare.
14990
14991 2014-10-15  Jan Hubicka  <hubicka@ucw.cz>
14992
14993         PR lto/62026
14994         * cgraphclones.c (duplicate_thunk_for_node): Get body to have args
14995         to duplicate.
14996         * lto-streamer-out.c (lto_output): Handle correctly thunks that was
14997         born at WPA time.
14998
14999 2014-10-15  Vladimir Makarov  <vmakarov@redhat.com>
15000
15001         PR rtl-optimization/63448
15002         * lra-int.h (LRA_MAX_CONSTRAINT_ITERATION_NUMBER): Remove.
15003         (LRA_MAX_ASSIGNMENT_ITERATION_NUMBER): New.
15004         (LRA_MAX_INHERITANCE_PASSES): Use it.
15005         (lra_constraint_iter_after_spill): Remove.
15006         (lra_assignment_iter): New.
15007         (lra_assignment_iter_after_spill): New.
15008         * lra-assigns.c (lra_assignment_iter): New.
15009         (lra_assignment_iter_after_spill): New.
15010         (former_reload_pseudo_spill_p): New.
15011         (spill_for): Set up former_reload_pseudo_spill_p.
15012         (setup_live_pseudos_and_spill_after_risky): Ditto.
15013         (assign_by_spills): Ditto.
15014         (lra_assign): Increment lra_assignment_iter.  Print the iteration
15015         number.  Reset former_reload_pseudo_spill_p.  Check
15016         lra_assignment_iter_after_spill.
15017         * lra.c (lra): Remove lra_constraint_iter_after_spill.  Initialize
15018         lra_assignment_iter and lra_assignment_iter_after_spill.
15019         * lra-constraints.c (lra_constraint_iter_after_spill): Remove.
15020         (lra_constraints): Remove code with
15021         lra_assignment_iter_after_spill.
15022
15023 2014-10-15  Teresa Johnson  <tejohnson@google.com>
15024
15025         PR bootstrap/63432
15026         * tree-ssa-threadupdate.c (recompute_probabilities): Better
15027         overflow checking.
15028
15029 2014-10-15  Renlin Li <renlin.li@arm.com>
15030
15031         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Define
15032         __ARM_BIG_ENDIAN, __ARM_SIZEOF_MINIMAL_ENUM. Add __ARM_64BIT_STATE,
15033         __ARM_ARCH_ISA_A64, __ARM_FEATURE_CLZ, __ARM_FEATURE_IDIV,
15034         __ARM_FEATURE_UNALIGNED, __ARM_PCS_AAPCS64, __ARM_SIZEOF_WCHAR_T.
15035
15036 2014-10-15  Richard Biener  <rguenther@suse.de>
15037
15038         * gimple-fold.c (gimple_fold_call): Properly keep virtual
15039         SSA form up-to-date when devirtualizing a call to
15040         __builtin_unreachable and avoid fixing up EH info here.
15041
15042 2014-10-15  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15043             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15044             Anna Tikhonova  <anna.tikhonova@intel.com>
15045             Ilya Tocar  <ilya.tocar@intel.com>
15046             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15047             Ilya Verbin  <ilya.verbin@intel.com>
15048             Kirill Yukhin  <kirill.yukhin@intel.com>
15049             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15050
15051         * config/i386/sse.md (define_mode_iterator VI_AVX2): Extend
15052         to support AVX-512BW.
15053         (define_mode_iterator VI124_AVX2_48_AVX512F): Remove.
15054         (define_expand "<plusminus_insn><mode>3"): Remove masking support.
15055         (define_insn "*<plusminus_insn><mode>3"): Ditto.
15056         (define_expand "<plusminus_insn><VI48_AVX512VL:mode>3_mask"): New.
15057         (define_expand "<plusminus_insn><VI12_AVX512VL:mode>3_mask"): Ditto.
15058         (define_insn "*<plusminus_insn><VI48_AVX512VL:mode>3_mask"): Ditto.
15059         (define_insn "*<plusminus_insn><VI12_AVX512VL:mode>3_mask"): Ditto.
15060         (define_expand "<sse2_avx2>_andnot<mode>3"): Remove masking support.
15061         (define_insn "*andnot<mode>3"): Ditto.
15062         (define_expand "<sse2_avx2>_andnot<VI48_AVX512VL:mode>3_mask"): New.
15063         (define_expand "<sse2_avx2>_andnot<VI12_AVX512VL:mode>3_mask"): Ditto.
15064         (define_insn "*andnot<VI48_AVX512VL:mode>3<mask_name>"): Ditto.
15065         (define_insn "*andnot<VI12_AVX512VL:mode>3<mask_name>"): Ditto.
15066         (define_insn "*abs<mode>2"): Remove masking support.
15067         (define_insn "abs<VI48_AVX512VL:mode>2_mask"): New.
15068         (define_insn "abs<VI12_AVX512VL:mode>2_mask"): Ditto.
15069         (define_expand "abs<mode>2"): Use VI_AVX2 mode iterator.
15070
15071 2014-10-15  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15072             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15073             Anna Tikhonova  <anna.tikhonova@intel.com>
15074             Ilya Tocar  <ilya.tocar@intel.com>
15075             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15076             Ilya Verbin  <ilya.verbin@intel.com>
15077             Kirill Yukhin  <kirill.yukhin@intel.com>
15078             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15079
15080         * config/i386/predicates.md (define_predicate "constm1_operand"): New.
15081         * config/i386/sse.md
15082         (define_c_enum "unspec"): Add UNSPEC_CVTINT2MASK.
15083         (define_insn "<avx512>_cvt<ssemodesuffix>2mask<VI12_AVX512VL:mode>"): New.
15084         (define_insn "<avx512>_cvt<ssemodesuffix>2mask<VI48_AVX512VL:mode>"): Ditto.
15085         (define_expand "<avx512>_cvtmask2<ssemodesuffix><VI12_AVX512VL:mode>"): Ditto.
15086         (define_insn "*<avx512>_cvtmask2<ssemodesuffix><VI12_AVX512VL:mode>"): Ditto.
15087         (define_expand "<avx512>_cvtmask2<ssemodesuffix><VI48_AVX512VL:mode>"): Ditto.
15088         (define_insn "*<avx512>_cvtmask2<ssemodesuffix><VI48_AVX512VL:mode>"): Ditto.
15089
15090 2014-10-15  Renlin Li <renlin.li@arm.com>
15091
15092         * config/aarch64/aarch64.h (ARM_DEFAULT_PCS, arm_pcs_variant): Delete.
15093
15094 2014-10-15  Jakub Jelinek  <jakub@redhat.com>
15095
15096         * tree-ssa-reassoc.c (optimize_range_tests_diff): Perform
15097         MINUS_EXPR in unsigned type to avoid undefined behavior.
15098
15099 2014-10-15  Eric Botcazou  <ebotcazou@adacore.com>
15100
15101         * stor-layout.c (self_referential_size): Do not promote arguments.
15102
15103 2014-10-15  Marek Polacek  <polacek@redhat.com>
15104
15105         * doc/invoke.texi: Update to reflect that GNU11 is the default
15106         mode for C.
15107         * c-common.h (c_language_kind): Update comment.
15108
15109 2014-10-15  Richard Biener  <rguenther@suse.de>
15110
15111         * hash-table.c: Include bconfig.h if building for the host.
15112         * hash-table.h: Do not include ggc.h on the host but just declare
15113         a few ggc allocation templates.
15114
15115 2014-10-15  Joern Rennecke  <joern.rennecke@embecosm.com>
15116             Jeff Law  <law@redhat.com>
15117
15118         * caller-save.c (replace_reg_with_saved_mem): If saved_mode covers
15119         multiple hard registers, use smaller mode derived from MODE.
15120
15121 2014-10-15  Andreas Schwab  <schwab@suse.de>
15122
15123         * explow.c (convert_memory_address_addr_space_1): Mark in_const
15124         as ATTRIBUTE_UNUSED.
15125
15126 2014-10-14  Jan Hubicka  <hubicka@ucw.cz>
15127
15128         * loop-unroll.c (decide_unrolling_and_peeling): Rename to
15129         (decide_unrolling): ... this one.
15130         (peel_loops_completely): Remove.
15131         (decide_peel_simple): Remove.
15132         (decide_peel_once_rolling): Remove.
15133         (decide_peel_completely): Remove.
15134         (peel_loop_simple): Remove.
15135         (peel_loop_completely): Remove.
15136         (unroll_and_peel_loops): Rename to ...
15137         (unroll_loops): ... this one; handle only unrolling.
15138         * cfgloop.h (lpt_dec): Remove LPT_PEEL_COMPLETELY and LPT_PEEL_SIMPLE.
15139         (UAP_PEEL): Remove.
15140         (unroll_and_peel_loops): Remove.
15141         (unroll_loops): New.
15142         * passes.def: Replace pass_rtl_unroll_and_peel_loops
15143         by pass_rtl_unroll_loops.
15144         * loop-init.c (gate_rtl_unroll_and_peel_loops,
15145         rtl_unroll_and_peel_loops): Rename to ...
15146         (gate_rtl_unroll_loops, rtl_unroll_loops): ... these; update.
15147         (pass_rtl_unroll_and_peel_loops): Rename to ...
15148         (pass_rtl_unroll_loops): ... this one.
15149         * tree-pass.h (make_pass_rtl_unroll_and_peel_loops): Remove.
15150         (make_pass_rtl_unroll_loops): New.
15151         * tree-ssa-loop-ivcanon.c (estimated_peeled_sequence_size,
15152         try_peel_loop): New.
15153         (canonicalize_loop_induction_variables): Update.
15154
15155 2014-10-14  Max Filippov  <jcmvbkbc@gmail.com>
15156
15157         * config/xtensa/xtensa.h (TARGET_HARD_FLOAT_POSTINC): new macro.
15158         * config/xtensa/xtensa.md (*lsiu, *ssiu): add dependency on
15159         !TARGET_HARD_FLOAT_POSTINC.
15160         (*lsip, *ssip): new instructions.
15161
15162 2014-10-14  Max Filippov  <jcmvbkbc@gmail.com>
15163
15164         * config/xtensa/xtensa.md (divsf3, *recipsf2, sqrtsf2, *rsqrtsf2):
15165         remove.
15166
15167 2014-10-14  Andrew Pinski  <apinski@cavium.com>
15168
15169         * explow.c (convert_memory_address_addr_space): Rename to ...
15170         (convert_memory_address_addr_space_1): This.  Add in_const argument.
15171         Inside a CONST RTL, permute the conversion and addition of constant
15172         for zero and sign extended pointers.
15173         (convert_memory_address_addr_space): New function.
15174
15175 2014-10-14  Andrew Pinski  <apinski@cavium.com>
15176
15177         Revert:
15178         2011-08-19  H.J. Lu  <hongjiu.lu@intel.com>
15179
15180         PR middle-end/49721
15181         * explow.c (convert_memory_address_addr_space): Also permute the
15182         conversion and addition of constant for zero-extend.
15183
15184 2014-10-14  DJ Delorie  <dj@redhat.com>
15185
15186         * config/msp430/msp430-modes.def (PSI): Add.
15187
15188         * config/msp430/msp430-protos.h (msp430_hard_regno_nregs_has_padding):
15189         New.
15190         (msp430_hard_regno_nregs_with_padding): New.
15191         * config/msp430/msp430.c (msp430_scalar_mode_supported_p): New.
15192         (msp430_hard_regno_nregs_has_padding): New.
15193         (msp430_hard_regno_nregs_with_padding): New.
15194         (msp430_unwind_word_mode): Use PSImode instead of SImode.
15195         (msp430_addr_space_legitimate_address_p): New.
15196         (msp430_asm_integer): New.
15197         (msp430_init_dwarf_reg_sizes_extra): New.
15198         (msp430_print_operand): Use X suffix for PSImode even in small model.
15199         * config/msp430/msp430.h (POINTER_SIZE): Use 20 bits, not 32.
15200         (PTR_SIZE): ...but 4 bytes for EH.
15201         (SIZE_TYPE): Use __int20.
15202         (PTRDIFF_TYPE): Likewise.
15203         (INCOMING_FRAME_SP_OFFSET): Adjust.
15204         * config/msp430/msp430.md (movqi_topbyte): New.
15205         (movpsi): Use fixed suffixes.
15206         (movsipsi2): Enable for 430X, not large model.
15207         (extendhipsi2): Likewise.
15208         (zero_extendhisi2): Likewise.
15209         (zero_extendhisipsi2): Likewise.
15210         (extend_and_shift1_hipsi2): Likewise.
15211         (extendpsisi2): Likewise.
15212         (*bitbranch<mode>4_z): Fix suffix logic.
15213
15214 2014-10-14  Eric Botcazou  <ebotcazou@adacore.com>
15215
15216         PR ada/62019
15217         * tree-eh.c (tree_could_trap) <FUNCTION_DECL>: Revamp and really
15218         do not choke on null node.
15219         <VAR_DECL>: Likewise.
15220
15221 2014-10-14  DJ Delorie  <dj@redhat.com>
15222
15223         * machmode.h (int_n_data_t): New.
15224         (int_n_enabled_p): New.
15225         (int_n_data): New.
15226         * tree.c (int_n_enabled_p): New.
15227         (int_n_trees): New.
15228         (make_or_reuse_type): Check for all __intN types, not just __int128.
15229         (build_common_tree_nodes): Likewise.  Also fill in integer_typs[]
15230         entries.
15231         * tree.h (int128_integer_type_node): Remove.
15232         (int128_unsigned_type_node): Remove.
15233         (int_n_trees_t): New.
15234         (int_n_enabled_p): New.
15235         (int_n_trees): New.
15236         * toplev.c (standard_type_bitsize): New.
15237         (do_compile): Check which __intN types are enabled for the current run.
15238         * builtin-types.def (BT_INT128): Remove.
15239         (BT_UINT128): Remove.
15240         * machmode.def: Add macro to create __int128 for all targets.
15241         * stor-layout.c (mode_for_size): Support __intN types.
15242         (smallest_mode_for_size): Likewise.
15243         (initialize_sizetypes): Support __intN types.
15244         * genmodes.c (struct mode_data): Add int_n field.
15245         (blank_mode): Likewise.
15246         (INT_N): New.
15247         (make_int_n): New.
15248         (emit_insn_modes_h): Count __intN entries and define NUM_INT_N_ENTS.
15249         (emit_mode_int_n): New.
15250         (emit_insn_modes_c): Call it.
15251         * gimple.c (gimple_signed_or_unsigned_type): Check for all __intN
15252         types, not just __int128.
15253         * tree-core.h (integer_type_kind): Remove __int128-specific
15254         entries, reserve spots for __intN entries.
15255
15256         * config/msp430/msp430-modes.def (PSI): Add.
15257
15258 2014-10-14  Kito Cheng  <kito@0xlab.org>
15259
15260         * ira.c: Fix typo in comment.
15261         * ira.h: Ditto.
15262         * ira-build.c: Ditto.
15263         * ira-color.c: Ditto.
15264         * ira-emit.c: Ditto.
15265         * ira-int.h: Ditto.
15266         * ira-lives.c: Ditto.
15267
15268 2014-10-14  Uros Bizjak  <ubizjak@gmail.com>
15269
15270         PR rtl-optimization/63475
15271         * alias.c (true_dependence_1): Always use get_addr to extract
15272         true address operands from x_addr and mem_addr.  Use extracted
15273         address operands to check for references with alignment ANDs.
15274         Use extracted address operands with find_base_term and
15275         base_alias_check. For noncanonicalized operands call canon_rtx with
15276         extracted address operand.
15277         (write_dependence_1): Ditto.
15278         (may_alias_p): Ditto.  Remove unused calls to canon_rtx.
15279
15280 2014-10-14  Evgeny Stupachenko  <evstupac@gmail.com>
15281
15282         PR target/63534
15283         * config/i386/i386.c (ix86_expand_split_stack_prologue): Make
15284         __morestack local.
15285
15286 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15287             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15288             Anna Tikhonova  <anna.tikhonova@intel.com>
15289             Ilya Tocar  <ilya.tocar@intel.com>
15290             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15291             Ilya Verbin  <ilya.verbin@intel.com>
15292             Kirill Yukhin  <kirill.yukhin@intel.com>
15293             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15294
15295         * config/i386/i386.c
15296         (ix86_expand_sse_movcc): Handle V64QI and V32HI mode.
15297         (ix86_expand_int_vcond): Ditto.
15298
15299 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15300             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15301             Anna Tikhonova  <anna.tikhonova@intel.com>
15302             Ilya Tocar  <ilya.tocar@intel.com>
15303             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15304             Ilya Verbin  <ilya.verbin@intel.com>
15305             Kirill Yukhin  <kirill.yukhin@intel.com>
15306             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15307
15308         * config/i386/i386.c
15309         (emit_reduc_half): Handle V64QI and V32HI mode.
15310         * config/i386/sse.md
15311         (define_mode_iterator VI_AVX512BW): New.
15312         (define_expand "reduc_<code>_<mode>"): Use VI512_48F_12BW.
15313
15314 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15315             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15316             Anna Tikhonova  <anna.tikhonova@intel.com>
15317             Ilya Tocar  <ilya.tocar@intel.com>
15318             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15319             Ilya Verbin  <ilya.verbin@intel.com>
15320             Kirill Yukhin  <kirill.yukhin@intel.com>
15321             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15322
15323         * config/i386/sse.md
15324         (define_mode_iterator REDUC_SMINMAX_MODE): Add V64QI and V32HI modes.
15325
15326 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15327             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15328             Anna Tikhonova  <anna.tikhonova@intel.com>
15329             Ilya Tocar  <ilya.tocar@intel.com>
15330             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15331             Ilya Verbin  <ilya.verbin@intel.com>
15332             Kirill Yukhin  <kirill.yukhin@intel.com>
15333             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15334
15335         * config/i386/i386.c
15336         (ix86_expand_vector_logical_operator): Handle V16SF and V8DF modes.
15337         * config/i386/sse.md
15338         (define_mode_iterator VI): Add V64QI and V32HI modes.
15339
15340 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15341             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15342             Anna Tikhonova  <anna.tikhonova@intel.com>
15343             Ilya Tocar  <ilya.tocar@intel.com>
15344             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15345             Ilya Verbin  <ilya.verbin@intel.com>
15346             Kirill Yukhin  <kirill.yukhin@intel.com>
15347             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15348
15349         * config/i386/sse.md (define_mode_attr avx2_avx512f): Remove.
15350
15351 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15352             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15353             Anna Tikhonova  <anna.tikhonova@intel.com>
15354             Ilya Tocar  <ilya.tocar@intel.com>
15355             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15356             Ilya Verbin  <ilya.verbin@intel.com>
15357             Kirill Yukhin  <kirill.yukhin@intel.com>
15358             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15359
15360         * config/i386/sse.md
15361         (define_insn "*sse4_1_<code><mode>3<mask_name>"): Add masking.
15362         (define_insn "*sse4_1_<code><mode>3<mask_name>"): Ditto.
15363
15364 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15365             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15366             Anna Tikhonova  <anna.tikhonova@intel.com>
15367             Ilya Tocar  <ilya.tocar@intel.com>
15368             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15369             Ilya Verbin  <ilya.verbin@intel.com>
15370             Kirill Yukhin  <kirill.yukhin@intel.com>
15371             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15372
15373         * config/i386/sse.md
15374         (define_insn "avx512bw_umulhrswv32hi3<mask_name>"): New.
15375         (define_expand "<ssse3_avx2>_pmulhrsw<mode>3_mask"): Ditto.
15376
15377 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15378             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15379             Anna Tikhonova  <anna.tikhonova@intel.com>
15380             Ilya Tocar  <ilya.tocar@intel.com>
15381             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15382             Ilya Verbin  <ilya.verbin@intel.com>
15383             Kirill Yukhin  <kirill.yukhin@intel.com>
15384             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15385
15386         * config/i386/sse.md
15387         (define_c_enum "unspec"): Add UNSPEC_PMADDWD512.
15388         (define_mode_iterator VI2_AVX2): Add V32HI mode.
15389         (define_expand "mul<mode>3<mask_name>"): Add masking.
15390         (define_insn "*mul<mode>3<mask_name>"): Ditto.
15391         (define_expand "<s>mul<mode>3_highpart<mask_name>"): Ditto.
15392         (define_insn "*<s>mul<mode>3_highpart<mask_name>"): Ditto.
15393         (define_insn "avx512bw_pmaddwd512<mode><mask_name>"): New.
15394         (define_mode_attr SDOT_PMADD_SUF): Ditto.
15395         (define_expand "sdot_prod<mode>"): Add <SDOT_PMADD_SUF>.
15396         (define_insn "<sse2_avx2>_packssdw<mask_name>"): Add masking.
15397         (define_insn "*<ssse3_avx2>_pmulhrsw<mode>3<mask_name>"): Ditto.
15398         (define_insn "avx2_packusdw"): Delete.
15399         (define_insn "sse4_1_packusdw"): Ditto.
15400         (define_insn "<sse4_1_avx2>_packusdw<mask_name>"): New.
15401
15402 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15403             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15404             Anna Tikhonova  <anna.tikhonova@intel.com>
15405             Ilya Tocar  <ilya.tocar@intel.com>
15406             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15407             Ilya Verbin  <ilya.verbin@intel.com>
15408             Kirill Yukhin  <kirill.yukhin@intel.com>
15409             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15410
15411         * config/i386/sse.md
15412         (define_insn "vec_dup<mode>"): Update constraints.
15413
15414 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15415             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15416             Anna Tikhonova  <anna.tikhonova@intel.com>
15417             Ilya Tocar  <ilya.tocar@intel.com>
15418             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15419             Ilya Verbin  <ilya.verbin@intel.com>
15420             Kirill Yukhin  <kirill.yukhin@intel.com>
15421             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15422
15423         * config/i386/sse.md
15424         (define_mode_iterator SSESCALARMODE): Add V4TI mode.
15425         (define_insn "<ssse3_avx2>_palignr<mode>_mask"): New.
15426         (define_insn "<ssse3_avx2>_palignr<mode>"): Add EVEX version.
15427
15428 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15429             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15430             Anna Tikhonova  <anna.tikhonova@intel.com>
15431             Ilya Tocar  <ilya.tocar@intel.com>
15432             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15433             Ilya Verbin  <ilya.verbin@intel.com>
15434             Kirill Yukhin  <kirill.yukhin@intel.com>
15435             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15436
15437         * config/i386/sse.md
15438         (define_expand "mul<mode>3<mask_name>"): Add masking.
15439
15440 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15441             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15442             Anna Tikhonova  <anna.tikhonova@intel.com>
15443             Ilya Tocar  <ilya.tocar@intel.com>
15444             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15445             Ilya Verbin  <ilya.verbin@intel.com>
15446             Kirill Yukhin  <kirill.yukhin@intel.com>
15447             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15448
15449         * config/i386/sse.md
15450         (define_insn "<sse2_avx2>_packsswb<mask_name>"): Add masking.
15451         (define_insn "<sse2_avx2>_packuswb<mask_name>"): Ditto.
15452
15453 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15454             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15455             Anna Tikhonova  <anna.tikhonova@intel.com>
15456             Ilya Tocar  <ilya.tocar@intel.com>
15457             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15458             Ilya Verbin  <ilya.verbin@intel.com>
15459             Kirill Yukhin  <kirill.yukhin@intel.com>
15460             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15461
15462         * config/i386/sse.md
15463         (define_c_enum "unspec"): Add UNSPEC_DBPSADBW, UNSPEC_PMADDUBSW512.
15464         (define_insn "avx512bw_pmaddubsw512<mode><mask_name>"): New.
15465         (define_insn "<mask_codefor>avx512bw_dbpsadbw<mode><mask_name>"):
15466         Ditto.
15467
15468 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15469             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15470             Anna Tikhonova  <anna.tikhonova@intel.com>
15471             Ilya Tocar  <ilya.tocar@intel.com>
15472             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15473             Ilya Verbin  <ilya.verbin@intel.com>
15474             Kirill Yukhin  <kirill.yukhin@intel.com>
15475             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15476
15477         * config/i386/sse.md
15478         (define_insn "<sse>_andnot<VF_128_256:mode>3<mask_name>"): Add masking,
15479         use VF_128_256 mode iterator and update assembler emit code.
15480         (define_insn "<sse>_andnot<VF_512:mode>3<mask_name>"): New.
15481         (define_expand "<any_logic:code><VF_128_256:mode>3<mask_name>"):
15482         Add masking, use VF_128_256 mode iterator.
15483         (define_expand "<any_logic:code><VF_512:mode>3<mask_name>"): New.
15484         (define_insn "*<any_logic:code><VF_128_256:mode>3<mask_name>"):
15485         Add masking, use VF_128_256 mode iterator and update assembler emit
15486         code.
15487         (define_insn "*<any_logic:code><VF_512:mode>3<mask_name>"): New.
15488         (define_mode_attr avx512flogicsuff): Delete.
15489         (define_insn "avx512f_<logic><mode>"): Ditto.
15490         (define_insn "*andnot<mode>3<mask_name>"): Update MODE_XI, MODE_OI,
15491         MODE_TI.
15492         (define_insn "<mask_codefor><code><mode>3<mask_name>"): Ditto.
15493
15494 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15495             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15496             Anna Tikhonova  <anna.tikhonova@intel.com>
15497             Ilya Tocar  <ilya.tocar@intel.com>
15498             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15499             Ilya Verbin  <ilya.verbin@intel.com>
15500             Kirill Yukhin  <kirill.yukhin@intel.com>
15501             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15502
15503         * config/i386/sse.md
15504         (define_mode_iterator VI128_128 [V16QI V8HI V2DI]): Delete.
15505         (define_expand "vashr<mode>3<mask_name>"): Add masking,
15506         use VI12_128 mode iterator.
15507         (define_expand "ashrv2di3<mask_name>"): New.
15508
15509 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15510             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15511             Anna Tikhonova  <anna.tikhonova@intel.com>
15512             Ilya Tocar  <ilya.tocar@intel.com>
15513             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15514             Ilya Verbin  <ilya.verbin@intel.com>
15515             Kirill Yukhin  <kirill.yukhin@intel.com>
15516             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15517
15518         * config/i386/i386.c
15519         (ix86_expand_args_builtin): Handle CODE_FOR_avx512vl_cmpv4di3_mask,
15520         CODE_FOR_avx512vl_cmpv8si3_mask, CODE_FOR_avx512vl_ucmpv4di3_mask,
15521         CODE_FOR_avx512vl_ucmpv8si3_mask, CODE_FOR_avx512vl_cmpv2di3_mask,
15522         CODE_FOR_avx512vl_cmpv4si3_mask, CODE_FOR_avx512vl_ucmpv2di3_mask,
15523         CODE_FOR_avx512vl_ucmpv4si3_mask.
15524         * config/i386/sse.md
15525         (define_insn "avx512f_ucmp<mode>3<mask_scalar_merge_name>"): Delete.
15526         "<avx512>_ucmp<VI12_AVX512VL:mode>3<mask_scalar_merge_name>"):New.
15527         (define_insn
15528         "<avx512>_ucmp<VI48_AVX512VL:mode>3<mask_scalar_merge_name>"):Ditto.
15529         (define_expand "<avx512>_eq<mode>3<mask_scalar_merge_name>"): Ditto.
15530         (define_insn "<avx512>_eq<mode>3<mask_scalar_merge_name>_1"): Ditto.
15531         (define_insn "<avx512>_gt<mode>3<mask_scalar_merge_name>"): Ditto.
15532         (define_insn "<avx512>_testm<mode>3<mask_scalar_merge_name>"): Ditto.
15533         (define_insn "<avx512>_testnm<mode>3<mask_scalar_merge_name>"): Ditto.
15534
15535 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15536             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15537             Anna Tikhonova  <anna.tikhonova@intel.com>
15538             Ilya Tocar  <ilya.tocar@intel.com>
15539             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15540             Ilya Verbin  <ilya.verbin@intel.com>
15541             Kirill Yukhin  <kirill.yukhin@intel.com>
15542             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15543
15544         * config/i386/sse.md
15545         (define_expand "vec_widen_umult_even_v8si<mask_name>"): Add masking.
15546         (define_insn "*vec_widen_umult_even_v8si<mask_name>"): Ditto.
15547         (define_expand "vec_widen_umult_even_v4si<mask_name>"): Ditto.
15548         (define_insn "*vec_widen_umult_even_v4si<mask_name>"): Ditto.
15549         (define_expand "vec_widen_smult_even_v8si<mask_name>"): Ditto.
15550         (define_insn "*vec_widen_smult_even_v8si<mask_name>"): Ditto.
15551         (define_expand "sse4_1_mulv2siv2di3<mask_name>"): Ditto.
15552         (define_insn "*sse4_1_mulv2siv2di3<mask_name>"): Ditto.
15553         (define_insn "avx512dq_mul<mode>3<mask_name>"): New.
15554
15555 2014-10-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
15556             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
15557             Anna Tikhonova  <anna.tikhonova@intel.com>
15558             Ilya Tocar  <ilya.tocar@intel.com>
15559             Andrey Turetskiy  <andrey.turetskiy@intel.com>
15560             Ilya Verbin  <ilya.verbin@intel.com>
15561             Kirill Yukhin  <kirill.yukhin@intel.com>
15562             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
15563
15564         * config/i386/sse.md
15565         (define_insn "avx512f_blendm<mode>"): Delete.
15566         (define_insn "<avx512>_blendm<VI48_AVX512VL:mode>"): New.
15567         (define_insn "<avx512>_blendm<VI12_AVX512VL:mode>"): Ditto..
15568         (define_mode_attr cmp_imm_predicate): Add V8SF, V4DF, V8SI, V4DI, V4SF,
15569         V2DF, V4SI, V2DI, V32HI, V64QI, V16HI, V32QI, V8HI, V16QI modes.
15570         (define_insn
15571         "avx512f_cmp<mode>3<mask_scalar_merge_name><round_saeonly_name>"):
15572         Remove.
15573         (define_insn
15574         "<avx512>_cmp<VI48_AVX512VL:mode>3<mask_scalar_merge_name><round_saeonly_name>"):
15575         New.
15576         (define_insn
15577         "<avx512>_cmp<VI12_AVX512VL:mode>3<mask_scalar_merge_name><round_saeonly_name>"):
15578         Ditto.
15579         (define_insn "<mask_codefor>avx512f_vec_dup<mode><mask_name>"): Delete.
15580         (define_insn "<avx512>_vec_dup<V48_AVX512VL:mode><mask_name>"): New.
15581         (define_insn "<avx512>_vec_dup<V12_AVX512VL:mode><mask_name>"): Ditto.
15582         (define_insn "<mask_codefor>avx512f_vec_dup_gpr<mode><mask_name>"):
15583         Delete.
15584         (define_insn
15585         "<mask_codefor><avx512>_vec_dup_gpr<VI48_AVX512VL:mode><mask_name>"):
15586         New.
15587         (define_insn
15588         "<mask_codefor><avx512>_vec_dup_gpr<VI12_AVX512VL:mode><mask_name>"):
15589         Ditto.
15590         (define_insn·"<mask_codefor>avx512f_vec_dup_mem<mode><mask_name>"):
15591         Delete.
15592         (define_insn
15593         "<mask_codefor><avx512>_vec_dup_mem<VI48_AVX512VL:mode><mask_name>"):
15594         New.
15595         (define_insn
15596         "<mask_codefor><avx512>_vec_dup_mem<VI12_AVX512VL:mode><mask_name>"):
15597         Ditto.
15598
15599 2014-10-14  Richard Biener  <rguenther@suse.de>
15600
15601         PR tree-optimization/63512
15602         * tree-ssa-pre.c (create_expression_by_pieces): Mark stmts
15603         modified.
15604
15605 2014-10-14  Oleg Endo  <olegendo@gcc.gnu.org>
15606
15607         PR target/63260
15608         * config/sh/sh.md (negsf2, negsf2_i, negdf2, negdf2_i, abssf2,
15609         abssf2_i, absdf2, absdf2_i): Remove fp_mode attribute.  Remove use
15610         of FPSCR.
15611         (negsf2_i): Rename to *negsf2_i.
15612         (abssf2_i): Rename to *abssf2_i.
15613         (negdf2_i): Rename to *negdf2_i.
15614         (absdf2_i): Rename to *absdf2_i.
15615
15616 2014-10-14  Felix Yang  <felix.yang@huawei.com>
15617             Jeff Law  <law@redhat.com>
15618
15619         * ira.c (struct equivalence): Change member "is_arg_equivalence" and
15620         "replace" into boolean bitfields; turn member "loop_depth" into a short
15621         integer; add new member "no_equiv" and "reserved".
15622         (no_equiv): Set no_equiv of struct equivalence if register is marked
15623         as having no known equivalence.
15624         (update_equiv_regs): Check all definitions for a multiple-set
15625         register to make sure that the RHS have the same value.
15626
15627 2014-10-13  Richard Henderson  <rth@redhat.com>
15628
15629         * combine-stack-adj.c (no_unhandled_cfa): New.
15630         (maybe_merge_cfa_adjust): New.
15631         (combine_stack_adjustments_for_block): Use them.
15632
15633 2014-10-13  Aldy Hernandez  <aldyh@redhat.com>
15634
15635         * Makefile.in (TAGS): Tag ../include files.
15636
15637 2014-10-13  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
15638
15639         * config/rs6000/rs6000.h (DBX_REGISTER_NUMBER): Pass format argument
15640         to rs6000_dbx_register_number.
15641         (DWARF_FRAME_REGNUM): Redefine as identity map.
15642         (DWARF2_FRAME_REG_OUT): Call rs6000_dbx_register_number.
15643         * config/rs6000/rs6000-protos.h (rs6000_dbx_register_number): Update.
15644         * config/rs6000/rs6000.c (rs6000_dbx_register_number): Add format
15645         argument to handle .debug_frame and .eh_frame directly.  Always
15646         translate SPE high register numbers.  Add special treatment for CR,
15647         but only in .debug_frame.  Respect RS6000_USE_DWARF_NUMBERING.
15648
15649         * config/rs6000/sysv.h (DBX_REGISTER_NUMBER): Do not undefine.
15650         * config/rs6000/freebsd.h (DBX_REGISTER_NUMBER): Remove.
15651         (RS6000_USE_DWARF_NUMBERING): Define.
15652         * config/rs6000/freebsd64.h (DBX_REGISTER_NUMBER): Remove.
15653         (RS6000_USE_DWARF_NUMBERING): Define.
15654         * config/rs6000/netbsd.h (DBX_REGISTER_NUMBER): Remove.
15655         (RS6000_USE_DWARF_NUMBERING): Define.
15656         * config/rs6000/lynx.h (DBX_REGISTER_NUMBER): Remove.
15657         (RS6000_USE_DWARF_NUMBERING): Define.
15658         * config/rs6000/aix.h (RS6000_USE_DWARF_NUMBERING): Define.
15659         * config/rs6000/darwin.h (RS6000_USE_DWARF_NUMBERING): Define.
15660
15661 2014-10-13  Evgeny Stupachenko  <evstupac@gmail.com>
15662
15663         * config/i386/i386.c (ix86_address_cost): Lower cost for
15664         when address contains GOT register.
15665
15666 2014-10-13  Ilya Enkovich  <ilya.enkovich@intel.com>
15667             Vladimir Makarov  <vmakarov@redhat.com>
15668
15669         PR target/8340
15670         PR middle-end/47602
15671         PR rtl-optimization/55458
15672         * config/i386/i386.c (ix86_use_pseudo_pic_reg): New.
15673         (ix86_init_pic_reg): New.
15674         (ix86_select_alt_pic_regnum): Add check on pseudo register.
15675         (ix86_save_reg): Likewise.
15676         (ix86_expand_prologue): Remove PIC register initialization
15677         now performed in ix86_init_pic_reg.
15678         (ix86_output_function_epilogue): Add check on pseudo register.
15679         (set_pic_reg_ever_alive): New.
15680         (legitimize_pic_address): Replace df_set_regs_ever_live with new
15681         set_pic_reg_ever_alive.
15682         (legitimize_tls_address): Likewise.
15683         (ix86_pic_register_p): New check.
15684         (ix86_delegitimize_address): Add check on pseudo register.
15685         (ix86_expand_call): Insert move from pseudo PIC register to ABI
15686         defined REAL_PIC_OFFSET_TABLE_REGNUM.
15687         (TARGET_INIT_PIC_REG): New.
15688         (TARGET_USE_PSEUDO_PIC_REG): New.
15689         * config/i386/i386.h (PIC_OFFSET_TABLE_REGNUM): Return INVALID_REGNUM
15690         if pic_offset_table_rtx exists.
15691         * doc/tm.texi.in (TARGET_USE_PSEUDO_PIC_REG, TARGET_INIT_PIC_REG):
15692         Document.
15693         * doc/tm.texi: Regenerate.
15694         * function.c (assign_parms): Generate pseudo register for PIC.
15695         * init-regs.c (initialize_uninitialized_regs): Ignor pseudo PIC
15696         register.
15697         * ira-color.c (color_pass): Add check on pseudo register.
15698         * ira-emit.c (change_loop): Don't create copies for PIC pseudo
15699         register.
15700         * ira.c (split_live_ranges_for_shrink_wrap): Add check on pseudo
15701         register.
15702         (ira): Add target specific PIC register initialization.
15703         (do_reload): Keep PIC pseudo register.
15704         * lra-assigns.c (spill_for): Add checks on pseudo register.
15705         * lra-constraints.c (contains_symbol_ref_p): New.
15706         (lra_constraints): Enable lra risky transformations when PIC is pseudo
15707         register.
15708         * shrink-wrap.c (try_shrink_wrapping): Add check on pseudo register.
15709         * target.def (use_pseudo_pic_reg): New.
15710         (init_pic_reg): New.
15711
15712 2014-10-13  Evgeny Stupachenko  <evstupac@gmail.com>
15713
15714         * config/i386/x86-tune.def (X86_TUNE_SSE_PARTIAL_REG_DEPENDENCY):
15715         Remove m_SILVERMONT and m_INTEL from the tune.
15716
15717 2014-10-13  John David Anglin  <dave.anglin@nrc-cnrc.gc.ca>
15718
15719         PR libfortran/63471
15720         * config/pa/pa-hpux11.h (TARGET_OS_CPP_BUILTINS): Define _REENTRANT
15721         when _HPUX_SOURCE is defined.
15722
15723 2014-10-13  Jan Hubicka  <hubicka@ucw.cz>
15724
15725         PR tree-optimization/62127
15726         * tree.c (remap_type_1): When remapping array, remap
15727         also its type.
15728
15729 2014-10-13  Christophe Lyon  <christophe.lyon@linaro.org>
15730
15731         * Makefile.in: (check-%): Update comment, as RUNTESTFLAGS no
15732         longer impact parallelization.
15733
15734 2014-10-13  Jan Hubicka  <hubicka@ucw.cz>
15735
15736         PR bootstrap/63496
15737         * ipa-polymorphic-call.c (extr_type_from_vtbl_ptr_store): Fix pasto.
15738
15739 2014-10-13  Marat Zakirov  <m.zakirov@samsung.com>
15740
15741         * asan.c (instrument_derefs): BIT_FIELD_REF added.
15742
15743 2014-10-13  Richard Biener  <rguenther@suse.de>
15744
15745         PR tree-optimization/63419
15746         * gimple-fold.h (gimple_convert): New function.
15747         * gimple-fold.c (gimple_convert): Likewise.
15748         * tree-ssa-pre.c (create_expression_by_pieces): Use gimple_convert
15749         to split out required conversions early.
15750
15751 2014-10-13  Richard Sandiford  <richard.sandiford@arm.com>
15752
15753         * rtlanal.c (generic_subrtx_iterator <T>::add_subrtxes_to_queue):
15754         Add the parts of an insn in reverse order, with the pattern at
15755         the top of the queue.  Detect when we're iterating over a SEQUENCE
15756         pattern and in that case just consider patterns of subinstructions.
15757
15758 2014-10-12  Oleg Endo  <olegendo@gcc.gnu.org>
15759
15760         PR target/59401
15761         * config/sh/sh-protos (sh_find_equiv_gbr_addr): Use rtx_insn* instead
15762         of rtx.
15763         * config/sh/sh.c (sh_find_equiv_gbr_addr): Use def chains instead of
15764         insn walking.
15765         (sh_find_equiv_gbr_addr): Do nothing if input mem is already a GBR
15766         address.  Use def chains to handle GBR clobbering call insns.
15767
15768 2014-10-12  Trevor Saunders  <tsaunders@mozilla.com>
15769
15770         * asan.c, cfgloop.c, cfgloop.h, cgraph.c, cgraph.h,
15771         config/darwin.c, config/m32c/m32c.c, config/mep/mep.c,
15772         config/mips/mips.c, config/rs6000/rs6000.c, dwarf2out.c,
15773         function.c, function.h, gimple-ssa.h, libfuncs.h, optabs.c,
15774         output.h, rtl.h, sese.c, symtab.c, tree-cfg.c, tree-dfa.c,
15775         tree-ssa.c, varasm.c: Use hash-table instead of hashtab.
15776         * doc/gty.texi (for_user): Document new option.
15777         * gengtype.c (create_user_defined_type): Don't try to get a struct for
15778         char.
15779         (walk_type): Don't error out on for_user option.
15780         (write_func_for_structure): Emit user marking routines if requested by
15781         for_user option.
15782         (write_local_func_for_structure): Likewise.
15783         (main): Mark types with for_user option as used.
15784         * ggc.h (gt_pch_nx): Add overload for unsigned int.
15785         * hash-map.h (hash_map::hash_entry::pch_nx_helper): AddOverloads.
15786         * hash-table.h (ggc_hasher): New struct.
15787         (hash_table::create_ggc): New function.
15788         (gt_pch_nx): New overload for hash_table.
15789
15790 2014-10-11  Oleg Endo  <olegendo@gcc.gnu.org>
15791
15792         * config/sh/sh.h (TARGET_SH4A_ARCH): Remove macro.
15793         * config/sh/sh.h: Replace uses of TARGET_SH4A_ARCH with TARGET_SH4A.
15794         * config/sh/sh.c: Likewise.
15795         * config/sh/sh-mem.cc: Likewise.
15796         * config/sh/sh.md: Likewise.
15797         * config/sh/predicates.md: Likewise.
15798         * config/sh/sync.md: Likewise.
15799
15800 2014-10-11  Martin Liska  <mliska@suse.cz>
15801
15802         PR middle-end/63376
15803         * cgraphunit.c (symbol_table::process_new_functions): Missing call
15804         for call_cgraph_insertion_hooks added.
15805
15806 2014-10-10  Jakub Jelinek  <jakub@redhat.com>
15807
15808         PR c/63495
15809         * stor-layout.c (min_align_of_type): Don't decrease alignment
15810         through BIGGEST_FIELD_ALIGNMENT or ADJUST_FIELD_ALIGN if
15811         TYPE_USER_ALIGN is set.
15812
15813 2014-10-10  Uros Bizjak  <ubizjak@gmail.com>
15814
15815         PR rtl-optimization/63483
15816         * alias.c (true_dependence_1): Do not exit early for MEM_READONLY_P
15817         references when alignment ANDs are involved.
15818         (write_dependence_p): Ditto.
15819         (may_alias_p): Ditto.
15820
15821 2014-10-10  Marek Polacek  <polacek@redhat.com>
15822
15823         * asan.c (pass_sanopt::execute): Handle IFN_UBSAN_OBJECT_SIZE.
15824         * doc/invoke.texi: Document -fsanitize=object-size.
15825         * flag-types.h (enum sanitize_code): Add SANITIZE_OBJECT_SIZE and
15826         or it into SANITIZE_UNDEFINED.
15827         * gimple-fold.c (gimple_fold_call): Optimize IFN_UBSAN_OBJECT_SIZE.
15828         * internal-fn.c (expand_UBSAN_OBJECT_SIZE): New function.
15829         * internal-fn.def (UBSAN_OBJECT_SIZE): Define.
15830         * opts.c (common_handle_option): Handle -fsanitize=object-size.
15831         * ubsan.c: Include tree-object-size.h.
15832         (ubsan_type_descriptor): Call tree_to_uhwi instead of tree_to_shwi.
15833         (ubsan_expand_bounds_ifn): Use false instead of 0.
15834         (ubsan_expand_objsize_ifn): New function.
15835         (instrument_object_size): New function.
15836         (pass_ubsan::execute): Add object size instrumentation.
15837         * ubsan.h (ubsan_expand_objsize_ifn): Declare.
15838
15839 2014-10-10  Richard Henderson  <rth@redhat.com>
15840
15841         PR target/63404
15842         * shrink-wrap.c (move_insn_for_shrink_wrap): Don't use single_set.
15843         Restrict the set of expressions we're willing to move.
15844
15845 2014-10-10  Jeff Law  <law@redhat.com>
15846
15847         * ira.c (struct equivalence): Promote INIT_INSNs field to
15848         an rtx_insn_list.  Add comments.
15849         (no_equiv): Promote LIST to an rtx_insn_list.  Update
15850         testing for and creating the special marker.  Use methods
15851         to extract the insn and next pointers.  Promote INSN to an
15852         rtx_insn.
15853         (update_equiv_regs): Update test for special marker in the
15854         INIT_INSNs list.
15855
15856 2014-10-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
15857
15858         * configure.ac: Add --enable-fix-cortex-a53-835769 option.
15859         * configure: Regenerate.
15860         * config/aarch64/aarch64.c (aarch64_override_options): Handle
15861         TARGET_FIX_ERR_A53_835769_DEFAULT.
15862         * config/aarch64/aarch64.opt (mfix-cortex-a53-835769): Set Init
15863         value to 2.
15864         * doc/install.texi (aarch64*-*-*): Document
15865         new --enable-fix-cortex-a53-835769 option.
15866
15867 2014-10-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
15868             Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
15869
15870         * config/aarch64/aarch64.h (FINAL_PRESCAN_INSN): Define.
15871         (ADJUST_INSN_LENGTH): Define.
15872         * config/aarch64/aarch64.opt (mfix-cortex-a53-835769): New option.
15873         * config/aarch64/aarch64.c (is_mem_p): New function.
15874         (is_memory_op): Likewise.
15875         (aarch64_prev_real_insn): Likewise.
15876         (is_madd_op): Likewise.
15877         (dep_between_memop_and_curr): Likewise.
15878         (aarch64_madd_needs_nop): Likewise.
15879         (aarch64_final_prescan_insn): Likewise.
15880         * doc/invoke.texi (AArch64 Options): Document -mfix-cortex-a53-835769
15881         and -mno-fix-cortex-a53-835769 options.
15882
15883 2014-10-10  Jakub Jelinek  <jakub@redhat.com>
15884
15885         PR tree-optimization/63464
15886         * tree-switch-conversion.c (struct case_bit_test): Remove
15887         hi and lo fields, add wide_int mask field.
15888         (emit_case_bit_tests): Add MAXVAL argument, rewrite uses of
15889         hi/lo fields into wide_int mask operations, optimize by pretending
15890         minval to be 0 if maxval is small enough.
15891         (process_switch): Adjust caller.
15892
15893 2014-10-10  Richard Biener  <rguenther@suse.de>
15894
15895         PR tree-optimization/63379
15896         * tree-vect-slp.c (vect_get_constant_vectors): Do not compute
15897         a neutral operand for min/max when it is not a reduction chain.
15898
15899 2014-10-10  Richard Biener  <rguenther@suse.de>
15900
15901         PR tree-optimization/63476
15902         * tree-ssa-pre.c (struct bb_bitmap_sets): Add vop_on_exit member.
15903         (BB_LIVE_VOP_ON_EXIT): New define.
15904         (create_expression_by_pieces): Assign VUSEs to stmts.
15905         (compute_avail): Track BB_LIVE_VOP_ON_EXIT.
15906         (pass_pre::execute): Assert virtual SSA form is up-to-date
15907         after insertion.
15908
15909 2014-10-10  Eric Botcazou  <ebotcazou@adacore.com>
15910
15911         * lra-assigns.c (assign_by_spills): Error out on spill failure.
15912
15913 2014-10-09  Markus Trippelsdorf  <markus@trippelsdorf.de>
15914
15915         * pa-polymorphic-call.c (check_stmt_for_type_change): Move
15916         assertion.
15917
15918 2014-10-09  Richard Biener  <rguenther@suse.de>
15919
15920         PR tree-optimization/63380
15921         * tree-ssa-tail-merge.c (stmt_local_def): Exclude stmts that
15922         may trap.
15923
15924 2014-10-09  Joern Rennecke  <joern.rennecke@embecosm.com>
15925
15926         * config/avr/avr.opt (mmcu=): Change to have a string value.
15927         (mn-flash=, mskip-bug, march=, mrmw): New options.
15928         (HeaderInclude): New.
15929         (mmcu=): Remove Var / Init clauses.
15930         * config/avr/avr.h (DRIVER_SELF_SPECS): Translate -mmcu into a
15931         -specs option.
15932         (SYMBOL_FLAG_IO, SYMBOL_FLAG_ADDRESS): Define.
15933         (ASM_OUTPUT_ALIGNED_BSS): Use avr_asm_asm_output_aligned_bss.
15934         (SYMBOL_FLAG_IO_LOW): Define.
15935         (avr_device_to_as, avr_device_to_ld): Don't declare.
15936         (avr_device_to_data_start, avr_device_to_startfiles): Likewise.
15937         (avr_device_to_devicelib, avr_device_to_sp8): Likewise.
15938         (EXTRA_SPEC_FUNCTIONS): Don't define.
15939         (ASM_SPEC): Translate -arch= option to -mmcu= option.
15940         (LINK_SPEC): Translate -arch= option to -m= option.
15941         Don't use device_to_ld / device_to_data_start.
15942         (STARTFILE_SPEC): Now empty.
15943         (ASM_SPEC): Add -%{mrelax: --mlink-relax}.
15944         * config/avr/gen-avr-mmcu-specs.c: New file.
15945         * config/avr/t-avr (gen-avr-mmcu-specs$(build_exeext)): New rule.
15946         (s-device-specs): Likewise.
15947         (GCC_PASSES): Add s-device-specs.
15948         (install-driver): Depend on install-device-specs.
15949         (install-device-specs): New rule.
15950         * config/avr/avr.c (avr_option_override): Look up mcu arch by
15951         avr_arch_index and provide fallback initialization for avr_n_flash.
15952         (varasm.h): #include.
15953         (avr_print_operand) <i>: Allow SYMBOL_REF with SYMBOL_FLAG_IO;
15954         (avr_handle_addr_attribute, avr_eval_addr_attrib): New functions.
15955         (avr_attribute_table): Add "io", "address" and "io_low".
15956         (avr_asm_output_aligned_decl_common): Change type of decl to tree.
15957         Add special handling for symbols with "io" and/or "address" attributes.
15958         (avr_asm_asm_output_aligned_bss): New function.
15959         (avr_encode_section_info): Set SYMBOL_FLAG_IO and SYMBOL_FLAG_ADDRESS
15960         as appropriate.  Handle io_low attribute.
15961         (avr_out_sbxx_branch): Handle symbolic io addresses.
15962         (avr_xload_libgcc_p, avr_nonconst_pointer_addrspace): Use
15963         avr_n_flash instead of avr_current_device->n_flash.
15964         (avr_pgm_check_var_decl, avr_insert_attributes): Likewise.
15965         (avr_emit_movmemhi): Likewise.
15966         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Likewise.
15967         Use TARGET_RMW instead of avr_current_device->dev_attributes.
15968         Don't define avr_current_device->macro (that's the specfile's job).
15969         Use TARGET_SKIP_BUG instead of avr_current_device->errata_skip.
15970         * config/avr/avr.c (avr_2word_insn_p): Likewise.
15971         * config/avr/avr.md (*cpse.ne): Likewise.
15972         (mov<mode>): Use avr_eval_addr_attrib.
15973         (cbi): Change constraint for low_io_address_operand operand to "i".
15974         (sbi, sbix_branch, sbix_branch_bit7, insv.io, insv.not.io): Likewise.
15975         * config/avr/predicates.md (io_address_operand):
15976         Allow SYMBOL_REF with SYMBOL_FLAG_IO.
15977         (low_io_address_operand): Allow SYMBOL_REF with SYMBOL_FLAG_IO_LOW.
15978         * config/avr/avr-protos.h (avr_asm_output_aligned_decl_common):
15979         Update prototype.
15980         (avr_eval_addr_attrib, avr_asm_asm_output_aligned_bss): Prototype.
15981         * config/avr/genmultilib.awk: Use -march=.
15982         Remove Multilib matches processing.
15983         * config/avr/t-multilib, config/avr/avr-tables.opt: Regenerate.
15984         * config/avr/avr-arch.h: Add double include guard.
15985         (avr_mcu_t) <library_name>: Update comment.
15986         * config/avr/driver-avr.c (avr_device_to_as): Delete.
15987         (avr_device_to_ld, avr_device_to_data_start): Likewise.
15988         (avr_device_to_startfiles, avr_device_to_devicelib): Likewise.
15989         (avr_device_to_sp8): Likewise.
15990         * config/avr/genopt.sh:  Instead avr_mcu, emit an Enum for avr_arch.
15991
15992         * doc/extend.texi (io, address): Document new AVR variable attributes.
15993         (io_low): Likewise.
15994
15995 2014-10-09  Marek Polacek  <polacek@redhat.com>
15996
15997         * doc/invoke.texi: Document -fsanitize=bool and -fsanitize=enum.
15998
15999 2014-10-08  Richard Biener  <rguenther@suse.de>
16000
16001         PR tree-optimization/61969
16002         * tree-nrv.c (pass_nrv::execute): Properly test for automatic
16003         variables.
16004
16005 2014-10-09  Richard Biener  <rguenther@suse.de>
16006
16007         PR tree-optimization/63445
16008         * tree-vrp.c (simplify_cond_using_ranges): Only warn about
16009         overflow for non-equality compares.
16010
16011 2014-10-09  Uros Bizjak  <ubizjak@gmail.com>
16012
16013         PR rtl-optimization/57003
16014         * regcprop.c (copyprop_hardreg_forward_1): If ksvd.ignore_set_reg,
16015         also check CALL_INSN_FUNCTION_USAGE for clobbers again after
16016         killing regs_invalidated_by_call.
16017
16018 2014-10-08  Teresa Johnson  <tejohnson@google.com>
16019
16020         PR bootstrap/63432.
16021         * tree-ssa-threadupdate.c (estimated_freqs_path): New function.
16022         (ssa_fix_duplicate_block_edges): Invoke it.
16023         (mark_threaded_blocks): Make two passes to avoid ordering dependences.
16024
16025 2014-10-08  Oleg Endo  <olegendo@gcc.gnu.org>
16026
16027         PR target/52941
16028         * config/sh/sync.md (atomic_exchangesi_hard, atomic_exchange<mode>_hard,
16029         atomic_fetch_<fetchop_name>si_hard,
16030         atomic_fetch_<fetchop_name><mode>_hard, atomic_fetch_nandsi_hard,
16031         atomic_fetch_nand<mode>_hard, atomic_<fetchop_name>_fetchsi_hard,
16032         atomic_<fetchop_name>_fetch<mode>_hard, atomic_nand_fetchsi_hard,
16033         atomic_nand_fetch<mode>_hard): Add missing set of T_REG.
16034
16035 2014-10-08  Rong Xu  <xur@google.com>
16036
16037         * gcov-tool.c (profile_overlap): New driver function
16038         to compute profile overlap.
16039         (print_overlap_usage_message): New.
16040         (overlap_usage): New.
16041         (do_overlap): New.
16042         (print_usage): Add calls to overlap function.
16043         (main): Ditto.
16044         * doc/gcov-tool.texi: Add documentation.
16045
16046 2014-10-08  Steve Ellcey  <sellcey@mips.com>
16047
16048         * config/mips/mti-linux.h (DRIVER_SELF_SPECS): Change
16049         LINUX64_DRIVER_SELF_SPECS to LINUX_DRIVER_SELF_SPECS
16050
16051 2014-10-08  Jan Hubicka  <hubicka@ucw.cz>
16052
16053         * ipa-polymorphic-call.c (extr_type_from_vtbl_store): Do better
16054         pattern matching of MEM_REF.
16055         (check_stmt_for_type_change): Update.
16056
16057 2014-10-08  Steve Ellcey  <sellcey@mips.com>
16058
16059         * config/mips/linux64.h: Remove.
16060         * config/mips/gnu-user64.h: Remove.
16061         * gcc.config (mips*-*-*): Remove references to linux64.h and
16062         gnu-user64.h
16063         * config/mips/gnu-user.h (GNU_USER_TARGET_LINK_SPEC): Replace
16064         with modified version from gnu-user64.h.
16065         (LINUX_DRIVER_SELF_SPECS): Update parts from gnu-user64.h.
16066         (LOCAL_LABEL_PREFIX): Copy from gnu-user64.h.
16067         * config/mips/linux.h (GNU_USER_LINK_EMULATION32): Copy from
16068         linux64.h.
16069         (GNU_USER_LINK_EMULATION64): Ditto.
16070         (GNU_USER_LINK_EMULATIONN32): Ditto.
16071         (GLIBC_DYNAMIC_LINKER32): Ditto.
16072         (GLIBC_DYNAMIC_LINKER64): Ditto.
16073         (GLIBC_DYNAMIC_LINKERN32): Ditto.
16074         (UCLIBC_DYNAMIC_LINKER32): Ditto.
16075         (UCLIBC_DYNAMIC_LINKER64): Ditto.
16076         (UCLIBC_DYNAMIC_LINKERN32): Ditto.
16077         (BIONIC_DYNAMIC_LINKERN32): Ditto.
16078         (GNU_USER_DYNAMIC_LINKERN32): Ditto.
16079         (GLIBC_DYNAMIC_LINKER): Delete.
16080         (UCLIBC_DYNAMIC_LINKER): Delete.
16081
16082 2014-10-08  Joern Rennecke  <joern.rennecke@embecosm.com>
16083             Richard Biener  <rguenther@suse.de>
16084
16085         * cfgexpand.c (expand_debug_expr) <TARGET_MEM_REF>:
16086         Get address space from operand 0 (BASE).
16087
16088 2014-10-07  Iain Sandoe  <iain@codesourcery.com>
16089
16090         PR target/61387
16091         * config/i386/i386.c (x86_output_mi_thunk): Fix darwin fallout.
16092
16093 2014-10-07  Aldy Hernandez  <aldyh@redhat.com>
16094
16095         * dwarf2out.c: Remove current_function_has_inlines.
16096         (gen_subprogram_die): Same.
16097         (gen_inlined_subroutine_die): Same.
16098
16099 2014-10-07  Ilya Tocar  <ilya.tocar@intel.com>
16100
16101         * config/i386/adxintrin.h (_subborrow_u64): Use long long for param
16102         type.
16103         (_addcarry_u64): Ditto.
16104         (_addcarryx_u64): Ditto.
16105
16106 2014-10-07  Eric Botcazou  <ebotcazou@adacore.com>
16107
16108         * cgraph.h (cgraph_node::get_fun): Declare.
16109         * cgraph.c (cgraph_node::get_fun): New method.
16110         * ipa-inline.c (can_inline_edge_p): Use it.
16111
16112 2014-10-07  Eric Botcazou  <ebotcazou@adacore.com>
16113
16114         * lto-opts.c (lto_write_options): Handle -fmath-errno, -fsigned-zeros
16115         and -ftrapping-math.
16116         * lto-wrapper.c (merge_and_complain): Likewise.
16117         (run_gcc): Likewise.
16118
16119 2014-10-06  Rong Xu  <xur@google.com>
16120
16121         * params.def (PARAM_INDIR_CALL_TOPN_PROFILE): New param.
16122         * tree-profile.c: (params.h): New include.
16123         (init_ic_make_global_vars): Make __gcov_indirect_call_topn_callee
16124         and __gcov_indirect_call_topn_counters for
16125         indirect_call_topn_profile.
16126         (gimple_init_edge_profiler): New decls for
16127         __gcov_indirect_call_topn_profiler.
16128         (gimple_gen_ic_profiler): Generate the correct profiler call.
16129         (gimple_gen_ic_func_profiler): Fix format.
16130         * value-prof.c (params.h): New include.
16131         (dump_histogram_value): Hanlde indirect_call_topn counters.
16132         (stream_in_histogram_value): Ditto.
16133         (gimple_indirect_call_to_profile): Use indirect_call_topn
16134         profile when PARAM_INDIR_CALL_TOPN_PROFILE is set.
16135         (gimple_find_values_to_profile): Hanlde indirect_call_topn
16136         counters.
16137         * value-prof.h (enum hist_type): Histrogram type for
16138         indirect_call_topn counters.
16139         * profile.c (instrument_values): Instrument
16140         indirect_call_topn counters.
16141
16142 2014-10-06  Rong Xu  <xur@google.com>
16143
16144         * Makefile.in: Fix dependence.
16145         * gcov-counter.def (GCOV_COUNTER_ICALL_TOPNV): Add
16146         indirect call topn profiler.
16147         * gcov-io.h: Ditto.
16148
16149 2014-10-06  Eric Botcazou  <ebotcazou@adacore.com>
16150
16151         * calls.c (expand_call): Do not use the target as the return slot if
16152         it is not sufficiently aligned.
16153
16154 2014-10-06  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16155
16156         * config/rs6000/rs6000.c (analyze_swaps commentary): Add
16157         discussion of permutes and why we don't handle them.
16158
16159 2014-10-06  Eric Botcazou  <ebotcazou@adacore.com>
16160
16161         * config/sparc/predicates.md (int_register_operand): Delete.
16162
16163 2014-10-06  Eric Botcazou  <ebotcazou@adacore.com>
16164
16165         * dwarf2cfi.c (create_pseudo_cfg): Fix trace numbering.
16166
16167 2014-10-06  Jakub Jelinek  <jakub@redhat.com>
16168
16169         * ubsan.h (ubsan_get_source_location): New prototype.
16170         * ubsan.c (ubsan_source_location_type): New variable.
16171         Function renamed to ...
16172         (ubsan_get_source_location_type): ... this.  Cache
16173         return value in ubsan_source_location_type variable.
16174         (ubsan_source_location, ubsan_create_data): Use
16175         ubsan_get_source_location_type instead of
16176         ubsan_source_location_type.
16177         * asan.c (asan_protect_global): Don't protect globals
16178         with ubsan_get_source_location_type () type.
16179         (asan_add_global): Provide global decl location info
16180         if possible.
16181
16182 2014-10-04  Jan Hubicka  <hubicka@ucw.cz>
16183
16184         * ipa-prop.c (try_make_edge_direct_virtual_call): Remove overactive
16185         sanity check.
16186
16187 2014-10-04  Jan Hubicka  <hubicka@ucw.cz>
16188
16189         * ipa-polymorphic-call.c (possible_placement_new): Fix condition
16190         on size.
16191         (ipa_polymorphic_call_context::restrict_to_inner_type): Do not walk
16192         into vptr pointer.
16193         (ipa_polymorphic_call_context::dump): Fix formating.
16194         (walk_ssa_copies): Add logic avoiding loops; update uses.
16195         * ipa-prop.c (ipa_analyze_call_uses): Compute vptr_changed.
16196
16197 2014-10-02  Mark Wielaard  <mjw@redhat.com>
16198
16199         PR debug/63239
16200         * dwarf2out.c (gen_subprogram_die): When a member function is
16201         explicitly deleted then add a DW_AT_GNU_deleted attribute.
16202         * langhooks.h (struct lang_hooks_for_decls): Add
16203         function_decl_deleted_p langhook.
16204         * langhooks-def.h (LANG_HOOKS_FUNCTION_DECL_DELETED_P): Define.
16205         (LANG_HOOKS_DECLS): Add LANG_HOOKS_FUNCTION_DECL_DELETED_P.
16206
16207 2014-10-04  Jan Hubicka  <hubicka@ucw.cz>
16208
16209         * ipa-polymorphic-call.c (walk_ssa_copies): Recognize
16210         NULL pointer checks.
16211         (ipa_polymorphic_call_context::get_dynamic_type): Return true
16212         if type doesn't change.
16213         * cgraph.h (cgraph_indirect_call_info): New flag.
16214         * cgraph.c (cgraph_node::create_indirect_edge): Initialize it.
16215         (cgraph_node::dump): Dump it.
16216         * ipa-prop.c (ipa_analyze_call_uses):  Ignore return valud
16217         of context.get_dynamic_type.
16218         (ipa_make_edge_direct_to_target): Do not speculate
16219         edge that is already speuclative.
16220         (try_make_edge_direct_virtual_call): Use VPTR_CHANGED; Do not
16221         speculate to __builtin_unreachable
16222         (ipa_write_indirect_edge_info, ipa_read_indirect_edge_info): Stream
16223         vptr_changed.
16224         * ipa-cp.c (ipa_get_indirect_edge_target_1): Use vptr_changed.
16225
16226 2014-10-04  Jan Hubicka  <hubicka@ucw.cz>
16227
16228         * ipa-prop.c (ipa_compute_jump_functions_for_edge): Call
16229         get_dynamic_type; drop TODO.
16230         * ipa-polymorphic-call.c
16231         (ipa_polymorphic_call_context::get_dynamic_type): Be ready
16232         for otr_type to be unknown.
16233
16234 2014-10-04  Trevor Saunders  <tsaunders@mozilla.com>
16235
16236         * common/config/score/score-common.c: Remove.
16237         * config.gcc: Remove support for score-*.
16238         * config/score/constraints.md: Remove.
16239         * config/score/elf.h: Remove.
16240         * config/score/predicates.md: Remove.
16241         * config/score/score-conv.h: Remove.
16242         * config/score/score-generic.md: Remove.
16243         * config/score/score-modes.def: Remove.
16244         * config/score/score-protos.h: Remove.
16245         * config/score/score.c: Remove.
16246         * config/score/score.h: Remove.
16247         * config/score/score.md: Remove.
16248         * config/score/score.opt: Remove.
16249         * doc/md.texi: Don't document score-*.
16250
16251 2014-10-04  Trevor Saunders  <tsaunders@mozilla.com>
16252
16253         PR pch/63429
16254         * genconditions.c: Directly include ggc.h before rtl.h.
16255
16256 2014-10-03  Jan Hubicka  <hubicka@ucw.cz>
16257
16258         * ipa-polymorphic-call.c
16259         (ipa_polymorphic_call_context::ipa_polymorphic_call_context): Fix
16260         code determining speculative type.
16261         (ipa_polymorphic_call_context::combine_with): Fix speculation merge.
16262
16263 2014-10-03  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16264
16265         * altivec.md (altivec_lvsl): New define_expand.
16266         (altivec_lvsl_direct): Rename define_insn from altivec_lvsl.
16267         (altivec_lvsr): New define_expand.
16268         (altivec_lvsr_direct): Rename define_insn from altivec_lvsr.
16269         * rs6000.c (rs6000_expand_builtin): Change to use
16270         altivec_lvs[lr]_direct; remove commented-out code.
16271
16272 2014-10-03  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16273
16274         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
16275         Issue a warning message when vec_lvsl or vec_lvsr is used with a
16276         little endian target.
16277
16278 2014-10-03  Manuel López-Ibáñez  <manu@gcc.gnu.org>
16279
16280         * tree-pretty-print.c (dump_location): Make it extern. Dump also
16281         the column.
16282         * tree-pretty-print.h (dump_location): Declare.
16283         * gimple-pretty-print.c (dump_gimple_phi): Use dump_location.
16284         (pp_gimple_stmt_1): Likewise.
16285         (dump_implicit_edges): Likewise.
16286         * gimplify.c (gimplify_call_expr): Use LOCATION_FILE and
16287         LOCATION_LINE.
16288
16289
16290 2014-10-03  David Malcolm  <dmalcolm@redhat.com>
16291
16292         * gcc.c (driver::global_initializations): Remove "const" so
16293         that GCC_DRIVER_HOST_INITIALIZATION can modify decoded_options
16294         and decoded_options_count.
16295
16296 2014-10-03  Maciej W. Rozycki  <macro@codesourcery.com>
16297
16298         * config/rs6000/e500.h (HARD_REGNO_CALLER_SAVE_MODE): Remove
16299         macro.
16300         * config/rs6000/rs6000.h (HARD_REGNO_CALLER_SAVE_MODE): Handle
16301         TARGET_E500_DOUBLE case here.
16302
16303 2014-10-03  Marc Glisse  <marc.glisse@inria.fr>
16304
16305         PR c++/54427
16306         PR c++/57198
16307         PR c++/58845
16308         * doc/extend.texi (Vector Extensions): Document &&, ||, ! in C++.
16309
16310 2014-10-03  Jan Hubicka  <hubicka@ucw.cz>
16311
16312         * cgraph.h (struct indirect_call_info): Add IN_POLYMORPHIC_CDTOR
16313         * lto-cgraph.c (lto_output_edge, input_edge): Stream
16314         in_polymorphic_cdtor
16315         * cgraph.c (symbol_table::create_edge): Compute in_polymorphic_cdtor.
16316         (cgraph_edge::make_speculative): Copy in_polymorphic_cdtor.
16317         * cgraphclones.c (cgraph_edge::clone): Likewise.
16318         * ipa-prop.c (update_jump_functions_after_inlining,
16319         try_make_edge_direct_virtual_call): Pass in_polymorphic_cdtor
16320         to possible_dynamic_type_change.
16321         (decl_maybe_in_construction_p): Allow empty OUTER_TYPE and BASE.
16322         (ipa_polymorphic_call_context::possible_dynamic_type_change): Add
16323         IN_POLY_CDOTR argument.
16324
16325         * ipa-polymorphic-call.c (decl_maybe_in_construction_p): Be ready
16326         for BASE and OUTER_TYPE being NULL.
16327         (ipa_polymorphic_call_context::possible_dynamic_type_change): Add
16328         in_poly_cdtor parameter.
16329
16330 2014-10-03  Jakub Jelinek  <jakub@redhat.com>
16331
16332         * config/i386/i386.c (ix86_expand_vec_perm_vpermi2): Fix up formatting.
16333         (ix86_expand_vec_perm): Only call ix86_expand_vec_perm_vpermi2 if
16334         TARGET_AVX512F.
16335         (expand_vec_perm_1): Likewise.
16336
16337 2014-10-03  Jakub Jelinek  <jakub@redhat.com>
16338             Uros Bizjak  <ubizjak@gmail.com>
16339
16340         PR tree-optimization/61403
16341         * config/i386/i386.c (expand_vec_perm_palignr): Fix a spelling
16342         error in comment.  Also optimize 256-bit vectors for AVX2
16343         or AVX (floating vectors only), provided the first permutation
16344         can be performed in one insn.
16345
16346 2014-10-03  David Malcolm  <dmalcolm@redhat.com>
16347
16348         * gcc.c (class driver): New class.
16349         (main): Reimplement in terms of driver::main, moving most of the
16350         locals to be locals within individual methods of class driver.
16351         The remaining locals "explicit_link_files", "decoded_options" and
16352         "decoded_options_count" are used by multiple driver:: methods, and
16353         so become member data.  Doing so isolates the argc/argv reads and
16354         writes.  Replace "goto out" with a special exit code from
16355         new method driver::prepare_infiles.  Split out the old
16356         implementation of main into the following...
16357         (driver::main): New function, corresponding to the old "main"
16358         implementation.
16359         (driver::set_progname): New function, taken from the old
16360         "main" implementation.
16361         (driver::expand_at_files): Likewise.
16362         (driver::decode_argv): Likewise.
16363         (driver::global_initializations): Likewise.
16364         (driver::build_multilib_strings): Likewise.
16365         (driver::set_up_specs): Likewise.
16366         (driver::putenv_COLLECT_GCC): Likewise.
16367         (driver::maybe_putenv_COLLECT_LTO_WRAPPER): Likewise.
16368         (driver::handle_unrecognized_options): Likewise.
16369         (driver::maybe_print_and_exit): Likewise.
16370         (driver::prepare_infiles): Likewise.
16371         (driver::do_spec_on_infiles): Likewise.
16372         (driver::maybe_run_linker): Likewise.
16373         (driver::final_actions): Likewise.
16374         (driver::get_exit_code): Likewise.
16375
16376 2014-10-03  Yury Gribov  <y.gribov@samsung.com>
16377
16378         * asan.c (asan_finish_file): Disable __asan_init calls for KASan;
16379         don't emit empty ctors.
16380
16381 2014-10-03  Eric Botcazou  <ebotcazou@adacore.com>
16382
16383         * convert.c (convert_to_integer): Do not introduce useless conversions
16384         between integral types.
16385
16386 2014-10-03  David Sherwood  <david.sherwood@arm.com>
16387
16388         * ira-int.h (ira_allocno): Mark hard_regno as signed.
16389
16390 2014-10-03  Ilya Enkovich  <ilya.enkovich@intel.com>
16391
16392         * lra-constraints.c (inherit_in_ebb): Handle calls with
16393         multiple return values.
16394         * caller-save.c (save_call_clobbered_regs): Likewise.
16395
16396 2014-10-03  Jakub Jelinek  <jakub@redhat.com>
16397
16398         * tree-vect-data-refs.c (vect_permute_load_chain,
16399         vect_shift_permute_load_chain): Fix a typo in temporary var names,
16400         suffle3 to shuffle3.
16401
16402         PR libgomp/61200
16403         * omp-low.c (taskreg_contexts): New variable.
16404         (scan_omp_parallel): Push newly created context into taskreg_contexts
16405         vector and move record layout code to finish_taskreg_scan.
16406         (scan_omp_task): Likewise.
16407         (finish_taskreg_scan): New function.
16408         (execute_lower_omp): Call finish_taskreg_scan on all taskreg_contexts
16409         vector elements and release it.
16410
16411         PR target/62128
16412         * config/i386/i386.c (expand_vec_perm_palignr): If op1, op0 order
16413         of palignr arguments can't be used due to min 0 or max - min
16414         too high, try also op0, op1 order of palignr arguments.
16415
16416 2014-10-02  Jan Hubicka  <hubicka@ucw.cz>
16417
16418         * cgraph.h (ipa_polymorphic_call_context):
16419         Turn bools into bitfields; add DYNAMIC; make MAKE_SPECULATIVE
16420         private, add POSSIBLE_DYNAMIC_TYPE_CHANGE.
16421         * ipa-polymorphic-call.c
16422         (ipa_polymorphic_call_context::restrict_to_inner_class): Allow accesses
16423         past end of dynamic types.
16424         (ipa_polymorphic_call_context::stream_out,
16425         speculative_outer_type): Stream dynamic flag.
16426         (ipa_polymorphic_call_context::set_by_decl): Clear DYNAMIC.
16427         (ipa_polymorphic_call_context::ipa_polymorphic_call_context):
16428         Clear DYNAMIC.
16429         (ipa_polymorphic_call_context::get_dynamic_type): Use DYNAMIC;
16430         set it.
16431         (ipa_polymorphic_call_context::combine_with): Propagate dynamic.
16432         * ipa-prop.c (update_jump_functions_after_inlining,
16433         try_make_edge_direct_virtual_call): Use possible_dynamic_type_change.
16434
16435 2014-10-02  Teresa Johnson  <tejohnson@google.com>
16436
16437         * tree-ssa-threadupdate.c (freqs_to_counts_path): Scale frequencies
16438         up when synthesizing counts to avoid rounding errors.
16439
16440 2014-10-02  Teresa Johnson  <tejohnson@google.com>
16441
16442         PR middle-end/63422
16443         * tree-ssa-threadupdate.c (freqs_to_counts_path): Remove
16444         asserts to handle incoming insanities.
16445
16446 2014-10-02  Martin Jambor  <mjambor@suse.cz>
16447
16448         PR tree-optimization/63375
16449         * tree-sra.c (build_access_from_expr_1): Disqualify volatile
16450         references.
16451
16452 2014-10-02  Olivier Hainque  <hainque@adacore.com>
16453
16454         * Makefile.in (CROSS): Define, to @CROSS.
16455
16456 2014-10-02  Jakub Jelinek  <jakub@redhat.com>
16457
16458         PR target/62128
16459         * config/i386/i386.c (expand_vec_perm_1): Try expand_vec_perm_palignr
16460         if it expands to a single insn only.
16461         (expand_vec_perm_palignr): Add SINGLE_INSN_ONLY_P argument.  If true,
16462         fail unless in_order is true.  Add forward declaration.
16463         (expand_vec_perm_vperm2f128): Fix up comment about which permutation
16464         is useful for one_operand_p.
16465         (ix86_expand_vec_perm_const_1): Adjust expand_vec_perm_palignr caller.
16466
16467 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16468
16469         * cgraphclones.c (build_function_type_skip_args): Do not make new
16470         type variant of old.
16471
16472 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16473
16474         * ipa-prop.h (ipa_get_controlled_uses): Add hack to avoid ICE
16475         when speculation is added.
16476         (ipa_edge_args): Add polymorphic_call_contexts.
16477         (ipa_get_ith_polymorhic_call_context): New accesor.
16478         (ipa_make_edge_direct_to_target): Add SPECULATIVE parameter.
16479         * ipa-prop.c (ipa_print_node_jump_functions_for_edge): Print contexts.
16480         (ipa_compute_jump_functions_for_edge): Compute contexts.
16481         (update_jump_functions_after_inlining): Update contexts.
16482         (ipa_make_edge_direct_to_target): Add SPECULATIVE argument;
16483         update dumping; add speculative edge creation.
16484         (try_make_edge_direct_virtual_call): Add CTX_PTR parameter; handle
16485         context updating.
16486         (update_indirect_edges_after_inlining): Pass down context.
16487         (ipa_edge_duplication_hook): Duplicate contexts.
16488         (ipa_write_node_info): Stream out contexts.
16489         (ipa_read_node_info): Stream in contexts.
16490         * ipa-devirt.c (type_all_derivations_known_p): Avoid ICE on non-ODR
16491         types.
16492         (try_speculative_devirtualization): New function.
16493         * ipa-utils.h (try_speculative_devirtualization): Declare.
16494
16495 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16496
16497         * ipa.c (walk_polymorphic_call_targets): Avoid ICE when
16498         dumping during WPA.
16499
16500 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16501
16502         * ipa-prop.c (ipa_modify_formal_parameters): Do not merge
16503         type variants.
16504
16505 2014-10-01  Jan Hubicka  <hubicka@ucw.cz>
16506
16507         * ipa-polymorphic-call.c
16508         (ipa_polymorphic_call_context::restrict_to_inner_class):
16509         Rename EXPECTED_TYPE to OTR_TYPE; Validate speculation late;
16510         use speculation_consistent_p to do so; Add CONSDER_BASES
16511         and CONSIDER_PLACEMENT_NEW parameters.
16512         (contains_type_p): Add CONSDER_PLACEMENT_NEW and CONSIDER_BASES;
16513         short circuit obvious cases.
16514         (ipa_polymorphic_call_context::dump): Improve formatting.
16515         (ipa_polymorphic_call_context::ipa_polymorphic_call_context): Use
16516         combine_speculation_with to record speculations; Do not ICE when
16517         object is located in pointer type decl; do not ICE for methods
16518         of UNION_TYPE; do not record nonpolymorphic types.
16519         (ipa_polymorphic_call_context::speculation_consistent_p): New method.
16520         (ipa_polymorphic_call_context::combine_speculation_with): New method.
16521         (ipa_polymorphic_call_context::combine_with): New method.
16522         (ipa_polymorphic_call_context::make_speculative): Move here; use
16523         combine speculation.
16524         * cgraph.h (ipa_polymorphic_call_context): Update
16525         restrict_to_inner_class prototype; add offset_by, make_speculative,
16526         combine_with, useless_p, combine_speculation_with and
16527         speculation_consistent_p methods.
16528         (ipa_polymorphic_call_context::offset_by): New method.
16529         (ipa_polymorphic_call_context::useless_p): New method.
16530
16531 2014-10-01  Segher Boessenkool  <segher@kernel.crashing.org>
16532
16533         PR rtl-optimization/62151
16534         * combine.c (can_combine_p): Allow the destination register of INSN
16535         to be clobbered in I3.
16536         (subst): Do not substitute into clobbers of registers.
16537
16538 2014-10-01  Jakub Jelinek  <jakub@redhat.com>
16539
16540         PR debug/63342
16541         * dwarf2out.c (loc_list_from_tree): Handle MEM_REF with non-zero
16542         offset, TARGET_MEM_REF and SSA_NAME.
16543
16544         * config/i386/i386.c (expand_vec_perm_palignr): Handle
16545         256-bit vectors for TARGET_AVX2.
16546
16547         * config/i386/i386.c (expand_vec_perm_vperm2f128): Canonicalize
16548         dfirst permutation.
16549
16550         PR target/63428
16551         * config/i386/i386.c (expand_vec_perm_pshufb): Fix up rperm[0]
16552         argument to avx2_permv2ti.
16553
16554 2014-10-01  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
16555
16556         * config/arm/arm.md (*store_minmaxsi): Disable for arm_restrict_it.
16557
16558 2014-09-30  Uros Bizjak  <ubizjak@gmail.com>
16559
16560         * config/i386/i386.md (fmodxf3): Enable for flag_finite_math_only only.
16561         (fmod<mode>3): Ditto.
16562         (fpremxf4_i387): Ditto.
16563         (reminderxf3): Ditto.
16564         (reminder<mode>3): Ditto.
16565         (fprem1xf4_i387): Ditto.
16566
16567 2014-09-30  Teresa Johnson  <tejohnson@google.com>
16568
16569         * tree-ssa-threadupdate.c (struct ssa_local_info_t): New
16570         duplicate_blocks bitmap.
16571         (remove_ctrl_stmt_and_useless_edges): Ditto.
16572         (create_block_for_threading): Ditto.
16573         (compute_path_counts): New function.
16574         (update_profile): Ditto.
16575         (recompute_probabilities): Ditto.
16576         (update_joiner_offpath_counts): Ditto.
16577         (freqs_to_counts_path): Ditto.
16578         (clear_counts_path): Ditto.
16579         (ssa_fix_duplicate_block_edges): Update profile info.
16580         (ssa_create_duplicates): Pass new parameter.
16581         (ssa_redirect_edges): Remove old profile update.
16582         (thread_block_1): New duplicate_blocks bitmap,
16583         remove old profile update.
16584         (thread_single_edge): Pass new parameter.
16585
16586 2014-09-30  Ilya Tocar  <ilya.tocar@intel.com>
16587
16588         PR middle-end/62120
16589         * varasm.c (decode_reg_name_and_count): Check availability for
16590         registers from ADDITIONAL_REGISTER_NAMES.
16591
16592 2014-09-30  David Malcolm  <dmalcolm@redhat.com>
16593
16594         PR plugins/63410
16595         * Makefile.in (PRETTY_PRINT_H): Add wide-int-print.h.
16596         (PLUGIN_HEADERS): Add pass-instances.def.
16597
16598 2014-09-30  James Greenhalgh  <james.greenhalgh@arm.com>
16599
16600         * config/aarch64/aarch64-simd-builtins.def (sqdmull_laneq): Expand
16601         iterator.
16602         * config/aarch64/aarch64-simd.md
16603         (aarch64_sqdmull_laneq<mode>): Expand iterator.
16604         * config/aarch64/arm_neon.h (vqdmullh_laneq_s16): New.
16605         (vqdmulls_lane_s32): Fix return type.
16606         (vqdmulls_laneq_s32): New.
16607
16608 2014-09-30  Jakub Jelinek  <jakub@redhat.com>
16609
16610         PR inline-asm/63282
16611         * ifcvt.c (dead_or_predicable): Don't call redirect_jump_1
16612         or invert_jump_1 if jump isn't any_condjump_p.
16613
16614 2014-09-30  Terry Guo  <terry.guo@arm.com>
16615
16616         * config/arm/arm-cores.def (cortex-m7): New core name.
16617         * config/arm/arm-fpus.def (fpv5-sp-d16): New fpu name.
16618         (fpv5-d16): Ditto.
16619         * config/arm/arm-tables.opt: Regenerated.
16620         * config/arm/arm-tune.md: Regenerated.
16621         * config/arm/arm.h (TARGET_VFP5): New macro.
16622         * config/arm/bpabi.h (BE8_LINK_SPEC): Include cortex-m7.
16623         * config/arm/vfp.md (<vrint_pattern><SDF:mode>2,
16624         smax<mode>3, smin<mode>3): Enabled for FPU FPv5.
16625         * doc/invoke.texi: Document new cpu and fpu names.
16626
16627 2014-09-30  Jiong Wang  <jiong.wang@arm.com>
16628
16629         * shrink-wrap.c (move_insn_for_shrink_wrap): Check "can_throw_internal"
16630         before sinking insn.
16631
16632 2014-09-30  David Sherwood  <david.sherwood@arm.com>
16633
16634         * ira-int.h (ira_allocno): Add "wmode" field.
16635         * ira-build.c (create_insn_allocnos): Add new "parent" function
16636         parameter.
16637         * ira-conflicts.c (ira_build_conflicts): Add conflicts for registers
16638         that cannot be accessed in wmode.
16639
16640 2014-09-30  Markus Trippelsdorf  <markus@trippelsdorf.de>
16641
16642         * data-streamer.c (bp_unpack_var_len_int): Avoid signed
16643         integer overflow.
16644
16645 2014-09-29  Andi Kleen  <ak@linux.intel.com>
16646
16647         * opts.c (print_filtered_help): Print --param min/max/default
16648         with -Q.
16649
16650 2014-09-29  Kaz Kojima  <kkojima@gcc.gnu.org>
16651
16652         * config/sh/sh.md: Use define_c_enum for "unspec" and "unspecv".
16653
16654 2014-09-29  Eric Botcazou  <ebotcazou@adacore.com>
16655
16656         * tree-vrp.c (get_single_symbol): New function.
16657         (build_symbolic_expr): Likewise.
16658         (symbolic_range_based_on_p): New predicate.
16659         (extract_range_from_binary_expr_1): Deal with single-symbolic ranges
16660         for PLUS and MINUS.  Do not drop symbolic ranges at the end.
16661         (extract_range_from_binary_expr): Try harder for PLUS and MINUS if
16662         operand is symbolic and based on the other operand.
16663
16664 2014-09-29  Chen Gang  <gang.chen.5i5j@gmail.com>
16665
16666         * config/microblaze/microblaze.md (call_internal1): Use VOID
16667         instead of SI to fix "((void (*)(void)) 0)()" issue
16668
16669 2014-09-29  Nick Clifton  <nickc@redhat.com>
16670
16671         * config/msp430/msp430.c (msp430_expand_prologue): Return a
16672         CLOBBER rtx for naked functions.
16673         (msp430_expand_epilogue): Likewise.
16674         (msp430_use_f5_series_hwmult): Cache result.
16675         (use_32bit_hwmult): Cache result.
16676         (msp430_no_hwmult): New function.
16677         (msp430_output_labelref): Use it.
16678
16679 2014-09-29  Jakub Jelinek  <jakub@redhat.com>
16680
16681         PR middle-end/63247
16682         * omp-low.c (lower_omp_target): For OMP_CLAUSE_MAP_POINTER
16683         of ARRAY_TYPE, if not OMP_CLAUSE_MAP_ZERO_BIAS_ARRAY_SECTION
16684         use the alignment of avar rather than ovar.
16685
16686 2014-09-28  John David Anglin  <danglin@gcc.gnu.org>
16687
16688         * config/pa/pa.c (pa_output_function_epilogue): Only update
16689         last_address when a nonnote insn is found.
16690
16691 2014-09-26  Jan Hubicka  <hubicka@ucw.cz>
16692
16693         PR ipa/60665
16694         * ipa-devirt.c (possible_polymorphic_call_targets): Silence
16695         clang warning.
16696
16697 2014-09-26  Jan Hubicka  <hubicka@ucw.cz>
16698
16699         PR ipa/62121
16700         * ipa-polymorphic-call.c
16701         (ipa_polymorphic_call_context::restrict_to_inner_class): Fix pasto
16702         in checking array size.
16703
16704 2014-09-26  Jan Hubicka  <hubicka@ucw.cz>
16705
16706         PR middle-end/35545
16707         * passes.def (pass_tracer): Move before last dominator pass.
16708
16709 2014-09-26  Thomas Schwinge  <thomas@codesourcery.com>
16710
16711         * gcc.c (try_generate_repro): Remove argument "prog".  Change all
16712         users.
16713         (run_attempt): Handle errors of "pex_run" invocation.
16714
16715 2014-09-26  Christophe Lyon  <christophe.lyon@linaro.org>
16716
16717         * config/aarch64/aarch64-linux.h (ASAN_CC1_SPEC): Define.
16718         (CC1_SPEC): Define.
16719         * config/aarch64/aarch64.c (aarch64_asan_shadow_offset): New function.
16720         (TARGET_ASAN_SHADOW_OFFSET): Define.
16721
16722 2014-09-26  Martin Liska  <mliska@suse.cz>
16723
16724         * cgraph.c (cgraph_node::release_body): New argument keep_arguments
16725         introduced.
16726         * cgraph.h: Likewise.
16727         * cgraphunit.c (cgraph_node::create_wrapper): Usage of new
16728         argument introduced.
16729         * ipa-utils.h (polymorphic_type_binfo_p): Safe check for binfos
16730         created by Java.
16731         * tree-ssa-alias.c (ao_ref_base_alias_set): Static function
16732         transformed to global.
16733         * tree-ssa-alias.h: Likewise.
16734
16735 2014-09-26  Jakub Jelinek  <jakub@redhat.com>
16736             Max Ostapenko  <m.ostapenko@partner.samsung.com>
16737
16738         * common.opt: New option.
16739         * doc/invoke.texi: Describe new option.
16740         * gcc.c (execute): Don't free first string early, but at the end
16741         of the function.  Call retry_ice if compiler exited with
16742         ICE_EXIT_CODE.
16743         (main): Factor out common code.
16744         (print_configuration): New function.
16745         (files_equal_p): Likewise.
16746         (check_repro): Likewise.
16747         (run_attempt): Likewise.
16748         (do_report_bug): Likewise.
16749         (append_text): Likewise.
16750         (try_generate_repro): Likewise
16751
16752 2014-09-25  Andi Kleen  <ak@linux.intel.com>
16753
16754         * config/i386/i386.c (x86_print_call_or_nop): New function.
16755         (x86_function_profiler): Support -mnop-mcount and
16756         -mrecord-mcount.
16757         * config/i386/i386.opt (-mnop-mcount, -mrecord-mcount): Add
16758         * doc/invoke.texi: Document -mnop-mcount, -mrecord-mcount.
16759
16760 2014-09-25  Jan Hubicka  <hubicka@ucw.cz>
16761
16762         * ipa-prop.c (ipa_intraprocedural_devirtualization): Remove.
16763         * ipa-prop.h (ipa_intraprocedural_devirtualization): Remove.
16764         * tree-ssa-prop.c (eliminate_dom_walker::before_dom_children):
16765         Remove.
16766
16767 2014-09-25  Jan Hubicka  <hubicka@ucw.cz>
16768
16769         * ipa-utils.h (subbinfo_with_vtable_at_offset,
16770         type_all_derivations_known_p, type_known_to_have_no_deriavations_p,
16771         types_must_be_same_for_odr, types_odr_comparable): Declare.
16772         (polymorphic_type_binfo_p): Move here from ipa-devirt.c
16773         * ipa-polymorphic-call.c: New file.
16774         (contains_polymorphic_type_p, possible_placement_new,
16775         ipa_polymorphic_call_context::restrict_to_inner_class,
16776         contains_type_p, decl_maybe_in_construction_p,
16777         ipa_polymorphic_call_context::stream_out,
16778         ipa_polymorphic_call_context::debug,
16779         ipa_polymorphic_call_context::stream_in,
16780         ipa_polymorphic_call_context::set_by_decl,
16781         ipa_polymorphic_call_context::set_by_invariant,
16782         walk_ssa_copies,
16783         ipa_polymorphic_call_context::ipa_polymorphic_call_context,
16784         type_change_info, noncall_stmt_may_be_vtbl_ptr_store,
16785         extr_type_from_vtbl_ptr_store, record_known_type
16786         check_stmt_for_type_change,
16787         ipa_polymorphic_call_context::get_dynamic_type): Move here from
16788         ipa-devirt.c
16789         * ipa-devirt.c: No longer include data-streamer.h, lto-streamer.h
16790         and streamer-hooks.h
16791         (contains_polymorphic_type_p, possible_placement_new,
16792         ipa_polymorphic_call_context::restrict_to_inner_class,
16793         contains_type_p, decl_maybe_in_construction_p,
16794         ipa_polymorphic_call_context::stream_out,
16795         ipa_polymorphic_call_context::debug,
16796         ipa_polymorphic_call_context::stream_in,
16797         ipa_polymorphic_call_context::set_by_decl,
16798         ipa_polymorphic_call_context::set_by_invariant,
16799         walk_ssa_copies,
16800         ipa_polymorphic_call_context::ipa_polymorphic_call_context,
16801         type_change_info, noncall_stmt_may_be_vtbl_ptr_store,
16802         extr_type_from_vtbl_ptr_store, record_known_type
16803         check_stmt_for_type_change,
16804         ipa_polymorphic_call_context::get_dynamic_type): Move to
16805         ipa-polymorphic-call.c
16806         (type_all_derivations_known_p, types_odr_comparable,
16807         types_must_be_same_for_odr): Export.
16808         (type_known_to_have_no_deriavations_p): New function.
16809         * Makefile.in: Add ipa-polymorphic-call.c
16810
16811 2014-09-25  Jan Hubicka  <hubicka@ucw.cz>
16812
16813         * ipa-devirt.c (polymorphic_call_target_d): Add SPECULATIVE; reorder
16814         for better storage.
16815         (polymorphic_call_target_hasher::hash): Hash SPECULATIVE.
16816         (possible_polymorphic_call_targets): Instead of computing both
16817         speculative and non-speculative answers, do just one at a time.
16818         Replace NONSPECULATIVE_TARGETSP parameter with SPECULATIVE flag.
16819         (dump_targets): Break out from ...
16820         (dump_possible_polymorphic_call_targets): ... here; dump both
16821         speculative and non-speculative lists.
16822         (ipa_devirt): Update for new possible_polymorphic_call_targets API.
16823         * ipa-utils.h (possible_polymorphic_call_targets): Update.
16824
16825 2014-09-25  Uros Bizjak  <ubizjak@gmail.com>
16826
16827         PR rtl-optimization/63348
16828         * emit-rtl.c (try_split): Do not emit extra barrier.
16829
16830 2014-09-25  James Greenhalgh  <james.greenhalgh@arm.com>
16831
16832         * config/aarch64/aarch64-protos.h (aarch64_simd_const_bounds): Delete.
16833         * config/aarch64/aarch64-simd.md (aarch64_<sur>q<r>shl<mode>): Use
16834         new predicates.
16835         (aarch64_<sur>shll2_n<mode>): Likewise.
16836         (aarch64_<sur>shr_n<mode>): Likewise.
16837         (aarch64_<sur>sra_n<mode>: Likewise.
16838         (aarch64_<sur>s<lr>i_n<mode>): Likewise.
16839         (aarch64_<sur>qshl<u>_n<mode>): Likewise.
16840         * config/aarch64/aarch64.c (aarch64_simd_const_bounds): Delete.
16841         * config/aarch64/iterators.md (ve_mode): New.
16842         (offsetlr): Remap to infix text for use in new predicates.
16843         * config/aarch64/predicates.md (aarch64_simd_shift_imm_qi): New.
16844         (aarch64_simd_shift_imm_hi): Likewise.
16845         (aarch64_simd_shift_imm_si): Likewise.
16846         (aarch64_simd_shift_imm_di): Likewise.
16847         (aarch64_simd_shift_imm_offset_qi): Likewise.
16848         (aarch64_simd_shift_imm_offset_hi): Likewise.
16849         (aarch64_simd_shift_imm_offset_si): Likewise.
16850         (aarch64_simd_shift_imm_offset_di): Likewise.
16851         (aarch64_simd_shift_imm_bitsize_qi): Likewise.
16852         (aarch64_simd_shift_imm_bitsize_hi): Likewise.
16853         (aarch64_simd_shift_imm_bitsize_si): Likewise.
16854         (aarch64_simd_shift_imm_bitsize_di): Likewise.
16855
16856 2014-09-25  Jiong Wang  <jiong.wang@arm.com>
16857
16858         * shrink-wrap.c (move_insn_for_shrink_wrap): Initialize the live-in of
16859         new created BB as the intersection of live-in from "old_dest" and
16860         live-out from "bb".
16861
16862 2014-09-25  Felix Yang  <felix.yang@huawei.com>
16863
16864         * lra.c (lra_set_insn_recog_data): Fix typo in comment.
16865         * genautomata.c (merge_states): Ditto.
16866
16867 2014-09-25  Oleg Endo  <olegendo@gcc.gnu.org>
16868
16869         PR target/62218
16870         * config/sh/sync.md (atomic_test_and_set_soft_imask): Fix typo
16871         in instruction sequence.
16872
16873 2014-09-25  Nick Clifton  <nickc@redhat.com>
16874
16875         PR target/62218
16876         * config/sh/sync.md (atomic_fetch_nand<mode>_soft_imask): Fix typo
16877         in instruction sequence.
16878
16879 2014-09-25  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
16880
16881         PR target/63335
16882         * config/rs6000/rs6000-c.c (altivec_build_resolved_builtin):
16883         Exclude VSX_BUILTIN_XVCMPGEDP_P from special handling.
16884
16885 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16886             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16887             Anna Tikhonova  <anna.tikhonova@intel.com>
16888             Ilya Tocar  <ilya.tocar@intel.com>
16889             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16890             Ilya Verbin  <ilya.verbin@intel.com>
16891             Kirill Yukhin  <kirill.yukhin@intel.com>
16892             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16893
16894         * config/i386/sse.md
16895         (define_expand "<avx2_avx512f>_perm<mode>"): Rename to ...
16896         (define_expand "<avx2_avx512>_perm<mode>"): ... this.
16897         (define_expand "avx512f_perm<mode>_mask"): Rename to ...
16898         (define_expand "<avx512>_perm<mode>_mask"): ... this.
16899         Use VI8F_256_512 mode iterator.
16900         (define_insn "<avx2_avx512f>_perm<mode>_1<mask_name>"): Rename to ...
16901         (define_insn "<avx2_avx512bw>_perm<mode>_1<mask_name>"): ... this.
16902
16903 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16904             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16905             Anna Tikhonova  <anna.tikhonova@intel.com>
16906             Ilya Tocar  <ilya.tocar@intel.com>
16907             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16908             Ilya Verbin  <ilya.verbin@intel.com>
16909             Kirill Yukhin  <kirill.yukhin@intel.com>
16910             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16911
16912         * config/i386/sse.md
16913         (define_insn "avx_movshdup256<mask_name>"): Add masking.
16914         (define_insn "sse3_movshdup<mask_name>"): Ditto.
16915         (define_insn "avx_movsldup256<mask_name>"): Ditto.
16916         (define_insn "sse3_movsldup<mask_name>"): Ditto.
16917         (define_insn "vec_dupv2df<mask_name>"): Ditto.
16918         (define_insn "*vec_concatv2df"): Add EVEX version.
16919
16920 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16921             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16922             Anna Tikhonova  <anna.tikhonova@intel.com>
16923             Ilya Tocar  <ilya.tocar@intel.com>
16924             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16925             Ilya Verbin  <ilya.verbin@intel.com>
16926             Kirill Yukhin  <kirill.yukhin@intel.com>
16927             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16928
16929         * config/i386/sse.md
16930         (define_insn "vec_set<mode>_0"): Add EVEX version.
16931
16932 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16933             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16934             Anna Tikhonova  <anna.tikhonova@intel.com>
16935             Ilya Tocar  <ilya.tocar@intel.com>
16936             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16937             Ilya Verbin  <ilya.verbin@intel.com>
16938             Kirill Yukhin  <kirill.yukhin@intel.com>
16939             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16940
16941         * config/i386/sse.md
16942         (define_insn
16943         "<fixsuffix>fix_trunc<mode><sselongvecmodelower>2<mask_name><round_saeonly_name>"):
16944         New.
16945         (define_insn "<fixsuffix>fix_truncv2sfv2di2<mask_name>"): Ditto.
16946         (define_insn "ufix_trunc<mode><sseintvecmodelower>2<mask_name>"): Ditto.
16947         (define_insn "sse2_cvtss2sd<round_saeonly_name>"): Change
16948         "nonimmediate_operand" to "<round_saeonly_nimm_predicate>".
16949         (define_insn "avx_cvtpd2ps256<mask_name>"): Add masking.
16950         (define_expand "sse2_cvtpd2ps_mask): New.
16951         (define_insn "*sse2_cvtpd2ps<mask_name>"): Add masking.
16952         (define_insn "sse2_cvtps2pd<mask_name>"): Add masking.
16953
16954 2014-09-25  Alexander Ivchenko  <alexander.ivchenko@intel.com>
16955             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
16956             Anna Tikhonova  <anna.tikhonova@intel.com>
16957             Ilya Tocar  <ilya.tocar@intel.com>
16958             Andrey Turetskiy  <andrey.turetskiy@intel.com>
16959             Ilya Verbin  <ilya.verbin@intel.com>
16960             Kirill Yukhin  <kirill.yukhin@intel.com>
16961             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
16962
16963         * config/i386/i386.c
16964         (avx512f_ufix_notruncv8dfv8si_mask_round): Rename to ...
16965         (ufix_notruncv8dfv8si2_mask_round): ... this.
16966         * config/i386/sse.md
16967         (define_insn "avx512f_cvtdq2pd512_2): Update TARGET check.
16968         (define_insn "avx_cvtdq2pd256_2"): Add EVEX version.
16969         (define_insn "sse2_cvtdq2pd<mask_name>"): Add masking.
16970         (define_insn "avx_cvtpd2dq256<mask_name>"): Ditto.
16971         (define_expand "sse2_cvtpd2dq"): Delete.
16972         (define_insn "sse2_cvtpd2dq<mask_name>"): Add masking and
16973         make 2nd operand const0 vector.
16974         (define_insn "avx512f_ufix_notruncv8dfv8si<mask_name><round_name>"):
16975         Delete.
16976         (define_mode_attr pd2udqsuff): New.
16977         (define_insn
16978         "ufix_notrunc<mode><si2dfmodelower>2<mask_name><round_name>"): Ditto.
16979         (define_insn "ufix_notruncv2dfv2si2<mask_name>"): Ditto.
16980         (define_insn "*avx_cvttpd2dq256_2"): Delete.
16981         (define_expand "sse2_cvttpd2dq"): Ditto.
16982         (define_insn "sse2_cvttpd2dq<mask_name>"): Add masking and
16983         make 2nd operand const0 vector.
16984
16985 2014-09-25  Jakub Jelinek  <jakub@redhat.com>
16986
16987         PR tree-optimization/63341
16988         * tree-vectorizer.h (vect_create_data_ref_ptr,
16989         vect_create_addr_base_for_vector_ref): Add another tree argument
16990         defaulting to NULL_TREE.
16991         * tree-vect-data-refs.c (vect_create_data_ref_ptr): Add byte_offset
16992         argument, pass it down to vect_create_addr_base_for_vector_ref.
16993         (vect_create_addr_base_for_vector_ref): Add byte_offset argument,
16994         add that to base_offset too if non-NULL.
16995         * tree-vect-stmts.c (vectorizable_load): Add byte_offset variable,
16996         for dr_explicit_realign_optimized set it to vector byte size
16997         - 1 instead of setting offset, pass byte_offset down to
16998         vect_create_data_ref_ptr.
16999
17000 2014-09-24  Jan Hubicka  <hubicka@ucw.cz>
17001
17002         * ipa-devirt.c (possible_polymorphic_call_targets): Remove
17003         forgotten debug output; canonicalize querries more wtih LTO.
17004
17005 2014-09-24  Jan Hubicka  <hubicka@ucw.cz>
17006
17007         * cgraph.h (class ipa_polymorphic_call_context): Move here from
17008         ipa-utils.h; add stream_int and stream_out methods.
17009         (cgraph_indirect_call_info): Remove SPECILATIVE_OFFSET,
17010         OUTER_TYPE, SPECULATIVE_OUTER_TYPE, MAYBE_IN_CONSTRUCTION
17011         MAYBE_DERIVED_TYPE and SPECULATIEVE_MAYBE_DERIVED_TYPE;
17012         add CONTEXT.
17013         (ipa_polymorphic_call_context::ipa_polymorphic_call_context,
17014         ipa_polymorphic_call_context::ipa_polymorphic_call_context,
17015         ipa_polymorphic_call_context::clear_speculation,
17016         ipa_polymorphic_call_context::clear_outer_type): Move here from
17017         ipa-utils.h
17018         * ipa-utils.h (class ipa_polymorphic_call_context): Move to cgraph.h
17019         (ipa_polymorphic_call_context::ipa_polymorphic_call_context,
17020         ipa_polymorphic_call_context::ipa_polymorphic_call_context,
17021         ipa_polymorphic_call_context::clear_speculation,
17022         ipa_polymorphic_call_context::clear_outer_type): Likewise.
17023         * ipa-devirt.c: Include data-streamer.h, lto-streamer.h and
17024         streamer-hooks.h
17025         (ipa_polymorphic_call_context::stream_out): New method.
17026         (ipa_polymorphic_call_context::stream_in): New method.
17027         (noncall_stmt_may_be_vtbl_ptr_store): Add forgotten static.
17028         * ipa-prop.c (ipa_analyze_indirect_call_uses): Do not care about
17029         OUTER_TYPE.
17030         (ipa_analyze_call_uses): Simplify.
17031         (update_indirect_edges_after_inlining): Do not care about outer_type.
17032         (ipa_write_indirect_edge_info): Update.
17033         (ipa_write_indirect_edge_info): Likewise.
17034         * cgraph.c (cgraph_node::create_indirect_edge): Simplify.
17035         (dump_edge_flags): Break out from ...
17036         (cgraph_node::dump): ... here; dump indirect edges.
17037
17038 2014-09-24  Jan Hubicka  <hubicka@ucw.cz>
17039
17040         * ipa-utils.h (polymorphic_call_context): Add
17041         metdhos dump, debug and clear_outer_type.
17042         (ipa_polymorphic_call_context::ipa_polymorphic_call_context): Simplify.
17043         (ipa_polymorphic_call_context::clear_outer_type): New method.
17044         * ipa-prop.c (ipa_analyze_call_uses): Do not overwrite offset.
17045         * ipa-devirt.c (types_odr_comparable): New function.
17046         (types_must_be_same_for_odr): New function.
17047         (odr_subtypes_equivalent_p): Simplify.
17048         (possible_placement_new): Break out from ...
17049         (ipa_polymorphic_call_context::restrict_to_inner_type): ... here;
17050         be more cuatious about returning false in cases the context may be
17051         valid in derived type or via placement new.
17052         (contains_type_p): Clear maybe_derived_type
17053         (ipa_polymorphic_call_context::dump): New method.
17054         (ipa_polymorphic_call_context::debug): New method.
17055         (ipa_polymorphic_call_context::set_by_decl): Cleanup comment.
17056         (ipa_polymorphic_call_context::set_by_invariant): Simplify.
17057         (ipa_polymorphic_call_context::ipa_polymorphic_call_context): Simplify.
17058         (possible_polymorphic_call_targets): Trust
17059         context.restrict_to_inner_class to suceed on all valid cases;
17060         remove confused sanity check.
17061         (dump_possible_polymorphic_call_targets): Simplify.
17062
17063 2014-09-24  Aldy Hernandez  <aldyh@redhat.com>
17064
17065         * cgraph.h, dbxout.c, dwarfout2.c, gimple-fold.c,
17066         lto-streamer-out.c, print-tree.c, symtab.c, tree-inline.c,
17067         tree-streamer-in.c, tree-streamer-out.c, tree.c, tree.h,
17068         varpool.c: Rename all instances of DECL_ABSTRACT to
17069         DECL_ABSTRACT_P.
17070
17071 2014-09-24  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
17072
17073         * config/rs6000/rs6000.c (insn_is_swappable_p): Don't provide
17074         special handling for stores whose SET_SRC is an UNSPEC (such as
17075         UNSPEC_STVE).
17076
17077 2014-09-24  Jiong Wang  <jiong.wang@arm.com>
17078
17079         * shrink-wrap.c (move_insn_for_shrink_wrap): Add further check when
17080         !REG_P (src) to release more instruction sink opportunities.
17081
17082 2014-09-24  Wilco Dijkstra  <wilco.dijkstra@arm.com>
17083
17084         * config/aarch64/aarch64.c (aarch64_register_move_cost): Add register
17085         move costs for 128-bit types.
17086
17087 2014-09-24  Martin Jambor  <mjambor@suse.cz>
17088
17089         * ipa-prop.c (ipa_edge_duplication_hook): Update controlled_use_count
17090         when duplicating a PASS_THROUGH jump function when creating a
17091         speculative edge.
17092
17093 2014-09-24  Marek Polacek  <polacek@redhat.com>
17094
17095         PR c/61405
17096         PR c/53874
17097         * asan.c (maybe_instrument_call): Add default case.
17098         * ipa-pure-const.c (special_builtin_state): Likewise.
17099         * predict.c (expr_expected_value_1): Likewise.
17100         * lto-streamer-out.c (write_symbol): Initialize variable.
17101
17102 2014-09-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
17103
17104         * config/aarch64/arm_neon.h (vmuld_lane_f64): Use macro for getting
17105         the lane.
17106         (vmuld_laneq_f64): Likewise.
17107         (vmuls_lane_f32): Likewise.
17108         (vmuls_laneq_f32): Likewise.
17109
17110 2014-09-24  Kirill Yukhin  <kirill.yukhin@intel.com>
17111
17112         PR bootstrap/63235
17113         * varpool.c (varpool_node::add): Pass decl attributes
17114         to lookup_attribute.
17115
17116 2014-09-24  Jakub Jelinek  <jakub@redhat.com>
17117
17118         PR sanitizer/63316
17119         * asan.c (asan_expand_check_ifn): Fix up align >= 8 optimization.
17120
17121 2014-09-24  Thomas Preud'homme  <thomas.preudhomme@arm.com>
17122
17123         PR tree-optimization/63266
17124         * tree-ssa-math-opts.c (struct symbolic_number): Add comment about
17125         marker for unknown byte value.
17126         (MARKER_MASK): New macro.
17127         (MARKER_BYTE_UNKNOWN): New macro.
17128         (HEAD_MARKER): New macro.
17129         (do_shift_rotate): Mark bytes with unknown values due to sign
17130         extension when doing an arithmetic right shift. Replace hardcoded
17131         mask for marker by new MARKER_MASK macro.
17132         (find_bswap_or_nop_1): Likewise and adjust ORing of two symbolic
17133         numbers accordingly.
17134
17135 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17136             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17137             Anna Tikhonova  <anna.tikhonova@intel.com>
17138             Ilya Tocar  <ilya.tocar@intel.com>
17139             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17140             Ilya Verbin  <ilya.verbin@intel.com>
17141             Kirill Yukhin  <kirill.yukhin@intel.com>
17142             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17143
17144         * config/i386/sse.md
17145         (define_insn
17146         "<sse2_avx_avx512f>_fix_notrunc<sf2simodelower><mode><mask_name>"):
17147         Add masking.
17148         (define_insn "fix_truncv8sfv8si2<mask_name>"): Ditto.
17149         (define_insn "fix_truncv4sfv4si2<mask_name>"): Ditto.
17150
17151 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17152             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17153             Anna Tikhonova  <anna.tikhonova@intel.com>
17154             Ilya Tocar  <ilya.tocar@intel.com>
17155             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17156             Ilya Verbin  <ilya.verbin@intel.com>
17157             Kirill Yukhin  <kirill.yukhin@intel.com>
17158             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17159
17160         * config/i386/sse.md
17161         (define_c_enum "unspec"): Add UNSPEC_PSHUFHW, UNSPEC_PSHUFLW.
17162         (define_insn "<mask_codefor>avx512bw_pshuflwv32hi<mask_name>"): New.
17163         (define_expand "avx512vl_pshuflwv3_mask"): Ditto.
17164         (define_insn "avx2_pshuflw_1<mask_name>"): Add masking.
17165         (define_expand "avx512vl_pshuflw_mask"): New.
17166         (define_insn "sse2_pshuflw_1<mask_name>"): Add masking.
17167         (define_insn "<mask_codefor>avx512bw_pshufhwv32hi<mask_name>"): New.
17168         (define_expand "avx512vl_pshufhwv3_mask"): Ditto.
17169         (define_insn "avx2_pshufhw_1<mask_name>"): Add masking.
17170         (define_expand "avx512vl_pshufhw_mask"): New.
17171         (define_insn "sse2_pshufhw_1<mask_name>"): Add masking.
17172
17173 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17174             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17175             Anna Tikhonova  <anna.tikhonova@intel.com>
17176             Ilya Tocar  <ilya.tocar@intel.com>
17177             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17178             Ilya Verbin  <ilya.verbin@intel.com>
17179             Kirill Yukhin  <kirill.yukhin@intel.com>
17180             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17181
17182         * config/i386/i386.c
17183         (ix86_expand_args_builtin): Handle CODE_FOR_sse2_shufpd,
17184         CODE_FOR_sse2_sse2_shufpd_mask, CODE_FOR_sse2_avx512dq_shuf_f64x2_mask,
17185         CODE_FOR_sse2_avx512dq_shuf_i64x2_mask,
17186         CODE_FOR_sse2_avx512vl_shuf_i32x4_mask and
17187         CODE_FOR_sse2_avx512vl_shuf_f32x4_mask.
17188         * config/i386/sse.md
17189         (define_expand "avx512dq_shuf_<shuffletype>64x2_mask"): New.
17190         (define_insn
17191         "<mask_codefor>avx512dq_shuf_<shuffletype>64x2_1<mask_name>"): Ditto.
17192         (define_expand "avx512vl_shuf_<shuffletype>32x4_mask"): Ditto.
17193         (define_insn
17194         "<mask_codefor>avx512vl_shuf_<shuffletype>32x4_1<mask_name>"): Ditto.
17195         (define_expand "avx512vl_pshufdv3_mask"): Ditto.
17196         (define_insn "avx2_pshufd_1<mask_name>"): Add masking.
17197         (define_expand "avx512vl_pshufd_mask"): New.
17198         (define_insn "sse2_pshufd_1<mask_name>"): Add masking.
17199
17200 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17201             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17202             Anna Tikhonova  <anna.tikhonova@intel.com>
17203             Ilya Tocar  <ilya.tocar@intel.com>
17204             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17205             Ilya Verbin  <ilya.verbin@intel.com>
17206             Kirill Yukhin  <kirill.yukhin@intel.com>
17207             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17208
17209         * config/i386/i386.c
17210         (CODE_FOR_avx2_extracti128): Rename to ...
17211         (CODE_FOR_avx_vextractf128v4di): this.
17212         (CODE_FOR_avx2_inserti128): Rename to ...
17213         (CODE_FOR_avx_vinsertf128v4di): this.
17214         (ix86_expand_args_builtin): Handle CODE_FOR_avx_vinsertf128v4di,
17215         CODE_FOR_avx_vextractf128v4di.
17216         (ix86_expand_args_builtin): Handle CODE_FOR_avx512dq_vinsertf32x8_mask,
17217         CODE_FOR_avx512dq_vinserti32x8_mask, CODE_FOR_avx512vl_vinsertv4df,
17218         CODE_FOR_avx512vl_vinsertv4di, CODE_FOR_avx512vl_vinsertv8sf,
17219         CODE_FOR_avx512vl_vinsertv8si.
17220         * config/i386/sse.md
17221         (define_expand
17222         "<extract_type>_vinsert<shuffletype><extract_suf>_mask"): Use
17223         AVX512_VEC mode iterator.
17224         (define_insn
17225         "<mask_codefor><extract_type>_vinsert<shuffletype><extract_suf>_1<mask_name>"):
17226         Ditto.
17227         (define_expand
17228         "<extract_type_2>_vinsert<shuffletype><extract_suf_2>_mask"): Use
17229         AVX512_VEC_2 mode iterator.
17230         (define_insn "vec_set_lo_<mode><mask_name>"): New.
17231         (define_insn "vec_set_hi_<mode><mask_name>"): Ditto.
17232         (define_expand "avx512vl_vinsert<mode>"): Ditto.
17233         (define_insn "avx2_vec_set_lo_v4di"): Delete.
17234         (define_insn "avx2_vec_set_hi_v4di"): Ditto.
17235         (define_insn "vec_set_lo_<mode><mask_name>"): Add masking.
17236         (define_insn "vec_set_hi_<mode><mask_name>"): Ditto.
17237         (define_insn "vec_set_lo_<mode><mask_name>"): Ditto.
17238         (define_insn "vec_set_hi_<mode><mask_name>"): Ditto.
17239         (define_expand "avx2_extracti128"): Delete.
17240         (define_expand "avx2_inserti128"): Ditto.
17241
17242 2014-09-24  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17243             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17244             Anna Tikhonova  <anna.tikhonova@intel.com>
17245             Ilya Tocar  <ilya.tocar@intel.com>
17246             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17247             Ilya Verbin  <ilya.verbin@intel.com>
17248             Kirill Yukhin  <kirill.yukhin@intel.com>
17249             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17250
17251         * config/i386/sse.md
17252         (define_insn "avx2_<code>v16qiv16hi2<mask_name>"): Add masking.
17253         (define_insn "avx512bw_<code>v32qiv32hi2<mask_name>"): New.
17254         (define_insn "sse4_1_<code>v8qiv8hi2<mask_name>"): Add masking.
17255         (define_insn "avx2_<code>v8qiv8si2<mask_name>"): Ditto.
17256         (define_insn "sse4_1_<code>v4qiv4si2<mask_name>"): Ditto.
17257         (define_insn "avx2_<code>v8hiv8si2<mask_name>"): Ditto.
17258         (define_insn "sse4_1_<code>v4hiv4si2<mask_name>"): Ditto.
17259         (define_insn "avx2_<code>v4qiv4di2<mask_name>"): Ditto.
17260         (define_insn "sse4_1_<code>v2qiv2di2<mask_name>"): Ditto.
17261         (define_insn "avx2_<code>v4hiv4di2<mask_name>"): Ditto.
17262         (define_insn "sse4_1_<code>v2hiv2di2<mask_name>"): Ditto.
17263         (define_insn "avx2_<code>v4siv4di2<mask_name>"): Ditto.
17264         (define_insn "sse4_1_<code>v2siv2di2<mask_name>"): Ditto.
17265
17266 2014-09-24  Zhenqiang Chen  <zhenqiang.chen@arm.com>
17267
17268         PR rtl-optimization/63210
17269         * ira-color.c (assign_hard_reg): Ignore conflict cost if the
17270         HARD_REGNO is not available for CONFLICT_A.
17271
17272 2014-09-23  Andi Kleen  <ak@linux.intel.com>
17273
17274         * cgraph.h (symtab_node): Add no_reorder attribute.
17275         (symbol_table::output_asm_statements): Remove.
17276         * cgraphclones.c (cgraph_node::create_clone): Copy no_reorder.
17277         (cgraph_node::create_version_clone): Dito.
17278         (symbol_table::output_asm_statements): Remove.
17279         * trans-mem.c (ipa_tm_create_version_alias): Dito.
17280         * cgraphunit.c (varpool_node::finalize_decl): Check no_reorder.
17281         (output_in_order): Add no_reorder flag. Only handle no_reorder
17282         nodes when set.
17283         (symbol_table::compile): Add separate pass for no_reorder nodes.
17284         (process_common_attributes): Set no_reorder flag in symtab node.
17285         Add node argument.
17286         (process_function_and_variable_attributes): Pass symtab nodes to
17287         process_common_attributes.
17288         * doc/extend.texi (no_reorder): Document no_reorder attribute.
17289         * lto-cgraph.c (lto_output_node): Serialize no_reorder.
17290         (lto_output_varpool_node): Dito.
17291         (input_overwrite_node): Dito.
17292         (input_varpool_node): Dito.
17293         * varpool.c (varpool_node::add): Set no_reorder attribute.
17294         (symbol_table::remove_unreferenced_decls): Handle no_reorder.
17295         (symbol_table::output_variables): Dito.
17296         * symtab.c (symtab_node::dump_base): Print no_reorder.
17297
17298 2014-09-23  Jiong Wang  <jiong.wang@arm.com>
17299
17300         * shrink-wrap.c (try_shrink_wrapping): Check PIC_OFFSET_TABLE_REGNUM
17301         not be INVALID_REGNUM.
17302
17303 2014-09-23  Thomas Schwinge  <thomas@codesourcery.com>
17304
17305         * configure: Regenerate.
17306
17307 2014-09-23  Alan Lawrence  <alan.lawrence@arm.com>
17308
17309         * combine.c (simplify_shift_const_1): Allow commuting (ashiftrt (xor))
17310         when result_mode == shift_mode.
17311
17312 2014-09-23  Kostya Serebryany  <kcc@google.com>
17313
17314         Update to match the changed asan API.
17315         * asan.c (asan_global_struct): Update the __asan_global definition
17316         to match the new API.
17317         (asan_add_global): Ditto.
17318         * sanitizer.def (BUILT_IN_ASAN_INIT): Rename __asan_init_v3
17319         to __asan_init_v4.
17320
17321 2014-09-23  Michael Meissner  <meissner@linux.vnet.ibm.com>
17322
17323         * config/rs6000/rs6000.md (f32_vsx): New mode attributes to
17324         refine the constraints used on 32/64-bit floating point moves.
17325         (f32_av): Likewise.
17326         (f64_vsx): Likewise.
17327         (f64_dm): Likewise.
17328         (f64_av): Likewise.
17329         (BOOL_REGS_OUTPUT): Use wt constraint for TImode instead of wa.
17330         (BOOL_REGS_OP1): Likewise.
17331         (BOOL_REGS_OP2): Likewise.
17332         (BOOL_REGS_UNARY): Likewise.
17333         (mov<mode>_hardfloat, SFmode/SDmode): Tighten down constraints for
17334         32/64-bit floating point moves.  Do not use wa, instead use ww/ws
17335         for moves involving VSX registers.  Do not use constraints that
17336         target VSX registers for decimal types.
17337         (mov<mode>_hardfloat32, DFmode/DDmode): Likewise.
17338         (mov<mode>_hardfloat64, DFmode/DDmode): Likewise.
17339
17340 2014-09-23  Jan Hubicka  <hubicka@ucw.cz>
17341
17342         * tree.h (int_bit_position): Turn into inline function;
17343         implement using wide int.
17344         * tree.c (int_bit_position): Remove.
17345
17346 2014-09-23  Richard Sandiford  <richard.sandiford@arm.com>
17347
17348         PR bootstrap/63280
17349         * target-globals.c (target_globals::~target_globals): Fix location
17350         of ira_int destruction.
17351
17352 2014-09-23  Renlin Li  <renlin.li@arm.com>
17353
17354         * config/aarch64/aarch64.md (return): New.
17355         (simple_return): Likewise.
17356         * config/aarch64/aarch64.c (aarch64_use_return_insn_p): New.
17357         * config/aarch64/aarch64-protos.h (aarch64_use_return_insn_p): New.
17358
17359 2014-09-23  Wilco Dijkstra  <wdijkstr@arm.com>
17360
17361         * common/config/aarch64/aarch64-common.c:
17362         (default_options aarch_option_optimization_table):
17363         Default to -fsched-pressure.
17364
17365 2014-09-23  Ilya Enkovich  <ilya.enkovich@intel.com>
17366
17367         * cfgcleanup.c (try_optimize_cfg): Do not remove label
17368         with LABEL_PRESERVE_P flag set.
17369
17370 2014-09-23  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17371             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17372             Anna Tikhonova  <anna.tikhonova@intel.com>
17373             Ilya Tocar  <ilya.tocar@intel.com>
17374             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17375             Ilya Verbin  <ilya.verbin@intel.com>
17376             Kirill Yukhin  <kirill.yukhin@intel.com>
17377             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17378
17379         * config/i386/sse.md
17380         (define_expand "avx_shufpd256<mask_expand4_name>"): Add masking.
17381         (define_insn "avx_shufpd256_1<mask_name>"): Ditto.
17382         (define_expand "sse2_shufpd<mask_expand4_name>"): Ditto.
17383         (define_insn "sse2_shufpd_v2df_mask"): New.
17384
17385 2014-09-23  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17386             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17387             Anna Tikhonova  <anna.tikhonova@intel.com>
17388             Ilya Tocar  <ilya.tocar@intel.com>
17389             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17390             Ilya Verbin  <ilya.verbin@intel.com>
17391             Kirill Yukhin  <kirill.yukhin@intel.com>
17392             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17393
17394         * config/i386/sse.md
17395         (define_expand "avx_shufps256<mask_expand4_name>"): Add masking.
17396         (define_insn "avx_shufps256_1<mask_name>"): Ditto.
17397         (define_expand "sse_shufps<mask_expand4_name>"): Ditto.
17398         (define_insn "sse_shufps_v4sf_mask"): New.
17399
17400 2014-09-23  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17401             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17402             Anna Tikhonova  <anna.tikhonova@intel.com>
17403             Ilya Tocar  <ilya.tocar@intel.com>
17404             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17405             Ilya Verbin  <ilya.verbin@intel.com>
17406             Kirill Yukhin  <kirill.yukhin@intel.com>
17407             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17408
17409         * config/i386/sse.md
17410         (define_insn "avx_unpckhps256<mask_name>"): Add masking.
17411         (define_insn "vec_interleave_highv4sf<mask_name>"): Ditto.
17412         (define_insn "avx_unpcklps256<mask_name>"): Ditto.
17413         (define_insn "unpcklps128_mask"): New.
17414
17415 2014-09-23  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17416             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
17417             Anna Tikhonova  <anna.tikhonova@intel.com>
17418             Ilya Tocar  <ilya.tocar@intel.com>
17419             Andrey Turetskiy  <andrey.turetskiy@intel.com>
17420             Ilya Verbin  <ilya.verbin@intel.com>
17421             Kirill Yukhin  <kirill.yukhin@intel.com>
17422             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
17423
17424         * config/i386/sse.md
17425         (define_insn "avx_unpckhpd256<mask_name>"): Add masking.
17426         (define_insn "avx512vl_unpckhpd128_mask"): New.
17427         (define_expand "avx_movddup256<mask_name>"): Add masking.
17428         (define_expand "avx_unpcklpd256<mask_name>"): Ditto.
17429         (define_insn "*avx_unpcklpd256<mask_name>"): Ditto.
17430         (define_insn "avx512vl_unpcklpd128_mask"): New.
17431
17432 2014-09-22  Joseph Myers  <joseph@codesourcery.com>
17433
17434         * doc/tm.texi.in (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17435         * doc/tm.texi: Regenerate.
17436         * system.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Poison.
17437         * config/alpha/alpha.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17438         * config/i386/i386-interix.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE):
17439         Remove.
17440         * config/i386/i386.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17441         * config/i386/rtemself.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17442         * config/ia64/ia64.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17443         * config/m68k/m68k.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17444         * config/m68k/netbsd-elf.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE):
17445         Remove.
17446         * config/mips/mips.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17447         * config/mips/n32-elf.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17448         * config/msp430/msp430.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17449         * config/rl78/rl78.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17450         * config/rs6000/rs6000.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17451         * config/rx/rx.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17452         * config/s390/s390.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17453         * config/sparc/freebsd.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17454         * config/sparc/linux.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17455         * config/sparc/linux64.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Remove.
17456         * config/sparc/netbsd-elf.h (LIBGCC2_LONG_DOUBLE_TYPE_SIZE):
17457         Remove.
17458
17459 2014-09-22  Jan Hubicka  <hubicka@ucw.cz>
17460
17461         * tree-ssa-ccp.c (prop_value_d): Rename to ...
17462         (ccp_prop_value_t): ... this one to avoid ODR violation; update uses.
17463         * ipa-prop.c (struct type_change_info): Rename to ...
17464         (prop_type_change_info): ... this; update uses.
17465         * ggc-page.c (globals): Rename to ...
17466         (static struct ggc_globals): ... this; update uses.
17467         * tree-ssa-loop-im.c (mem_ref): Rename to ...
17468         (im_mem_ref): ... this; update uses.
17469         * ggc-common.c (loc_descriptor): Rename to ...
17470         (ggc_loc_descriptor): ... this; update uses.
17471         * lra-eliminations.c (elim_table): Rename to ...
17472         (lra_elim_table): ... this; update uses.
17473         * bitmap.c (output_info): Rename to ...
17474         (bitmap_output_info): ... this; update uses.
17475         * gcse.c (expr): Rename to ...
17476         (gcse_expr) ... this; update uses.
17477         (occr): Rename to ...
17478         (gcse_occr): .. this; update uses.
17479         * tree-ssa-copy.c (prop_value_d): Rename to ...
17480         (prop_value_t): ... this.
17481         * predict.c (block_info_def): Rename to ...
17482         (block_info): ... this; update uses.
17483         (edge_info_def): Rename to ...
17484         (edge_info): ... this; update uses.
17485         * profile.c (bb_info): Rename to ...
17486         (bb_profile_info): ... this; update uses.
17487         * alloc-pool.c (output_info): Rename to ...
17488         (pool_output_info): ... this; update uses.
17489         * ipa-cp.c (topo_info): Rename to ..
17490         (ipa_topo_info): ... this; update uses.
17491         * tree-nrv.c (nrv_data): Rename to ...
17492         (nrv_data_t): ... this; update uses.
17493         * ipa-split.c (bb_info): Rename to ...
17494         (split_bb_info): ... this one.
17495         * profile.h (edge_info): Rename to ...
17496         (edge_profile_info): ... this one; update uses.
17497         * dse.c (bb_info): Rename to ...
17498         (dse_bb_info): ... this one; update uses.
17499         * cprop.c (occr): Rename to ...
17500         (cprop_occr): ... this one; update uses.
17501         (expr): Rename to ...
17502         (cprop_expr): ... this one; update uses.
17503
17504 2014-09-22  Jason Merrill  <jason@redhat.com>
17505
17506         * Makefile.in (check-parallel-%): Add @.
17507
17508 2014-09-22  James Greenhalgh  <james.greenhalgh@arm.com>
17509
17510         * config/aarch64/geniterators.sh: New.
17511         * config/aarch64/iterators.md (VDQF_DF): New.
17512         * config/aarch64/t-aarch64: Generate aarch64-builtin-iterators.h.
17513         * config/aarch64/aarch64-builtins.c (BUILTIN_*) Remove.
17514
17515 2014-09-22  Peter A. Bigot  <pab@pabigot.com>
17516
17517         * config/msp430/msp430.h (LIB_SPEC): Remove automatic addition of
17518         -lnosys when -msim absent.
17519
17520 2014-09-22  Alan Lawrence  <alan.lawrence@arm.com>
17521
17522         * fold-const.c (tree_swap_operands_p): Strip only sign-preserving NOPs.
17523
17524 2014-09-22  Richard Biener  <rguenther@suse.de>
17525
17526         * gimplify.c (gimplify_init_constructor): Do not leave
17527         non-GIMPLE vector constructors around.
17528         * tree-cfg.c (verify_gimple_assign_single): Verify that
17529         CONSTRUCTORs have gimple elements.
17530
17531 2014-09-22  Jakub Jelinek  <jakub@redhat.com>
17532
17533         PR debug/63328
17534         * omp-low.c (ipa_simd_modify_stmt_ops): For debug stmts
17535         insert a debug source bind stmt setting DEBUG_EXPR_DECL
17536         instead of a normal gimple assignment stmt.
17537
17538 2014-09-22  James Greenhalgh  <james.greenhalgh@arm.com>
17539
17540         * config/bfin/bfin.md: Fix use of constraints in define_split.
17541
17542 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17543
17544         * config/i386/i386.c (ix86_cannot_change_mode_class): Remove
17545         GET_MODE_SIZE (to) < GET_MODE_SIZE (from) test.
17546
17547 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17548
17549         * hard-reg-set.h: Include hash-table.h.
17550         (target_hard_regs): Add a finalize method and a x_simplifiable_subregs
17551         field.
17552         * target-globals.c (target_globals::~target_globals): Call
17553         hard_regs->finalize.
17554         * rtl.h (subreg_shape): New structure.
17555         (shape_of_subreg): New function.
17556         (simplifiable_subregs): Declare.
17557         * reginfo.c (simplifiable_subreg): New structure.
17558         (simplifiable_subregs_hasher): Likewise.
17559         (simplifiable_subregs): New function.
17560         (invalid_mode_changes): Delete.
17561         (alid_mode_changes, valid_mode_changes_obstack): New variables.
17562         (record_subregs_of_mode): Remove subregs_of_mode parameter.
17563         Record valid mode changes in valid_mode_changes.
17564         (find_subregs_of_mode): Remove subregs_of_mode parameter.
17565         Update calls to record_subregs_of_mode.
17566         (init_subregs_of_mode): Remove invalid_mode_changes and bitmap
17567         handling.  Initialize new variables.  Update call to
17568         find_subregs_of_mode.
17569         (invalid_mode_change_p): Check new variables instead of
17570         invalid_mode_changes.
17571         (finish_subregs_of_mode): Finalize new variables instead of
17572         invalid_mode_changes.
17573         (target_hard_regs::finalize): New function.
17574         * ira-costs.c (print_allocno_costs): Call invalid_mode_change_p
17575         even when CLASS_CANNOT_CHANGE_MODE is undefined.
17576
17577 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17578
17579         * combine.c (subst): Use simplify_subreg_regno rather than
17580         REG_CANNOT_CHANGE_MODE_P to detect invalid mode changes.
17581
17582 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17583
17584         * rtl.h (subreg_info): Expand commentary
17585         * rtlanal.c (subreg_get_info): Likewise.
17586
17587 2014-09-22  Richard Sandiford  <richard.sandiford@arm.com>
17588
17589         * hard-reg-set.h (COPY_HARD_REG_SET, COMPL_HARD_REG_SET)
17590         (AND_HARD_REG_SET, AND_COMPL_HARD_REG_SET, IOR_HARD_REG_SET)
17591         (IOR_COMPL_HARD_REG_SET): Allow the "from" set to be constant.
17592
17593 2014-09-22  Zhenqiang Chen  <zhenqiang.chen@arm.com>
17594
17595         * config/arm/arm.c: #include "tm-constrs.h"
17596         (thumb1_size_rtx_costs): Adjust rtx costs.
17597
17598 2014-09-22  Hans-Peter Nilsson  <hp@axis.com>
17599
17600         * configure.ac (target_header_dir): Move block defining
17601         this to before the block setting inhibit_libc.
17602         (inhibit_libc): When considering $with_headers, just
17603         check it it's explicitly "no".  If not, also check if
17604         $target_header_dir/stdio.h is present.  If not, set
17605         inhibit_libc=true.
17606         * configure: Regenerate.
17607
17608 2014-09-21  Patrick Oppenlander  <pattyo.lists@gmail.com>
17609
17610         * config/rs6000/t-spe (MULTILIB_EXCEPTIONS): Allow isel without SPE.
17611
17612 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17613
17614         * config/rs6000/rs6000.md (div<mode>3): Fix comment.  Use a different
17615         insn for divides by integer powers of two.
17616         (div<mode>3_sra, *div<mode>3_sra_dot, *div<mode>3_sra_dot2): New.
17617         (mod<mode>3): Fix formatting.
17618         (three anonymous define_insn and two define_split): Delete.
17619
17620 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17621
17622         * config/rs6000/rs6000.md (ashr<mode>3, *ashr<mode>3, *ashrsi3_64,
17623         *ashr<mode>3_dot, *ashr<mode>3_dot2): Clobber CA_REGNO.
17624         (floatdisf2_internal2): Ditto.
17625         (ashrdi3_no_power): Ditto.  Fix formatting.
17626
17627 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17628
17629         * config/rs6000/rs6000.md (ctz<mode>2, ffs<mode>2, popcount<mode>2,
17630         popcntb<mode>2, popcntd<mode>2, parity<mode>2, parity<mode>2_cmpb):
17631         Tidy.
17632
17633 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17634
17635         * config/rs6000/rs6000.md (strlensi): Don't use subsi3 with a
17636         constant, use addsi3 directly.
17637         (three anonymous define_insn, two define_split): Delete.
17638         (sub<mode>3): Move.  Do not allow constant second operand.
17639         Generate different insn for constant first operand.
17640         (*subf<mode>3, *subf<mode>3_dot, *subf<mode>3_dot2): New.
17641         (subf<mode>3_imm): New.
17642         (ctz<mode>2, ffs<mode>2): Clobber CA_REGNO where required.
17643         (*plus_ltu<mode>): Only handle registers.
17644         (*plus_ltu<mode>_1): New.  Handle integer third operand.
17645         (*plus_gtu<mode>): Only handle registers.
17646         (*plus_gtu<mode>_1): New.  Handle integer third operand.
17647
17648 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17649
17650         * config/rs6000/rs6000.md (iorxor): New code_iterator.
17651         (iorxor): New code_attr.
17652         (IORXOR): New code_attr.
17653         (*and<mode>3, *and<mode>3_dot, *and<mode>3_dot2): Delete.
17654         (ior<mode>3, xor<mode>3): Delete.
17655         (<iorxor><mode>3): New.
17656         (splitter for "big" integer ior, xor): New.
17657         (*bool<mode>3): Move.  Also handle AND.
17658         (*bool<mode>3_dot, *bool<mode>3_dot2): Also handle AND.
17659         (splitter for "big" integer ior, xor): Delete.
17660
17661 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17662
17663         * config/rs6000/rs6000.md (*neg<mode>2_internal): Delete.
17664         (two anonymous define_insn and two define_split): Delete.
17665         (*neg<mode>2, *neg<mode>2_dot, *neg<mode>2_dot2): New.
17666
17667 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17668
17669         * config/rs6000/rs6000.md (*one_cmpl<mode>2): Generate "not" insn.
17670         (two anonymous define_insn and two define_split): Delete.
17671         (*one_cmpl<mode>2_dot, *one_cmpl<mode>2_dot2): New.
17672
17673 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17674
17675         * config/rs6000/rs6000.c (rs6000_rtx_costs) <NE>: New.
17676
17677 2014-09-21  Segher Boessenkool  <segher@kernel.crashing.org>
17678
17679         * config/rs6000/predicates.md (ca_operand): Allow subregs.
17680         (input_operand): Do not allow ca_operand.
17681         * config/rs6000/rs6000.c (rs6000_hard_regno_mode_ok): For the
17682         carry bit, allow SImode and Pmode.
17683         (rs6000_init_hard_regno_mode_ok): Make the carry bit class NO_REGS.
17684
17685 2014-09-21  Uros Bizjak  <ubizjak@gmail.com>
17686
17687         * config/i386/i386.c (ix86_expand_call): Generate MS->SYSV extra
17688         clobbered registers using clobber_reg.  Remove UNSPEC decoration.
17689         * config/i386/i386.md (unspec) <UNSPEC_MS_TO_SYSV_CALL>: Remove.
17690         (*call_rex64_ms_sysv): Remove.
17691         (*call_value_rex64_ms_sysv): Ditto.
17692         * config/i386/predicates.md (call_rex64_ms_sysv_operation): Remove.
17693
17694 2014-09-20  Joern Rennecke  <joern.rennecke@embecosm.com>
17695
17696         * config/epiphany/epiphany.md (sub_f_add_imm): Change constraint of
17697         operand 3 to "CnL".
17698
17699 2014-09-20  Andreas Schwab  <schwab@suse.de>
17700
17701         * config/ia64/ia64.md: Remove constraints from define_split
17702         patterns.
17703
17704 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17705
17706         * ipa-utils.h (ipa_polymorphic_call_context): Turn into class;
17707         add ctors.
17708         (possible_polymorphic_call_targets,
17709         dump_possible_polymorphic_call_targets,
17710         possible_polymorphic_call_target_p,
17711         possible_polymorphic_call_target_p): Simplify.
17712         (get_dynamic_type): Remove.
17713         * ipa-devirt.c (ipa_dummy_polymorphic_call_context): Remove.
17714         (clear_speculation): Bring to ipa-deivrt.h
17715         (get_class_context): Rename to ...
17716         (ipa_polymorphic_call_context::restrict_to_inner_class): ... this one.
17717         (contains_type_p): Update.
17718         (get_dynamic_type): Rename to ...
17719         ipa_polymorphic_call_context::get_dynamic_type(): ... this one.
17720         (possible_polymorphic_call_targets): UPdate.
17721         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children): Update.
17722         * ipa-prop.c (ipa_analyze_call_uses): Update.
17723
17724 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17725
17726         * ipa-visibility.c (varpool_node::externally_visible_p): Do not
17727         privatize dynamic TLS variables.
17728
17729 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17730
17731         * diagnostic.c (warning_n): New function.
17732         * diagnostic-core.h (warning_n): Declare.
17733         * ipa-devirt.c (ipa_devirt): Handle singulars correctly;
17734         output dynamic counts when available.
17735
17736 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17737
17738         PR tree-optimization/63255
17739         * ipa.c (symbol_table::remove_unreachable_nodes): Fix ordering
17740         issue in setting body_removed flag.
17741
17742 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17743
17744         PR c++/61825
17745         * c-family/c-common.c (handle_alias_ifunc_attribute): Check
17746         that visibility change is possible
17747         (handle_weakref_attribute): Likewise.
17748         * cgraph.h (symtab_node): Add method get_create and
17749         field refuse_visibility_changes.
17750         (symtab_node::get_create): New method.
17751         * fold-const.c (tree_single_nonzero_warnv_p): Use get_create.
17752         * varasm.c (mark_weak): Verify that visibility change is possible.
17753
17754 2014-09-19  Michael Meissner  <meissner@linux.vnet.ibm.com>
17755
17756         * config/rs6000/predicates.md (fusion_gpr_mem_load): Move testing
17757         for base_reg_operand to be common between LO_SUM and PLUS.
17758         (fusion_gpr_mem_combo): New predicate to match a fused address
17759         that combines the addis and memory offset address.
17760
17761         * config/rs6000/rs6000-protos.h (fusion_gpr_load_p): Change
17762         calling signature.
17763         (emit_fusion_gpr_load): Likewise.
17764
17765         * config/rs6000/rs6000.c (fusion_gpr_load_p): Change calling
17766         signature to pass each argument separately, rather than
17767         using an operands array.  Rewrite the insns found by peephole2 to
17768         be a single insn, rather than hoping the insns will still be
17769         together when the peephole pass is done.  Drop being called via a
17770         normal peephole.
17771         (emit_fusion_gpr_load): Change calling signature to be called from
17772         the fusion_gpr_load_<mode> insns with a combined memory address
17773         instead of the peephole pass passing the addis and offset
17774         separately.
17775
17776         * config/rs6000/rs6000.md (UNSPEC_FUSION_GPR): New unspec for GPR
17777         fusion.
17778         (power8 fusion peephole): Drop support for doing power8 via a
17779         normal peephole that was created by the peephole2 pass.
17780         (power8 fusion peephole2): Create a new insn with the fused
17781         address, so that the fused operation is kept together after
17782         register allocation is done.
17783         (fusion_gpr_load_<mode>): Likewise.
17784
17785 2014-09-19  Jan Hubicka  <hubicka@ucw.cz>
17786
17787         PR lto/63286
17788         * tree.c (need_assembler_name_p): Do not mangle variadic types.
17789
17790 2014-09-19  Segher Boessenkool  <segher@kernel.crashing.org>
17791
17792         * recog.c (scratch_operand): Do not simply allow all hard registers:
17793         only allow those that are allocatable.
17794
17795 2014-09-19  Felix Yang  <felix.yang@huawei.com>
17796
17797         * cfgrtl.c ira.c ira-color.c ira-conflicts ira-lives.c: Update
17798         comments and fix spacing to conform to coding style.
17799
17800 2014-09-19  James Greenhalgh  <james.greenhalgh@arm.com>
17801
17802         * genrecog.c (validate_pattern): Allow empty constraints in
17803         a match_scratch.
17804
17805 2014-09-19  Aldy Hernandez  <aldyh@redhat.com>
17806
17807         * dwarf2out.c (decl_ultimate_origin): Update comment.
17808         * tree.c (block_ultimate_origin): Same.
17809
17810 2014-09-19  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
17811
17812         * config/rs6000/rs6000.c (rs6000_special_adjust_field_align_p):
17813         Update GCC version name to GCC 5.
17814         (rs6000_function_arg_boundary): Likewise.
17815         (rs6000_function_arg): Likewise.
17816
17817 2014-09-19  James Greenhalgh  <james.greenhalgh@arm.com>
17818
17819         * config/sh/sh.md: Fix use of constraints in define_split.
17820
17821 2014-09-19  Markus Trippelsdorf  <markus@trippelsdorf.de>
17822
17823         PR ipa/61998
17824         * ipa-devirt.c (ipa_devirt): Bail out if odr_types_ptr is NULL.
17825
17826 2014-09-19  James Greenhalgh  <james.greenhalgh@arm.com>
17827
17828         * doc/md.texi (Modifiers): Consistently use "read/write"
17829         nomenclature rather than "input/output".
17830         * genrecog.c (constraints_supported_in_insn_p): New.
17831         (validate_pattern): If needed, also check constraints on
17832         MATCH_SCRATCH operands.
17833         * genoutput.c (validate_insn_alternatives): Catch earlyclobber
17834         operands with no '=' or '+' modifier.
17835
17836 2014-09-19  James Greenhalgh  <james.greenhalgh@arm.com>
17837
17838         * config/aarch64/aarch64.md (stack_protect_test_<mode>): Mark
17839         scratch register as written.
17840
17841 2014-09-19  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
17842
17843         * config/s390/s390.c (s390_emit_epilogue): Remove bogus
17844         assignment.
17845
17846 2014-09-19  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
17847
17848         * config/s390/s390.md ("trunctdsd2", "extendsdtd2"): New
17849         expanders.
17850
17851 2014-09-19  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
17852
17853         PR target/62662
17854         * config/s390/s390.c (s390_emit_epilogue): When doing the return
17855         address load optimization force s390_optimize_prologue to leave it
17856         that way.  Only do the optimization if we already decided to push
17857         r14 into a stack slot.
17858
17859 2014-09-19  Marat Zakirov  <m.zakirov@samsung.com>
17860
17861         * asan.c (build_check_stmt): Alignment arg was added.
17862         (asan_expand_check_ifn): Optimization for alignment >= 8.
17863
17864 2014-09-19  Olivier Hainque  <hainque@adacore.com>
17865
17866         * config/i386/vxworksae.h: Remove obsolete definitions.
17867         (STACK_CHECK_PROTECT): Define.
17868         * config/i386/vx-common.h: Remove.  Merge contents within
17869         config/i386/vxworks.h.
17870         * config.gcc (i?86-vxworks*): Use i386/vxworks.h instead of
17871         i386/vx-common.h.
17872
17873 2014-09-19  Olivier Hainque  <hainque@adacore.com>
17874
17875         * config.gcc (powerpc-wrs-vxworksmils): New configuration.
17876         * config/rs6000/t-vxworksmils: New file.
17877         * config/rs6000/vxworksmils.h: New file.
17878
17879 2014-09-19  Olivier Hainque  <hainque@adacore.com>
17880
17881         * varasm.c (default_section_type_flags): Flag .persistent.bss
17882         sections as SECTION_BSS.
17883
17884 2014-09-19  Nick Clifton  <nickc@redhat.com>
17885
17886         * config/rl78/rl78.c (rl78_expand_epilogue): Generate a USE of the
17887         pop'ed registers so that DCE does not eliminate them.
17888
17889 2014-09-18  Jan Hubicka  <hubicka@ucw.cz>
17890
17891         PR lto/63298
17892         * ipa-devirt.c (odr_subtypes_equivalent_p): Fix thinko in a condition.
17893
17894 2014-09-18  Joseph Myers  <joseph@codesourcery.com>
17895
17896         * system.h (LIBGCC2_TF_CEXT): Poison.
17897         * config/i386/cygming.h (LIBGCC2_TF_CEXT): Remove.
17898         * config/i386/darwin.h (LIBGCC2_TF_CEXT): Likewise.
17899         * config/i386/dragonfly.h (LIBGCC2_TF_CEXT): Likewise.
17900         * config/i386/freebsd.h (LIBGCC2_TF_CEXT): Likewise.
17901         * config/i386/gnu-user-common.h (LIBGCC2_TF_CEXT): Likewise.
17902         * config/i386/openbsdelf.h (LIBGCC2_TF_CEXT): Likewise.
17903         * config/i386/sol2.h (LIBGCC2_TF_CEXT): Likewise.
17904         * config/ia64/ia64.h (LIBGCC2_TF_CEXT): Likewise.
17905         * config/ia64/linux.h (LIBGCC2_TF_CEXT): Likewise.
17906
17907 2014-09-19  Kito Cheng  <kito@0xlab.org>
17908
17909         * except.h: Fix header guard.
17910         * addresses.h: Add missing header guard.
17911         * cfghooks.h: Likewise.
17912         * collect-utils.h: Likewise.
17913         * collect2-aix.h: Likewise.
17914         * conditions.h: Likewise.
17915         * cselib.h: Likewise.
17916         * dwarf2asm.h: Likewise.
17917         * graphds.h: Likewise.
17918         * graphite-scop-detection.h: Likewise.
17919         * gsyms.h: Likewise.
17920         * hw-doloop.h: Likewise.
17921         * incpath.h: Likewise.
17922         * ipa-inline.h: Likewise.
17923         * ipa-ref.h: Likewise.
17924         * ira-int.h: Likewise.
17925         * ira.h: Likewise.
17926         * lra-int.h: Likewise.
17927         * lra.h: Likewise.
17928         * lto-section-names.h: Likewise.
17929         * read-md.h: Likewise.
17930         * reload.h: Likewise.
17931         * rtl-error.h: Likewise.
17932         * sdbout.h: Likewise.
17933         * targhooks.h: Likewise.
17934         * tree-affine.h: Likewise.
17935         * xcoff.h: Likewise.
17936         * xcoffout.h: Likewise.
17937
17938 2014-09-18  Vladimir Makarov  <vmakarov@redhat.com>
17939
17940         PR debug/63285
17941         * haifa-sched.c (schedule_block): Advance cycle at the end of BB
17942         if advance != 0.
17943
17944 2014-09-18  Vladimir Makarov  <vmakarov@redhat.com>
17945
17946         PR target/61360
17947         * lra.c (lra): Call recog_init.
17948
17949 2014-09-18  Jakub Jelinek  <jakub@redhat.com>
17950
17951         PR c++/62017
17952         * asan.c (transform_statements): Don't instrument clobber statements.
17953
17954 2014-09-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
17955
17956         * config/arm/neon.md (*movmisalign<mode>_neon_load): Change type
17957         to neon_load1_1reg<q>.
17958
17959 2014-09-17  Jakub Jelinek  <jakub@redhat.com>
17960
17961         PR debug/63284
17962         * tree-cfgcleanup.c (fixup_noreturn_call): Don't split block
17963         if there are only debug stmts after the noreturn call, instead
17964         remove the debug stmts.
17965
17966 2014-09-17  Jan Hubicka  <hubicka@ucw.cz>
17967
17968         * ipa-devirt.c (type_pair, default_hashset_traits): New types.
17969         (odr_types_equivalent_p): Use pair hash.
17970         (odr_subtypes_equivalent_p): Likewise, do structural compare
17971         on ODR types that may be mismatched.
17972         (warn_odr): Support warning when only one field is given.
17973         (odr_types_equivalent_p): Strenghten comparsions made;
17974         support VOIDtype.
17975         (add_type_duplicate): Update VISITED hash set.
17976
17977 2014-09-17  Sebastian Huber  <sebastian.huber@embedded-brains.de>
17978
17979         * config.gcc (*-*-rtems*): Default to 'rtems' thread model.
17980         Enable selection of 'posix' or no thread model.
17981
17982 2014-09-17  Andrew Stubbs  <ams@codesourcery.com>
17983
17984         * config/arm/arm.c (arm_option_override): Reject -mfpu=neon
17985         when architecture is older than ARMv7.
17986
17987 2014-09-16  John David Anglin  <danglin@gcc.gnu.org>
17988
17989         PR target/61853
17990         * config/pa/pa.c (pa_function_value): Directly handle aggregates
17991         that fit exactly in a word or double word.
17992
17993 2014-09-16  Ilya Tocar  <ilya.tocar@intel.com>
17994
17995         * config/i386/driver-i386.c (host_detect_local_cpu): Detect lack of
17996         zmm/k regs support.
17997
17998 2014-09-16  Alexander Ivchenko  <alexander.ivchenko@intel.com>
17999             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18000             Anna Tikhonova  <anna.tikhonova@intel.com>
18001             Ilya Tocar  <ilya.tocar@intel.com>
18002             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18003             Ilya Verbin  <ilya.verbin@intel.com>
18004             Kirill Yukhin  <kirill.yukhin@intel.com>
18005             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18006
18007         * config/i386/i386.c
18008         (ix86_expand_vector_extract): Handle V32HI and V64QI modes.
18009         * config/i386/sse.md
18010         (define_mode_iterator VI48F_256): New.
18011         (define_mode_attr extract_type): Ditto.
18012         (define_mode_attr extract_suf): Ditto.
18013         (define_mode_iterator AVX512_VEC): Ditto.
18014         (define_expand
18015         "<extract_type>_vextract<shuffletype><extract_suf>_mask"): Use
18016         AVX512_VEC.
18017         (define_insn "avx512dq_vextract<shuffletype>64x2_1_maskm"): New.
18018         (define_insn
18019         "<mask_codefor>avx512dq_vextract<shuffletype>64x2_1<mask_name>"):
18020         Ditto.
18021         (define_mode_attr extract_type_2): Ditto.
18022         (define_mode_attr extract_suf_2): Ditto.
18023         (define_mode_iterator AVX512_VEC_2): Ditto.
18024         (define_expand
18025         "<extract_type_2>_vextract<shuffletype><extract_suf_2>_mask"): Use
18026         AVX512_VEC_2 mode iterator.
18027         (define_insn "vec_extract_hi_<mode>_maskm"): Ditto.
18028         (define_expand "avx512vl_vextractf128<mode>"): Ditto.
18029         (define_insn_and_split "vec_extract_lo_<mode>"): Delete.
18030         (define_insn "vec_extract_lo_<mode><mask_name>"): New.
18031         (define_split for V16FI mode): Ditto.
18032         (define_insn_and_split "vec_extract_lo_<mode>"): Delete.
18033         (define_insn "vec_extract_lo_<mode><mask_name>"): New.
18034         (define_split for VI8F_256 mode): Ditto.
18035         (define_insn "vec_extract_hi_<mode><mask_name>"): Add masking.
18036         (define_insn_and_split "vec_extract_lo_<mode>"): Delete.
18037         (define_insn "vec_extract_lo_<mode><mask_name>"): New.
18038         (define_split for VI4F_256 mode): Ditto.
18039         (define_insn "vec_extract_lo_<mode>_maskm"): Ditto.
18040         (define_insn "vec_extract_hi_<mode>_maskm"): Ditto.
18041         (define_insn "vec_extract_hi_<mode><mask_name>"): Add masking.
18042         (define_mode_iterator VEC_EXTRACT_MODE): Add V64QI and V32HI modes.
18043         (define_insn "vcvtph2ps<mask_name>"): Fix pattern condition.
18044         (define_insn "avx512f_vextract<shuffletype>32x4_1_maskm"): Ditto.
18045         (define_insn "<mask_codefor>avx512f_vextract<shuffletype>32x4_1<mask_name>"):
18046         Update `type' attribute, remove explicit `memory' attribute calculation.
18047
18048 2014-09-16  Kito Cheng  <kito@0xlab.org>
18049
18050         * ira.c (ira): Don't initialize ira_spilled_reg_stack_slots and
18051         ira_spilled_reg_stack_slots_num if using lra.
18052         (do_reload): Remove release ira_spilled_reg_stack_slots part.
18053         * ira-color.c (ira_sort_regnos_for_alter_reg): Add assertion to
18054         make sure not using lra.
18055         (ira_reuse_stack_slot): Likewise.
18056         (ira_mark_new_stack_slot): Likewise.
18057
18058 2014-09-15  Andi Kleen  <ak@linux.intel.com>
18059
18060         * function.c (allocate_struct_function): Force
18061         DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT to one when
18062         profiling is disabled.
18063
18064 2014-09-15  Trevor Saunders  <tsaunders@mozilla.com>
18065
18066         * cfgrtl.c, combine.c, config/arc/arc.c, config/mcore/mcore.c,
18067         config/rs6000/rs6000.c, config/sh/sh.c, cprop.c, dwarf2out.c,
18068         emit-rtl.c, final.c, function.c, gcse.c, jump.c, reg-stack.c,
18069         reload1.c, reorg.c, resource.c, sel-sched-ir.c: Replace INSN_DELETED_P
18070         macro with statically checked member functions.
18071         * rtl.h (rtx_insn::deleted): New method.
18072         (rtx_insn::set_deleted): Likewise.
18073         (rtx_insn::set_undeleted): Likewise.
18074         (INSN_DELETED_P): Remove.
18075
18076 2014-09-15  Trevor Saunders  <tsaunders@mozilla.com>
18077
18078         * config/mn10300/mn10300.c (mn10300_insert_setlb_lcc): Assign the
18079         result of emit_jump_insn_before to a new variable.
18080         * jump.c (mark_jump_label): Change the type of insn to rtx_insn *.
18081         (mark_jump_label_1): Likewise.
18082         (mark_jump_label_asm): Likewise.
18083         * reload1.c (gen_reload): Change type of tem to rtx_insn *.
18084         * rtl.h (mark_jump_label): Adjust.
18085
18086 2014-09-15  Jakub Jelinek  <jakub@redhat.com>
18087
18088         * Makefile.in (dg_target_exps): Remove.
18089         (check_gcc_parallelize): Change to just an upper bound number.
18090         (check-%-subtargets): Always print the non-parallelized goals.
18091         (check_p_vars, check_p_comma, check_p_subwork): Remove.
18092         (check_p_count, check_p_numbers0, check_p_numbers1, check_p_numbers2,
18093         check_p_numbers3, check_p_numbers4, check_p_numbers5,
18094         check_p_numbers6): New variables.
18095         (check_p_numbers): Set to sequence from 1 to 9999.
18096         (check_p_subdirs): Set to sequence from 1 to minimum of
18097         $(check_p_count) and either GCC_TEST_PARALLEL_SLOTS env var if set,
18098         or 128.
18099         (check-%, check-parallel-%): Rewritten so that for parallelized
18100         testing each job runs all the *.exp files, with
18101         GCC_RUNTEST_PARALLELIZE_DIR set in environment.
18102
18103 2014-09-15  David Malcolm  <dmalcolm@redhat.com>
18104
18105         * config/arc/arc-protos.h (arc_attr_type): Strengthen param from
18106         rtx to rtx_insn *.
18107         (arc_sets_cc_p): Likewise.
18108         * config/arc/arc.c (arc_print_operand): Use methods of
18109         "final_sequence" for clarity, and to enable strengthening of
18110         locals "jump" and "delay" from rtx to rtx_insn *.
18111         (arc_adjust_insn_length): Strengthen local "prev" from rtx to
18112         rtx_insn *; use method of rtx_sequence for typesafety.
18113         (arc_get_insn_variants): Use insn method of rtx_sequence for
18114         typesafety.
18115         (arc_pad_return): Likewise.
18116         (arc_attr_type): Strengthen param from rtx to rtx_insn *.
18117         (arc_sets_cc_p): Likewise.  Also, convert a GET_CODE check to a
18118         dyn_cast to rtx_sequence *, using insn method for typesafety.
18119         * config/arc/arc.h (ADJUST_INSN_LENGTH): Add checked casts to
18120         rtx_sequence * and use insn method when invoking get_attr_length.
18121         * config/bfin/bfin.c (type_for_anomaly): Strengthen param from rtx
18122         to rtx_insn *.  Replace a GET_CODE check with a dyn_cast to
18123         rtx_sequence *, introducing a local "seq", using its insn method
18124         from typesafety and clarity.
18125         (add_sched_insns_for_speculation): Strengthen local "next" from
18126         rtx to rtx_insn *.
18127         * config/c6x/c6x.c (get_insn_side): Likewise for param "insn".
18128         (predicate_insn): Likewise.
18129         * config/cris/cris-protos.h (cris_notice_update_cc): Likewise for
18130         second param.
18131         * config/cris/cris.c (cris_notice_update_cc): Likewise.
18132         * config/epiphany/epiphany-protos.h
18133         (extern void epiphany_insert_mode_switch_use): Likewise for param
18134         "insn".
18135         (get_attr_sched_use_fpu): Likewise for param.
18136         * config/epiphany/epiphany.c (epiphany_insert_mode_switch_use):
18137         Likewise for param "insn".
18138         * config/epiphany/mode-switch-use.c (insert_uses): Likewise for
18139         param "insn" of "target_insert_mode_switch_use" callback.
18140         * config/frv/frv.c (frv_insn_unit): Likewise for param "insn".
18141         (frv_issues_to_branch_unit_p): Likewise.
18142         (frv_pack_insn_p): Likewise.
18143         (frv_compare_insns): Strengthen locals "insn1" and "insn2" from
18144         const rtx * (i.e. mutable rtx_def * const *) to
18145         rtx_insn * const *.
18146         * config/i386/i386-protos.h (standard_sse_constant_opcode):
18147         Strengthen first param from rtx to rtx_insn *.
18148         (output_fix_trunc): Likewise.
18149         * config/i386/i386.c (standard_sse_constant_opcode): Likewise.
18150         (output_fix_trunc): Likewise.
18151         (core2i7_first_cycle_multipass_filter_ready_try): Likewise for
18152         local "insn".
18153         (min_insn_size): Likewise for param "insn".
18154         (get_mem_group): Likewise.
18155         (is_cmp): Likewise.
18156         (get_insn_path): Likewise.
18157         (get_insn_group): Likewise.
18158         (count_num_restricted): Likewise.
18159         (fits_dispatch_window): Likewise.
18160         (add_insn_window): Likewise.
18161         (add_to_dispatch_window): Likewise.
18162         (debug_insn_dispatch_info_file): Likewise.
18163         * config/m32c/m32c-protos.h (m32c_output_compare): Likewise for
18164         first param.
18165         * config/m32c/m32c.c (m32c_compare_redundant): Likewise for param
18166         "cmp" and local "prev".
18167         (m32c_output_compare): Likewise for param "insn".
18168         * config/m32r/predicates.md (define_predicate "small_insn_p"): Add
18169         a checked cast to rtx_insn * on "op" after we know it's an INSN_P.
18170         (define_predicate "large_insn_p"): Likewise.
18171         * config/m68k/m68k-protos.h (m68k_sched_attr_size): Strengthen
18172         param from rtx to rtx_insn *.
18173         (attr_op_mem m68k_sched_attr_op_mem): Likewise.
18174         * config/m68k/m68k.c (sched_get_attr_size_int): Likewise.
18175         (m68k_sched_attr_size): Likewise.
18176         (sched_get_opxy_mem_type): Likewise for param "insn".
18177         (m68k_sched_attr_op_mem): Likewise.
18178         (sched_mem_operand_p): Likewise.
18179         * config/mep/mep-protos.h (mep_multi_slot): Likewise for param.
18180         * config/mep/mep.c (mep_multi_slot): Likewise.
18181         * config/mips/mips-protos.h (mips_output_sync_loop): Likewise for
18182         first param.
18183         (mips_sync_loop_insns): Likewise.
18184         * config/mips/mips.c (mips_print_operand_punctuation): Use insn
18185         method of "final_sequence" for typesafety.
18186         (mips_process_sync_loop): Strengthen param "insn" from rtx to
18187         rtx_insn *.
18188         (mips_output_sync_loop): Likewise.
18189         (mips_sync_loop_insns): Likewise.
18190         (mips_74k_agen_init): Likewise.
18191         (mips_sched_init): Use NULL rather than NULL_RTX when working with
18192         insns.
18193         * config/nds32/nds32-fp-as-gp.c (nds32_symbol_load_store_p):
18194         Strengthen param "insn" from rtx to rtx_insn *.
18195         * config/nds32/nds32.c (nds32_target_alignment): Likewise for
18196         local "insn".
18197         * config/pa/pa-protos.h (pa_insn_refs_are_delayed): Likewise for param.
18198         * config/pa/pa.c (pa_output_function_epilogue): Likewise for local
18199         "insn".  Use method of rtx_sequence for typesafety.
18200         (branch_to_delay_slot_p): Strengthen param "insn" from rtx to
18201         rtx_insn *.
18202         (branch_needs_nop_p): Likewise.
18203         (use_skip_p): Likewise.
18204         (pa_insn_refs_are_delayed): Likewise.
18205         * config/rl78/rl78.c (rl78_propogate_register_origins): Likewise
18206         for locals "insn", "ninsn".
18207         * config/rs6000/rs6000.c (is_microcoded_insn): Likewise for param
18208         "insn".
18209         (is_cracked_insn): Likewise.
18210         (is_branch_slot_insn): Likewise.
18211         (is_nonpipeline_insn): Likewise.
18212         (insn_terminates_group_p): Likewise.
18213         (insn_must_be_first_in_group): Likewise.
18214         (insn_must_be_last_in_group): Likewise.
18215         (force_new_group): Likewise for param "next_insn".
18216         * config/s390/s390.c (s390_get_sched_attrmask): Likewise for param
18217         "insn".
18218         (s390_sched_score): Likewise.
18219         * config/sh/sh-protos.h (output_branch): Likewise for param 2.
18220         (rtx sfunc_uses_reg): Likewise for sole param.
18221         * config/sh/sh.c (sh_print_operand): Use insn method of
18222         final_sequence for typesafety.
18223         (output_branch): Strengthen param "insn" from rtx to rtx_insn *.
18224         Use insn method of final_sequence for typesafety.
18225         (sfunc_uses_reg): Strengthen param "insn" from rtx to rtx_insn *.
18226         * config/sparc/sparc-protos.h (eligible_for_call_delay): Likewise
18227         for param.
18228         (eligible_for_return_delay): Likewise.
18229         (eligible_for_sibcall_delay): Likewise.
18230         * config/sparc/sparc.c (eligible_for_call_delay): Likewise.
18231         (eligible_for_return_delay): Likewise.
18232         (eligible_for_sibcall_delay): Likewise.
18233         * config/stormy16/stormy16-protos.h
18234         (xstormy16_output_cbranch_hi): Likewise for final param.
18235         (xstormy16_output_cbranch_si): Likewise.
18236         * config/stormy16/stormy16.c (xstormy16_output_cbranch_hi): LIkewise.
18237         (xstormy16_output_cbranch_si): Likewise.
18238         * config/v850/v850-protos.h (notice_update_cc): Likewise.
18239         * config/v850/v850.c (notice_update_cc): Likewise.
18240
18241         * final.c (get_attr_length_1): Strengthen param "insn" and param
18242         of "fallback_fn" from rtx to rtx_insn *, eliminating a checked cast.
18243         (get_attr_length): Strengthen param "insn" from rtx to rtx_insn *.
18244         (get_attr_min_length): Likewise.
18245         (shorten_branches): Likewise for signature of locals "length_fun"
18246         and "inner_length_fun".  Introduce local rtx_sequence * "seqn"
18247         from a checked cast and use its methods for clarity and to enable
18248         strengthening local "inner_insn" from rtx to rtx_insn *.
18249         * genattr.c (gen_attr): When writing out the prototypes of the
18250         various generated "get_attr_" functions, strengthen the params of
18251         the non-const functions from rtx to rtx_insn *.
18252         Similarly, strengthen the params of insn_default_length,
18253         insn_min_length, insn_variable_length_p, insn_current_length.
18254         (main): Similarly, strengthen the param of num_delay_slots,
18255         internal_dfa_insn_code, insn_default_latency, bypass_p,
18256         insn_latency, min_issue_delay, print_reservation,
18257         insn_has_dfa_reservation_p and of the "internal_dfa_insn_code" and
18258         "insn_default_latency" callbacks.  Rename hook_int_rtx_unreachable
18259         to hook_int_rtx_insn_unreachable.
18260         * genattrtab.c (write_attr_get): When writing out the generated
18261         "get_attr_" functions, strengthen the param "insn" from rtx to
18262         rtx_insn *, eliminating a checked cast.
18263         (make_automaton_attrs): When writing out prototypes of
18264         "internal_dfa_insn_code_", "insn_default_latency_" functions
18265         and the "internal_dfa_insn_code" and "insn_default_latency"
18266         callbacks, strengthen their params from rtx to rtx_insn *
18267         * genautomata.c (output_internal_insn_code_evaluation): When
18268         writing out code, add a checked cast from rtx to rtx_insn * when
18269         invoking DFA_INSN_CODE_FUNC_NAME aka dfa_insn_code.
18270         (output_dfa_insn_code_func): Strengthen param of generated
18271         function "dfa_insn_code_enlarge" from rtx to rtx_insn *.
18272         (output_trans_func): Likewise for generated function
18273         "state_transition".
18274         (output_internal_insn_latency_func): When writing out generated
18275         function "internal_insn_latency", rename params from "insn" and
18276         "insn2" to "insn_or_const0" and "insn2_or_const0".  Reintroduce
18277         locals "insn" and "insn2" as rtx_insn * with checked casts once
18278         we've proven that we're not dealing with const0_rtx.
18279         (output_insn_latency_func):  Strengthen param of generated
18280         function "insn_latency" from rtx to rtx_insn *.
18281         (output_print_reservation_func): Likewise for generated function
18282         "print_reservation".
18283         (output_insn_has_dfa_reservation_p): Likewise for generated
18284         function "insn_has_dfa_reservation_p".
18285         * hooks.c (hook_int_rtx_unreachable): Rename to...
18286         (hook_int_rtx_insn_unreachable): ...this, and strengthen param
18287         from rtx to rtx_insn *.
18288         * hooks.h (hook_int_rtx_unreachable): Likewise.
18289         (extern int hook_int_rtx_insn_unreachable): Likewise.
18290         * output.h (get_attr_length): Strengthen param from rtx to rtx_insn *.
18291         (get_attr_min_length): Likewise.
18292         * recog.c (get_enabled_alternatives): Likewise.
18293         * recog.h (alternative_mask get_enabled_alternatives): Likewise.
18294         * reorg.c (find_end_label): Introduce local rtx "pat" and
18295         strengthen local "insn" from rtx to rtx_insn *.
18296         (redundant_insn): Use insn method of "seq" rather than element for
18297         typesafety; strengthen local "control" from rtx to rtx_insn *.
18298         * resource.c (mark_referenced_resources): Add checked cast to
18299         rtx_insn * within INSN/JUMP_INSN case.
18300         (mark_set_resources): Likewise.
18301         * sel-sched.c (estimate_insn_cost): Strengthen param "insn" from
18302         rtx to rtx_insn *.
18303
18304 2014-09-15  David Malcolm  <dmalcolm@redhat.com>
18305
18306         * config/rs6000/rs6000.c (rs6000_loop_align_max_skip): Strengthen
18307         param "label" from rtx to rtx_insn *.
18308         * config/rx/rx.c (rx_max_skip_for_label): Likewise for param "lab"
18309         and local "op".
18310         * doc/tm.texi (TARGET_ASM_JUMP_ALIGN_MAX_SKIP): Autogenerated changes.
18311         (TARGET_ASM_LABEL_ALIGN_AFTER_BARRIER_MAX_SKIP): Likewise.
18312         (TARGET_ASM_LOOP_ALIGN_MAX_SKIP): Likewise.
18313         (TARGET_ASM_LABEL_ALIGN_MAX_SKIP): Likewise.
18314         * final.c (default_label_align_after_barrier_max_skip): Strengthen
18315         param from rtx to rtx_insn *.
18316         (default_loop_align_max_skip): Likewise.
18317         (default_label_align_max_skip): Likewise.
18318         (default_jump_align_max_skip): Likewise.
18319         * target.def (label_align_after_barrier_max_skip): Likewise.
18320         (loop_align_max_skip): Likewise.
18321         (label_align_max_skip): Likewise.
18322         (jump_align_max_skip): Likewise.
18323         * targhooks.h (default_label_align_after_barrier_max_skip): Likewise.
18324         (default_loop_align_max_skip): Likewise.
18325         (default_label_align_max_skip): Likewise.
18326         (default_jump_align_max_skip): Likewise.
18327
18328 2014-09-15  David Malcolm  <dmalcolm@redhat.com>
18329
18330         * config/arc/arc.c (arc_can_follow_jump): Strengthen both params
18331         from const_rtx to const rtx_insn *.  Update union members from rtx
18332         to rtx_insn *.
18333         * doc/tm.texi (TARGET_CAN_FOLLOW_JUMP): Autogenerated change.
18334         * hooks.c (hook_bool_const_rtx_const_rtx_true): Rename to...
18335         (hook_bool_const_rtx_insn_const_rtx_insn_true): ...this, and
18336         strengthen both params from const_rtx to const rtx_insn *.
18337         * hooks.h (hook_bool_const_rtx_const_rtx_true): Likewise.
18338         (hook_bool_const_rtx_insn_const_rtx_insn_true): Likewise.
18339         * reorg.c (follow_jumps): Strengthen param "jump" from rtx to
18340         rtx_insn *.
18341         * target.def (can_follow_jump): Strengthen both params from
18342         const_rtx to const rtx_insn *, and update default implementation
18343         from hook_bool_const_rtx_const_rtx_true to
18344         hook_bool_const_rtx_insn_const_rtx_insn_true.
18345
18346 2014-09-15  David Malcolm  <dmalcolm@redhat.com>
18347
18348         * sched-deps.c (deps_start_bb): Strengthen param "head" and local
18349         "insn" from rtx to rtx_insn *.
18350         * sched-int.h (deps_start_bb): Likewise for 2nd param.
18351
18352 2014-09-15  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18353             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18354             Anna Tikhonova  <anna.tikhonova@intel.com>
18355             Ilya Tocar  <ilya.tocar@intel.com>
18356             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18357             Ilya Verbin  <ilya.verbin@intel.com>
18358             Kirill Yukhin  <kirill.yukhin@intel.com>
18359             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18360
18361         * config/i386/sse.md
18362         (define_insn "vcvtph2ps<mask_name>"): Add masking.
18363         (define_insn "*vcvtph2ps_load<mask_name>"): Ditto.
18364         (define_insn "vcvtph2ps256<mask_name>"): Ditto.
18365         (define_expand "vcvtps2ph_mask"): New.
18366         (define_insn "*vcvtps2ph<mask_name>"): Add masking.
18367         (define_insn "*vcvtps2ph_store<mask_name>"): Ditto.
18368         (define_insn "vcvtps2ph256<mask_name>"): Ditto.
18369
18370 2014-09-15  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18371             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18372             Anna Tikhonova  <anna.tikhonova@intel.com>
18373             Ilya Tocar  <ilya.tocar@intel.com>
18374             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18375             Ilya Verbin  <ilya.verbin@intel.com>
18376             Kirill Yukhin  <kirill.yukhin@intel.com>
18377             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18378
18379         * config/i386/sse.md (define_mode_iterator VI248_AVX512BW_AVX512VL):
18380         New.
18381         (define_mode_iterator VI24_AVX512BW_1): Ditto.
18382         (define_insn "<mask_codefor>ashr<mode>3<mask_name>"): Ditto.
18383         (define_insn "<mask_codefor>ashrv2di3<mask_name>"): Ditto.
18384         (define_insn "ashr<VI248_AVX512BW_AVX512VL:mode>3<mask_name>"): Enable
18385         also for TARGET_AVX512VL.
18386         (define_expand "ashrv2di3"): Update to enable TARGET_AVX512VL.
18387
18388 2014-09-15  Markus Trippelsdorf  <markus@trippelsdorf.de>
18389
18390         * doc/install.texi (Options specification): add
18391         --disable-libsanitizer item.
18392
18393 2014-09-14  James Clarke  <jrtc27@jrtc27.com>
18394             Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
18395
18396         PR target/61407
18397         * config/darwin-c.c (version_as_macro): Added extra 0 for OS X 10.10
18398         and above.
18399         * config/darwin-driver.c (darwin_find_version_from_kernel): Removed
18400         kernel version check to avoid incrementing it after every major OS X
18401         release.
18402         (darwin_default_min_version): Avoid static memory buffer.
18403
18404 2014-09-13  Jan Hubicka  <hubicka@ucw.cz>
18405
18406         * tree.c (need_assembler_name_p): Store C++ type mangling only
18407         for aggregates.
18408
18409 2014-09-13  Marek Polacek  <polacek@redhat.com>
18410
18411         * tree.c (protected_set_expr_location): Don't check whether T is
18412         non-null here.
18413
18414 2014-09-12  DJ Delorie  <dj@redhat.com>
18415
18416         * config/msp430/msp430.md (extendhipsi2): Use 20-bit form of RLAM/RRAM.
18417         (extend_and_shift1_hipsi2): Likewise.
18418         (extend_and_shift2_hipsi2): Likewise.
18419
18420 2014-09-12  David Malcolm  <dmalcolm@redhat.com>
18421
18422         * config/alpha/alpha.c (alpha_ra_ever_killed): Replace NULL_RTX
18423         with NULL when dealing with an insn.
18424         * config/sh/sh.c (sh_reorg): Strengthen local "last_float_move"
18425         from rtx to rtx_insn *.
18426         * rtl.h (reg_set_between_p): Strengthen params 2 and 3 from
18427         const_rtx to const rtx_insn *.
18428         * rtlanal.c (reg_set_between_p): Likewise, removing a checked cast.
18429
18430 2014-09-12  Trevor Saunders  <tsaunders@mozilla.com>
18431
18432         * hash-table.h (gt_pch_nx): Don't call gt_pch_note_object within an
18433         assert.
18434
18435 2014-09-12  Joseph Myers  <joseph@codesourcery.com>
18436
18437         * target.def (libgcc_floating_mode_supported_p): New hook.
18438         * targhooks.c (default_libgcc_floating_mode_supported_p): New
18439         function.
18440         * targhooks.h (default_libgcc_floating_mode_supported_p): Declare.
18441         * doc/tm.texi.in (LIBGCC2_HAS_DF_MODE, LIBGCC2_HAS_XF_MODE)
18442         (LIBGCC2_HAS_TF_MODE): Remove.
18443         (TARGET_LIBGCC_FLOATING_MODE_SUPPORTED_P): New @hook.
18444         * doc/tm.texi: Regenerate.
18445         * genmodes.c (emit_insn_modes_h): Define HAVE_%smode for each
18446         machine mode.
18447         * system.h (LIBGCC2_HAS_SF_MODE, LIBGCC2_HAS_DF_MODE)
18448         (LIBGCC2_HAS_XF_MODE, LIBGCC2_HAS_TF_MODE): Poison.
18449         * config/i386/cygming.h (LIBGCC2_HAS_TF_MODE): Remove.
18450         * config/i386/darwin.h (LIBGCC2_HAS_TF_MODE): Remove.
18451         * config/i386/djgpp.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18452         * config/i386/dragonfly.h (LIBGCC2_HAS_TF_MODE): Remove.
18453         * config/i386/freebsd.h (LIBGCC2_HAS_TF_MODE): Remove.
18454         * config/i386/gnu-user-common.h (LIBGCC2_HAS_TF_MODE): Remove.
18455         * config/i386/i386-interix.h (IX86_NO_LIBGCC_TFMODE): Define.
18456         * config/i386/i386.c (ix86_libgcc_floating_mode_supported_p): New
18457         function.
18458         (TARGET_LIBGCC_FLOATING_MODE_SUPPORTED_P): Define.
18459         * config/i386/i386elf.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18460         * config/i386/lynx.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18461         * config/i386/netbsd-elf.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18462         * config/i386/netbsd64.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18463         * config/i386/nto.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18464         * config/i386/openbsd.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18465         * config/i386/openbsdelf.h (LIBGCC2_HAS_TF_MODE): Remove.
18466         * config/i386/rtemself.h (IX86_NO_LIBGCC_TFMODE): Define.
18467         * config/i386/sol2.h (LIBGCC2_HAS_TF_MODE): Remove.
18468         * config/i386/vx-common.h (IX86_MAYBE_NO_LIBGCC_TFMODE): Define.
18469         * config/ia64/elf.h (IA64_NO_LIBGCC_TFMODE): Define.
18470         * config/ia64/freebsd.h (IA64_NO_LIBGCC_TFMODE): Define.
18471         * config/ia64/hpux.h (LIBGCC2_HAS_XF_MODE, LIBGCC2_HAS_TF_MODE):
18472         Remove.
18473         * config/ia64/ia64.c (TARGET_LIBGCC_FLOATING_MODE_SUPPORTED_P):
18474         New macro.
18475         (ia64_libgcc_floating_mode_supported_p): New function.
18476         * config/ia64/linux.h (LIBGCC2_HAS_TF_MODE): Remove.
18477         * config/ia64/vms.h (IA64_NO_LIBGCC_XFMODE)
18478         (IA64_NO_LIBGCC_TFMODE): Define.
18479         * config/msp430/msp430.h (LIBGCC2_HAS_DF_MODE): Remove.
18480         * config/pdp11/pdp11.c (TARGET_SCALAR_MODE_SUPPORTED_P): New macro.
18481         (pdp11_scalar_mode_supported_p): New function.
18482         * config/rl78/rl78.h (LIBGCC2_HAS_DF_MODE): Remove.
18483         * config/rx/rx.h (LIBGCC2_HAS_DF_MODE): Remove.
18484
18485 2014-09-12  Richard Biener  <rguenther@suse.de>
18486
18487         PR middle-end/63237
18488         * gimple-fold.c (get_maxval_strlen): Gimplify string length.
18489
18490 2014-09-12  Marc Glisse  <marc.glisse@inria.fr>
18491
18492         * tree.c (integer_each_onep): New function.
18493         * tree.h (integer_each_onep): Declare it.
18494         * fold-const.c (fold_binary_loc): Use it for ~A + 1 to -A and
18495         -A - 1 to ~A.  Disable (X & 1) ^ 1, (X ^ 1) & 1 and ~X & 1 to
18496         (X & 1) == 0 for vector and complex.
18497
18498 2014-09-12  Wilco Dijkstra  <wilco.dijkstra@arm.com>
18499
18500         * gcc/config/aarch64/aarch64.c (cortexa57_regmove_cost): New cost table
18501         for A57.
18502         (cortexa53_regmove_cost): New cost table for A53.  Increase GP2FP/FP2GP
18503         cost to spilling from integer to FP registers.
18504
18505 2014-09-12  Wilco Dijkstra  <wilco.dijkstra@arm.com>
18506
18507         * config/aarch64/aarch64.c (aarch64_register_move_cost): Fix Q register
18508         move handling.
18509         (generic_regmove_cost): Undo raised FP2FP move cost as Q register moves
18510         are now handled correctly.
18511
18512 2014-09-12  Wilco Dijkstra  <wilco.dijkstra@arm.com>
18513
18514         * config/aarch64/aarch64.c (aarch64_register_move_cost): Add cost
18515         handling of CALLER_SAVE_REGS and POINTER_REGS.
18516
18517 2014-09-12  Wilco Dijkstra  <wilco.dijkstra@arm.com>
18518
18519         * gcc/ree.c (combine_reaching_defs): Ensure inserted copy don't change
18520         the number of hard registers.
18521
18522 2014-09-12  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18523             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18524             Anna Tikhonova  <anna.tikhonova@intel.com>
18525             Ilya Tocar  <ilya.tocar@intel.com>
18526             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18527             Ilya Verbin  <ilya.verbin@intel.com>
18528             Kirill Yukhin  <kirill.yukhin@intel.com>
18529             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18530
18531         * config/i386/sse.md
18532         (define_mode_iterator VI48_AVX512VL): New.
18533         (define_expand "<avx512>_vternlog<mode>_maskz"): Rename from
18534         "avx512f_vternlog<mode>_maskz" and update mode iterator.
18535         (define_insn "<avx512>_vternlog<mode><sd_maskz_name>"): Rename
18536         from "avx512f_vternlog<mode><sd_maskz_name>" and update mode iterator.
18537         (define_insn "<avx512>_vternlog<mode>_mask"): Rename from
18538         "avx512f_vternlog<mode>_mask" and update mode iterator.
18539         (define_insn "<mask_codefor><avx512>_align<mode><mask_name>"): Rename
18540         from "<mask_codefor>avx512f_align<mode><mask_name>" and update mode
18541         iterator.
18542         (define_insn "<avx512>_<rotate>v<mode><mask_name>"): Rename from
18543         "avx512f_<rotate>v<mode><mask_name>" and update mode iterator.
18544         (define_insn "<avx512>_<rotate><mode><mask_name>"): Rename from
18545         "avx512f_<rotate><mode><mask_name>" and update mode iterator.
18546         (define_insn "clz<mode>2<mask_name>"): Use VI48_AVX512VL mode iterator.
18547         (define_insn "<mask_codefor>conflict<mode><mask_name>"): Ditto.
18548
18549 2014-09-12  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18550             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18551             Anna Tikhonova  <anna.tikhonova@intel.com>
18552             Ilya Tocar  <ilya.tocar@intel.com>
18553             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18554             Ilya Verbin  <ilya.verbin@intel.com>
18555             Kirill Yukhin  <kirill.yukhin@intel.com>
18556             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18557
18558         * config/i386/sse.md (VI128_256): Delete.
18559         (define_mode_iterator VI124_256): New.
18560         (define_mode_iterator VI124_256_AVX512F_AVX512BW): Ditto.
18561         (define_expand "<code><mode>3<mask_name><round_name>"): Delete.
18562         (define_expand "<code><VI124_256_AVX512F_AVX512BW:mode>3"): New.
18563         (define_insn "*avx2_<code><VI124_256:mode>3"): Rename from
18564         "*avx2_<code><mode>3<mask_name><round_name>" and update mode iterator.
18565         (define_expand "<code><VI48_AVX512VL:mode>3_mask"): New.
18566         (define_insn "*avx512bw_<code><VI48_AVX512VL:mode>3<mask_name>"): Ditto.
18567         (define_insn "<mask_codefor><code><mode>3<mask_name>"): Update mode
18568         iterator.
18569         (define_expand "<code><VI8_AVX2:mode>3"): Update pettern generation
18570         in presence of AVX-512.
18571
18572 2014-09-12  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18573             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18574             Anna Tikhonova  <anna.tikhonova@intel.com>
18575             Ilya Tocar  <ilya.tocar@intel.com>
18576             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18577             Ilya Verbin  <ilya.verbin@intel.com>
18578             Kirill Yukhin  <kirill.yukhin@intel.com>
18579             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18580
18581         * config/i386/sse.md
18582         (define_expand "<avx512>_gathersi<mode>"): Rename from
18583         "avx512f_gathersi<mode>".
18584         (define_insn "*avx512f_gathersi<mode>"): Use VI48F.
18585         (define_insn "*avx512f_gathersi<mode>_2"): Ditto.
18586         (define_expand "<avx512>_gatherdi<mode>"): Rename from
18587         "avx512f_gatherdi<mode>".
18588         (define_insn "*avx512f_gatherdi<mode>"): Use VI48F.
18589         (define_insn "*avx512f_gatherdi<mode>_2"): Use VI48F, add 128/256-bit
18590         wide versions.
18591         (define_expand "<avx512>_scattersi<mode>"): Rename from
18592         "avx512f_scattersi<mode>".
18593         (define_insn "*avx512f_scattersi<mode>"): Use VI48F.
18594         (define_expand "<avx512>_scatterdi<mode>"): Rename from
18595         "avx512f_scatterdi<mode>".
18596         (define_insn "*avx512f_scatterdi<mode>"): Use VI48F.
18597
18598 2014-09-12  Richard Sandiford  <richard.sandiford@arm.com>
18599
18600         * ira.h (ira_finish_once): Delete.
18601         * ira-int.h (target_ira_int::~target_ira_int): Declare.
18602         (target_ira_int::free_ira_costs): Likewise.
18603         (target_ira_int::free_register_move_costs): Likewise.
18604         (ira_finish_costs_once): Delete.
18605         * ira.c (free_register_move_costs): Replace with...
18606         (target_ira_int::free_register_move_costs): ...this new function.
18607         (target_ira_int::~target_ira_int): Define.
18608         (ira_init): Call free_register_move_costs as a member function rather
18609         than a global function.
18610         (ira_finish_once): Delete.
18611         * ira-costs.c (free_ira_costs): Replace with...
18612         (target_ira_int::free_ira_costs): ...this new function.
18613         (ira_init_costs): Call free_ira_costs as a member function rather
18614         than a global function.
18615         (ira_finish_costs_once): Delete.
18616         * target-globals.c (target_globals::~target_globals): Call the
18617         target_ira_int destructor.
18618         * toplev.c: Include lra.h.
18619         (finalize): Call lra_finish_once rather than ira_finish_once.
18620
18621 2014-09-11  Jan Hubicka  <hubicka@ucw.cz>
18622
18623         * common.opt (flto-odr-type-merging): New flag.
18624         * ipa-deivrt.c (hash_type_name): Use ODR names for hasing if availale.
18625         (types_same_for_odr): Likewise.
18626         (odr_subtypes_equivalent_p): Likewise.
18627         (add_type_duplicate): Do not walk type variants.
18628         (register_odr_type): New function.
18629         * ipa-utils.h (register_odr_type): Declare.
18630         (odr_type_p): New function.
18631         * langhooks.c (lhd_set_decl_assembler_name): Do not compute
18632         TYPE_DECLs
18633         * doc/invoke.texi (-flto-odr-type-merging): Document.
18634         * tree.c (need_assembler_name_p): Compute ODR names when asked
18635         for it.
18636         * tree.h (DECL_ASSEMBLER_NAME): Update comment.
18637
18638 2014-09-11  H.J. Lu  <hongjiu.lu@intel.com>
18639
18640         PR target/63228
18641         * config/i386/i386.c (ix86_option_override_internal): Also turn
18642         off OPTION_MASK_ABI_X32 for -m16.
18643
18644 2014-09-11  Segher Boessenkool  <segher@kernel.crashing.org>
18645
18646         * config/rs6000/rs6000.md (rs6000_mftb_<mode>): Use mode iterator
18647         GPR instead of P.
18648
18649 2014-09-11  Marc Glisse  <marc.glisse@inria.fr>
18650
18651         PR target/58757
18652         * ginclude/float.h (FLT_TRUE_MIN, DBL_TRUE_MIN, LDBL_TRUE_MIN):
18653         Directly forward to __*_DENORM_MIN__.
18654
18655 2014-09-11  David Malcolm  <dmalcolm@redhat.com>
18656
18657         * rtl.h (LABEL_REF_LABEL): New macro.
18658
18659         * alias.c (rtx_equal_for_memref_p): Use LABEL_REF_LABEL in place
18660         of XEXP (, 0), where we know that we have a LABEL_REF.
18661         * cfgbuild.c (make_edges): Likewise.
18662         (purge_dead_tablejump_edges): Likewise.
18663         * cfgexpand.c (convert_debug_memory_address): Likewise.
18664         * cfgrtl.c (patch_jump_insn): Likewise.
18665         * combine.c (distribute_notes): Likewise.
18666         * cse.c (hash_rtx_cb): Likewise.
18667         (exp_equiv_p): Likewise.
18668         (fold_rtx): Likewise.
18669         (check_for_label_ref): Likewise.
18670         * cselib.c (rtx_equal_for_cselib_1): Likewise.
18671         (cselib_hash_rtx): Likewise.
18672         * emit-rtl.c (mark_label_nuses): Likewise.
18673         * explow.c (convert_memory_address_addr_space): Likewise.
18674         * final.c (output_asm_label): Likewise.
18675         (output_addr_const): Likewise.
18676         * gcse.c (add_label_notes): Likewise.
18677         * genconfig.c (walk_insn_part): Likewise.
18678         * genrecog.c (validate_pattern): Likewise.
18679         * ifcvt.c (cond_exec_get_condition): Likewise.
18680         (noce_emit_store_flag): Likewise.
18681         (noce_get_alt_condition): Likewise.
18682         (noce_get_condition): Likewise.
18683         * jump.c (maybe_propagate_label_ref): Likewise.
18684         (mark_jump_label_1): Likewise.
18685         (redirect_exp_1): Likewise.
18686         (rtx_renumbered_equal_p): Likewise.
18687         * lra-constraints.c (operands_match_p): Likewise.
18688         * reload.c (operands_match_p): Likewise.
18689         (find_reloads): Likewise.
18690         * reload1.c (set_label_offsets): Likewise.
18691         * reorg.c (get_branch_condition): Likewise.
18692         * rtl.c (rtx_equal_p_cb): Likewise.
18693         (rtx_equal_p): Likewise.
18694         * rtlanal.c (reg_mentioned_p): Likewise.
18695         (rtx_referenced_p): Likewise.
18696         (get_condition): Likewise.
18697         * sched-vis.c (print_value): Likewise.
18698         * varasm.c (const_hash_1): Likewise.
18699         (compare_constant): Likewise.
18700         (const_rtx_hash_1): Likewise.
18701         (output_constant_pool_1): Likewise.
18702
18703 2014-09-11  Segher Boessenkool  <segher@kernel.crashing.org>
18704
18705         * config/rs6000/htm.md (tabort, tabortdc, tabortdci, tabortwc,
18706         tabortwci, tbegin, tcheck, tend, trechkpt, treclaim, tsr): Use xor
18707         instead of minus.
18708         * config/rs6000/vector.md (cr6_test_for_zero_reverse,
18709         cr6_test_for_lt_reverse): Ditto.
18710
18711 2014-09-11  Paolo Carlini  <paolo.carlini@oracle.com>
18712
18713         PR c++/61489
18714         * doc/invoke.texi ([-Wmissing-field-initializers]): Update.
18715
18716 2014-09-11  Alan Lawrence  <alan.lawrence@arm.com>
18717
18718         * config/aarch64/aarch64-builtins.c (aarch64_types_unop_su_qualifiers,
18719         TYPES_REINTERP_SU, aarch64_types_unop_sp_qualifiers, TYPE_REINTERP_SP,
18720         aarch64_types_unop_us_qualifiers, TYPES_REINTERP_US,
18721         aarch64_types_unop_ps_qualifiers, TYPES_REINTERP_PS, BUILTIN_VD):
18722         Delete.
18723
18724         (aarch64_fold_builtin): Remove all reinterpret cases.
18725
18726         * config/aarch64/aarch64-protos.h (aarch64_simd_reinterpret): Delete.
18727
18728         * config/aarch64/aarch64-simd-builtins.def (reinterpret*) : Delete.
18729
18730         * config/aarch64/aarch64-simd.md (aarch64_reinterpretv8qi<mode>,
18731         aarch64_reinterpretv4hi<mode>, aarch64_reinterpretv2si<mode>,
18732         aarch64_reinterpretv2sf<mode>, aarch64_reinterpretdi<mode>,
18733         aarch64_reinterpretv1df<mode>, aarch64_reinterpretv16qi<mode>,
18734         aarch64_reinterpretv8hi<mode>, aarch64_reinterpretv4si<mode>,
18735         aarch64_reinterpretv4sf<mode>, aarch64_reinterpretv2di<mode>,
18736         aarch64_reinterpretv2df<mode>): Delete.
18737
18738         * config/aarch64/aarch64.c (aarch64_simd_reinterpret): Delete.
18739
18740         * config/aarch64/arm_neon.h (vreinterpret_p8_f64,
18741         vreinterpret_p16_f64, vreinterpret_f32_f64, vreinterpret_f64_f32,
18742         vreinterpret_f64_p8, vreinterpret_f64_p16, vreinterpret_f64_s8,
18743         vreinterpret_f64_s16, vreinterpret_f64_s32, vreinterpret_f64_u8,
18744         vreinterpret_f64_u16, vreinterpret_f64_u32, vreinterpret_s64_f64,
18745         vreinterpret_u64_f64, vreinterpret_s8_f64, vreinterpret_s16_f64,
18746         vreinterpret_s32_f64, vreinterpret_u8_f64, vreinterpret_u16_f64,
18747         vreinterpret_u32_f64): Use cast.
18748
18749         * config/aarch64/iterators.md (VD_RE): Delete.
18750
18751 2014-09-11  Alan Lawrence  <alan.lawrence@arm.com>
18752
18753         * config/aarch64/arm_neon.h (aarch64_vset_lane_any): New (*2).
18754         (vset_lane_f32, vset_lane_f64, vset_lane_p8, vset_lane_p16,
18755         vset_lane_s8, vset_lane_s16, vset_lane_s32, vset_lane_s64,
18756         vset_lane_u8, vset_lane_u16, vset_lane_u32, vset_lane_u64,
18757         vsetq_lane_f32, vsetq_lane_f64, vsetq_lane_p8, vsetq_lane_p16,
18758         vsetq_lane_s8, vsetq_lane_s16, vsetq_lane_s32, vsetq_lane_s64,
18759         vsetq_lane_u8, vsetq_lane_u16, vsetq_lane_u32, vsetq_lane_u64):
18760         Replace inline assembler with __aarch64_vset_lane_any.
18761
18762 2014-09-11  James Greenhalgh  <james.greenhalgh@arm.com>
18763
18764         * config/aarch64/arm_neon.h (vmull_high_lane_s16): Fix argument
18765         types.
18766         (vmull_high_lane_s32): Likewise.
18767         (vmull_high_lane_u16): Likewise.
18768         (vmull_high_lane_u32): Likewise.
18769
18770 2014-09-11  Jason Merrill  <jason@redhat.com>
18771
18772         PR c++/58678
18773         * ipa-devirt.c (ipa_devirt): Don't check DECL_COMDAT.
18774
18775 2014-09-11  Georg-Johann Lay  <avr@gjlay.de>
18776
18777         PR target/63223
18778         * config/avr/avr.md (*tablejump.3byte-pc): New insn.
18779         (*tablejump): Restrict to !AVR_HAVE_EIJMP_EICALL.  Add void clobber.
18780         (casesi): Expand to *tablejump.3byte-pc if AVR_HAVE_EIJMP_EICALL.
18781
18782 2014-09-11  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18783             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18784             Anna Tikhonova  <anna.tikhonova@intel.com>
18785             Ilya Tocar  <ilya.tocar@intel.com>
18786             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18787             Ilya Verbin  <ilya.verbin@intel.com>
18788             Kirill Yukhin  <kirill.yukhin@intel.com>
18789             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18790
18791         * config/i386/sse.md
18792         (define_expand "<avx512>_vpermi2var<VI48F:mode>3_maskz"): Rename from
18793         "avx512f_vpermi2var<mode>3_maskz" and update mode iterator.
18794         (define_expand "<avx512>_vpermi2var<VI2_AVX512VL:mode>3_maskz"):
18795         New.
18796         (define_insn "<avx512>_vpermi2var<VI48F:mode>3<sd_maskz_name>"): Rename
18797         from "avx512f_vpermi2var<mode>3<sd_maskz_name>" and update mode
18798         iterator.
18799         (define_insn "<avx512>_vpermi2var<VI2_AVX512VL:mode>3<sd_maskz_name>"):
18800         New.
18801         (define_insn "<avx512>_vpermi2var<VI48F:mode>3_mask"): Rename from
18802         "avx512f_vpermi2var<mode>3_mask" and update mode iterator.
18803         (define_insn "<avx512>_vpermi2var<VI2_AVX512VL:mode>3_mask"): New.
18804         (define_expand "<avx512>_vpermt2var<VI48F:mode>3_maskz"): Rename from
18805         "avx512f_vpermt2var<mode>3_maskz" and update mode iterator.
18806         (define_expand "<avx512>_vpermt2var<VI2_AVX512VL:mode>3_maskz"): New.
18807         (define_insn "<avx512>_vpermt2var<VI48F:mode>3<sd_maskz_name>"): Rename
18808         from "avx512f_vpermt2var<mode>3<sd_maskz_name>" and update mode
18809         iterator.
18810         (define_insn "<avx512>_vpermt2var<VI2_AVX512VL:mode>3<sd_maskz_name>"):
18811         New.
18812         (define_insn "<avx512>_vpermt2var<VI48F:mode>3_mask"): Rename from
18813         "avx512f_vpermt2var<mode>3_mask" and update mode iterator.
18814         (define_insn "<avx512>_vpermt2var<VI2_AVX512VL:mode>3_mask"): New.
18815
18816 2014-09-10  Jan Hubicka  <hubicka@ucw.cz>
18817
18818         * varpool.c (varpool_node::ctor_useable_for_folding_p): Do not try
18819         to access removed nodes.
18820
18821 2014-09-10  Jan Hubicka  <hubicka@ucw.cz>
18822
18823         PR tree-optimization/63186
18824         * ipa-split.c (test_nonssa_use): Skip nonforced labels.
18825         (mark_nonssa_use): Likewise.
18826         (verify_non_ssa_vars): Verify all header blocks for label
18827         definitions.
18828
18829 2014-09-11  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18830             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18831             Anna Tikhonova  <anna.tikhonova@intel.com>
18832             Ilya Tocar  <ilya.tocar@intel.com>
18833             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18834             Ilya Verbin  <ilya.verbin@intel.com>
18835             Kirill Yukhin  <kirill.yukhin@intel.com>
18836             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18837
18838         * config/i386/sse.md
18839         (define_mode_attr avx2_avx512): Rename from avx2_avx512bw.
18840         (define_mode_iterator VI48F_256_512): Extend to AVX-512VL.
18841         (define_insn "<avx2_avx512>_permvar<mode><mask_name>"): Rename from
18842         "<avx2_avx512f>_permvar<mode><mask_name>".
18843         (define_insn "<avx512>_permvar<mode><mask_name>"): New.
18844         (define_insn "<avx2_avx512>_ashrv<VI48_AVX512F_AVX512VL:mode><mask_name>"):
18845         Rename from "<avx2_avx512f>_ashrv<mode><mask_name>".
18846         (define_insn "<avx2_avx512>_ashrv<VI2_AVX512VL:mode><mask_name>"):
18847         Ditto.
18848         (define_insn "<avx2_avx512>_<shift_insn>v<VI48_AVX512F:mode><mask_name>"):
18849         Rename from "<avx2_avx512bw>_<shift_insn>v<mode><mask_name>".
18850         (define_insn "<avx2_avx512>_<shift_insn>v<VI2_AVX512VL:mode><mask_name>"):
18851         Rename from "<avx2_avx512bw>_<shift_insn>v<mode><mask_name>".
18852
18853 2014-09-10  Michael Meissner  <meissner@linux.vnet.ibm.com>
18854
18855         * config/rs6000/vsx.md (vsx_fmav4sf4): Use correct constraints for
18856         V2DF, V4SF, DF, and DI modes.
18857         (vsx_fmav2df2): Likewise.
18858         (vsx_float_fix_<mode>2): Likewise.
18859         (vsx_reduc_<VEC_reduc_name>_v2df_scalar): Likewise.
18860
18861 2014-09-10  Xinliang David Li  <davidxl@google.com>
18862
18863         PR target/63209
18864         * config/arm/arm.md (movcond_addsi): Handle case where source
18865         and target operands are the same.
18866
18867 2014-09-10  David Malcolm  <dmalcolm@redhat.com>
18868
18869         * final.c (this_is_asm_operands): Strengthen this variable from
18870         rtx to const rtx_insn *.
18871         * output.h (this_is_asm_operands): Likewise.
18872         * rtl-error.c (location_for_asm): Strengthen param "insn" from
18873         const_rtx to const rtx_insn *.
18874         (diagnostic_for_asm): Likewise.
18875         * rtl-error.h (error_for_asm): Likewise.
18876         (warning_for_asm): Likewise.
18877
18878 2014-09-10  David Malcolm  <dmalcolm@redhat.com>
18879
18880         * genextract.c (print_header): When writing out insn_extract to
18881         insn-extract.c, strengthen the param "insn" from rtx to rtx_insn *.
18882         * recog.h (insn_extract): Strengthen the param from rtx to
18883         rtx_insn *.
18884
18885 2014-09-10  Mike Stump  <mikestump@comcast.net>
18886
18887         * doc/install.texi (Prerequisites): Note Tcl 8.6 bug fixed in
18888         8.6.1.
18889
18890 2014-09-10  Martin Jambor  <mjambor@suse.cz>
18891
18892         * cgraphunit.c (expand_thunk): If not expanding, set analyzed flag.
18893         (analyze): Do not set analyze flag if expand_thunk returns false;.
18894         (create_wrapper): Likewise.
18895         * cgraphclones.c (duplicate_thunk_for_node): Likewise.
18896
18897 2014-09-10  Martin Jambor  <mjambor@suse.cz>
18898
18899         PR ipa/61654
18900         * cgraphclones.c (duplicate_thunk_for_node): Copy arguments of the
18901         new decl properly.  Analyze the new thunk if it is expanded.
18902
18903 2014-09-10  Andreas Schwab  <schwab@suse.de>
18904
18905         * coretypes.h (struct _dont_use_rtx_insn_here_, rtx_insn)
18906         [USED_FOR_TARGET]: Define.
18907
18908 2014-09-10  Matthew Fortune  <matthew.fortune@imgtec.com>
18909
18910         * config/mips/mips.c (mips_secondary_reload_class): Handle
18911         regno < 0 case.
18912
18913 2014-09-10  Robert Suchanek   <robert.suchanek@imgtec.com>
18914
18915         * lra-lives.c (process_bb_lives): Replace assignment with bitwise OR
18916         assignment.
18917
18918 2014-09-10  Jakub Jelinek  <jakub@redhat.com>
18919
18920         * flag-types.h (enum sanitize_code): Add SANITIZE_NONNULL_ATTRIBUTE
18921         and SANITIZE_RETURNS_NONNULL_ATTRIBUTE, or them into SANITIZE_UNDEFINED.
18922         * opts.c (common_handle_option): Handle SANITIZE_NONNULL_ATTRIBUTE and
18923         SANITIZE_RETURNS_NONNULL_ATTRIBUTE and disable
18924         flag_delete_null_pointer_checks for them.
18925         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_NONNULL_ARG,
18926         BUILT_IN_UBSAN_HANDLE_NONNULL_ARG_ABORT,
18927         BUILT_IN_UBSAN_HANDLE_NONNULL_RETURN,
18928         BUILT_IN_UBSAN_HANDLE_NONNULL_RETURN_ABORT): New.
18929         * ubsan.c (instrument_bool_enum_load): Set *gsi back to
18930         stmt's iterator.
18931         (instrument_nonnull_arg, instrument_nonnull_return): New functions.
18932         (pass_ubsan::gate): Return true even for SANITIZE_NONNULL_ATTRIBUTE
18933         or SANITIZE_RETURNS_NONNULL_ATTRIBUTE.
18934         (pass_ubsan::execute): Call instrument_nonnull_{arg,return}.
18935         * doc/invoke.texi (-fsanitize=nonnull-attribute,
18936         -fsanitize=returns-nonnull-attribute): Document.
18937
18938         * ubsan.h (struct ubsan_mismatch_data): Removed.
18939         (ubsan_create_data): Remove MISMATCH argument, add LOCCNT argument.
18940         * ubsan.c (ubsan_source_location): For unknown locations,
18941         pass { NULL, 0, 0 } instead of { "<unknown>", x, y }.
18942         (ubsan_create_data): Remove MISMATCH argument, add LOCCNT argument.
18943         Allow more than one location and arbitrary extra arguments passed
18944         in ... instead of through MISMATCH pointer.
18945         (ubsan_instrument_unreachable, ubsan_expand_bounds_ifn,
18946         ubsan_expand_null_ifn, ubsan_build_overflow_builtin,
18947         instrument_bool_enum_load, ubsan_instrument_float_cast): Adjust
18948         callers.
18949
18950 2014-09-10  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18951             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18952             Anna Tikhonova  <anna.tikhonova@intel.com>
18953             Ilya Tocar  <ilya.tocar@intel.com>
18954             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18955             Ilya Verbin  <ilya.verbin@intel.com>
18956             Kirill Yukhin  <kirill.yukhin@intel.com>
18957             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18958
18959         * config/i386/sse.md
18960         (define_mode_iterator VI48F): New.
18961         (define_insn "<avx512>_compress<mode>_mask"): Rename from
18962         "avx512f_compress<mode>_mask" and update mode iterator.
18963         (define_insn "<avx512>_compressstore<mode>_mask"): Rename from
18964         "avx512f_compressstore<mode>_mask" and update mode iterator.
18965         (define_expand "<avx512>_expand<mode>_maskz"): Rename from
18966         "avx512f_expand<mode>_maskz" and update mode iterator.
18967         (define_insn "<avx512>_expand<mode>_mask"): Rename from
18968         "avx512f_expand<mode>_mask" and update mode iterator.
18969
18970 2014-09-10  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18971             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18972             Anna Tikhonova  <anna.tikhonova@intel.com>
18973             Ilya Tocar  <ilya.tocar@intel.com>
18974             Andrey Turetskiy  <andrey.turetskiy@intel.com>
18975             Ilya Verbin  <ilya.verbin@intel.com>
18976             Kirill Yukhin  <kirill.yukhin@intel.com>
18977             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
18978
18979         * config/i386/i386.c
18980         (ix86_expand_args_builtin): Handle avx512dq_rangepv8df_mask_round,
18981         avx512dq_rangepv16sf_mask_round, avx512dq_rangepv4df_mask,
18982         avx512dq_rangepv8sf_mask, avx512dq_rangepv2df_mask,
18983         avx512dq_rangepv4sf_mask.
18984         * config/i386/sse.md
18985         (define_c_enum "unspec"): Add UNSPEC_REDUCE, UNSPEC_FPCLASS,
18986         UNSPEC_RANGE.
18987         (define_insn "<mask_codefor>reducep<mode><mask_name>"): New.
18988         (define_insn "reduces<mode>"): Ditto.
18989         (define_insn "avx512dq_rangep<mode><mask_name><round_saeonly_name>"):
18990         Ditto.
18991         (define_insn "avx512dq_ranges<mode><round_saeonly_name>"): Ditto.
18992         (define_insn "avx512dq_fpclass<mode><mask_scalar_merge_name>"): Ditto.
18993         (define_insn "avx512dq_vmfpclass<mode>"): Ditto..
18994
18995 2014-09-10  Alexander Ivchenko  <alexander.ivchenko@intel.com>
18996             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
18997             Anna Tikhonova  <anna.tikhonova@intel.com>
18998             Ilya Tocar  <ilya.tocar@intel.com>
18999             Andrey Turetskiy  <andrey.turetskiy@intel.com>
19000             Ilya Verbin  <ilya.verbin@intel.com>
19001             Kirill Yukhin  <kirill.yukhin@intel.com>
19002             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
19003
19004         * config/i386/i386.c
19005         (avx512f_vgetmantv2df_round): Rename from "avx512f_getmantv2df_round".
19006         (avx512f_vgetmantv4sf_round): Rename from "avx512f_vgetmantv4sf_round".
19007         (ix86_expand_args_builtin): Handle avx512vl_getmantv8sf_mask,
19008         avx512vl_getmantv4df_mask, avx512vl_getmantv4sf_mask,
19009         avx512vl_getmantv2df_mask.
19010         (ix86_expand_round_builtin): Handle avx512f_vgetmantv2df_round,
19011         avx512f_vgetmantv4sf_round.
19012         * config/i386/sse.md
19013         (define_insn "<avx512>_storeu<ssemodesuffix><avxsizesuffix>_mask"):
19014         Rename from "avx512f_storeu<ssemodesuffix>512_mask" and update
19015         mode iterator.
19016         (define_insn "<mask_codefor>rcp14<mode><mask_name>"): Use VF_AVX512VL.
19017         (define_insn "<mask_codefor>rsqrt14<mode><mask_name>"): Ditto.
19018         (define_insn "<avx512>_scalef<mode><mask_name><round_name>"): Rename
19019         from "avx512f_scalef<mode><mask_name><round_name>" and update mode
19020         iterator..
19021         (define_insn "<avx512>_getexp<mode><mask_name><round_saeonly_name>"):
19022         Rename from "avx512f_getexp<mode><mask_name><round_saeonly_name>" and
19023         update mode iterator.
19024         (define_expand
19025         "<avx512>_fixupimm<mode>_maskz<round_saeonly_expand_name>"): Rename from
19026         "avx512f_fixupimm<mode>_maskz<round_saeonly_expand_name>" and update
19027         mode iterator.
19028         (define_insn
19029         "<avx512>_fixupimm<mode><sd_maskz_name><round_saeonly_name>"): Rename
19030         from "avx512f_fixupimm<mode><sd_maskz_name><round_saeonly_name>" and
19031         update mode iterator.
19032         (define_insn "<avx512>_fixupimm<mode>_mask<round_saeonly_name>"): Rename
19033         from "avx512f_fixupimm<mode>_mask<round_saeonly_name>" and update mode
19034         iterator..
19035         (define_insn
19036         "<avx512>_rndscale<mode><mask_name><round_saeonly_name>"): rename from
19037         "avx512f_rndscale<mode><mask_name><round_saeonly_name>" and update
19038         mode iterator..
19039         (define_insn "<avx512>_getmant<mode><mask_name><round_saeonly_name>"):
19040         Rename from "avx512f_getmant<mode><mask_name><round_saeonly_name>" and
19041         update mode iterator.
19042         (define_insn "avx512f_vgetmant<mode><round_saeonly_name>"): Rename from
19043         "avx512f_getmant<mode><round_saeonly_name>".
19044
19045 2014-09-10  Jan Hubicka  <hubicka@ucw.cz>
19046
19047         PR ipa/63166
19048         * ipa-prop.c (compute_known_type_jump_func): Fix conditional.
19049
19050 2014-09-10  Alexander Ivchenko  <alexander.ivchenko@intel.com>
19051             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
19052             Anna Tikhonova  <anna.tikhonova@intel.com>
19053             Ilya Tocar  <ilya.tocar@intel.com>
19054             Andrey Turetskiy  <andrey.turetskiy@intel.com>
19055             Ilya Verbin  <ilya.verbin@intel.com>
19056             Kirill Yukhin  <kirill.yukhin@intel.com>
19057             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
19058
19059         * config/i386/sse.md (define_mode_iterator VF_AVX512VL): New.
19060         (define_mode_iterator FMAMODEM): Allow 128/256bit EVEX version.
19061         (define_mode_iterator FMAMODE_AVX512): New.
19062         (define_mode_iterator FMAMODE): Remove conditions.
19063         (define_expand "fma4i_fmadd_<mode>"): Use FMAMODE_AVX512 mode iterator.
19064         (define_expand "<avx512>_fmadd_<mode>_maskz<round_expand_name>"): Rename
19065         from "<avx512>_fmadd_<mode>_maskz<round_expand_name>" and use VF_AVX512VL
19066         mode iterator.
19067         (define_mode_iterator FMAMODE_NOVF512): Remove.
19068         (define_insn "*fma_fmadd_<mode>"): Rename from
19069         "<sd_mask_codefor>fma_fmadd_<mode><sd_maskz_name><round_name>" and use
19070         FMAMODE mode iterator.
19071         (define_mode_iterator VF_SF_AVX512VL): New.
19072         (define_insn "<sd_mask_codefor>fma_fmadd_<mode><sd_maskz_name><round_name>"):
19073         Use VF_SF_AVX512VL mode iterator.
19074         (define_insn "<avx512>_fmadd_<mode>_mask<round_name>"): Rename from
19075         "avx512f_fmadd_<mode>_mask<round_name>" and use VF_AVX512VL mode
19076         iterator.
19077         (define_insn "<avx512>_fmadd_<mode>_mask3<round_name>"): Rename from
19078         "avx512f_fmadd_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19079         iterator.
19080         (define_insn "*fma_fmsub_<mode>"): Rename from
19081         "<sd_mask_codefor>fma_fmsub_<mode><sd_maskz_name><round_name>" and use
19082         FMAMODE mode iterator.
19083         (define_insn "<sd_mask_codefor>fma_fmsub_<mode><sd_maskz_name><round_name>"):
19084         Use VF_SF_AVX512VL mode iterator.
19085         (define_insn "<avx512>_fmsub_<mode>_mask<round_name>"): Rename from
19086         "avx512f_fmsub_<mode>_mask<round_name>" and use VF_AVX512VL mode
19087         iterator.
19088         (define_insn "<avx512>_fmsub_<mode>_mask3<round_name>"): Rename from
19089         "avx512f_fmsub_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19090         iterator.
19091         (define_insn "*fma_fnmadd_<mode>"): Rename from
19092         "<sd_mask_codefor>fma_fnmadd_<mode><sd_maskz_name><round_name>" and
19093         use FMAMODE mode iterator.
19094         (define_insn "<sd_mask_codefor>fma_fnmadd_<mode><sd_maskz_name><round_name>"):
19095         Use VF_SF_AVX512VL mode iterator.
19096         (define_insn "<avx512>_fnmadd_<mode>_mask<round_name>"): Rename from
19097         "avx512f_fnmadd_<mode>_mask<round_name>" and use VF_AVX512VL mode
19098         iterator.
19099         (define_insn "<avx512>_fnmadd_<mode>_mask3<round_name>"): Rename from
19100         "avx512f_fnmadd_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19101         iterator.
19102         (define_insn "*fma_fnmsub_<mode>"): Rename from
19103         "<sd_mask_codefor>fma_fnmsub_<mode><sd_maskz_name><round_name>" and use
19104         FMAMODE mode iterator.
19105         (define_insn "<sd_mask_codefor>fma_fnmsub_<mode><sd_maskz_name><round_name>"):
19106         Use VF_SF_AVX512VL mode iterator.
19107         (define_insn "<avx512>_fnmsub_<mode>_mask<round_name>"): Rename from
19108         "avx512f_fnmsub_<mode>_mask<round_name>" and use VF_AVX512VL mode
19109         iterator.
19110         (define_insn "<avx512>_fnmsub_<mode>_mask3<round_name>"): Rename from
19111         "avx512f_fnmsub_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19112         iterator.
19113         (define_expand "<avx512>_fmaddsub_<mode>_maskz<round_expand_name>"):
19114         Rename from "avx512f_fmaddsub_<mode>_maskz<round_expand_name>" and
19115         use VF_AVX512VL mode iterator.
19116         (define_insn "*fma_fmaddsub_<mode>"): Rename from
19117         "<sd_mask_codefor>fma_fmaddsub_<mode><sd_maskz_name><round_name>" and
19118         remove subst usage.
19119         (define_insn "<sd_mask_codefor>fma_fmaddsub_<mode><sd_maskz_name><round_name>"):
19120         Use VF_SF_AVX512VL mode iterator.
19121         (define_insn "<avx512>_fmaddsub_<mode>_mask<round_name>"): Rename from
19122         "avx512f_fmaddsub_<mode>_mask<round_name>" and use VF_AVX512VL mode
19123         iterator.
19124         (define_insn "<avx512>_fmaddsub_<mode>_mask3<round_name>"): Rename from
19125         "avx512f_fmaddsub_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19126         iterator.
19127         (define_insn "*fma_fmsubadd_<mode>"): Rename from
19128         "<sd_mask_codefor>fma_fmsubadd_<mode><sd_maskz_name><round_name>" and
19129         remove usage of subst.
19130         (define_insn "<sd_mask_codefor>fma_fmsubadd_<mode><sd_maskz_name><round_name>"):
19131         Use VF_SF_AVX512VL mode iterator.
19132         (define_insn "<avx512>_fmsubadd_<mode>_mask<round_name>"): Rename from
19133         "avx512f_fmsubadd_<mode>_mask<round_name>" and use VF_AVX512VL mode
19134         iterator.
19135         (define_insn "<avx512>_fmsubadd_<mode>_mask3<round_name>"): Rename from
19136         "avx512f_fmsubadd_<mode>_mask3<round_name>" and use VF_AVX512VL mode
19137         iterator.
19138
19139 2014-09-10  Kugan Vivekanandarajah  <kuganv@linaro.org>
19140
19141         Revert r213751:
19142         * calls.c (precompute_arguments): Check
19143          promoted_for_signed_and_unsigned_p and set the promoted mode.
19144         (promoted_for_signed_and_unsigned_p): New function.
19145         (expand_expr_real_1): Check promoted_for_signed_and_unsigned_p
19146         and set the promoted mode.
19147         * expr.h (promoted_for_signed_and_unsigned_p): New function definition.
19148         * cfgexpand.c (expand_gimple_stmt_1): Call emit_move_insn if
19149         SUBREG is promoted with SRP_SIGNED_AND_UNSIGNED.
19150
19151 2014-09-09  Manuel López-Ibáñez  <manu@gcc.gnu.org>
19152
19153         * opth-gen.awk: Generate mapping from cpp message reasons to the
19154         options that enable them.
19155         * doc/options.texi (CppReason): Document.
19156
19157 2014-09-09  Manuel López-Ibáñez  <manu@gcc.gnu.org>
19158
19159         * doc/invoke.texi (Wnormalized=): Update.
19160
19161 2014-09-09  Segher Boessenkool  <segher@kernel.crashing.org>
19162
19163         PR target/63195
19164         * config/rs6000/rs6000.md (*bool<mode>3): Allow only register
19165         operands.  Split off the constant operand alternative to ...
19166         (*bool<mode>3_imm): New.
19167
19168 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19169
19170         * rtl.h (single_set_2): Strengthen first param from const_rtx to
19171         const rtx_insn *, and move prototype to above...
19172         (single_set): ...this.  Convert this from a macro to an inline
19173         function, enforcing the requirement that the param is a const
19174         rtx_insn *.
19175         (find_args_size_adjust): Strengthen param from rtx to rtx_insn *.
19176
19177         * config/arm/aarch-common-protos.h (aarch_crypto_can_dual_issue):
19178         Strengthen both params from rtx to rtx_insn *.
19179         * config/arm/aarch-common.c (aarch_crypto_can_dual_issue):
19180         Likewise; introduce locals "producer_set", "consumer_set", using
19181         them in place of "producer" and "consumer" when dealing with SET
19182         rather than insn.
19183         * config/avr/avr.c (avr_out_plus): Add checked cast to rtx_insn *
19184         when invoking single_set in region guarded by INSN_P.
19185         (avr_out_bitop): Likewise.
19186         (_reg_unused_after): Introduce local rtx_sequence * "seq" in
19187         region guarded by GET_CODE check, using methods to strengthen
19188         local "this_insn" from rtx to rtx_insn *, and for clarity.
19189         * config/avr/avr.md (define_insn_and_split "xload8<mode>_A"):
19190         Strengthen local "insn" from rtx to rtx_insn *.
19191         (define_insn_and_split "xload<mode>_A"): Likewise.
19192         * config/bfin/bfin.c (trapping_loads_p): Likewise for param
19193         "insn".
19194         (find_load): Likewise for return type.
19195         (workaround_speculation): Likewise for both locals named
19196         "load_insn".
19197         * config/cris/cris.c (cris_cc0_user_requires_cmp): Likewise for
19198         local "cc0_user".
19199         * config/cris/cris.md (define_peephole2 ; moversideqi): Likewise
19200         for local "prev".
19201         * config/h8300/h8300-protos.h (notice_update_cc): Likewise for
19202         param 2.
19203         * config/h8300/h8300.c (notice_update_cc): Likewise.
19204         * config/i386/i386.c (ix86_flags_dependent): Likewise for params
19205         "insn" and "dep_insn".
19206         (exact_store_load_dependency): Likewise for both params.
19207         (ix86_macro_fusion_pair_p): Eliminate local named "single_set"
19208         since this now clashes with inline function.  Instead, delay
19209         calling single_set until the point where its needed, and then
19210         assign the result to "compare_set" and rework the conditional that
19211         follows.
19212         * config/ia64/ia64.md (define_expand "tablejump"): Strengthen
19213         local "last" from rtx to rtx_insn *.
19214         * config/mips/mips-protos.h (mips_load_store_insns): Likewise for
19215         second param.
19216         (mips_store_data_bypass_p): Likewise for both params.
19217         * config/mips/mips.c (mips_load_store_insns): Likewise for second
19218         param.
19219         (mips_store_data_bypass_p): Likewise for both params.
19220         (mips_orphaned_high_part_p): Likewise for param "insn".
19221         * config/mn10300/mn10300.c (extract_bundle): Likewise.
19222         (mn10300_bundle_liw): Likewise for locals "r", "insn1", "insn2".
19223         Introduce local rtx "insn2_pat".
19224         * config/rl78/rl78.c (move_elim_pass): Likewise for locals "insn",
19225         "ninsn".
19226         (rl78_remove_unused_sets): Likewise for locals "insn", "ninsn".
19227         Introduce local rtx "set", using it in place of "insn" for the
19228         result of single_set.  This appears to fix a bug, since the call
19229         to find_regno_note on a SET does nothing.
19230         * config/rs6000/rs6000.c (set_to_load_agen): Strengthen both
19231         params from rtx to rtx_insn *.
19232         (set_to_load_agen): Likewise.
19233         * config/s390/s390.c (s390_label_align): Likewise for local
19234         "prev_insn".  Introduce new rtx locals "set" and "src", using
19235         them in place of "prev_insn" for the results of single_set
19236         and SET_SRC respectively.
19237         (s390_swap_cmp): Strengthen local "jump" from rtx to rtx_insn *.
19238         Introduce new rtx local "set" using in place of "jump" for the
19239         result of single_set.  Use SET_SRC (set) rather than plain
19240         XEXP (set, 1).
19241         * config/sh/sh.c (noncall_uses_reg): Strengthen param 2from
19242         rtx to rtx_insn *.
19243         (noncall_uses_reg): Likewise.
19244         (reg_unused_after): Introduce local rtx_sequence * "seq" in region
19245         guarded by GET_CODE check, using its methods for clarity, and to
19246         enable strengthening local "this_insn" from rtx to rtx_insn *.
19247         * config/sh/sh.md (define_expand "mulhisi3"): Strengthen local
19248         "insn" from rtx to rtx_insn *.
19249         (define_expand "umulhisi3"): Likewise.
19250         (define_expand "smulsi3_highpart"): Likewise.
19251         (define_expand "umulsi3_highpart"): Likewise.
19252         * config/sparc/sparc.c (sparc_do_work_around_errata): Likewise for
19253         local "after".  Replace GET_CODE check with a dyn_cast,
19254         introducing new local rtx_sequence * "seq", using insn method for
19255         typesafety.
19256
19257         * dwarf2cfi.c (dwarf2out_frame_debug): Strengthen param "insn"
19258         from rtx to rtx_insn *.  Introduce local rtx "pat", using it in
19259         place of "insn" once we're dealing with patterns rather than the
19260         input insn.
19261         (scan_insn_after): Strengthen param "insn" from rtx to rtx_insn *.
19262         (scan_trace): Likewise for local "elt", updating lookups within
19263         sequence to use insn method rather than element method.
19264         * expr.c (find_args_size_adjust): Strengthen param "insn" from rtx
19265         to rtx_insn *.
19266         * gcse.c (gcse_emit_move_after): Likewise for local "new_rtx".
19267         * ifcvt.c (noce_try_abs): Likewise for local "insn".
19268         * ira.c (fix_reg_equiv_init): Add checked cast to rtx_insn * when
19269         invoking single_set.
19270         * lra-constraints.c (insn_rhs_dead_pseudo_p): Strengthen param
19271         "insn" from rtx to rtx_insn *.
19272         (skip_usage_debug_insns): Likewise for return type, adding a
19273         checked cast.
19274         (check_secondary_memory_needed_p): Likewise for local "insn".
19275         (inherit_reload_reg): Likewise.
19276         * modulo-sched.c (sms_schedule): Likewise for local "count_init".
19277         * recog.c (peep2_attempt): Likewise for local "old_insn", adding
19278         checked casts.
19279         (store_data_bypass_p): Likewise for both params.
19280         (if_test_bypass_p): Likewise.
19281         * recog.h (store_data_bypass_p): Likewise for both params.
19282         (if_test_bypass_p): Likewise.
19283         * reload.c (find_equiv_reg): Likewise for local "where".
19284         * reorg.c (delete_jump): Likewise for param "insn".
19285         * rtlanal.c (single_set_2): Strenghen param "insn" from const_rtx
19286         to const rtx_insn *.
19287         * store-motion.c (replace_store_insn): Likewise for param "del".
19288         (delete_store): Strengthen local "i" from rtx to rtx_insn_list *,
19289         and use its methods for clarity, and to strengthen local "del"
19290         from rtx to rtx_insn *.
19291         (build_store_vectors): Use insn method of "st" when calling
19292         replace_store_insn for typesafety and clarity.
19293
19294 2014-09-09  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
19295
19296         * config/rs6000/rs6000.c (rtx_is_swappable_p): Add
19297         UNSPEC_VSX_CVDPSPN as an unswappable operand, and add commentary
19298         on how to make it legal in future.
19299
19300 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19301
19302         * caller-save.c (rtx saveinsn): Strengthen this variable from rtx
19303         to rtx_insn *.
19304         (restinsn): Likewise.
19305         * config/aarch64/aarch64-protos.h (aarch64_simd_attr_length_move):
19306         Likewise for param.
19307         * config/aarch64/aarch64.c (aarch64_simd_attr_length_move):
19308         Likewise.
19309         * config/arc/arc-protos.h (arc_adjust_insn_length): Likewise for
19310         first param.
19311         (arc_hazard): Likewise for both params.
19312         * config/arc/arc.c (arc600_corereg_hazard): Likewise, adding
19313         checked casts to rtx_sequence * and uses of the insn method for
19314         type-safety.
19315         (arc_hazard): Strengthen both params from rtx to rtx_insn *.
19316         (arc_adjust_insn_length): Likewise for param "insn".
19317         (struct insn_length_parameters_s): Likewise for first param of
19318         "get_variants" callback field.
19319         (arc_get_insn_variants): Likewise for first param and local
19320         "inner".  Replace a check of GET_CODE with a dyn_cast to
19321         rtx_sequence *, using methods for type-safety and clarity.
19322         * config/arc/arc.h (ADJUST_INSN_LENGTH): Use casts to
19323         rtx_sequence * and uses of the insn method for type-safety when
19324         invoking arc_adjust_insn_length.
19325         * config/arm/arm-protos.h (arm_attr_length_move_neon): Likewise
19326         for param.
19327         (arm_address_offset_is_imm): Likewise.
19328         (struct tune_params): Likewise for params 1 and 3 of the
19329         "sched_adjust_cost" callback field.
19330         * config/arm/arm.c (cortex_a9_sched_adjust_cost): Likewise for
19331         params 1 and 3 ("insn" and "dep").
19332         (xscale_sched_adjust_cost): Likewise.
19333         (fa726te_sched_adjust_cost): Likewise.
19334         (cortexa7_older_only): Likewise for param "insn".
19335         (cortexa7_younger): Likewise.
19336         (arm_attr_length_move_neon): Likewise.
19337         (arm_address_offset_is_imm): Likewise.
19338         * config/avr/avr-protos.h (avr_notice_update_cc): Likewise.
19339         * config/avr/avr.c (avr_notice_update_cc): Likewise.
19340         * config/bfin/bfin.c (hwloop_pattern_reg): Likewise.
19341         (workaround_speculation): Likewise for local "last_condjump".
19342         * config/c6x/c6x.c (shadow_p): Likewise for param "insn".
19343         (shadow_or_blockage_p): Likewise.
19344         (get_unit_reqs): Likewise.
19345         (get_unit_operand_masks): Likewise.
19346         (c6x_registers_update): Likewise.
19347         (returning_call_p): Likewise.
19348         (can_use_callp): Likewise.
19349         (convert_to_callp): Likewise.
19350         (find_last_same_clock): Likwise for local "t".
19351         (reorg_split_calls): Likewise for local "shadow".
19352         (hwloop_pattern_reg): Likewise for param "insn".
19353         * config/frv/frv-protos.h (frv_final_prescan_insn): Likewise.
19354         * config/frv/frv.c (frv_final_prescan_insn): Likewise.
19355         (frv_extract_membar): Likewise.
19356         (frv_optimize_membar_local): Strengthen param "last_membar" from
19357         rtx * to rtx_insn **.
19358         (frv_optimize_membar_global): Strengthen param "membar" from rtx
19359         to rtx_insn *.
19360         (frv_optimize_membar): Strengthen local "last_membar" from rtx *
19361         to rtx_insn **.
19362         * config/ia64/ia64-protos.h (ia64_st_address_bypass_p): Strengthen
19363         both params from rtx to rtx_insn *.
19364         (ia64_ld_address_bypass_p): Likewise.
19365         * config/ia64/ia64.c (ia64_safe_itanium_class): Likewise for param
19366         "insn".
19367         (ia64_safe_type): Likewise.
19368         (group_barrier_needed): Likewise.
19369         (safe_group_barrier_needed): Likewise.
19370         (ia64_single_set): Likewise.
19371         (is_load_p): Likewise.
19372         (record_memory_reference): Likewise.
19373         (get_mode_no_for_insn): Likewise.
19374         (important_for_bundling_p): Likewise.
19375         (unknown_for_bundling_p): Likewise.
19376         (ia64_st_address_bypass_p): Likewise for both params.
19377         (ia64_ld_address_bypass_p): Likewise.
19378         (expand_vselect): Introduce new local rtx_insn * "insn", using it
19379         in place of rtx "x" after the emit_insn call.
19380         * config/i386/i386-protos.h (x86_extended_QIreg_mentioned_p):
19381         Strengthen param from rtx to rtx_insn *.
19382         (ix86_agi_dependent): Likewise for both params.
19383         (ix86_attr_length_immediate_default): Likewise for param 1.
19384         (ix86_attr_length_address_default): Likewise for param.
19385         (ix86_attr_length_vex_default): Likewise for param 1.
19386         * config/i386/i386.c (ix86_attr_length_immediate_default):
19387         Likewise for param "insn".
19388         (ix86_attr_length_address_default): Likewise.
19389         (ix86_attr_length_vex_default): Likewise.
19390         (ix86_agi_dependent): Likewise for both params.
19391         (x86_extended_QIreg_mentioned_p): Likewise for param "insn".
19392         (vselect_insn): Likewise for this variable.
19393         * config/m68k/m68k-protos.h (m68k_sched_attr_opx_type): Likewise
19394         for param 1.
19395         (m68k_sched_attr_opy_type): Likewise.
19396         * config/m68k/m68k.c (sched_get_operand): Likewise.
19397         (sched_attr_op_type): Likewise.
19398         (m68k_sched_attr_opx_type): Likewise.
19399         (m68k_sched_attr_opy_type): Likewise.
19400         (sched_get_reg_operand): Likewise.
19401         (sched_get_mem_operand): Likewise.
19402         (m68k_sched_address_bypass_p): Likewise for both params.
19403         (sched_get_indexed_address_scale): Likewise.
19404         (m68k_sched_indexed_address_bypass_p): Likewise.
19405         * config/m68k/m68k.h (m68k_sched_address_bypass_p): Likewise.
19406         (m68k_sched_indexed_address_bypass_p): Likewise.
19407         * config/mep/mep.c (mep_jmp_return_reorg): Strengthen locals
19408         "label", "ret" from rtx to rtx_insn *, adding a checked cast and
19409         removing another.
19410         * config/mips/mips-protos.h (mips_linked_madd_p): Strengthen both
19411         params from rtx to rtx_insn *.
19412         (mips_fmadd_bypass): Likewise.
19413         * config/mips/mips.c (mips_fmadd_bypass): Likewise.
19414         (mips_linked_madd_p): Likewise.
19415         (mips_macc_chains_last_hilo): Likewise for this variable.
19416         (mips_macc_chains_record): Likewise for param.
19417         (vr4130_last_insn): Likewise for this variable.
19418         (vr4130_swap_insns_p): Likewise for both params.
19419         (mips_ls2_variable_issue): Likewise for param.
19420         (mips_need_noat_wrapper_p): Likewise for param "insn".
19421         (mips_expand_vselect): Add a new local rtx_insn * "insn", using it
19422         in place of "x" after the emit_insn.
19423         * config/pa/pa-protos.h (pa_fpstore_bypass_p): Strengthen both
19424         params from rtx to rtx_insn *.
19425         * config/pa/pa.c (pa_fpstore_bypass_p): Likewise.
19426         (pa_combine_instructions): Introduce local "par" for result of
19427         gen_rtx_PARALLEL, moving decl and usage of new_rtx for after call
19428         to make_insn_raw.
19429         (pa_can_combine_p): Strengthen param "new_rtx" from rtx to rtx_insn *.
19430         * config/rl78/rl78.c (insn_ok_now): Likewise for param "insn".
19431         (rl78_alloc_physical_registers_op1): Likewise.
19432         (rl78_alloc_physical_registers_op2): Likewise.
19433         (rl78_alloc_physical_registers_ro1): Likewise.
19434         (rl78_alloc_physical_registers_cmp): Likewise.
19435         (rl78_alloc_physical_registers_umul): Likewise.
19436         (rl78_alloc_address_registers_macax): Likewise.
19437         (rl78_alloc_physical_registers): Likewise for locals "insn", "curr".
19438         * config/s390/predicates.md (execute_operation): Likewise for
19439         local "insn".
19440         * config/s390/s390-protos.h (s390_agen_dep_p): Likewise for both
19441         params.
19442         * config/s390/s390.c (s390_safe_attr_type): Likewise for param.
19443         (addr_generation_dependency_p): Likewise for param "insn".
19444         (s390_agen_dep_p): Likewise for both params.
19445         (s390_fpload_toreg): Likewise for param "insn".
19446         * config/sh/sh-protos.h (sh_loop_align): Likewise for param.
19447         * config/sh/sh.c (sh_loop_align): Likewise for param and local
19448         "next".
19449         * config/sh/sh.md (define_peephole2): Likewise for local "insn2".
19450         * config/sh/sh_treg_combine.cc
19451         (sh_treg_combine::make_inv_ccreg_insn): Likewise for return type
19452         and local "i".
19453         (sh_treg_combine::try_eliminate_cstores): Likewise for local "i".
19454         * config/stormy16/stormy16.c (combine_bnp): Likewise for locals
19455         "and_insn", "load", "shift".
19456         * config/tilegx/tilegx.c (match_pcrel_step2): Likewise for param
19457         "insn".
19458         * final.c (final_scan_insn): Introduce local rtx_insn * "other"
19459         for XEXP (note, 0) of the REG_CC_SETTER note.
19460         (cleanup_subreg_operands): Strengthen param "insn" from rtx to
19461         rtx_insn *, eliminating a checked cast made redundant by this.
19462         * gcse.c (process_insert_insn): Strengthen local "insn" from rtx
19463         to rtx_insn *.
19464         * genattr.c (main): When writing out the prototype to
19465         const_num_delay_slots, strengthen the param from rtx to
19466         rtx_insn *.
19467         * genattrtab.c (write_const_num_delay_slots): Likewise when
19468         writing out the implementation of const_num_delay_slots.
19469         * hw-doloop.h (struct hw_doloop_hooks): Strengthen the param
19470         "insn" of callback field "end_pattern_reg" from rtx to rtx_insn *.
19471         * ifcvt.c (noce_emit_store_flag): Eliminate local rtx "tmp" in
19472         favor of new rtx locals "src" and "set" and new local rtx_insn *
19473         "insn" and "seq".
19474         (noce_emit_move_insn): Strengthen locals "seq" and "insn" from rtx
19475         to rtx_insn *.
19476         (noce_emit_cmove): Eliminate local rtx "tmp" in favor of new rtx
19477         locals "cond", "if_then_else", "set" and new rtx_insn * locals
19478         "insn" and "seq".
19479         (noce_try_cmove_arith): Strengthen locals "insn_a" and "insn_b",
19480         "last" from rtx to rtx_insn *.  Likewise for a local "tmp",
19481         renaming to "tmp_insn".  Eliminate the other local rtx "tmp" from
19482         the top-level scope, replacing with new more tightly-scoped rtx
19483         locals "reg", "pat", "mem" and rtx_insn * "insn", "copy_of_a",
19484         "new_insn", "copy_of_insn_b", and make local rtx "set" more
19485         tightly-scoped.
19486         * ira-int.h (ira_setup_alts): Strengthen param "insn" from rtx to
19487         rtx_insn *.
19488         * ira.c (setup_prohibited_mode_move_regs): Likewise for local
19489         "move_insn".
19490         (ira_setup_alts): Likewise for param "insn".
19491         * lra-constraints.c (emit_inc): Likewise for local "add_insn".
19492         * lra.c (emit_add3_insn): Split local rtx "insn" in two, an rtx
19493         and an rtx_insn *.
19494         (lra_emit_add): Eliminate top-level local rtx "insn" in favor of
19495         new more-tightly scoped rtx locals "add3_insn", "insn",
19496         "add2_insn" and rtx_insn * "move_insn".
19497         * postreload-gcse.c (eliminate_partially_redundant_load): Add
19498         checked cast on result of gen_move_insn when invoking
19499         extract_insn.
19500         * recog.c (insn_invalid_p): Strengthen param "insn" from rtx to
19501         rtx_insn *.
19502         (verify_changes): Add a checked cast on "object" when invoking
19503         insn_invalid_p.
19504         (extract_insn_cached): Strengthen param "insn" from rtx to
19505         rtx_insn *.
19506         (extract_constrain_insn_cached): Likewise.
19507         (extract_insn): Likewise.
19508         * recog.h (insn_invalid_p): Likewise for param 1.
19509         (recog_memoized): Likewise for param.
19510         (extract_insn): Likewise.
19511         (extract_constrain_insn_cached): Likewise.
19512         (extract_insn_cached): Likewise.
19513         * reload.c (can_reload_into): Likewise for local "test_insn".
19514         * reload.h (cleanup_subreg_operands): Likewise for param.
19515         * reload1.c (emit_insn_if_valid_for_reload): Rename param from
19516         "insn" to "pat", reintroducing "insn" as an rtx_insn * on the
19517         result of emit_insn.  Remove a checked cast made redundant by this
19518         change.
19519         * sel-sched-ir.c (sel_insn_rtx_cost): Strengthen param "insn" from
19520         rtx to rtx_insn *.
19521         * sel-sched.c (get_reg_class): Likewise.
19522
19523 2014-09-09  Marcus Shawcroft  <marcus.shawcroft@arm.com>
19524             Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
19525
19526         * config/aarch64/aarch64-elf-raw.h (ENDFILE_SPEC): Add crtfastmath.o.
19527         * config/aarch64/aarch64-linux.h (GNU_USER_TARGET_MATH_ENDFILE_SPEC):
19528         Define.
19529         (ENDFILE_SPEC): Define and use GNU_USER_TARGET_MATH_ENDFILE_SPEC.
19530
19531 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19532
19533         * rtl.h (INSN_LOCATION): Strengthen param from const_rtx to
19534         const rtx_insn *, and from rtx to rtx_insn * for the other
19535         overloaded variant.
19536         (RTL_LOCATION): Add a checked cast to rtx_insn * when invoking
19537         INSN_LOCATION, since we know INSN_P holds.
19538         (insn_line): Strengthen param from const_rtx to const rtx_insn *.
19539         (insn_file): Likewise.
19540         (insn_scope): Likewise.
19541         (insn_location): Likewise.
19542
19543         * config/mips/mips.c (mips16_gp_pseudo_reg): Strengthen local
19544         "insn" from rtx to rtx_insn *, introducing a new local rtx "set"
19545         for the result of gen_load_const_gp.
19546         * config/rs6000/rs6000-protos.h (output_call): Strengthen first
19547         param from rtx to rtx_insn *.
19548         * config/rs6000/rs6000.c (output_call): Likewise.
19549         * dwarf2out.c (dwarf2out_var_location): Likewise for local "prev",
19550         introducing a checked cast to rtx_sequence * and use of the insn
19551         method.
19552         * emit-rtl.c (emit_copy_of_insn_after): Strengthen both params
19553         from rtx to rtx_insn *.
19554         (insn_scope): Strengthen param from const_rtx to const rtx_insn *.
19555         (insn_line): Likewise.
19556         (insn_file): Likewise.
19557         (insn_location): Likewise.
19558         * emit-rtl.h (emit_copy_of_insn_after): Strengthen both params
19559         from rtx to rtx_insn *.
19560         * print-rtl.c (print_rtx): Introduce local "in_insn" via a checked
19561         cast, using it for calls to INSN_HAS_LOCATION and insn_location.
19562         * recog.c (peep2_attempt): Introduce local rtx_insn * "peepinsn"
19563         via a checked cast.
19564         * reorg.c (relax_delay_slots): Strengthen locals named "after"
19565         from rtx to rtx_insn *; use methods of "pat" for type-safety.
19566
19567 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19568
19569         * combine.c (try_combine): Eliminate checked cast on result of
19570         gen_rtx_INSN.
19571         * emit-rtl.c (gen_rtx_INSN): New function, improving over the prior
19572         autogenerated one by strengthening the return type and params 2 and 3
19573         from rtx to rtx_insn *, and by naming the params.
19574         * gengenrtl.c (special_rtx): Add INSN to those that are
19575         special-cased.
19576         * rtl.h (gen_rtx_INSN): New prototype.
19577
19578 2014-09-09  David Malcolm  <dmalcolm@redhat.com>
19579
19580         * ira.c (ira_update_equiv_info_by_shuffle_insn): Use NULL rather
19581         than NULL_RTX.
19582         (no_equiv): Likewise.
19583         (update_equiv_regs): Likewise.
19584         (setup_reg_equiv): Likewise.  Strengthen locals "elem",
19585         "prev_elem", "next_elem" from rtx to rtx_insn_list *, and "insn"
19586         from rtx to rtx_insn *.  Use methods of "elem" for typesafety and
19587         clarity.
19588         * ira.h (struct ira_reg_equiv_s): Strengthen field "init_insns"
19589         from rtx to rtx_insn_list *.
19590         * lra-assigns.c (spill_for): Strengthen local "x" from rtx to
19591         rtx_insn_list * and use methods for clarity and typesafety.
19592         * lra-constraints.c (contains_deleted_insn_p): Likewise for param
19593         "list".
19594         (init_insn_rhs_dead_pseudo_p): Likewise for local "insns".  Remove
19595         redundant check on INSN_P (insns): this cannot hold, as "insns" is
19596         an INSN_LIST, not an insn.
19597         (reverse_equiv_p): Strengthen local "insns" from rtx to
19598         rtx_insn_list * and use methods for clarity and typesafety.
19599         (contains_reloaded_insn_p): Likewise for local "list".
19600
19601 2014-09-09  Jiong Wang  <jiong.wang@arm.com>
19602
19603         * config/arm/arm.c (NEON_COPYSIGNF): New enum.
19604         (arm_init_neon_builtins): Support NEON_COPYSIGNF.
19605         (arm_builtin_vectorized_function): Likewise.
19606         * config/arm/arm_neon_builtins.def: New macro for copysignf.
19607         * config/arm/neon.md (neon_copysignf<mode>): New pattern for
19608         vector copysignf.
19609
19610 2014-09-09  Richard Sandiford  <richard.sandiford@arm.com>
19611
19612         * bb-reorder.h (default_target_bb_reorder): Remove redundant GTY.
19613         * builtins.h (default_target_builtins): Likewise.
19614         * gcse.h (default_target_gcse): Likewise.
19615         * target-globals.h (target_globals): Add a destructor.  Convert
19616         void-pointer fields back to their real type and change from
19617         GTY((atomic)) to GTY((skip)).
19618         (restore_target_globals): Remove casts accordingly.
19619         * target-globals.c (save_target_globals): Use XCNEW rather than
19620         ggc_internal_cleared_alloc to allocate non-GC structures.
19621         Use ggc_cleared_alloc to allocate the target_globals structure
19622         itself.
19623         (target_globals::~target_globals): Define.
19624
19625 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19626
19627         * config/arm/arm.md (vfp_pop_multiple_with_writeback): Use vldm
19628         mnemonic instead of fldmfdd.
19629         * config/arm/arm.c (vfp_output_fstmd): Rename to...
19630         (vfp_output_vstmd): ... This.  Convert output to UAL syntax.
19631         Output vpush when address register is SP.
19632         * config/arm/arm-protos.h (vfp_output_fstmd): Rename to...
19633         (vfp_output_vstmd): ... This.
19634         * config/arm/vfp.md (push_multi_vfp): Update call to
19635         vfp_output_vstmd.
19636
19637 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19638
19639         * config/arm/vfp.md (*movcc_vfp): Use UAL syntax.
19640
19641 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19642
19643         * config/arm/vfp.md (*sqrtsf2_vfp): Use UAL assembly syntax.
19644         (*sqrtdf2_vfp): Likewise.
19645         (*cmpsf_vfp): Likewise.
19646         (*cmpsf_trap_vfp): Likewise.
19647         (*cmpdf_vfp): Likewise.
19648         (*cmpdf_trap_vfp): Likewise.
19649
19650 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19651
19652         * config/arm/vfp.md (*extendsfdf2_vfp): Use UAL assembly syntax.
19653         (*truncdfsf2_vfp): Likewise.
19654         (*truncsisf2_vfp): Likewise.
19655         (*truncsidf2_vfp): Likewise.
19656         (fixuns_truncsfsi2): Likewise.
19657         (fixuns_truncdfsi2): Likewise.
19658         (*floatsisf2_vfp): Likewise.
19659         (*floatsidf2_vfp): Likewise.
19660         (floatunssisf2): Likewise.
19661         (floatunssidf2): Likewise.
19662
19663 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19664
19665         * config/arm/vfp.md (*mulsf3_vfp): Use UAL assembly syntax.
19666         (*muldf3_vfp): Likewise.
19667         (*mulsf3negsf_vfp): Likewise.
19668         (*muldf3negdf_vfp): Likewise.
19669         (*mulsf3addsf_vfp): Likewise.
19670         (*muldf3adddf_vfp): Likewise.
19671         (*mulsf3subsf_vfp): Likewise.
19672         (*muldf3subdf_vfp): Likewise.
19673         (*mulsf3negsfaddsf_vfp): Likewise.
19674         (*fmuldf3negdfadddf_vfp): Likewise.
19675         (*mulsf3negsfsubsf_vfp): Likewise.
19676         (*muldf3negdfsubdf_vfp): Likewise.
19677
19678 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19679
19680         * config/arm/vfp.md (*abssf2_vfp): Use UAL assembly syntax.
19681         (*absdf2_vfp): Likewise.
19682         (*negsf2_vfp): Likewise.
19683         (*negdf2_vfp): Likewise.
19684         (*addsf3_vfp): Likewise.
19685         (*adddf3_vfp): Likewise.
19686         (*subsf3_vfp): Likewise.
19687         (*subdf3_vfp): Likewise.
19688         (*divsf3_vfp): Likewise.
19689         (*divdf3_vfp): Likewise.
19690
19691 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19692
19693         * config/arm/arm.c (output_move_vfp): Use UAL syntax for load/store
19694         multiple.
19695         (arm_print_operand): Don't convert real values to decimal
19696         representation in default case.
19697         (fp_immediate_constant): Delete.
19698         * config/arm/arm-protos.h (fp_immediate_constant): Likewise.
19699         * config/arm/vfp.md (*arm_movsi_vfp): Convert to VFP moves to UAL
19700         syntax.
19701         (*thumb2_movsi_vfp): Likewise.
19702         (*movdi_vfp): Likewise.
19703         (*movdi_vfp_cortexa8): Likewise.
19704         (*movhf_vfp_neon): Likewise.
19705         (*movhf_vfp): Likewise.
19706         (*movsf_vfp): Likewise.
19707         (*thumb2_movsf_vfp): Likewise.
19708         (*movdf_vfp): Likewise.
19709         (*thumb2_movdf_vfp): Likewise.
19710         (*movsfcc_vfp): Likewise.
19711         (*thumb2_movsfcc_vfp): Likewise.
19712         (*movdfcc_vfp): Likewise.
19713         (*thumb2_movdfcc_vfp): Likewise.
19714
19715 2014-09-09  James Greenhalgh  <james.greenhalgh@arm.com>
19716
19717         * doc/invoke.texi (-march): Use GNU/Linux rather than Linux.
19718         (-mtune): Likewise.
19719         (-mcpu): Likewise.
19720
19721 2014-09-09  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
19722
19723         PR target/61749
19724         * config/aarch64/aarch64-builtins.c (aarch64_types_quadop_qualifiers):
19725         Use qualifier_immediate for last operand.  Rename to...
19726         (aarch64_types_ternop_lane_qualifiers): ... This.
19727         (TYPES_QUADOP): Rename to...
19728         (TYPES_TERNOP_LANE): ... This.
19729         (aarch64_simd_expand_args): Return const0_rtx when encountering user
19730         error.  Change return of 0 to return of NULL_RTX.
19731         (aarch64_crc32_expand_builtin): Likewise.
19732         (aarch64_expand_builtin): Return NULL_RTX instead of 0.
19733         ICE when expanding unknown builtin.
19734         * config/aarch64/aarch64-simd-builtins.def (sqdmlal_lane): Use
19735         TERNOP_LANE qualifiers.
19736         (sqdmlsl_lane): Likewise.
19737         (sqdmlal_laneq): Likewise.
19738         (sqdmlsl_laneq): Likewise.
19739         (sqdmlal2_lane): Likewise.
19740         (sqdmlsl2_lane): Likewise.
19741         (sqdmlal2_laneq): Likewise.
19742         (sqdmlsl2_laneq): Likewise.
19743
19744 2014-09-09  Nick Clifton  <nickc@redhat.com>
19745
19746         * doc/invoke.texi (Optimization Options): Add missing @gol to the
19747         end of a line.
19748         (S/390 and zSeries Options): Remove superfluous word from the
19749         description of the -mhotpatch option.
19750
19751 2014-09-09  Zhenqiang Chen  <zhenqiang.chen@arm.com>
19752
19753         * shrink-wrap.h: #define SHRINK_WRAPPING_ENABLED.
19754         * ira.c: #include "shrink-wrap.h"
19755         (split_live_ranges_for_shrink_wrap): Use SHRINK_WRAPPING_ENABLED.
19756         * ifcvt.c: #include "shrink-wrap.h"
19757         (dead_or_predicable): Use SHRINK_WRAPPING_ENABLED.
19758
19759 2014-09-08  Trevor Saunders  <tsaunders@mozilla.com>
19760
19761         * common/config/picochip/picochip-common.c: Remove.
19762         * config.gcc: Remove support for picochip.
19763         * config/picochip/constraints.md: Remove.
19764         * config/picochip/dfa_space.md: Remove.
19765         * config/picochip/dfa_speed.md: Remove.
19766         * config/picochip/picochip-protos.h: Remove.
19767         * config/picochip/picochip.c: Remove.
19768         * config/picochip/picochip.h: Remove.
19769         * config/picochip/picochip.md: Remove.
19770         * config/picochip/picochip.opt: Remove.
19771         * config/picochip/predicates.md: Remove.
19772         * config/picochip/t-picochip: Remove.
19773         * doc/md.texi: Don't document picochi.
19774
19775 2014-09-08  David Malcolm  <dmalcolm@redhat.com>
19776
19777         * basic-block.h (control_flow_insn_p): Strengthen param from
19778         const_rtx to const rtx_insn *.
19779         * cfgbuild.c (control_flow_insn_p): Likewise.
19780
19781 2014-09-08  David Malcolm  <dmalcolm@redhat.com>
19782
19783         * gcse.c (modify_mem_list): Strengthen this variable from
19784         vec<rtx> * to vec<rtx_insn *> *.
19785         (vec_rtx_heap): Strengthen this typedef from vec<rtx> to
19786         vec<rtx_insn *>.
19787         (load_killed_in_block_p): Strengthen local "list" from vec<rtx> to
19788         vec<rtx_insn *>, and local "setter" from rtx to rtx_insn *.
19789         (record_last_mem_set_info): Strengthen param "insn" from rtx to
19790         rtx_insn *.
19791         (record_last_set_info): Likewise for local "last_set_insn".
19792
19793 2014-09-08  DJ Delorie  <dj@redhat.com>
19794
19795         * doc/invoke.texi (MSP430 Options): Add -minrt.
19796
19797 2014-09-08  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
19798
19799         * config/rs6000/rs6000.c (special_handling_values):  Add SH_SPLAT.
19800         (rtx_is_swappable_p): Convert UNSPEC cascading ||s to a switch
19801         statement; allow optimization of UNSPEC_VSPLT_DIRECT with special
19802         handling SH_SPLAT.
19803         (adjust_extract): Fix test for VEC_DUPLICATE case; fix adjustment
19804         of extracted lane.
19805         (adjust_splat): New function.
19806         (handle_special_swappables): Call adjust_splat for SH_SPLAT.
19807         (dump_swap_insn_table): Add case for SH_SPLAT.
19808
19809 2014-09-08  Richard Biener  <rguenther@suse.de>
19810
19811         PR ipa/63196
19812         * tree-inline.c (copy_loops): The source loop header should
19813         always be non-NULL.
19814         (tree_function_versioning): If loops need fixup after removing
19815         unreachable blocks fix them.
19816         * omp-low.c (simd_clone_adjust): Do not add incr block to
19817         loop under construction.
19818
19819 2014-09-08  Alan Lawrence  <alan.lawrence@arm.com>
19820
19821         * config/aarch64/aarch64-builtins.c
19822         (aarch64_types_cmtst_qualifiers, TYPES_TST): Remove as unused.
19823
19824 2014-09-08  Joseph Myers  <joseph@codesourcery.com>
19825
19826         * config/i386/cygming.h (TF_SIZE): Remove.
19827         * config/i386/darwin.h (TF_SIZE): Remove.
19828         * config/i386/dragonfly.h (TF_SIZE): Remove.
19829         * config/i386/freebsd.h (TF_SIZE): Remove.
19830         * config/i386/gnu-user-common.h (TF_SIZE): Remove.
19831         * config/i386/openbsdelf.h (TF_SIZE): Remove.
19832         * config/i386/sol2.h (TF_SIZE): Remove.
19833         * config/ia64/hpux.h (XF_SIZE, TF_SIZE): Remove.
19834         * config/ia64/linux.h (TF_SIZE): Remove.
19835         * doc/tm.texi.in (SF_SIZE, DF_SIZE, XF_SIZE, TF_SIZE): Remove.
19836         * doc/tm.texi: Regenerate.
19837         * system.h (SF_SIZE, DF_SIZE, XF_SIZE, TF_SIZE): Poison.
19838
19839 2014-09-08  Joseph Myers  <joseph@codesourcery.com>
19840
19841         * defaults.h (LARGEST_EXPONENT_IS_NORMAL, ROUND_TOWARDS_ZERO):
19842         Remove.
19843         * doc/tm.texi.in (ROUND_TOWARDS_ZERO, LARGEST_EXPONENT_IS_NORMAL):
19844         Remove.
19845         * doc/tm.texi: Regenerate.
19846         * system.h (LARGEST_EXPONENT_IS_NORMAL, ROUND_TOWARDS_ZERO):
19847         Poison.
19848         * config/arm/arm.h (LARGEST_EXPONENT_IS_NORMAL): Remove.
19849         * config/cris/cris.h (__make_dp): Remove.
19850
19851 2014-09-08  Richard Biener  <rguenther@suse.de>
19852
19853         PR bootstrap/63204
19854         * cfgloop.c (mark_loop_for_removal): Track former header
19855         unconditionally.
19856         * cfgloop.h (struct loop): Add former_header member unconditionally.
19857         * loop-init.c (fix_loop_structure): Enable bogus loop removal
19858         diagnostic unconditionally.
19859
19860 2014-09-07 Venkataramanan Kumar <venkataramanan.kumar@linaro.org>
19861
19862         PR target/63190
19863         * config/aarch64/aarch64.md (stack_protect_test_<mode>) Add register
19864         constraint for operand0 and remove write only modifier from operand3.
19865
19866 2014-09-07  Richard Sandiford  <richard.sandiford@arm.com>
19867
19868         PR rtl-optimization/62208
19869         * simplify-rtx.c (simplify_relational_operation_1): Use CONST0_RTX
19870         rather than const0_rtx in eq/ne-xor simplifications.
19871
19872 2014-09-06  Joern Rennecke  <joern.rennecke@embecosm.com>
19873
19874         * config/arc/arc.c (arc_print_operand): Fix format for HOST_WIDE_INT.
19875         (arc_output_mi_thunk): Likewise.
19876
19877         * config/arc/arc.c (arc_predicate_delay_insns): Swap comparison
19878         arguments to silence bogus warning.
19879
19880 2014-09-06  Richard Sandiford  <richard.sandiford@arm.com>
19881
19882         PR middle-end/63171
19883         * rtlanal.c (tls_referenced_p): Don't skip constant subrtxes.
19884
19885 2014-09-06  Tom de Vries  <tom@codesourcery.com>
19886
19887         * ira-costs.c (ira_tune_allocno_costs): Don't conditionalize
19888         IRA_HARD_REGNO_ADD_COST_MULTIPLIER code on
19889         ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS.
19890
19891 2014-09-05  Dominique Dhumieres  <dominiq@lps.ens.fr>
19892
19893         PR target/63188
19894         * config/darwin.h (INIT_SECTION_ASM_OP): Define to "".
19895         * config/pa/pa64-hpux.h (INIT_SECTION_ASM_OP): Likewise.
19896
19897 2014-09-05  Easwaran Raman  <eraman@google.com>
19898
19899         PR rtl-optimization/62146
19900         * ifcvt.c (dead_or_predicable): Make removal of REG_EQUAL note of
19901         hoisted instruction unconditional.
19902
19903 2014-09-05  Segher Boessenkool  <segher@kernel.crashing.org>
19904
19905         PR target/63187
19906         * config/rs6000/rs6000.md (*and<mode>3_imm_dot, *and<mode>3_imm_dot2):
19907         Do not allow any_mask_operand for operands[2].
19908         (*and<mode>3_imm_mask_dot, *and<mode>3_imm_mask_dot2): New.
19909
19910 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19911
19912         * config/arc/arc.c (arc_print_operand): Use insn method of
19913         final_sequence for type-safety.
19914         * config/bfin/bfin.c (bfin_hardware_loop): Strengthen param
19915         "insn" from rtx to rtx_insn *.
19916         * config/frv/frv.c (frv_print_operand_jump_hint): Likewise.
19917         * config/mn10300/mn10300.c (mn10300_scan_for_setlb_lcc):
19918         Likewise for locals "branch", "label".
19919         * config/h8300/h8300.c (same_cmp_preceding_p): Likewise for
19920         locals "i1", "i2".  Use NULL rather than NULL_RTX in comparisons.
19921         (same_cmp_following_p): Likewise for locals "i2", "i3".
19922         * config/sh/sh_optimize_sett_clrt.cc
19923         (sh_optimize_sett_clrt::sh_cbranch_ccreg_value): Likewise for
19924         param "cbranch_insn".
19925         * function.c (convert_jumps_to_returns): Likewis for local "jump".
19926         * ifcvt.c (cond_exec_get_condition): Likewise for param "jump".
19927         * jump.c (simplejump_p): Strengthen param "insn" from const_rtx to
19928         const rtx_insn *.
19929         (condjump_p): Likewise.
19930         (condjump_in_parallel_p): Likewise.
19931         (pc_set): Likewise.
19932         (any_uncondjump_p): Likewise.
19933         (any_condjump_p): Likewise.
19934         (condjump_label): Likewise.
19935         (returnjump_p): Strengthen param "insn" from rtx to
19936         const rtx_insn *.
19937         (onlyjump_p): Strengthen param "insn" from const_rtx to
19938         const rtx_insn *.
19939         (jump_to_label_p): Likewise.
19940         (invert_jump_1): Strengthen param "jump" from rtx to rtx_insn *.
19941         (invert_jump): Likewise.
19942         * reorg.c (simplejump_or_return_p): Add checked cast when calling
19943         simplejump_p.
19944         (get_jump_flags): Strengthen param "insn" from rtx to
19945         const rtx_insn *.
19946         (get_branch_condition): Likewise.
19947         (condition_dominates_p): Likewise.
19948         (make_return_insns): Move declaration of local "pat" earlier, to
19949         after we've handled NONJUMP_INSN_P and non-sequences, using its
19950         methods to simplify the code and for type-safety.
19951         * rtl.h (find_constant_src): Strengthen param from const_rtx to
19952         const rtx_insn *.
19953         (jump_to_label_p): Strengthen param from rtx to const rtx_insn *.
19954         (condjump_p): Strengthen param from const_rtx to
19955         const rtx_insn *.
19956         (any_condjump_p): Likewise.
19957         (any_uncondjump_p): Likewise.
19958         (pc_set): Likewise.
19959         (condjump_label): Likewise.
19960         (simplejump_p): Likewise.
19961         (returnjump_p): Likewise.
19962         (onlyjump_p): Likewise.
19963         (invert_jump_1): Strengthen param 1 from rtx to rtx_insn *.
19964         (invert_jump): Likewise.
19965         (condjump_in_parallel_p): Strengthen param from const_rtx to
19966         const rtx_insn *.
19967         * rtlanal.c (find_constant_src): Strengthen param from const_rtx
19968         to const rtx_insn *.
19969         * sel-sched-ir.c (fallthru_bb_of_jump): Strengthen param from rtx
19970         to const rtx_insn *.
19971         * sel-sched-ir.h (fallthru_bb_of_jump): Likewise.
19972
19973 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19974
19975         * reorg.c (relax_delay_slots): Move declaration of "trial_seq"
19976         above the conditional, and convert the check on GET_CODE to a
19977         dyn_cast, so that "trial_seq" is available as an rtx_sequence * in
19978         the conditional.  Simplify the conditional by using methods of
19979         "trial_seq".
19980
19981 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19982
19983         * haifa-sched.c (check_clobbered_conditions): Strengthen local
19984         "link" from rtx to rtx_insn_list *, and use its methods for
19985         clarity and type-safety.
19986         (toggle_cancelled_flags): Likewise.
19987         (restore_last_backtrack_point): Likewise.
19988         (queue_to_ready): Use insn method of "link" in one place.
19989         (schedule_block): Strengthen local "link" from rtx to
19990         rtx_insn_list *, and use its methods for clarity and type-safety.
19991
19992 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
19993
19994         * sched-deps.c (sched_get_condition_with_rev_uncached): Strengthen
19995         param "insn" from const_rtx to const rtx_insn *.
19996         (sched_get_reverse_condition_uncached): Likewise.
19997         (sched_get_condition_with_rev): Likewise.
19998         (sched_has_condition_p): Likewise.
19999         (sched_insns_conditions_mutex_p): Likewise for both params.
20000         (sched_insn_is_legitimate_for_speculation_p): Likewise for param
20001         "insn"; conver use of CONST_CAST_RTX to CONST_CAST_RTX_INSN.
20002         (setup_insn_reg_uses): Move local "list" to be more tightly
20003         scoped, strengthening it from an rtx to an rtx_insn_list *.  Use
20004         its methods for clarity and type-safety.
20005         (sched_analyze_1): Strengthen local "pending" from rtx to
20006         rtx_insn_list *, and local "pending_mem" from rtx to
20007         rtx_expr_list *.  Use methods of each for clarity and type-safety.
20008         (sched_analyze_2): Likewise.
20009         (sched_analyze_insn): Likewise.
20010
20011         * sched-int.h (sched_get_reverse_condition_uncached): Strengthen
20012         param from const_rtx to const rtx_insn *.
20013         (sched_insns_conditions_mutex_p): Likewise for both params.
20014         (sched_insn_is_legitimate_for_speculation_p): Likewise for first
20015         param.
20016
20017         * system.h (CONST_CAST_RTX_INSN): New macro.
20018
20019 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20020
20021         * recog.c (peep2_attempt): Strengthen return type from rtx to
20022         rtx_insn *.
20023         (peep2_update_life): Likewise for params "last", "prev", removing
20024         a checked cast made redundant by this.
20025         (peephole2_optimize): Likewise for local "last".
20026
20027 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20028
20029         * basic-block.h (set_block_for_insn): Eliminate this macro in
20030         favor of...
20031         * rtl.h (set_block_for_insn): New inline function, imposing the
20032         requirement that the "insn" param is an rtx_insn *.
20033
20034 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20035
20036         * caller-save.c (setup_save_areas): Strengthen local "insn" from
20037         rtx to rtx_insn *.
20038         * final.c (get_call_reg_set_usage): Likewise for first param,
20039         eliminating a checked cast.
20040         * regs.h (get_call_reg_set_usage): Likewise for first param.
20041         * resource.c (mark_set_resources): Introduce local rtx_call_insn *
20042         "call_insn" for the case of a MARK_SRC_DEST_CALL via a checked
20043         cast, replacing references to "x" with "call_insn" where
20044         appropriate.
20045         (mark_target_live_regs): Strengthen local "real_insn" from rtx to
20046         rtx_insn *, adding a checked cast.
20047
20048 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20049
20050         * output.h (final_scan_insn): Strengthen first param from rtx to
20051         rtx_insn *.
20052
20053         * final.c (final_scan_insn): Likewise, renaming it back from
20054         "uncast_insn" to "insn", eliminating the checked cast.
20055
20056         * config/h8300/h8300.md (define_insn "jump"): Replace local rtx
20057         "vec" with an rtx_sequence * "seq", taking a copy of
20058         "final_sequence", and using methods of "seq" for clarity, and for
20059         type-safety in the calls to final_scan_insn.
20060         * config/mips/mips.c (mips_output_conditional_branch): Use methods
20061         of "final_sequence" for clarity, and for type-safety in the call to
20062         final_scan_insn.
20063         * config/sh/sh.c (print_slot): Strengthen param from rtx to
20064         rtx_sequence * and rename from "insn" to "seq".
20065
20066 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20067
20068         * jump.c (delete_related_insns): Introduce a new local "table" by
20069         replacing JUMP_TABLE_DATA_P with a dyn_cast, then use the
20070         get_labels method of "table" to simplify access to the labels in
20071         the jump table.
20072
20073 2014-09-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20074
20075         * config/arm/cortex-a53.md (cortex_a53_fpalu): Add f_rints, f_rintd,
20076         f_minmaxs, f_minmaxd types.
20077
20078 2014-09-05  Richard Biener  <rguenther@suse.de>
20079
20080         * cfgloop.c (mark_loop_for_removal): Record former header
20081         when ENABLE_CHECKING.
20082         * cfgloop.h (strut loop): Add former_header member when
20083         ENABLE_CHECKING.
20084         * loop-init.c (fix_loop_structure): Sanity check loops
20085         marked for removal if they re-appeared.
20086
20087 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20088
20089         * config/aarch64/arm_neon.h (int32x1_t, int16x1_t, int8x1_t,
20090         uint32x1_t, uint16x1_t, uint8x1_t): Remove typedefs.
20091
20092         (vqabsb_s8, vqabsh_s16, vqabss_s32, vqaddb_s8, vqaddh_s16, vqadds_s32,
20093         vqaddb_u8, vqaddh_u16, vqadds_u32, vqdmlalh_s16, vqdmlalh_lane_s16,
20094         vqdmlals_s32, vqdmlslh_s16, vqdmlslh_lane_s16, vqdmlsls_s32,
20095         vqdmulhh_s16, vqdmulhh_lane_s16, vqdmulhs_s32, vqdmulhs_lane_s32,
20096         vqdmullh_s16, vqdmullh_lane_s16, vqdmulls_s32, vqdmulls_lane_s32,
20097         vqmovnh_s16, vqmovns_s32, vqmovnd_s64, vqmovnh_u16, vqmovns_u32,
20098         vqmovnd_u64, vqmovunh_s16, vqmovuns_s32, vqmovund_s64, vqnegb_s8,
20099         vqnegh_s16, vqnegs_s32, vqrdmulhh_s16, vqrdmulhh_lane_s16,
20100         vqrdmulhs_s32, vqrdmulhs_lane_s32, vqrshlb_s8, vqrshlh_s16,
20101         vqrshls_s32, vqrshlb_u8, vqrshlh_u16, vqrshls_u32, vqrshrnh_n_s16,
20102         vqrshrns_n_s32, vqrshrnd_n_s64, vqrshrnh_n_u16, vqrshrns_n_u32,
20103         vqrshrnd_n_u64, vqrshrunh_n_s16, vqrshruns_n_s32, vqrshrund_n_s64,
20104         vqshlb_s8, vqshlh_s16, vqshls_s32, vqshlb_u8, vqshlh_u16, vqshls_u32,
20105         vqshlb_n_s8, vqshlh_n_s16, vqshls_n_s32, vqshlb_n_u8, vqshlh_n_u16,
20106         vqshls_n_u32, vqshlub_n_s8, vqshluh_n_s16, vqshlus_n_s32,
20107         vqshrnh_n_s16, vqshrns_n_s32, vqshrnd_n_s64, vqshrnh_n_u16,
20108         vqshrns_n_u32, vqshrnd_n_u64, vqshrunh_n_s16, vqshruns_n_s32,
20109         vqshrund_n_s64, vqsubb_s8, vqsubh_s16, vqsubs_s32, vqsubb_u8,
20110         vqsubh_u16, vqsubs_u32, vsqaddb_u8, vsqaddh_u16, vsqadds_u32,
20111         vuqaddb_s8, vuqaddh_s16, vuqadds_s32): Replace all int{32,16,8}x1_t
20112         with int{32,16,8}_t.
20113
20114 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20115
20116         * config/aarch64/arm_neon.h (__GET_HIGH): New macro.
20117         (vget_high_f32, vget_high_f64, vget_high_p8, vget_high_p16,
20118         vget_high_s8, vget_high_s16, vget_high_s32, vget_high_s64,
20119         vget_high_u8, vget_high_u16, vget_high_u32, vget_high_u64):
20120         Remove temporary __asm__ and reimplement.
20121
20122 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20123
20124         * config/aarch64/aarch64-builtins.c (aarch64_fold_builtin): Remove code
20125         handling cmge, cmgt, cmeq, cmtst.
20126
20127         * config/aarch64/aarch64-simd-builtins.def (cmeq, cmge, cmgt, cmle,
20128         cmlt, cmgeu, cmgtu, cmtst): Remove.
20129
20130         * config/aarch64/arm_neon.h (vceq_*, vceqq_*, vceqz_*, vceqzq_*,
20131         vcge_*, vcgeq_*, vcgez_*, vcgezq_*, vcgt_*, vcgtq_*, vcgtz_*,
20132         vcgtzq_*, vcle_*, vcleq_*, vclez_*, vclezq_*, vclt_*, vcltq_*,
20133         vcltz_*, vcltzq_*, vtst_*, vtstq_*): Use gcc vector extensions.
20134
20135 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20136
20137         * config/aarch64/aarch64-builtins.c (aarch64_types_cmtst_qualifiers,
20138         TYPES_TST): Define.
20139         (aarch64_fold_builtin): Update pattern for cmtst.
20140
20141         * config/aarch64/aarch64-protos.h (aarch64_const_vec_all_same_int_p):
20142         Declare.
20143
20144         * config/aarch64/aarch64-simd-builtins.def (cmtst): Update qualifiers.
20145
20146         * config/aarch64/aarch64-simd.md (aarch64_vcond_internal<mode><mode>):
20147         Switch operands, separate out more cases, refactor.
20148
20149         (aarch64_cmtst<mode>): Rewrite pattern to match (plus ... -1).
20150
20151         * config/aarch64.c (aarch64_const_vec_all_same_int_p): Take single
20152         argument; rename old version to...
20153         (aarch64_const_vec_all_same_in_range_p): ...this.
20154         (aarch64_print_operand, aarch64_simd_shift_imm_p): Follow renaming.
20155
20156         * config/aarch64/predicates.md (aarch64_simd_imm_minus_one): Define.
20157
20158 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20159
20160         * config/aarch64/aarch64-builtins.c (enum aarch64_type_qualifiers):
20161         Remove qualifier_const_pointer, update comment.
20162
20163 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20164
20165         * config/aarch64/aarch64.md (adddi3_aarch64): set type to neon_add.
20166
20167 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20168
20169         * config/aarch64/aarch64-builtins.c (aarch64_simd_expand_args): Replace
20170         varargs with pointer parameter.
20171         (aarch64_simd_expand_builtin): pass pointer into previous.
20172
20173 2014-09-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20174
20175         * config/arm/cortex-a53.md (cortex_a53_alu_shift): Add alu_ext,
20176         alus_ext.
20177
20178 2014-09-05  Alan Lawrence  <alan.lawrence@arm.com>
20179
20180         * config/aarch64/aarch64-simd.md (aarch64_rbit<mode>): New pattern.
20181         * config/aarch64/aarch64-simd-builtins.def (rbit): New builtin.
20182         * config/aarch64/arm_neon.h (vrbit_s8, vrbit_u8, vrbitq_s8, vrbitq_u8):
20183         Replace temporary asm with call to builtin.
20184         (vrbit_p8, vrbitq_p8): New functions.
20185
20186 2014-09-05  Richard Biener  <rguenther@suse.de>
20187
20188         * cfgloop.c (mark_loop_for_removal): New function.
20189         * cfgloop.h (mark_loop_for_removal): Declare.
20190         * cfghooks.c (delete_basic_block): Use mark_loop_for_removal.
20191         (merge_blocks): Likewise.
20192         (duplicate_block): Likewise.
20193         * except.c (sjlj_emit_dispatch_table): Likewise.
20194         * tree-eh.c (cleanup_empty_eh_merge_phis): Likewise.
20195         * tree-ssa-threadupdate.c (ssa_redirect_edges): Likewise.
20196         (thread_through_loop_header): Likewise.
20197
20198 2014-09-05  Richard Biener  <rguenther@suse.de>
20199
20200         PR middle-end/63148
20201         * fold-const.c (try_move_mult_to_index): Remove.
20202         (fold_binary_loc): Do not call it.
20203         * tree-data-ref.c (dr_analyze_indices): Strip conversions
20204         from the base object again.
20205
20206 2014-09-05  James Greenhalgh  <james.greenhalgh@arm.com>
20207
20208         * config/aarch64/aarch64.md (sibcall_value_insn): Give operand 1
20209         DImode.
20210
20211 2014-09-05  Bin Cheng  <bin.cheng@arm.com>
20212
20213         PR target/55701
20214         * config/arm/arm.md (setmem): New pattern.
20215         * config/arm/arm-protos.h (struct tune_params): New fields.
20216         (arm_gen_setmem): New prototype.
20217         * config/arm/arm.c (arm_slowmul_tune): Initialize new fields.
20218         (arm_fastmul_tune, arm_strongarm_tune, arm_xscale_tune): Ditto.
20219         (arm_9e_tune, arm_v6t2_tune, arm_cortex_tune): Ditto.
20220         (arm_cortex_a8_tune, arm_cortex_a7_tune): Ditto.
20221         (arm_cortex_a15_tune, arm_cortex_a53_tune): Ditto.
20222         (arm_cortex_a57_tune, arm_cortex_a5_tune): Ditto.
20223         (arm_cortex_a9_tune, arm_cortex_a12_tune): Ditto.
20224         (arm_v7m_tune, arm_v6m_tune, arm_fa726te_tune): Ditto.
20225         (arm_const_inline_cost): New function.
20226         (arm_block_set_max_insns): New function.
20227         (arm_block_set_non_vect_profit_p): New function.
20228         (arm_block_set_vect_profit_p): New function.
20229         (arm_block_set_unaligned_vect): New function.
20230         (arm_block_set_aligned_vect): New function.
20231         (arm_block_set_unaligned_non_vect): New function.
20232         (arm_block_set_aligned_non_vect): New function.
20233         (arm_block_set_vect, arm_gen_setmem): New functions.
20234
20235 2014-09-05  Bin Cheng  <bin.cheng@arm.com>
20236
20237         * config/arm/arm.md (arm_movqi_insn): Use Uh instead of m constraint.
20238
20239 2014-09-05  Bin Cheng  <bin.cheng@arm.com>
20240
20241         * config/arm/arm.c (output_move_neon): Handle REG explicitly.
20242
20243 2014-09-04  Trevor Saunders  <tsaunders@mozilla.com>
20244
20245         * valtrack.c (dead_debug_insert_temp): Take an rtx_insn * instead of
20246         an rtx.
20247         * valtrack.h: Adjust.
20248
20249 2014-09-04  Trevor Saunders  <tsaunders@mozilla.com>
20250
20251         * emit-rtl.c (emit_insn_before_noloc): Take an rtx_insn * instead of
20252         an rtx.
20253         (emit_jump_insn_before_noloc): Likewise.
20254         (emit_call_insn_before_noloc): Likewise.
20255         (emit_label_before): Likewise.
20256         (emit_label_after): Likewise.
20257         (emit_insn_before_setloc): Likewise.
20258         (emit_jump_insn_before_setloc): Likewise.
20259         (emit_call_insn_before_setloc): Likewise.
20260         (emit_call_insn_before): Likewise.
20261         * rtl.h: Adjust.
20262
20263 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20264
20265         * cse.c (cse_insn): Strengthen local "new_rtx" from rtx to
20266         rtx_insn *, eliminating a checked cast.
20267
20268 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20269
20270         * rtl.h (modified_between_p): Strengthen params 2 and 3 from
20271         const_rtx to const rtx_insn *.
20272         * rtlanal.c (modified_between_p): Likewise, eliminating a checked
20273         cast.
20274
20275 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20276
20277         * emit-rtl.c (try_split): Update NULL_RTX to NULL in call to
20278         fixup_args_size_notes.
20279         * expr.c (fixup_args_size_notes): Strengthen first two params from
20280         rtx to rtx_insn *, eliminating a checked cast.
20281         * rtl.h (fixup_args_size_notes): Strengthen first two params from
20282         rtx to rtx_insn *.
20283
20284 2014-09-05  David Malcolm  <dmalcolm@redhat.com>
20285
20286         * haifa-sched.c (get_ready_element): Strengthen return type from
20287         rtx to rtx_insn *.
20288         * sched-int.h (get_ready_element): Likewise.
20289
20290 2014-09-04  Segher Boessenkool  <segher@kernel.crashing.org>
20291
20292         PR target/63165
20293         * config/rs6000/rs6000.md (floatsi<mode>2_lfiwax_mem): Use
20294         indexed_or_indirect_operand instead of memory_operand.
20295         (floatsi<mode>2_lfiwzx_mem): Ditto.
20296
20297 2014-09-04  Trevor Saunders  <tsaunders@mozilla.com>
20298
20299         * config/bfin/bfin.c, config/c6x/c6x.c, config/m32c/m32c.c,
20300         config/mn10300/mn10300.c, config/s390/s390.c, config/sh/sh.c,
20301         ifcvt.c, reorg.c: Change types of variables from rtx to rtx_insn *.
20302
20303 2014-09-04  Trevor Saunders  <tsaunders@mozilla.com>
20304
20305         * emit-rtl.c (get_first_nonnote_insn): Return rtx_insn * instead of
20306         rtx.
20307         (get_last_nonnote_insn): Likewise.
20308         (next_nonnote_insn_bb): Take rtx_insn * instead of rtx.
20309         * resource.c (find_basic_block): Likewise.
20310         * rtl.h: Adjust.
20311         * rtlanal.c (keep_with_call_p): Take const rtx_insn * instead of
20312         const_rtx.
20313
20314 2014-09-04  David Malcolm  <dmalcolm@redhat.com>
20315
20316         * genattr.c (main): Within the prototype of insn_latency written
20317         out to insn-attr.h, strengthen both params from rtx to rtx_insn *.
20318         * genautomata.c (output_internal_maximal_insn_latency_func):
20319         Within the implementation of insn_latency written out to
20320         insn-automata.c, strengthen both params from rtx to rtx_insn *,
20321         eliminating a pair of checked casts.
20322
20323 2014-09-04  David Malcolm  <dmalcolm@redhat.com>
20324
20325         * jump.c (eh_returnjump_p): Strengthen param "insn" from rtx to
20326         rtx_insn *.
20327
20328         * rtl.h (eh_returnjump_p): Likewise.
20329
20330 2014-09-04  Aldy Hernandez  <aldyh@redhat.com>
20331
20332         * Makefile.in (TAGS): Handle constructs in timevar.def.
20333
20334 2014-09-04  Guozhi Wei  <carrot@google.com>
20335
20336         PR target/62040
20337         * config/aarch64/iterators.md (VQ_NO2E, VQ_2E): New iterators.
20338         * config/aarch64/aarch64-simd.md (move_lo_quad_internal_<mode>): Split
20339         it into two patterns.
20340         (move_lo_quad_internal_be_<mode>): Likewise.
20341
20342 2014-09-04  Manuel López-Ibáñez  <manu@gcc.gnu.org>
20343
20344         * doc/options.texi: Document that Var and Init are required if CPP
20345         is given.
20346         * optc-gen.awk: Require Var and Init if CPP is given.
20347         * common.opt (Wpedantic): Use Init.
20348
20349 2014-09-04  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
20350
20351         * config/rs6000/rs6000.c (special_handling_values): Add
20352         SH_EXTRACT.
20353         (rtx_is_swappable_p): Look for patterns with a VEC_SELECT, perhaps
20354         wrapped in a VEC_DUPLICATE, representing an extract.  Mark these
20355         as swappable with special handling SH_EXTRACT.  Remove
20356         UNSPEC_VSX_XXSPLTW from the list of disallowed unspecs for the
20357         optimization.
20358         (adjust_extract): New function.
20359         (handle_special_swappables): Add default to case statement; add
20360         case for SH_EXTRACT that calls adjust_extract.
20361         (dump_swap_insn_table): Handle SH_EXTRACT.
20362
20363 2014-09-04  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
20364
20365         * config/rs6000/vsx.md (*vsx_extract_<mode>_load): Always match
20366         selection of 0th memory doubleword, regardless of endianness.
20367
20368 2014-09-04  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
20369
20370         * config/rx/rx.h (HARD_REGNO_MODE_OK): Add braces.
20371
20372 2014-09-04  Alan Modra  <amodra@gmail.com>
20373
20374         PR debug/60655
20375         * dwarf2out.c (mem_loc_descriptor <PLUS>): Return NULL if addend
20376         can't be output.
20377
20378 2014-09-03  Matthew Fortune  <matthew.fortune@imgtec.com>
20379
20380         * target.def (TARGET_DWARF_FRAME_REG_MODE): New target hook.
20381         * targhooks.c (default_dwarf_frame_reg_mode): New function.
20382         * targhooks.h (default_dwarf_frame_reg_mode): New prototype.
20383         * doc/tm.texi.in (TARGET_DWARF_FRAME_REG_MODE): Document.
20384         * doc/tm.texi: Regenerate.
20385         * dwarf2cfi.c (expand_builtin_init_dwarf_reg_sizes): Abstract mode
20386         selection logic to default_dwarf_frame_reg_mode.
20387
20388 2014-09-03  Marek Polacek  <polacek@redhat.com>
20389
20390         * doc/invoke.texi: Document that -Wlogical-not-parentheses is enabled
20391         by -Wall.
20392
20393 2014-09-03  Richard Sandiford  <richard.sandiford@arm.com>
20394
20395         * doc/rtl.texi (RTX_AUTOINC): Document that the first operand is
20396         the automodified register.
20397
20398 2014-09-03  Richard Sandiford  <richard.sandiford@arm.com>
20399
20400         * output.h (get_some_local_dynamic_name): Declare.
20401         * final.c (some_local_dynamic_name): New variable.
20402         (get_some_local_dynamic_name): New function.
20403         (final_end_function): Clear some_local_dynamic_name.
20404         * config/alpha/alpha.c (machine_function): Remove some_ld_name.
20405         (get_some_local_dynamic_name, get_some_local_dynamic_name_1): Delete.
20406         (print_operand): Report an error if '%&' is used inappropriately.
20407         * config/i386/i386.c (get_some_local_dynamic_name): Delete.
20408         (get_some_local_dynamic_name_1): Delete.
20409         * config/rs6000/rs6000.c (machine_function): Remove some_ld_name.
20410         (rs6000_get_some_local_dynamic_name): Delete.
20411         (rs6000_get_some_local_dynamic_name_1): Delete.
20412         (print_operand): Report an error if '%&' is used inappropriately.
20413         * config/s390/s390.c (machine_function): Remove some_ld_name.
20414         (get_some_local_dynamic_name, get_some_local_dynamic_name_1): Delete.
20415         (print_operand): Assert that get_some_local_dynamic_name is nonnull.
20416         * config/sparc/sparc.c: Include rtl-iter.h.
20417         (machine_function): Remove some_ld_name.
20418         (sparc_print_operand): Report an error if '%&' is used inappropriately.
20419         (get_some_local_dynamic_name, get_some_local_dynamic_name_1): Delete.
20420
20421 2014-09-03  Richard Henderson  <rth@redhat.com>
20422
20423         * config/aarch64/aarch64.c (aarch64_popwb_single_reg): Remove.
20424         (aarch64_popwb_pair_reg): Remove.
20425         (aarch64_set_frame_expr): Remove.
20426         (aarch64_restore_callee_saves): Add CFI_OPS argument; fill it with
20427         the restore ops performed by the insns generated.
20428         (aarch64_expand_epilogue): Attach CFI_OPS to the stack deallocation
20429         insn.  Perform the calls_eh_return addition later; do not attempt to
20430         preserve the CFA in that case.  Don't use aarch64_set_frame_expr.
20431         (aarch64_expand_prologue): Use REG_CFA_ADJUST_CFA directly, or no
20432         special markup at all.  Load cfun->machine->frame.hard_fp_offset
20433         into a local variable.
20434         (aarch64_frame_pointer_required): Don't check calls_alloca.
20435
20436 2014-09-03  Richard Biener  <rguenther@suse.de>
20437
20438         * opts.c (default_options_optimization): Adjust
20439         max-combine-insns to 2 for -Og.
20440
20441 2014-09-03  Martin Jambor  <mjambor@suse.cz>
20442
20443         PR ipa/62015
20444         * ipa-cp.c (intersect_aggregates_with_edge): Handle impermissible
20445         pass-trough jump functions correctly.
20446
20447 2014-09-03  Martin Jambor  <mjambor@suse.cz>
20448
20449         PR ipa/61986
20450         * ipa-cp.c (find_aggregate_values_for_callers_subset): Chain
20451         created replacements in ascending order of offsets.
20452         (known_aggs_to_agg_replacement_list): Likewise.
20453
20454 2014-09-03  Martin Liska  <mliska@suse.cz>
20455
20456         * tree-ssa-sccvn.c (vn_reference_lookup_call): default (NULL) value
20457         is set to set uninitialized value for vnresult.
20458
20459 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20460
20461         * config/nds32/nds32.c (nds32_must_pass_in_stack): New implementation
20462         for TARGET_MUST_PASS_IN_STACK.
20463
20464 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20465
20466         * config/nds32/nds32.c (nds32_arg_partial_bytes): New implementation
20467         for TARGET_ARG_PARTIAL_BYTES.
20468
20469 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20470
20471         * config/nds32/nds32.c (nds32_expand_prologue): Emit stack push
20472         instructions for varargs implementation.
20473         (nds32_expand_epilogue): Emit stack adjustment instructions for
20474         varargs implementation.
20475
20476 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20477
20478         * config/nds32/nds32.c (nds32_expand_prologue): Suppress fp-as-gp
20479         optimization detection.
20480
20481 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20482
20483         * config/nds32/nds32.c (nds32_function_arg): Deal with nameless
20484         arguments.
20485         (nds32_function_arg_advance): Deal with nameless arguments.
20486         * config/nds32/nds32.h (NDS32_ARG_PASS_IN_REG_P): Split it into ...
20487         (NDS32_ARG_ENTIRE_IN_GPR_REG_P): ... this one and ...
20488         (NDS32_ARG_PARTIAL_IN_GPR_REG_P): ... this one.
20489
20490 2014-09-03  Richard Biener  <rguenther@suse.de>
20491
20492         * tree-ssa-pre.c (alloc_expression_id): Use quick_grow_cleared.
20493         (struct bb_bitmap_sets): Remove deferred member.
20494         (BB_DEFERRED): Remove.
20495         (defer_or_phi_translate_block): Remove.
20496         (compute_antic_aux): Remove deferring of blocks, assert
20497         proper iteration order.
20498         (compute_antic): Do not set BB_DEFERRED.
20499         (eliminate): Allocate el_avail of proper size initially.
20500
20501 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20502
20503         * config/nds32/nds32.h (FIRST_PARM_OFFSET): Set proper location
20504         according to the value of crtl->args.pretend_args_size.
20505
20506 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20507
20508         * config/nds32/nds32.c (nds32_compute_stack_frame): Prepare necessary
20509         varargs information.
20510
20511 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20512
20513         * config/nds32/nds32.c (nds32_setup_incoming_varargs): New
20514         implementation for TARGET_SETUP_INCOMING_VARARGS.
20515         (nds32_strict_argument_naming): Refine comment.
20516         * config/nds32/nds32.h (TARGET_SOFT_FLOAT, TARGET_HARD_FLOAT):
20517         Define for future implementation.
20518
20519 2014-09-03  Ilya Tocar  <ilya.tocar@intel.com>
20520
20521         * config/i386/adxintrin.h (_subborrow_u32): New.
20522         (_addcarry_u32): Ditto.
20523         (_subborrow_u64): Ditto.
20524         (_addcarry_u64): Ditto.
20525         * config/i386/i386.c (ix86_builtins): Add IX86_BUILTIN_SBB32,
20526         IX86_BUILTIN_SBB64.
20527         (ix86_init_mmx_sse_builtins): Handle __builtin_ia32_sbb_u32,
20528         __builtin_ia32_sbb_u64
20529
20530 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20531
20532         * config/nds32/nds32.c (nds32_function_arg): Define and rename some
20533         GPR-specific stuff.
20534         (nds32_function_arg_advance): Likewise.
20535         (nds32_init_cumulative_args): Likewise.
20536         * config/nds32/nds32.h (NDS32_MAX_GPR_REGS_FOR_ARGS): Define.
20537         (NDS32_FIRST_GPR_REGNUM): Define.
20538         (NDS32_LAST_GPR_REGNUM): Define.
20539         (NDS32_AVAILABLE_REGNUM_FOR_GPR_ARG): Define.
20540         (NDS32_ARG_PASS_IN_REG_P): Use NDS32_MAX_GPR_REGS_FOR_ARGS.
20541         (FUNCTION_ARG_REGNO_P): Use NDS32_MAX_GPR_REGS_FOR_ARGS.
20542         (machine_function): Use GRP-specific stuff.
20543
20544 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20545
20546         * config/nds32/nds32.c (nds32_expand_prologue): Remove unused variables.
20547         (nds32_expand_epilogue): Likewise.
20548         (nds32_expand_prologue_v3push): Likewise.
20549         (nds32_expand_epilogue_v3pop): Likewise.
20550
20551 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20552
20553         * config/nds32/nds32.c (nds32_compute_stack_frame): Do not use
20554         v3push/v3pop for variadic function.
20555         * config/nds32/nds32.md (prologue, epilogue): Likewise.
20556
20557 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20558
20559         * config/nds32/nds32-md-auxiliary.c (nds32_output_stack_push):
20560         Check rtx for varargs implementation.
20561         (nds32_output_stack_pop): Likewise.
20562         * config/nds32/nds32-protos.h: Have a rtx argument for
20563         nds32_output_stack_push and nds32_output_stack_pop.
20564         * config/nds32/nds32.md: Likewise.
20565
20566 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20567
20568         * config/nds32/nds32-isr.c (nds32_isr_function_p): Define new function
20569         to check if FUNC is an interrupt service routine.
20570         * config/nds32/nds32-protos.h (nds32_isr_function_p): Declaration.
20571
20572 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20573
20574         * config/nds32/nds32.h (machine_function): Add some fields for variadic
20575         arguments implementation.
20576
20577 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20578
20579         * config/nds32/nds32-predicates.c
20580         (nds32_valid_stack_push_pop): Rename to ...
20581         (nds32_valid_stack_push_pop_p): ... this.
20582         * config/nds32/nds32-protos.h: Likewise.
20583         * config/nds32/predicates.md: Likewise.
20584
20585 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20586
20587         * config/nds32/nds32.c (nds32_gen_stack_v3push): Rename to ...
20588         (nds32_emit_stack_v3push): ... this.
20589         (nds32_gen_stack_v3pop): Rename to ...
20590         (nds32_emit_stack_v3pop): ... this and consider CFA restore
20591         information.
20592
20593 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20594
20595         * config/nds32/nds32.c (nds32_gen_stack_push_multiple): Rename to ...
20596         (nds32_emit_stack_push_multiple): ... this.
20597         (nds32_gen_stack_pop_multiple): Rename to ...
20598         (nds32_emit_stack_pop_multiple): ... this and consider CFA restore
20599         information.
20600
20601 2014-09-03  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
20602
20603         PR target/61078
20604         * config/s390/s390.md ("*negdi2_31"): Add s390_split_ok_p check
20605         and add a second splitter to handle the remaining cases.
20606
20607 2014-09-03  Chung-Ju Wu  <jasonwucj@gmail.com>
20608
20609         * config/nds32/nds32.h (PIC_OFFSET_TABLE_REGNUM): Define.
20610
20611 2014-09-02  Trevor Saunders  <tsaunders@mozilla.com>
20612
20613         * cfgexpand.c (label_rtx_for_bb): Change type to
20614         hash_map<basic_block, rtx_code_label *> *.
20615         (expand_gimple_basic_block): Adjust.
20616         (pass_expand::execute): Likewise.
20617
20618 2014-09-02  Trevor Saunders  <tsaunders@mozilla.com>
20619
20620         * asan.c, cfgexpand.c, config/alpha/alpha.md, config/arm/arm.c,
20621         config/epiphany/epiphany.md, config/h8300/h8300.c, config/i386/i386.md,
20622         config/m32r/m32r.c, config/mcore/mcore.md, config/mips/mips.c,
20623         config/mips/mips.md, config/nios2/nios2.c, config/pa/pa.c,
20624         config/s390/s390.c, config/s390/s390.md, config/sh/sh-mem.cc,
20625         config/sh/sh.c, config/sparc/sparc.c, dojump.c, function.c, optabs.c,
20626         stmt.c: Assign the result of gen_label_rtx to rtx_code_label * instead
20627         of rtx.
20628
20629 2014-09-02  Trevor Saunders  <tsaunders@mozilla.com>
20630
20631         * alloc-pool.c: Include coretypes.h.
20632         * cgraph.h, dbxout.c, dwarf2out.c, except.c, except.h, function.c,
20633         function.h, symtab.c, tree-cfg.c, tree-eh.c: Use hash_map and
20634         hash_set instead of htab.
20635         * ggc-page.c (in_gc): New variable.
20636         (ggc_free): Do nothing if a collection is taking place.
20637         (ggc_collect): Set in_gc appropriately.
20638         * ggc.h (gt_ggc_mx(const char *)): New function.
20639         (gt_pch_nx(const char *)): Likewise.
20640         (gt_ggc_mx(int)): Likewise.
20641         (gt_pch_nx(int)): Likewise.
20642         * hash-map.h (hash_map::hash_entry::ggc_mx): Likewise.
20643         (hash_map::hash_entry::pch_nx): Likewise.
20644         (hash_map::hash_entry::pch_nx_helper): Likewise.
20645         (hash_map::hash_map): Adjust.
20646         (hash_map::create_ggc): New function.
20647         (gt_ggc_mx): Likewise.
20648         (gt_pch_nx): Likewise.
20649         * hash-set.h (default_hashset_traits::ggc_mx): Likewise.
20650         (default_hashset_traits::pch_nx): Likewise.
20651         (hash_set::hash_entry::ggc_mx): Likewise.
20652         (hash_set::hash_entry::pch_nx): Likewise.
20653         (hash_set::hash_entry::pch_nx_helper): Likewise.
20654         (hash_set::hash_set): Adjust.
20655         (hash_set::create_ggc): New function.
20656         (hash_set::elements): Likewise.
20657         (gt_ggc_mx): Likewise.
20658         (gt_pch_nx): Likewise.
20659         * hash-table.h (hash_table::hash_table): Adjust.
20660         (hash_table::m_ggc): New member.
20661         (hash_table::~hash_table): Adjust.
20662         (hash_table::expand): Likewise.
20663         (hash_table::empty): Likewise.
20664         (gt_ggc_mx): New function.
20665         (hashtab_entry_note_pointers): Likewise.
20666         (gt_pch_nx): Likewise.
20667
20668 2014-09-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
20669
20670         * config/rs6000/rs6000-builtin.def (XVCVSXDDP_SCALE):  New
20671         built-in definition.
20672         (XVCVUXDDP_SCALE): Likewise.
20673         (XVCVDPSXDS_SCALE): Likewise.
20674         (XVCVDPUXDS_SCALE): Likewise.
20675         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins):  Add
20676         entries for VSX_BUILTIN_XVCVSXDDP_SCALE,
20677         VSX_BUILTIN_XVCVUXDDP_SCALE, VSX_BUILTIN_XVCVDPSXDS_SCALE, and
20678         VSX_BUILTIN_XVCVDPUXDS_SCALE.
20679         * config/rs6000/rs6000-protos.h (rs6000_scale_v2df): New
20680         prototype.
20681         * config/rs6000/rs6000.c (real.h): New include.
20682         (rs6000_scale_v2df): New function.
20683         * config/rs6000/vsx.md (UNSPEC_VSX_XVCVSXDDP): New unspec.
20684         (UNSPEC_VSX_XVCVUXDDP): Likewise.
20685         (UNSPEC_VSX_XVCVDPSXDS): Likewise.
20686         (UNSPEC_VSX_XVCVDPUXDS): Likewise.
20687         (vsx_xvcvsxddp_scale): New define_expand.
20688         (vsx_xvcvsxddp): New define_insn.
20689         (vsx_xvcvuxddp_scale): New define_expand.
20690         (vsx_xvcvuxddp): New define_insn.
20691         (vsx_xvcvdpsxds_scale): New define_expand.
20692         (vsx_xvcvdpsxds): New define_insn.
20693         (vsx_xvcvdpuxds_scale): New define_expand.
20694         (vsx_xvcvdpuxds): New define_insn.
20695         * doc/extend.texi (vec_ctf): Add new prototypes.
20696         (vec_cts): Likewise.
20697         (vec_ctu): Likewise.
20698         (vec_splat): Likewise.
20699         (vec_div): Likewise.
20700         (vec_mul): Likewise.
20701
20702 2014-09-02  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20703
20704         PR target/62275
20705         * config/arm/neon.md
20706         (neon_vcvt<NEON_VCVT:nvrint_variant><su_optab><VCVTF:mode>
20707         <v_cmp_result>): New pattern.
20708         * config/arm/iterators.md (NEON_VCVT): New int iterator.
20709         * config/arm/arm_neon_builtins.def (vcvtav2sf, vcvtav4sf, vcvtauv2sf,
20710         vcvtauv4sf, vcvtpv2sf, vcvtpv4sf, vcvtpuv2sf, vcvtpuv4sf, vcvtmv2sf,
20711         vcvtmv4sf, vcvtmuv2sf, vcvtmuv4sf): New builtin definitions.
20712         * config/arm/arm.c (arm_builtin_vectorized_function): Handle
20713         BUILT_IN_LROUNDF, BUILT_IN_LFLOORF, BUILT_IN_LCEILF.
20714
20715 2014-09-02  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20716
20717         PR target/62275
20718         * config/arm/iterators.md (FIXUORS): New code iterator.
20719         (VCVT): New int iterator.
20720         (su_optab): New code attribute.
20721         (su): Likewise.
20722         * config/arm/vfp.md (l<vrint_pattern><su_optab><mode>si2): New pattern.
20723
20724 2014-09-02  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
20725
20726         * config/aarch64/predicates.md (aarch64_comparison_operation):
20727         New special predicate.
20728         * config/aarch64/aarch64.md (*csinc2<mode>_insn): Use
20729         aarch64_comparison_operation instead of matching an operator.
20730         Update operand numbers.
20731         (csinc3<mode>_insn): Likewise.
20732         (*csinv3<mode>_insn): Likewise.
20733         (*csneg3<mode>_insn): Likewise.
20734         (ffs<mode>2): Update gen_csinc3<mode>_insn callsite.
20735         * config/aarch64/aarch64.c (aarch64_get_condition_code):
20736         Return -1 instead of aborting on invalid condition codes.
20737         (aarch64_print_operand): Update aarch64_get_condition_code callsites
20738         to assert that the returned condition code is valid.
20739         * config/aarch64/aarch64-protos.h (aarch64_get_condition_code): Export.
20740
20741 2014-09-02  Aldy Hernandez  <aldyh@redhat.com>
20742
20743         * Makefile.in (TAGS): Handle constructs in common.opt, rtl.def,
20744         tree.def, and gimple.def
20745
20746 2014-09-02  Jakub Jelinek  <jakub@redhat.com>
20747             Balaji V. Iyer  <balaji.v.iyer@intel.com>
20748             Igor Zamyatin  <igor.zamyatin@intel.com>
20749
20750         * cilk-builtins.def (__cilkrts_cilk_for_32): New.
20751         (__cilkrts_cilk_for_64): Likewise.
20752         * cilk-common.c (declare_cilk_for_builtin): New function.
20753         (cilk_init_builtins): Declare __cilkrts_cilk_for_32 and
20754         __cilkrts_cilk_for_64 bultins.
20755         * cilk.h (enum cilk_tree_index): Added CILK_TI_F_LOOP_32 and
20756         CILK_TI_F_LOOP_64.
20757         (cilk_for_32_fndecl): New define.
20758         (cilk_for_64_fndecl): Likewise.
20759         * gimple-pretty-print.c (dump_gimple_omp_for): Correct hadling of
20760         GF_OMP_FOR_KIND_CILKFOR cases; Added NE_EXPR case.
20761         * gimple.h (enum gf_mask): Added GF_OMP_FOR_KIND_CILKFOR; adjusted
20762         GF_OMP_FOR_KIND_MASK, GF_OMP_FOR_SIMD, GF_OMP_FOR_COMBINED,
20763         GF_OMP_FOR_COMBINED_INTO.
20764         * gimplify.c (gimplify_scan_omp_clauses): Added
20765         OMP_CLAUSE__CILK_FOR_COUNT_ case.
20766         (gimplify_adjust_omp_clauses): Ditto.
20767         (gimplify_omp_for): Added CILK_FOR case.
20768         (gimplify_expr): Ditto.
20769         * omp-low.c: Include cilk.h.
20770         (extract_omp_for_data): Set appropriate kind for
20771         GF_OMP_FOR_KIND_CILKFOR; added check for GF_OMP_FOR_KIND_CILKFOR.
20772         (scan_sharing_clauses): Added OMP_CLAUSE__CILK_FOR_COUNT_ cases.
20773         (create_omp_child_function_name): Added second argument to handle
20774         cilk_for case.
20775         (cilk_for_check_loop_diff_type): New function.
20776         (expand_cilk_for_call): Likewise.
20777         (expand_cilk_for): Likewise.
20778         (create_omp_child_function): Set cilk_for_count; handle the cases when
20779         it is true; call create_omp_child_function_name with second argument.
20780         (expand_omp_taskreg): Set is_cilk_for and handle cases when it's true.
20781         (expand_omp_for): Handle case of GF_OMP_FOR_KIND_CILKFOR.
20782         * tree-core.h (omp_clause_code): Added OMP_CLAUSE__CILK_FOR_COUNT_.
20783         * tree-nested.c (convert_nonlocal_omp_clauses): Added
20784         OMP_CLAUSE__CILK_FOR_COUNT_ case.
20785         (convert_local_omp_clauses): Ditto.
20786         * tree-pretty-print.c (dump_omp_clause): Added
20787         OMP_CLAUSE__CILK_FOR_COUNT_ and OMP_CLAUSE_SCHEDULE_CILKFOR cases.
20788         (dump_generic_node): Added CILK_FOR case.
20789         * tree.c (omp_clause_num_ops): New element
20790         OMP_CLAUSE__CILK_FOR_COUNT_ (1).
20791         (omp_clause_code_name): New element _Cilk_for_count_.
20792         (walk_tree_1): Added OMP_CLAUSE__CILK_FOR_COUNT_ case.
20793         * tree.def: Add tree code for CILK_FOR.
20794
20795 2014-09-02  Segher Boessenkool  <segher@kernel.crashing.org>
20796
20797         * config/rs6000/40x.md (ppc403-integer): Move "exts" to "no dot".
20798         (ppc403-compare): Add "exts with dot" case.
20799         * config/rs6000/440.md (ppc440-integer, ppc440-compare): As above.
20800         * config/rs6000/476.md (ppc476-simple-integer, ppc476-compare): Ditto.
20801         * config/rs6000/601.md (ppc601-integer, ppc601-compare): Ditto.
20802         * config/rs6000/603.md (ppc603-integer, ppc603-compare): Ditto.
20803         * config/rs6000/6xx.md (ppc604-integer, ppc604-compare): Ditto.
20804         * config/rs6000/7450.md (ppc7450-integer, ppc7450-compare): Ditto.
20805         * config/rs6000/7xx.md (ppc750-integer, ppc750-compare): Ditto.
20806         * config/rs6000/cell.md (cell-integer, cell-fast-cmp,
20807         cell-cmp-microcoded): Similarly.
20808         * config/rs6000/e300c2c3.md (ppce300c3_iu, ppce300c3_cmp): As before.
20809         * config/rs6000/e500mc64.md (e500mc64_su, e500mc64_su2): Ditto.
20810         * config/rs6000/e5500.md (e5500_sfx, e5500_sfx2): Ditto.
20811         * config/rs6000/e6500.md (e6500_sfx, e6500_sfx2): Ditto.
20812         * config/rs6000/mpc.md (mpccore-integer, mpccore-compare): Ditto.
20813         * config/rs6000/power4.md (power4-integer, power4-compare): Ditto.
20814         * config/rs6000/power5.md (power5-integer, power5-compare): Ditto.
20815         * config/rs6000/power6.md (power6-exts): Add "no dot" condition.
20816         (power6-compare): Add "exts with dot" case.
20817         * config/rs6000/power7.md (power7-integer, power7-compare): As before.
20818         * config/rs6000/power8.md (power8-1cyc, power8-compare): Ditto.
20819         * config/rs6000/rs64.md (rs64a-integer, rs64a-compare): Ditto.
20820
20821         * config/rs6000/predicates.md (lwa_operand): Don't allow memory
20822         if avoiding Cell microcode.
20823         * config/rs6000/rs6000.c (rs6000_adjust_cost): Handle exts+dot case.
20824         (is_cracked_insn): Ditto.
20825         (insn_must_be_first_in_group): Ditto.
20826         * config/rs6000/rs6000.md (dot): Adjust comment.
20827         (cell_micro): Handle exts+dot.
20828         (extendqidi2, extendhidi2, extendsidi2, *extendsidi2_lfiwax,
20829         *extendsidi2_nocell, *extendsidi2_nocell, extendqisi2, extendqihi2,
20830         extendhisi2, 16 anonymous instructions, and 12 splitters): Delete.
20831         (extendqi<mode>2, *extendqi<mode>2_dot, *extendqi<mode>2_dot2,
20832         extendhi<mode>2, *extendhi<mode>2, *extendhi<mode>2_noload,
20833         *extendhi<mode>2_dot, *extendhi<mode>2_dot2, extendsi<mode>2,
20834         *extendsi<mode>2_dot, *extendsi<mode>2_dot2): New.
20835
20836 2014-09-02  Segher Boessenkool  <segher@kernel.crashing.org>
20837
20838         * config/rs6000/rs6000.md (QHSI): Delete.
20839         (EXTQI, EXTHI, EXTSI): New mode iterators.
20840         (zero_extend<mode>di2, *zero_extend<mode>di2_internal1,
20841         *zero_extend<mode>di2_internal2, *zero_extend<mode>di2_internal3,
20842         *zero_extendsidi2_lfiwzx, zero_extendqisi2, zero_extendhisi2,
20843         9 anonymous instructions, and 8 splitters): Delete.
20844         (zero_extendqi<mode>2, *zero_extendqi<mode>2_dot,
20845         *zero_extendqi<mode>2_dot2, zero_extendhi<mode>2,
20846         *zero_extendhi<mode>2_dot, *zero_extendhi<mode>2_dot2,
20847         zero_extendsi<mode>2, *zero_extendsi<mode>2_dot,
20848         *zero_extendsi<mode>2_dot2): New.
20849
20850 2014-09-02  Segher Boessenkool  <segher@kernel.crashing.org>
20851
20852         * config/rs6000/rs6000.md (any_extend): New code iterator.
20853         (u, su): New code attributes.
20854         (dmode, DMODE): New mode attributes.
20855         (<su>mul<mode>3_highpart): New.
20856         (*<su>mul<mode>3_highpart): New.
20857         (<su>mulsi3_highpart_le): New.
20858         (<su>muldi3_highpart_le): New.
20859         (<su>mulsi3_highpart_64): New.
20860         (<u>mul<mode><dmode>3): New.
20861         (mulsidi3, umulsidi3, smulsi3_highpart, umulsi3_highpart, and two
20862         splitters): Delete.
20863         (mulditi3, umulditi3, smuldi3_highpart, umuldi3_highpart, and two
20864         splitters): Delete.
20865
20866 2014-09-02  Segher Boessenkool  <segher@kernel.crashing.org>
20867
20868         * config/rs6000/rs6000.md (mulsi3, *mulsi3_internal1,
20869         *mulsi3_internal2, and two splitters): Delete.
20870         (muldi3, *muldi3_internal1, *muldi3_internal2, and two splitters):
20871         Delete.
20872         (mul<mode>3, mul<mode>3_dot, mul<mode>3_dot2): New.
20873
20874 2014-09-02  Richard Biener  <rguenther@suse.de>
20875
20876         PR tree-optimization/62695
20877         * tree-ssa-structalias.c (find_func_clobbers): Add missing
20878         vector truncate.
20879
20880 2014-09-01  Oleg Endo  <olegendo@gcc.gnu.org>
20881
20882         PR target/62312
20883         * config/sh/sh.md (*cmp_div0s_0): Add missing constraints.
20884
20885 2014-09-01  Andi Kleen  <ak@linux.intel.com>
20886
20887         * file-find.c (add_prefix_begin): Add.
20888         (do_add_prefix): Rename from add_prefix with first argument.
20889         (add_prefix): Add new wrapper.
20890         * file-find.h (add_prefix_begin): Add.
20891         * gcc-ar.c (main): Support -B option.
20892
20893 2014-09-01  Segher Boessenkool  <segher@kernel.crashing.org>
20894
20895         * genemit.c: Include dumpfile.h.
20896         (gen_split): Print name of splitter function to dump file.
20897
20898 2014-09-01  Richard Biener  <rguenther@suse.de>
20899
20900         * tree-ssa-struct-aliases.c (find_func_aliases_for_builtin_call):
20901         Use stack auto_vecs for constraint expressions.
20902         (find_func_aliases_for_call): Likewise.
20903         (find_func_aliases): Likewise.
20904         (find_func_clobbers): Likewise.
20905
20906 2014-09-01  Richard Biener  <rguenther@suse.de>
20907
20908         * tree-ssa-pre.c (phi_translate_1): Avoid re-allocating the
20909         operands vector in most cases.  Remove redundant code.
20910
20911 2014-09-01  Olivier Hainque  <hainque@adacore.com>
20912
20913         * config/vxworksae.h (VXWORKSAE_TARGET_DIR): Rely on
20914         $WIND_BASE instead of designating a harcoded arbitrary home dir.
20915         (VXWORKS_ADDITIONAL_CPP_SPEC): Adjust callers.
20916
20917 2014-09-01  Richard Biener  <rguenther@suse.de>
20918
20919         * tree-ssa-sccvn.h (copy_reference_ops_from_ref,
20920         copy_reference_ops_from_call, vn_nary_op_compute_hash,
20921         vn_reference_compute_hash, vn_reference_insert): Remove.
20922         (vn_reference_lookup_call): New function.
20923         * tree-ssa-sccvn.c (vn_reference_compute_hash,
20924         copy_reference_ops_from_ref, copy_reference_ops_from_call,
20925         vn_reference_insert, vn_nary_op_compute_hash): Make static.
20926         (create_reference_ops_from_call): Remove.
20927         (vn_reference_lookup_3): Properly update shared_lookup_references.
20928         (vn_reference_lookup_pieces): Assert that we updated
20929         shared_lookup_references properly.
20930         (vn_reference_lookup): Likewise.
20931         (vn_reference_lookup_call): New function.
20932         (visit_reference_op_call): Use it.  Avoid re-building the
20933         reference ops.
20934         (visit_reference_op_load): Remove redundant lookup.
20935         (visit_reference_op_store): Perform special tail-merging work
20936         only when possibly doing tail-merging.
20937         (visit_use): Likewise.
20938         * tree-ssa-pre.c (compute_avail): Use vn_reference_lookup_call.
20939
20940 2014-09-01  Jakub Jelinek  <jakub@redhat.com>
20941
20942         PR target/62025
20943         * sched-deps.c (add_or_update_dep_1): If ask_dependency_caches
20944         returned DEP_PRESENT, make sure to set DEP_MULTIPLE on present_dep.
20945         (find_inc): Revert 2014-08-13 change.
20946
20947 2014-09-01  Marek Polacek  <polacek@redhat.com>
20948
20949         PR middle-end/61903
20950         * expmed.c (store_fixed_bit_field_1): Shift UHWI 1 instead of HWI 1.
20951         Change the type of V to unsigned HOST_WIDE_INT.
20952
20953 2014-09-01  Thomas Preud'homme  <thomas.preudhomme@arm.com>
20954
20955         * tree-ssa-math-opts.c (struct symbolic_number): Clarify comment about
20956         the size of byte markers.
20957         (do_shift_rotate): Fix confusion between host, target and marker byte
20958         size.
20959         (verify_symbolic_number_p): Likewise.
20960         (find_bswap_or_nop_1): Likewise.
20961         (find_bswap_or_nop): Likewise.
20962
20963 2014-09-01  Olivier Hainque  <hainque@adacore.com>
20964
20965         * Makefile.in (FLAGS_TO_PASS): Propagate INSTALL, INSTALL_DATA,
20966         INSTALL_SCRIPT and INSTALL_PROGRAM as well.
20967
20968 2014-09-01  Jakub Jelinek  <jakub@redhat.com>
20969
20970         * config/gnu-user.h (LIBLSAN_EARLY_SPEC): Define.
20971         * gcc.c (LIBLSAN_SPEC, LIBLSAN_EARLY_SPEC): Follow LIBTSAN*_SPEC.
20972         (SANITIZER_EARLY_SPEC): Include LIBLSAN_EARLY_SPEC for -fsanitize=leak.
20973
20974 2014-09-01  Yury Gribov  <y.gribov@samsung.com>
20975
20976         PR sanitizer/61897
20977         PR sanitizer/62140
20978         * asan.c (asan_mem_ref_get_end): Handle non-ptroff_t lengths.
20979         (build_check_stmt): Likewise.
20980         (instrument_strlen_call): Likewise.
20981         (asan_expand_check_ifn): Likewise and fix types.
20982         (maybe_cast_to_ptrmode): New function.
20983
20984 2014-09-01  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
20985
20986         * config/mcore/mcore.c (try_constant_tricks): Fix declaration.
20987
20988 2014-08-31  Gerald Pfeifer  <gerald@pfeifer.com>
20989
20990         * doc/generic.texi (Deficiencies): Add note on exemplary mistakes.
20991
20992 2014-08-30  John David Anglin  <danglin@gcc.gnu.org>
20993
20994         * config/pa/pa.c (pa_assemble_integer): Don't add PLABEL relocation
20995         prefix to function labels when generating fast indirect calls.
20996
20997 2014-08-30  David Malcolm  <dmalcolm@redhat.com>
20998
20999         PR bootstrap/62304
21000
21001         * gcc/reorg.c (skip_consecutive_labels): Convert return type and
21002         param back from rtx_insn * to rtx.  Rename param from "label" to
21003         "label_or_return", reintroducing "label" as an rtx_insn * after
21004         we've ensured it's not a RETURN.
21005         (first_active_target_insn): Likewise for return type and param;
21006         add a checked cast to rtx_insn * once we've ensured "insn" is not
21007         a RETURN.
21008         (steal_delay_list_from_target): Convert param "pnew_thread" back
21009         from rtx_insn ** to rtx *.  Replace use of JUMP_LABEL_AS_INSN
21010         with JUMP_LABEL.
21011         (own_thread_p): Convert param "thread" back from an rtx_insn * to
21012         an rtx.  Introduce local rtx_insn * "thread_insn" with a checked
21013         cast once we've established we're not dealing with a RETURN,
21014         renaming subsequent uses of "thread" to "thread_insn".
21015         (fill_simple_delay_slots): Convert uses of JUMP_LABEL_AS_INSN back
21016         to JUMP_LABEL.
21017         (follow_jumps): Convert return type and param "label" from
21018         rtx_insn * back to rtx.  Move initialization of "value" to after
21019         the handling for ANY_RETURN_P, adding a checked cast there to
21020         rtx_insn *.  Convert local rtx_insn * "this_label" to an rtx and
21021         rename to "this_label_or_return", reintroducing "this_label" as
21022         an rtx_insn * once we've handled the case where it could be an
21023         ANY_RETURN_P.
21024         (fill_slots_from_thread): Rename param "thread" to
21025         "thread_or_return", converting from an rtx_insn * back to an rtx.
21026         Reintroduce name "thread" as an rtx_insn * local with a checked
21027         cast once we've handled the case of it being an ANY_RETURN_P.
21028         Convert local "new_thread" from an rtx_insn * back to an rtx.
21029         Add a checked cast when assigning to "trial" from "new_thread".
21030         Convert use of JUMP_LABEL_AS_INSN back to JUMP_LABEL.  Add a
21031         checked cast to rtx_insn * from "new_thread" when invoking
21032         get_label_before.
21033         (fill_eager_delay_slots): Convert locals "target_label",
21034         "insn_at_target" from rtx_insn * back to rtx.
21035         Convert uses of JUMP_LABEL_AS_INSN back to JUMP_LABEL.
21036         (relax_delay_slots): Convert locals "trial", "target_label" from
21037         rtx_insn * back to rtx.  Convert uses of JUMP_LABEL_AS_INSN back
21038         to JUMP_LABEL.  Add a checked cast to rtx_insn * on "trial" when
21039         invoking update_block.
21040         (dbr_schedule): Convert use of JUMP_LABEL_AS_INSN back to
21041         JUMP_LABEL; this removes all JUMP_LABEL_AS_INSN from reorg.c.
21042
21043         * resource.h (mark_target_live_regs): Undo erroneous conversion
21044         of second param of r214693, converting it back from rtx_insn * to
21045         rtx, since it could be a RETURN.
21046
21047         * resource.c (find_dead_or_set_registers): Similarly, convert
21048         param "jump_target" back from an rtx_insn ** to an rtx *, as we
21049         could be writing back a RETURN.  Rename local rtx_insn * "next" to
21050         "next_insn", and introduce "lab_or_return" as a local rtx,
21051         handling the case where JUMP_LABEL (this_jump_insn) is a RETURN.
21052         (mark_target_live_regs): Undo erroneous conversion
21053         of second param of r214693, converting it back from rtx_insn * to
21054         rtx, since it could be a RETURN.  Rename it from "target" to
21055         "target_maybe_return", reintroducing the name "target" as a local
21056         rtx_insn * with a checked cast, after we've handled the case of
21057         ANY_RETURN_P.
21058
21059 2014-08-29  DJ Delorie  <dj@redhat.com>
21060
21061         * cppbuiltin.c (define_builtin_macros_for_type_sizes): Round
21062         pointer size up to a power of two.
21063         * defaults.h (DWARF2_ADDR_SIZE): Round up.
21064         (POINTER_SIZE_UNITS): New, rounded up value.
21065         * dwarf2asm.c (size_of_encoded_value): Use it.
21066         (dw2_output_indirect_constant_1): Likewise.
21067         * expmed.c (init_expmed_one_conv): We now know the sizes of
21068         partial int modes.
21069         * loop-iv.c (iv_number_of_iterations): Use precision, not size.
21070         * optabs.c (expand_float): Use precision, not size.
21071         (expand_fix): Likewise.
21072         * simplify-rtx (simplify_unary_operation_1): Likewise.
21073         * tree-dfa.c (get_ref_base_and_extent): Likewise.
21074         * varasm.c (assemble_addr_to_section): Round up pointer sizes.
21075         (default_assemble_integer) Likewise.
21076         (dump_tm_clone_pairs): Likewise.
21077         * dwarf2out.c (mem_loc_descriptor): Allow partial-int modes also.
21078         * var-tracking.c (adjust_mems): Allow partial-int modes also.
21079         (prepare_call_arguments): Likewise.
21080         * stor-layout.c (finalize_type_size): Preserve precision.
21081         (layout_type): Use precision, not size.
21082
21083         * expr.c (convert_move): If the target has an explicit converter,
21084         use it.
21085
21086 2014-08-29  David Malcolm  <dmalcolm@redhat.com>
21087
21088         * gdbinit.in: Skip various inline functions in rtl.h when
21089         stepping.
21090
21091 2014-08-29  Richard Sandiford  <richard.sandiford@arm.com>
21092
21093         PR bootstrap/62301
21094         * rtlanal.c (rtx_referenced_p): Fix typo in LABEL_P call.
21095
21096 2014-08-29  Richard Biener  <rguenther@suse.de>
21097
21098         PR tree-optimization/62291
21099         * tree-ssa-pre.c (sorted_array_from_bitmap_set): Reserve
21100         exactly the vector size needed and use quick_push.
21101         (phi_translate_1): Adjust comment.
21102         (valid_in_sets): Remove block argument and remove pointless
21103         checking of NAMEs.
21104         (dependent_clean): Adjust for removal of block argument.
21105         (clean): Likewise.
21106         (compute_antic_aux): Likewise.
21107         (compute_partial_antic_aux): Likewise.
21108
21109 2014-08-29  Alexander Ivchenko  <alexander.ivchenko@intel.com>
21110             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
21111             Anna Tikhonova  <anna.tikhonova@intel.com>
21112             Ilya Tocar  <ilya.tocar@intel.com>
21113             Andrey Turetskiy  <andrey.turetskiy@intel.com>
21114             Ilya Verbin  <ilya.verbin@intel.com>
21115             Kirill Yukhin  <kirill.yukhin@intel.com>
21116             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
21117
21118         * config/i386/sse.md
21119         (define_insn "avx2_interleave_highv4di<mask_name>"): Add masking.
21120         (define_insn "vec_interleave_highv2di<mask_name>"): Ditto.
21121         (define_insn "avx2_interleave_lowv4di<mask_name>"): Ditto.
21122         (define_insn "vec_interleave_lowv2di<mask_name>"): Ditto.
21123
21124 2014-08-29  Alexander Ivchenko  <alexander.ivchenko@intel.com>
21125             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
21126             Anna Tikhonova  <anna.tikhonova@intel.com>
21127             Ilya Tocar  <ilya.tocar@intel.com>
21128             Andrey Turetskiy  <andrey.turetskiy@intel.com>
21129             Ilya Verbin  <ilya.verbin@intel.com>
21130             Kirill Yukhin  <kirill.yukhin@intel.com>
21131             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
21132
21133         * config/i386/i386-modes.def: Add V12QI, V14QI, V6HI modes.
21134         * config/i386/sse.md
21135         (define_mode_iterator VI4_128_8_256): New.
21136         (define_mode_iterator VI2_128_4_256): Ditto.
21137         (define_mode_iterator PMOV_DST_MODE): Rename into
21138         (define_mode_iterator PMOV_DST_MODE_1): this.
21139         (define_insn "*avx512f_<code><pmov_src_lower><mode>2"):
21140         Use PMOV_DST_MODE_1 mode iterator.
21141         (define_insn "avx512f_<code><pmov_src_lower><mode>2_mask"):
21142         Ditto.
21143         (define_insn "avx512f_<code><pmov_src_lower><mode>2_mask"):
21144         Ditto.
21145         (define_insn "*avx512bw_<code>v32hiv32qi2"): New.
21146         (define_insn "avx512bw_<code>v32hiv32qi2_mask"): Ditto.
21147         (define_expand "avx512bw_<code>v32hiv32qi2_store_mask"): Ditto.
21148         (define_mode_iterator PMOV_DST_MODE_2): New.
21149         (define_insn "*avx512vl_<code><ssedoublemodelower><mode>2"): Ditto.
21150         (define_insn "<avx512>_<code><ssedoublemodelower><mode>2_mask"): Ditto.
21151         (define_expand "<avx512>_<code><ssedoublemodelower><mode>2_store_mask"):
21152         Ditto.
21153         (define_mode_iterator PMOV_SRC_MODE_3): Ditto.
21154         (define_mode_attr pmov_dst_3): Ditto.
21155         (define_mode_attr pmov_dst_zeroed_3): Ditto.
21156         (define_mode_attr pmov_suff_3): Ditto.
21157         (define_insn "*avx512vl_<code><mode>v<ssescalarnum>qi2"): Ditto.
21158         (define_insn "*avx512vl_<code>v2div2qi2_store"): Ditto.
21159         (define_insn "avx512vl_<code>v2div2qi2_mask"): Ditto.
21160         (define_insn "avx512vl_<code>v2div2qi2_store_mask"): Ditto.
21161         (define_insn "*avx512vl_<code><mode>v4qi2_store"): Ditto.
21162         (define_insn "avx512vl_<code><mode>v4qi2_mask"): Ditto.
21163         (define_insn "avx512vl_<code><mode>v4qi2_store_mask"): Ditto.
21164         (define_insn "*avx512vl_<code><mode>v8qi2_store"): Ditto.
21165         (define_insn "avx512vl_<code><mode>v8qi2_mask"): Ditto.
21166         (define_insn "avx512vl_<code><mode>v8qi2_store_mask"): Ditto.
21167         (define_mode_iterator PMOV_SRC_MODE_4): Ditto.
21168         (define_mode_attr pmov_dst_4): Ditto.
21169         (define_mode_attr pmov_dst_zeroed_4): Ditto.
21170         (define_mode_attr pmov_suff_4): Ditto.
21171         (define_insn "*avx512vl_<code><mode>v<ssescalarnum>hi2"): Ditto.
21172         (define_insn "*avx512vl_<code><mode>v4hi2_store"): Ditto.
21173         (define_insn "avx512vl_<code><mode>v4hi2_mask"): Ditto.
21174         (define_insn "avx512vl_<code><mode>v4hi2_store_mask"): Ditto.
21175         (define_insn "*avx512vl_<code>v2div2hi2_store"): Ditto.
21176         (define_insn "avx512vl_<code>v2div2hi2_mask"): Ditto.
21177         (define_insn "avx512vl_<code>v2div2hi2_store_mask"): Ditto.
21178         (define_insn "*avx512vl_<code>v2div2si2"): Ditto.
21179         (define_insn "*avx512vl_<code>v2div2si2_store"): Ditto.
21180         (define_insn "avx512vl_<code>v2div2si2_mask"): Ditto.
21181         (define_insn "avx512vl_<code>v2div2si2_store_mask"): Ditto.
21182
21183 2014-08-29  Richard Biener  <rguenther@suse.de>
21184
21185         * tree-cfg.c (verify_gimple_assign_unary): Do not allow
21186         NON_LVALUE_EXPR in gimple.
21187
21188 2014-08-29  Richard Biener  <rguenther@suse.de>
21189
21190         PR middle-end/62292
21191         * gimple-fold.c (gimple_fold_builtin_strcpy): Fix error
21192         from previous refactoring.
21193         (gimple_fold_builtin_strncpy): Likewise.
21194
21195 2014-08-29  David Malcolm  <dmalcolm@redhat.com>
21196
21197         PR bootstrap/62300
21198         * function.c (assign_parm_setup_reg): Remove erroneous checked
21199         cast to rtx_insn * on result of gen_extend_insn in favor of
21200         introducing a new local rtx "pat".
21201
21202 2014-08-29  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
21203
21204         * config/mep/mep-pragma.c (mep_pragma_coprocessor_subclass): Rework
21205         to silence warning.
21206         * config/mep/mep.c (VECTOR_TYPE_P): Remove duplicate definition.
21207
21208 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21209
21210         * rtl.h (previous_insn): Strengthen param from rtx to rtx_insn *.
21211         (next_insn): Likewise.
21212         * emit-rtl.c (next_insn): Likewise.
21213         (previous_insn): Likewise.
21214         * config/pa/pa.c (remove_useless_addtr_insns): Strenghten locals
21215         "insn" and "next" from rtx to rtx_insn *.
21216         * config/picochip/picochip.c (picochip_reorg): Likewise for locals
21217         "insn", "insn1", "vliw_start",  "prologue_end_note",
21218         "last_insn_in_packet".
21219
21220 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21221
21222         * shrink-wrap.h (active_insn_between): Strengthen both params from
21223         rtx to rtx_insn *.
21224         * function.c (active_insn_between): Likewise.
21225
21226 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21227
21228         * genattr.c (main): When writing out insn-attr.h, strengthen param
21229         of dfa_clear_single_insn_cache from rtx to rtx_insn *.
21230         * genautomata.c (output_dfa_clean_insn_cache_func): Likewise when
21231         writing out the definition of dfa_clear_single_insn_cache to the
21232         generated insn-automata.c
21233
21234 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21235
21236         * resource.h (clear_hashed_info_for_insn): Strengthen param from
21237         rtx to rtx_insn *.
21238         (incr_ticks_for_insn): Likewise.
21239         (init_resource_info): Likewise.
21240
21241         * resource.c (init_resource_info): Likewise.
21242         (clear_hashed_info_for_insn): Likewise.
21243         (incr_ticks_for_insn): Likewise.
21244
21245         * reorg.c (delete_scheduled_jump): Strengthen param "insn" from
21246         rtx to rtx_insn *.
21247         (steal_delay_list_from_target): Use methods of "seq".
21248         (try_merge_delay_insns): Use methods of "merged_insns".
21249         (update_block): Strengthen param "insn" from rtx to rtx_insn *.
21250         (reorg_redirect_jump): Likewise for param "jump".
21251
21252 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21253
21254         * insn-addr.h (insn_addresses_new): Strengthen param "insn" from
21255         rtx to rtx_insn *.
21256         * config/s390/s390.c (s390_split_branches): Eliminate top-level
21257         local rtx "tmp", in favor of new local rtx "mem" and rtx_insn *
21258         "set_insn".
21259         (s390_mainpool_finish): In three places, split out a local rtx
21260         "insn" into a local rtx - "set" or "pat" - and a rtx_insn *
21261         "insn".  Strengthen local "pool_end" from rtx to rtx_code_label *
21262         and split another local rtx "insn" out into rtx "pat" and
21263         rtx_insn * "insn".
21264         * config/sh/sh.c (output_branchy_insn): Rather than working
21265         directly on operands[9], introduce local rtx_code_label *
21266         variables named "lab" in two places, working on them, and then
21267         assigning them to operands[9], so that the intervening operations
21268         are known by the type system to be on insns.
21269
21270 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21271
21272         * rtl.h (INSN_HAS_LOCATION): Strengthen param from const_rtx to
21273         const rtx_insn *.
21274
21275         * print-rtl.c (print_rtx): Add checked cast to const rtx_insn *
21276         in invocation of INSN_HAS_LOCATION.
21277
21278 2014-08-28  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
21279
21280         * config/rs6000/altivec.h (vec_xl): New #define.
21281         (vec_xst): Likewise.
21282         * config/rs6000/rs6000-builtin.def (XXSPLTD_V2DF): New built-in.
21283         (XXSPLTD_V2DI): Likewise.
21284         (DIV_V2DI): Likewise.
21285         (UDIV_V2DI): Likewise.
21286         (MUL_V2DI): Likewise.
21287         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
21288         entries for VSX_BUILTIN_XVRDPI, VSX_BUILTIN_DIV_V2DI,
21289         VSX_BUILTIN_UDIV_V2DI, VSX_BUILTIN_MUL_V2DI,
21290         VSX_BUILTIN_XXSPLTD_V2DF, and VSX_BUILTIN_XXSPLTD_V2DI).
21291         * config/rs6000/vsx.md (UNSPEC_VSX_XXSPLTD): New unspec.
21292         (UNSPEC_VSX_DIVSD): Likewise.
21293         (UNSPEC_VSX_DIVUD): Likewise.
21294         (UNSPEC_VSX_MULSD): Likewise.
21295         (vsx_mul_v2di): New insn-and-split.
21296         (vsx_div_v2di): Likewise.
21297         (vsx_udiv_v2di): Likewise.
21298         (vsx_xxspltd_<mode>): New insn.
21299
21300 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21301
21302         * rtl.h (RTX_PREV): Added checked casts to uses of PREV_INSN and
21303         NEXT_INSN.
21304         (PREV_INSN): Strengthen param from const_rtx to const rtx_insn *.
21305         (NEXT_INSN): Likewise.
21306         (JUMP_LABEL_AS_INSN): Add a "const" modifier to param.
21307         (reg_used_between_p): Strengthen params 2 and 3 from const_rtx to
21308         const rtx_insn *.
21309         (no_labels_between_p): Likewise for both params.
21310
21311         * config/aarch64/aarch64.c (aarch64_output_casesi): Add a checked
21312         cast when using NEXT_INSN on operands[2].
21313         * config/alpha/alpha.c (alpha_set_memflags): Strengthen local
21314         "insn" from rtx to rtx_insn *, adding a checked cast.
21315         (alpha_handle_trap_shadows): Strengthen locals "i", "n" from rtx to
21316         rtx_insn *.
21317         * config/arc/arc-protos.h (arc_ccfsm_record_condition): Likewise
21318         for third param.
21319         (arc_text_label): Likewise for param "insn".
21320         * config/arc/arc.c (arc_expand_epilogue): Likewise for local
21321         "insn".
21322         (arc_ccfsm_record_condition): Likewise for param "jump".
21323         (arc_text_label): Likewise for local "label".
21324         * config/arc/arc.md (doloop_begin_i): Likewise for local "scan".
21325         Introduce a local "seq" via a dyn_cast to rtx_sequence *, and use
21326         a method for typesafety.  Add a checked cast.
21327         * config/arc/constraints.md (Clb): Add a checked cast when getting
21328         the CODE_LABEL from a LABEL_REF.
21329         * config/arm/arm.c (require_pic_register): Strengthen locals
21330         "seq", "insn" from rtx to rtx_insn *.
21331         (create_fix_barrier): Likewise for locals "selected", "next".
21332         (thumb1_reorg): Likewise for locals "prev", "insn".
21333         (arm_expand_prologue): Likewise for local "last".
21334         (thumb1_output_casesi): Add a checked cast when using NEXT_INSN on
21335         operands[0].
21336         (thumb2_output_casesi): Likewise for operands[2].
21337         * config/avr/avr-log.c (avr_log_vadump): Within 'L' case,
21338         strengthen local "insn" from rtx to rtx_insn *.
21339         * config/bfin/bfin.c (find_next_insn_start): Likewise for return
21340         type and param "insn".
21341         (find_prev_insn_start): Likewise.
21342         (hwloop_optimize): Likewise for locals "insn", "last_insn",
21343         "prev".
21344         (gen_one_bundle): Likewise for loal "t".
21345         (find_load): Likewise for param "insn".
21346         (workaround_speculation): Likewise for locals "insn", "next",
21347         "target", "next_tgt".
21348         * config/c6x/c6x.c (assign_reservations): Likewise for both params
21349         and for locals "insn", "within", "last".
21350         (count_unit_reqs): Likewise for params "head", "tail" and local
21351         "insn".
21352         (try_rename_operands): Likewise for params "head", "tail".
21353         (reshuffle_units): Likewise for locals "head", "tail", "insn".
21354         (struct c6x_sched_context): Likewise for fields
21355         "last_scheduled_insn", "last_scheduled_iter0".
21356         (init_sched_state): Replace NULL_RTX with NULL.
21357         (reorg_split_calls): Strengthen local "new_cycle_first" from rtx
21358         to rtx_insn *.
21359         (undo_split_delayed_nonbranch): Likewise for param and for local
21360         "prev".
21361         (conditionalize_after_sched): Likewise for local "insn".
21362         (bb_earliest_end_cycle): Likewise.
21363         (filter_insns_above): Likewise for locals "insn", "next".
21364         (hwloop_optimize): Remove redundant checked cast.
21365         (hwloop_fail): Strengthen local "t" from rtx to rtx_insn *.
21366         * config/cris/cris.c (cris_initial_frame_pointer_offset): Replace
21367         NULL_RTX with NULL.
21368         (cris_simple_epilogue): Likewise.
21369         (cris_expand_prologue): Likewise.
21370         (cris_expand_epilogue): Likewise.
21371         * config/frv/frv.c (frv_function_contains_far_jump): Strengthen
21372         local "insn" from rtx to rtx_insn *.
21373         (frv_ifcvt_modify_tests): Likewise for locals "last_insn", "insn".
21374         (struct frv_packet_group): Likewise for the elements within array
21375         fields "insns", "sorted", and for field "nop".
21376         (frv_packet): Likewise for the elements within array field
21377         "insns".
21378         (frv_add_insn_to_packet): Likewise for param "insn".
21379         (frv_insert_nop_in_packet): Likewise for param "insn" and local
21380         "last".
21381         (frv_for_each_packet): Likewise for locals "insn", "next_insn".
21382         (frv_sort_insn_group_1): Likewise for local "insn".
21383         (frv_optimize_membar_local): Likewise.
21384         (frv_align_label): Likewise for locals "x", "last", "barrier",
21385         "label".
21386         * config/ia64/ia64.c (last_scheduled_insn): Likewise for this
21387         local.
21388         (ia64_sched_init): Likewise for local "insn".
21389         (scheduled_good_insn): Likewise for param "last".
21390         (struct _ia64_sched_context): Likewise for field
21391         "last_scheduled_insn".
21392         (ia64_init_sched_context): Replace NULL_RTX with NULL.
21393         (struct bundle_state): Likewise for field "insn".
21394         (issue_nops_and_insn): Likewise for param "insn".
21395         (get_next_important_insn): Likewise for return type and both
21396         params.
21397         (ia64_add_bundle_selector_before): Likewise for param "insn".
21398         (bundling): Likewise for params "prev_head_insn", "tail" and
21399         locals "insn", "next_insn", "b".  Eliminate top-level local rtx
21400         "nop" in favor of new locals rtx "nop_pat" and rtx_insn *nop;
21401         * config/iq2000/iq2000-protos.h (iq2000_fill_delay_slot):
21402         Strengthen final param from rtx to rtx_insn *.
21403         (iq2000_move_1word): Likewise for second param.
21404         * config/iq2000/iq2000.c (iq2000_fill_delay_slot): Likewise for
21405         param "cur_insn" and local "next_insn".
21406         (iq2000_move_1word): Likewise for param "insn".
21407         * config/iq2000/iq2000.md (insn before ADDR_DIFF_VEC): Add checked
21408         casts when using NEXT_INSN on operands[1].
21409         * config/m32c/m32c.c (m32c_function_needs_enter): Strengthen local
21410         "insn" from rtx to rtx_insn *.
21411         * config/m68k/m68k.c (m68k_jump_table_ref_p): Split out uses of
21412         "x", introducing local rtx_insn * "insn" for when working with the
21413         CODE_LABEL of the LABEL_REF.
21414         (m68k_sched_md_init_global): Strengthen local "insn" from rtx to
21415         rtx_insn *.
21416         * config/mcore/mcore-protos.h (mcore_is_dead): Likewise for first
21417         param.
21418         * config/mcore/mcore.c (emit_new_cond_insn): Likewise for return
21419         type.
21420         (conditionalize_block): Likewise for return type and param.
21421         (mcore_is_dead): Likewise for param "first" and local "insn".
21422         (emit_new_cond_insn): Likewise for return type.
21423         (conditionalize_block): Likewise for return type, param, and
21424         locals "insn", "blk_1_br", "end_blk_2_insn", "start_blk_3_lab",
21425         "newinsn".
21426         (conditionalize_optimization): Likewise for local "insn".
21427         * config/mep/mep.c (mep_jmp_return_reorg): Add checked cast when
21428         using NEXT_INSN.
21429         * config/microblaze/microblaze.md: Add checked casts when using
21430         NEXT_INSN.
21431         * config/mips/mips.c (mips_expand_prologue): Eliminate top-level
21432         rtx "insn" in favor of various more tightly-scoped rtx "insn" and
21433         and rtx_insn * "insn".
21434         * config/mips/mips.md (casesi_internal_mips16_<mode>): Add a
21435         checked cast when using NEXT_INSN on operands[2].
21436         * config/mn10300/mn10300.c (mn10300_insert_setlb_lcc): Strengthen
21437         local "insn" from rtx to rtx_insn *.
21438         * config/nds32/nds32-fp-as-gp.c (nds32_fp_as_gp_check_available):
21439         Likewise.
21440         * config/nds32/nds32-md-auxiliary.c (nds32_output_casesi_pc_relative):
21441         Add a checked cast when using NEXT_INSN on operands[1].
21442         * config/pa/pa-protos.h (pa_following_call): Strengthen param from
21443         rtx to rtx_insn *.
21444         (pa_output_cbranch): Likewise for final param.
21445         (pa_output_lbranch): Likewise for second param.
21446         (pa_output_bb): Likewise for third param.
21447         (pa_output_bvb): Likewise.
21448         (pa_output_dbra): Likewise for second param.
21449         (pa_output_movb): Likewise.
21450         (pa_output_parallel_movb): Likewise.
21451         (pa_output_parallel_addb): Likewise.
21452         (pa_output_millicode_call): Likewise for first param.
21453         (pa_output_mul_insn): Likewise for second param.
21454         (pa_output_div_insn): Likewise for third param.
21455         (pa_output_mod_insn): Likewise for second param.
21456         (pa_jump_in_call_delay): Likewise for param.
21457         * config/pa/pa.c (pa_output_mul_insn): Likewise for param "insn".
21458         (pa_output_div_insn): Likewise.
21459         (pa_output_mod_insn): Likewise.
21460         (pa_output_cbranch): Likewise.
21461         (pa_output_lbranch): Likewise.
21462         (pa_output_bb): Likewise.
21463         (pa_output_bvb): Likewise.
21464         (pa_output_dbra): Likewise.
21465         (pa_output_movb): Likewise.
21466         (pa_output_millicode_call): Likewise; use method of rtx_sequence *
21467         to simplify and for typesafety.
21468         (pa_output_call): Use method of rtx_sequence *.
21469         (forward_branch_p): Strengthen param "insn" from rtx to rtx_insn *.
21470         (pa_jump_in_call_delay): Likewise.
21471         (pa_output_parallel_movb): Likewise.
21472         (pa_output_parallel_addb): Likewise.
21473         (pa_following_call): Likewise.
21474         (pa_combine_instructions): Likewise for locals "anchor",
21475         "floater".
21476         (pa_can_combine_p): Likewise for params "anchor", "floater" and
21477         locals "start", "end".
21478         * config/picochip/picochip.c (picochip_reset_vliw): Likewise for
21479         param "insn" and local "local_insn".
21480         (picochip_final_prescan_insn): Likewise for local "local_insn".
21481         * config/rs6000/rs6000.c (compute_save_world_info): Likewise for
21482         local "insn".
21483         (uses_TOC): Likewise.
21484         * config/s390/s390.c (get_some_local_dynamic_name): Likewise.
21485         (s390_mainpool_finish): Eliminate top-level local rtx "insn",
21486         splitting out to more tightly-scoped locals, 3 as rtx and one as
21487         rtx_insn *.
21488         (s390_optimize_nonescaping_tx): Strengthen local "tmp" from rtx
21489         to rtx_insn *.
21490         (s390_emit_prologue): Introduce a local "insn" to be an rtx_insn *
21491         where needed.
21492         * config/sh/sh-protos.h (barrier_align): Strenghten param from rtx
21493         to rtx_insn *.
21494         (fixup_addr_diff_vecs): Likewise.
21495         (reg_unused_after): Likewise for param 2.
21496         (sh_can_redirect_branch): Likewise for both params.
21497         (check_use_sfunc_addr): Likewise for param 1.
21498         * config/sh/sh.c (fixup_mova): Likewise for local "worker".
21499         (find_barrier): Likewise for local "last_got".
21500         (gen_block_redirect): Likewise for return type, param "jump" and
21501         locals "prev", "scan", "next", "insn".
21502         (struct far_branch): Likewise for fields "near_label",
21503         "insert_place", "far_label".
21504         (gen_far_branch): Likewise for local "jump".
21505         (fixup_addr_diff_vecs): Likewise for param "first" and locals
21506         "insn", "prev".
21507         (barrier_align): Likewise for param and for locals "prev", "x".
21508         Introduce local rtx_sequence * "prev_seq" and use insn method for
21509         typesafety and clarity.
21510         (sh_reorg): Strengthen local "scan" from rtx to rtx_insn *.
21511         (get_dest_uid): Likewise for local "dest".
21512         (split_branches): Likewise for locals "next", "beyond", "label",
21513         "block", "far_label".  Add checked casts when assigning to
21514         bp->far_label and "far_label".
21515         (reg_unused_after): Strengthen param "scan" from rtx to rtx_insn *.
21516         (sequence_insn_p): Likewise.
21517         (mark_constant_pool_use): Likewise for locals "insn", "lab".  Add a
21518         more loop-scoped rtx "insn" when walking LABEL_REFS.
21519         (sh_can_redirect_branch): Strengthen both params from rtx to
21520         rtx_insn *.
21521         (check_use_sfunc_addr): Likewise for param "insn".  Introduce a
21522         new local rtx_sequence * "seq" via a dyn_cast, and use a method
21523         for clarity and typesafety.
21524         * config/sh/sh.md (define_expand "epilogue"): Strengthen local
21525         "insn" from rtx to rtx_insn *.
21526         (define_insn "casesi_worker_1"): Add a checked cast to rtx_insn *
21527         when using NEXT_INSN on the CODE_LABEL in operands[2].
21528         (define_insn "casesi_worker_2"): Likewise.
21529         (define_insn "casesi_shift_media"): Likewise.
21530         (define_insn "casesi_load_media"): Likewise for the CODE_LABEL in
21531         operands[3].
21532         * config/sh/sh_optimize_sett_clrt.cc (struct ccreg_value):
21533         Strengthen field "insn" from rtx to rtx_insn *.
21534         (sh_optimize_sett_clrt::execute): Likewise for locals "next_i", "i".
21535         (sh_optimize_sett_clrt::find_last_ccreg_values): Likewise for
21536         param "start_insn" and local "start_insn".
21537         * config/sh/sh_treg_combine.cc (struct set_of_reg): Likewise for
21538         field "insn".
21539         (find_set_of_reg_bb): Likewise for param "insn".
21540         (trace_reg_uses_1): Likewise for param "start_insn" and local "i".
21541         (trace_reg_uses): Likewise for param "start_insn".
21542         (sh_treg_combine::cbranch_trace): Likewise for field
21543         "cbranch_insn".
21544         (sh_treg_combine::cbranch_trace::cbranch_trace): Likewise for
21545         param "insn".
21546         (sh_treg_combine::record_set_of_reg): Likewise for param
21547         "start_insn" and local "i".
21548         (sh_treg_combine::can_remove_cstore): Likewise for local
21549         "prev_insn".
21550         (sh_treg_combine::try_optimize_cbranch): Likewise for param
21551         "insn".
21552         (sh_treg_combine::execute): Likewise for local "i".
21553         * config/sparc/sparc-protos.h (empty_delay_slot): Likewise for
21554         param.
21555         (sparc_check_64): Likewise for second param.
21556         * config/sparc/sparc.c (sparc_do_work_around_errata): Likewise for
21557         locals "insn", "next".  Introduce local rtx_sequence * "seq" via a
21558         dyn_cast, using its insn method for typesafety and clarity.
21559         (empty_delay_slot): Strengthen param "insn" from rtx to
21560         rtx_insn *.
21561         (set_extends): Likewise.
21562         (sparc_check_64): Likewise.
21563         * config/stormy16/stormy16.c (xstormy16_split_cbranch): Likewise
21564         for locals "seq", "last_insn".
21565         (combine_bnp): Likewise for param "insn".
21566         (xstormy16_reorg): Likewise for local "insn".
21567         * config/v850/v850.c (substitute_ep_register): Likewise for params
21568         "first_insn", "last_insn" and local "insn".
21569         (v850_reorg): Likewise for fields "first_insn", "last_insn" within
21570         elements of "regs" array, and local "insn".
21571         * except.c (emit_note_eh_region_end): Likewise for param "insn".
21572         * final.c (final_sequence): Strengthen this global from rtx to
21573         rtx_sequence *.
21574         (shorten_branches): Strenthen locals "rel_lab", "prev" from rtx to
21575         rtx_insn *.
21576         (final_scan_insn): Update assignment to "final_sequence" to be
21577         from "seq", the cast version of "body", for type-safety.
21578         * function.c (assign_parm_setup_reg): Strengthen locals "insn",
21579         "insns" from rtx to rtx_insn *.
21580         (thread_prologue_and_epilogue_insns): Likewise for local "seq".
21581         * genattr.c (main): When writing out generated insn-attr.h,
21582         strengthen params 1 and 3 of eligible_for_delay,
21583         eligible_for_annul_true, eligible_for_annul_false from rtx to
21584         rtx_insn *.
21585         * genattrtab.c (write_eligible_delay): Likewise when writing out
21586         generated insn-attrtab.c; also local "insn" the generated
21587         functions.
21588         * hw-doloop.c (discover_loops): Strengthen local "insn" from rtx
21589         to rtx_insn *.
21590         * hw-doloop.h (struct GTY hwloop_info_d): Strengthen field
21591         "start_label" from rtx to rtx_insn *.
21592         * ira.c (decrease_live_ranges_number): Likewise for local "p".
21593         (ira_update_equiv_info_by_shuffle_insn): Likewise for param
21594         "insns" and local "insn".
21595         (validate_equiv_mem): Likewise for param "start" and local "insn".
21596         (memref_used_between_p): Likewise for params "start", "end" and
21597         local "insn".
21598         * ira.h (ira_update_equiv_info_by_shuffle_insn): Likewise for
21599         final param.
21600         * loop-doloop.c (doloop_optimize): Within region guarded by
21601         INSN_P (doloop_pat), introduce a new local rtx_insn *
21602         "doloop_insn" via a checked cast, and use it for typesafety,
21603         eventually writing the value back into doloop_pat.
21604         * output.h (final_sequence): Strengthen this global from rtx to
21605         rtx_sequence *.
21606         * recog.c (peep2_attempt): Rename param "insn" to "uncast_insn",
21607         reintroducing "insn" as an rtx_insn * via a checked cast.
21608         Strengthen param "attempt" and local "new_insn"from rtx to
21609         rtx_insn *.
21610         (peephole2_optimize): Strengthen locals "insn", "attempt" from rtx
21611         to rtx_insn *.
21612         * ree.c (emit_note_eh_region_end): Likewise for local "insn".
21613         * reload1.c (reload_as_needed): Eliminate top-level locals "x" and
21614         "p" in favor of more tightly-scoped replacements, sometimes rtx
21615         and sometimes rtx_insn *, as appropriate.
21616         (delete_output_reload): Eliminate top-level rtx "i1", splitting
21617         into two loop-scoped locals, one an rtx, the other an rtx_insn *.
21618         * reorg.c (delete_scheduled_jump): Add checked cast.  Strengthen
21619         local "trial" from rtx to rtx_insn *.
21620         (redirect_with_delay_slots_safe_p): Strengthen param "jump" from
21621         rtx to rtx_insn *.  Strenghten local "pat" from rtx to
21622         rtx_sequence * and use methods for clarity and typesafety.
21623         (redirect_with_delay_list_safe_p): Strengthen param "jump" from
21624         rtx to rtx_insn *.  Strenghten local "li" from rtx to
21625         rtx_insn_list * and use its methods for clarity and typesafety.
21626         (steal_delay_list_from_target): Strengthen param "insn" from rtx
21627         to rtx_insn *.
21628         (steal_delay_list_from_fallthrough): Likewise.
21629         (try_merge_delay_insns): Likewise for param "thread" and locals
21630         "trial", "next_trial", "delay_insn".
21631         (redundant_insn): Likewise for param "target" and local "trial".
21632         (own_thread_p): Likewise for param "thread" and locals
21633         "active_insn", "insn".
21634         (get_label_before): Likewise for param "insn".
21635         (fill_simple_delay_slots): Likewise for local "new_label"; use
21636         JUMP_LABEL_AS_INSN as necessary when calling own_thread_p.
21637         (label_before_next_insn): Strengthen return type and local "insn"
21638         from rtx to rtx_insn *.
21639         (relax_delay_slots): Likewise for locals "other", "tmp".
21640         (make_return_insns): Likewise for param "first" and locals "insn",
21641         "jump_insn", "prev".  Move declaration of "pat" to its assignment
21642         and strengthen from rtx to rtx_sequence *.  Use its methods for
21643         clarity and typesafety.
21644         * rtlanal.c (no_labels_between_p): Strengthen params from
21645         const_rtx to const rtx_insn *.  Strengthen local "p" from rtx to
21646         rtx_insn *.
21647         (reg_used_between_p): Strengthen params "from_insn", "to_insn"
21648         from const_rtx to const rtx_insn *.
21649         (reg_set_between_p): Rename param "from_insn" to
21650         "uncast_from_insn", and reintroduce "from_insn" as a
21651         const rtx_insn * via a checked cast.
21652         (modified_between_p): Likewise for param "start" as "uncast_start".
21653         (tablejump_p): Add a cast when invoking NEXT_INSN on "label".
21654         * sel-sched-ir.c (get_seqno_by_preds): Strengthen param and locals
21655         "tmp", head" from rtx to rtx_insn *.
21656         (recompute_rev_top_order): Likewise for local "insn".
21657         * sel-sched-ir.h (get_seqno_by_preds): Likewise for param.
21658         * store-motion.c (build_store_vectors): Likewise for local "insn".
21659         Strengthen local "st" from rtx to rtx_insn_list * and use methods
21660         for clarity and typesafety.
21661         * tree-ssa-loop-ivopts.c (seq_cost): Strengthen param "seq" from
21662         rtx to rtx_insn *.
21663         (computation_cost): Likewise for local "seq".
21664         (get_address_cost): Likewise.
21665
21666 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21667
21668         * rtl.h (tablejump_p): Strengthen first param from const_rtx to
21669         const rtx_insn *.
21670         (label_is_jump_target_p): Likewise for second param.
21671
21672         * rtlanal.c (tablejump_p): Likewise for param "insn".
21673         (label_is_jump_target_p): Likewise for param "jump_insn".
21674
21675 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21676
21677         * rtl.h (find_first_parameter_load): Strengthen return type and
21678         both params from rtx to rtx_insn *.
21679         * rtlanal.c (find_first_parameter_load): Strengthen return type,
21680         both params and locals "before", "first_set" from rtx to
21681         rtx_insn *.  Remove now-redundant cast.
21682         * except.c (sjlj_mark_call_sites): Use NULL rather than NULL_RTX.
21683
21684 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21685
21686         * rtl.h (find_last_value): Delete.
21687         * rtlanal.c (find_last_value): Delete.
21688
21689 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21690
21691         * cfgexpand.c (pass_expand::execute): Strengthen local "after"
21692         from rtx to rtx_insn *.
21693         * cfgrtl.c (force_nonfallthru_and_redirect): Replace use of local
21694         rtx "note" with new local rtx_insn * "new_head" when calculating
21695         head insn of new basic block.
21696         * combine.c (combine_split_insns): Strengthen return type and local
21697         "ret" from rtx to rtx_insn *.
21698         (likely_spilled_retval_p): Likewise for locals "use" and "p".
21699         (try_combine): Eliminate local "m_split", splitting into new
21700         locals "m_split_insn" and "m_split_pat".
21701         (find_split_point): Strengthen local "seq" from rtx into
21702         rtx_insn *.
21703         * config/spu/spu.c (spu_machine_dependent_reorg): Likewise for
21704         locals "label", "branch".
21705         * config/spu/spu.md (define_expand "smulsi3_highpart"): Likewise
21706         for local "insn".
21707         (define_expand "umulsi3_highpart"): Likewise for local "insn".
21708         * dse.c (note_add_store_info): Likewise for fields "first",
21709         "current".
21710         (note_add_store): Likewise for local "insn".
21711         (emit_inc_dec_insn_before): Likewise for locals "insn",
21712         "new_insn", "cur".
21713         (find_shift_sequence): Likewise for locals "shift_seq", "insn".
21714         (replace_read): Likewise for locals "insns", "this_insn".
21715         * dwarf2cfi.c (dw_trace_info): Likewise for field "eh_head".
21716         (notice_eh_throw): Likewise for param "insn".
21717         (before_next_cfi_note): Likewise for return type, param, and local
21718         "prev".
21719         (connect_traces): Likewise for local "note".
21720         * emit-rtl.c (reset_all_used_flags): Likewise for local "p".
21721         (verify_rtl_sharing): Likewise.
21722         (unshare_all_rtl_in_chain): Likewise for param "insn".
21723         (get_first_nonnote_insn): Likewise for local "insn".
21724         (get_last_nonnote_insn): Likewise.  Introduce local rtx_sequence *
21725         "seq" and use its methods to clarify things.
21726         (next_insn): Strengthen return type from rtx to rtx_insn *.
21727         Rename param "insn" to "uncast_insn" and reintroduce "insn" as a
21728         local rtx_insn * using a checked cast, dropping a checked cast
21729         made redundant by this change.  Use a cast to and method of
21730         rtx_sequence to clarify the code.
21731         (previous_insn): Rename param "insn" to "uncast_insn" and
21732         reintroduce "insn" as a local rtx_insn * using a checked cast,
21733         dropping a checked cast made redundant by this change.  Use a cast
21734         to and method of rtx_sequence to clarify the code.
21735         (next_nonnote_insn): Rename param "insn" to "uncast_insn" and
21736         reintroduce "insn" as a local rtx_insn * using a checked cast,
21737         dropping a checked cast made redundant by this change.
21738         (next_nonnote_insn_bb): Likewise.
21739         (prev_nonnote_insn): Likewise.
21740         (prev_nonnote_insn_bb): Likewise.
21741         (next_nondebug_insn): Likewise.
21742         (prev_nondebug_insn): Likewise.
21743         (next_nonnote_nondebug_insn): Likewise.
21744         (prev_nonnote_nondebug_insn): Likewise.
21745         (next_real_insn): Likewise.
21746         (prev_real_insn): Likewise.
21747         (next_active_insn): Likewise.
21748         (prev_active_insn): Likewise.
21749         (next_cc0_user): Likewise.  Use rtx_sequence and a method for
21750         clarity.
21751         (prev_cc0_setter): Likewise.
21752         (try_split): Rename param "trial" to "uncast_trial" and
21753         reintroduce "insn" as a local rtx_insn * using a checked cast,
21754         dropping checked casts made redundant by this change.
21755         Strengthen locals "seq", "tem", "insn_last", "insn", "next" from
21756         rtx to rtx_insn *.
21757         (remove_insn): Rename param "insn" to "uncast_insn" and
21758         reintroduce "insn" as a local rtx_insn * using a checked cast.
21759         (emit_pattern_after_setloc): Likewise for param "after", as
21760         "uncast_after".
21761         (emit_pattern_after): Likewise.  Strengthen local "prev" from
21762         rtx to rtx_insn *.
21763         (emit_pattern_before_setloc): Rename param "before" to
21764         "uncast_before" and reintroduce "before" as a local rtx_insn *
21765         using a checked cast.  Strengthen locals "first", "last" from
21766         rtx to rtx_insn *.
21767         (emit_pattern_before): Likewise rename/cast param "before" to
21768         "uncast_before". Strengthen local "next" from rtx to rtx_insn *.
21769         * except.c (copy_reg_eh_region_note_forward): Strengthen param
21770         "first" and local "insn" from rtx to rtx_insn *.
21771         (copy_reg_eh_region_note_backward): Likewise for param "last"
21772         and local "insn".
21773         * expr.c (fixup_args_size_notes): Rename param "last" to
21774         "uncast_last" and reintroduce "last" as a local rtx_insn *
21775         using a checked cast.  Strengthen local "insn" from rtx to
21776         rtx_insn *.
21777         * function.c (set_insn_locations): Strengthen param "insn" from
21778         rtx to rtx_insn *.
21779         (record_insns): Likewise for param "insns" and local "tmp".
21780         (active_insn_between): Rename param "tail" to
21781         "uncast_tail" and reintroduce "tail" as a local rtx_insn *
21782         using a checked cast.
21783         (thread_prologue_and_epilogue_insns): Split out top-level local
21784         rtx "seq" into three different rtx_insn * locals.  Strengthen
21785         local "prologue_seq" from rtx to rtx_insn *.
21786         * gcse.c (insert_insn_end_basic_block): Strenghen local "insn"
21787         from rtx to rtx_insn *.
21788         * haifa-sched.c (initiate_bb_reg_pressure_info): Likewise.
21789         (priority): Likewise for locals "prev_first", "twin".
21790         (setup_insn_max_reg_pressure): Likewise for param "after".
21791         (sched_setup_bb_reg_pressure_info): Likewise.
21792         (no_real_insns_p): Strengthen params from const_rtx to
21793         const rtx_insn *.
21794         (schedule_block): Strengthen local "next_tail" from rtx to
21795         rtx_insn *.
21796         * ifcvt.c (find_active_insn_before): Strengthen return type and
21797         param "insn" from rtx to rtx_insn *.
21798         (find_active_insn_after): Likewise.
21799         (cond_exec_process_insns): Likewise for param "start" and local "insn".
21800         (cond_exec_process_if_block): Likewise for locals "then_start",
21801         "then_end", "else_start", "else_end", "insn", "start", "end", "from".
21802         (noce_process_if_block): Likewise for local "jump".
21803         (merge_if_block): Likewise for two locals named "end".
21804         (cond_exec_find_if_block): Likewise for local "last_insn".
21805         * jump.c (delete_related_insns): Rename param "insn" to
21806         "uncast_insn" and reintroduce "insn" as a local rtx_insn * using a
21807         checked cast.  Strengthen local "p" from rtx to rtx_insn *.
21808         * lra-constraints.c (inherit_reload_reg): Replace NULL_RTX with
21809         NULL.
21810         (split_reg): Likewise.
21811         * lra.c (lra_process_new_insns): Likewise.
21812         * modulo-sched.c (permute_partial_schedule): Strengthen param
21813         "last" from rtx to rtx_insn *.
21814         * optabs.c (add_equal_note): Likewise for param "insns" and local
21815         "last_insn".
21816         (expand_binop_directly): Add checked casts to rtx_insn * within
21817         NEXT_INSN (pat) uses.
21818         (expand_unop_direct): Likewise.
21819         (maybe_emit_unop_insn): Likewise.
21820         * recog.c (peep2_attempt): Strengthen locals "last",
21821         "before_try", "x" from rtx to rtx_insn *.
21822         * reorg.c (optimize_skip): Strengthen return type and local
21823         "delay_list" from rtx to rtx_insn_list *.  Strengthen param "insn"
21824         and locals "trial", "next_trial" from rtx to rtx_insn *.
21825         * resource.c (next_insn_no_annul): Strengthen return type and
21826         param "insn" from rtx to rtx_insn *.  Use a cast to and method of
21827         rtx_sequence to clarify the code.
21828         (mark_referenced_resources): Add a checked cast to rtx_insn *
21829         within PREV_INSN (x).
21830         (find_dead_or_set_registers): Strengthen return type, param
21831         "target", locals "insn", "next", "jump_insn", "this_jump_insn"
21832         from rtx to rtx_insn *.  Strengthen param "jump_target" from rtx *
21833         to rtx_insn **.
21834         (mark_target_live_regs): Strengthen params "insns" and "target",
21835         locals "insn", "jump_target", "start_insn", "stop_insn" from rtx
21836         to rtx_insn *.  Use cast to and method of rtx_sequence to clarify
21837         the code.
21838         * resource.h (mark_target_live_regs): Strengthen params 1 and 2
21839         from rtx to rtx_insn *.
21840         * rtl.h (copy_reg_eh_region_note_forward): Strengthen second param
21841         from rtx to rtx_insn *.
21842         (copy_reg_eh_region_note_backward): Likewise.
21843         (unshare_all_rtl_in_chain): Likewise for sole param.
21844         (dump_rtl_slim): Strengthen second and third params from const_rtx
21845         to const rtx_insn *.
21846         * sched-deps.c (sched_free_deps): Strengthen params "head" and
21847         "tail" and locals "insn", "next_tail" from rtx to rtx_insn *.
21848         * sched-ebb.c (init_ready_list): Strengthen locals "prev_head",
21849         "next_tail" from rtx to rtx_insn *.
21850         (begin_move_insn): Likewise for local "next".
21851         * sched-int.h (sched_free_deps): Likewise for first and second
21852         params.
21853         (no_real_insns_p): Strengthen both params from const_rtx to
21854         const rtx_insn *.
21855         (sched_setup_bb_reg_pressure_info): Strengthen second params from
21856         rtx to rtx_insn *.
21857         * sched-rgn.c (init_ready_list): Likewise for locals "prev_head",
21858         "next_tail".
21859         * sched-vis.c (dump_rtl_slim): Strengthen params "first", "last"
21860         and locals "insn", "tail" from const_rtx to const rtx_insn *.
21861         (rtl_dump_bb_for_graph): Strengthen local "insn" from rtx to
21862         rtx_insn *.
21863         (debug_rtl_slim): Strengthen params "first" and "last" from
21864         const_rtx to const rtx_insn *.
21865         * shrink-wrap.c (try_shrink_wrapping): Strengthen param
21866         "prologue_seq" and locals "seq", "p_insn" from rtx to rtx_insn *.
21867         (convert_to_simple_return): Likewise for param "returnjump".
21868         * shrink-wrap.h (try_shrink_wrapping): Likewise for param
21869         "prologue_seq".
21870         (convert_to_simple_return): Likewise for param "returnjump".
21871         * valtrack.c (propagate_for_debug): Likewise for params
21872         "insn", "last".
21873         * valtrack.h (propagate_for_debug): Likewise for second param.
21874
21875 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21876
21877         * output.h (insn_current_reference_address): Strengthen param
21878         from rtx to rtx_insn *.
21879         * final.c (insn_current_reference_address): Likewise.
21880
21881 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21882
21883         * basic-block.h (inside_basic_block_p): Strengthen param from
21884         const_rtx to const rtx_insn *.
21885         * cfgbuild.c (inside_basic_block_p): Likewise.
21886
21887 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21888
21889         * dwarf2cfi.c (dw_trace_info): Strengthen field "head" from rtx to
21890         rtx_insn *.
21891         (get_trace_info): Likewise for param "insn".
21892         (save_point_p): Likewise.
21893         (maybe_record_trace_start): Likewise for both params.
21894         (maybe_record_trace_start_abnormal): Likewise.
21895         (create_trace_edges): Likewise for sole param and for three of the
21896         locals named "lab".
21897         (scan_trace): Strengthen local "prev", "insn", "control" from rtx
21898         to rtx_insn *, and update a call to pat->element to pat->insn.
21899
21900 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21901
21902         * function.h (struct expr_status): Convert field "x_forced_labels"
21903         from rtx_expr_list * to rtx_insn_list *.
21904
21905         * cfgbuild.c (make_edges): Convert local "x" from an
21906         rtx_expr_list * to an rtx_insn_list *, replacing use of
21907         "element" method with "insn" method.
21908         * dwarf2cfi.c (create_trace_edges): Likewise for local "lab".
21909         * except.c (sjlj_emit_dispatch_table): Replace use of
21910         gen_rtx_EXPR_LIST with gen_rtx_INSN_LIST when prepending to
21911         forced_labels.
21912         * jump.c (rebuild_jump_labels_1): Convert local "insn" from an
21913         rtx_expr_list * to an rtx_insn_list *, replacing use of
21914         "element" method with "insn" method.
21915         * reload1.c (set_initial_label_offsets): Likewise for local "x".
21916         * stmt.c (label_rtx): Strengthen local "ref" from rtx to
21917         rtx_insn *, adding a checked cast.  Replace use of
21918         gen_rtx_EXPR_LIST with gen_rtx_INSN_LIST when prepending it to
21919         forced_labels.
21920         (expand_label): Likewise for local "label_r".
21921
21922 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21923
21924         * function.h (struct rtl_data): Convert field
21925         "x_nonlocal_goto_handler_labels" from rtx_expr_list * to
21926         rtx_insn_list *.
21927         * rtl.h (remove_node_from_insn_list): New prototype.
21928
21929         * builtins.c (expand_builtin): When prepending to
21930         nonlocal_goto_handler_labels, use gen_rtx_INSN_LIST rather than
21931         gen_rtx_EXPR_LIST.
21932         * cfgbuild.c (make_edges): Convert local "x" from rtx_expr_list *
21933         to rtx_insn_list *, and use its "insn" method rather than
21934         "element" method.
21935         * cfgrtl.c (delete_insn): Use new function
21936         remove_node_from_insn_list rather than
21937         remove_node_from_expr_list.
21938         (cfg_layout_initialize): Convert local "x" from rtx_expr_list *
21939         to rtx_insn_list *, and use its "insn" method rather than
21940         "element" method.
21941         * dwarf2cfi.c (create_trace_edges): Likewise for local "lab".
21942         * reload1.c (set_initial_label_offsets): Likewise for local "x".
21943         * rtlanal.c (remove_node_from_insn_list): New function, adapted
21944         from remove_node_from_expr_list.
21945         * stmt.c (expand_label): When prepending to
21946         nonlocal_goto_handler_labels, use gen_rtx_INSN_LIST rather than
21947         gen_rtx_EXPR_LIST.
21948
21949 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21950
21951         * function.h (struct rtl_data): Strengthen fields "x_return_label"
21952         and "x_naked_return_label" from rtx to rtx_code_label *.
21953
21954 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
21955
21956         * rtl.h (SET_PREV_INSN): Strengthen param from rtx to rtx_insn *.
21957         (SET_NEXT_INSN): Likewise.
21958         (gen_rtvec_v): Add an overload for param types (int, rtx_insn **).
21959
21960         * config/c6x/c6x.c (gen_one_bundle): Strengthen param "slot" from
21961         rtx * to rtx_insn **.  Introduce a new local rtx "seq", using it
21962         to split out the SEQUENCE from local "bundle", strengthening the
21963         latter from rtx to rtx_insn * to hold the insn holding the SEQUENCE.
21964         Strengthen locals "t" and "insn" from rtx to rtx_insn *.
21965         (c6x_gen_bundles): Strengthen locals "insn", "next", "last_call"
21966         and the type of the elements of the "slot" array from rtx to
21967         rtx_insn *.
21968         (reorg_split_calls): Likewise for locals "insn" and "next", and
21969         the type of the elements of the "slot" array.
21970
21971         * config/frv/frv.c (frv_nops): Likewise for the elements of this
21972         array.
21973         (frv_function_prologue): Likewise for locals "insn", "next",
21974         "last_call".
21975         (frv_register_nop): Introduce a local "nop_insn" to be the
21976         rtx_insn * containing rtx "nop".
21977
21978         * config/mep/mep.c (mep_make_bundle): Param "core" is sometimes
21979         used as an insn and sometimes as a pattern, so rename it to
21980         "core_insn_or_pat", and introduce local rtx_insn * "core_insn",
21981         using it where dealing with the core insn.
21982
21983         * config/picochip/picochip.c (reorder_var_tracking_notes):
21984         Strengthen locals "insn", "next", "last_insn", "queue",
21985         "next_queue", "prev" from rtx to rtx_insn *.
21986
21987         * emit-rtl.c (gen_rtvec_v): Add overloaded implementation for when
21988         the second param is an rtx_insn ** rather than an rtx **.
21989         (link_insn_into_chain): Strengthen locals "seq" and "sequence"
21990         from rtx to rtx_sequence *, and introduce local named "sequence",
21991         using methods of rtx_sequence to clarify the code.
21992         (remove_insn): Introduce local rtx_sequence * named "sequence" and
21993         use its methods.
21994         (emit_insn_after_1): Strengthen return type from rtx to rtx_insn *.
21995         Rename param "after" to "uncast_after", reintroducing "after" as a
21996         local rtx_insn * with a checked cast.
21997         (emit_pattern_after_noloc): Rename param "after" to "uncast_after",
21998         reintroducing "after" as a local rtx_insn * with a checked cast.
21999         Strengthen local "last" from rtx to rtx_insn * and remove the
22000         now-redundant checked casts.
22001         (copy_delay_slot_insn): Strengthen return type and param from rtx
22002         to rtx_insn *.
22003
22004         * haifa-sched.c (reemit_notes): Strengthen params "insn" and
22005         "last" from rtx to rtx_insn *.
22006
22007 2014-08-28  David Malcolm  <dmalcolm@redhat.com>
22008
22009         * emit-rtl.h (copy_delay_slot_insn): Strengthen return type and
22010         param from rtx to rtx_insn *.
22011
22012         * emit-rtl.c (copy_delay_slot_insn): Likewise.
22013
22014         * reorg.c (skip_consecutive_labels): Strengthen return type, param
22015         and local "insn" from rtx to rtx_insn *.
22016         (unfilled_slots_base): Strengthen type from rtx * to rtx_insn **.
22017         (unfilled_slots_next): Likewise.
22018         (function_return_label): Strengthen from rtx to rtx_code_label *.
22019         (function_simple_return_label): Likewise.
22020         (first_active_target_insn): Strengthen return type and param from
22021         rtx to rtx_insn *.
22022         (find_end_label): Strengthen return type from rtx to
22023         rtx_code_label *; strengthen locals as appropriate.
22024         (emit_delay_sequence): Strengthen return type, param "insn" and
22025         local "seq_insn" from rtx to rtx_insn *.  Strengthen param "list"
22026         and local "li" from rtx to rtx_insn_list *, using methods of
22027         rtx_insn_list for clarity and typesafety.
22028         (add_to_delay_list): Strengthen return type and param "insn" from
22029         rtx to rtx_insn *.  Strengthen param "delay_list" from rtx to
22030         rtx_insn_list * and use methods of rtx_insn_list.
22031         (delete_from_delay_slot): Strengthen return type, param "insn",
22032         locals "trial", "seq_insn", "prev" from rtx to rtx_insn *.
22033         Strengthen local "seq" from rtx to rtx_sequence *, and local
22034         "delay_list" from rtx to rtx_insn_list *, using methods of
22035         rtx_sequence for clarity and type-safety.
22036         (delete_scheduled_jump): Add checked cast when invoking
22037         delete_from_delay_slot.  Strengthen local "trial" from rtx to
22038         rtx_insn *.
22039         (optimize_skip): Strengthen return type and local "delay_list"
22040         from rtx to rtx_insn_list *.  Strengthen local "trial" from rtx to
22041         rtx_insn *.
22042         (steal_delay_list_from_target): Strengthen return type, param
22043         "delay_list" and local "new_delay_list" from rtx to
22044         rtx_insn_list *.  Strengthen param "seq" from rtx to
22045         rtx_sequence *.  Strengthen param "pnew_thread" from rtx * to
22046         rtx_insn **.
22047         Split out local "temp" into multiple more-tightly scoped locals:
22048         sometimes an rtx_insn_list *, and once a rtx_insn *.  Use methods
22049         of rtx_insn_list and rtx_sequence for clarity and typesafety.
22050         Strengthen locals named "trial" from rtx to rtx_insn *.
22051         (steal_delay_list_from_fallthrough): Strengthen return type and
22052         param "delay_list" from rtx to rtx_insn_list *.  Strengthen param
22053         "seq" from rtx to rtx_sequence *.  Use methods of rtx_sequence.
22054         Strengthen local "trial" from rtx to rtx_insn *.
22055         (try_merge_delay_insns): Strength local "merged_insns" from rtx
22056         to rtx_insn_list * and use its methods.  Strengthen local "pat"
22057         from rtx to rtx_sequence * and use its methods.  Strengthen locals
22058         "dtrial" and "new_rtx" from rtx to rtx_insn *.
22059         (get_label_before): Strengthen return type and local "label" from
22060         rtx to rtx_insn *.
22061         (fill_simple_delay_slots): Likewise for locals "insn", "trial",
22062         "next_trial", "next", prev".  Strengthen local "delay_list" from
22063         rtx to rtx_insn_list *  Strengthen local "tmp" from rtx * to
22064         rtx_insn **.
22065         (follow_jumps): Strengthen return type, param "label" and locals
22066         "insn", "next", "value", "this_label" from rtx to rtx_insn *.
22067         (fill_slots_from_thread): Strengthen return type, param
22068         "delay_list" from rtx to rtx_insn_list *.  Strengthen params
22069         "insn", "thread", "opposite_thread" and locals "new_thread",
22070         "trial", "temp", "ninsn" from rtx to rtx_insn *.  Introduce local
22071         "sequence" from a checked cast to rtx_sequence so that we can call
22072         steal_delay_list_from_target and steal_delay_list_from_fallthrough
22073         with an rtx_sequence *.
22074         (fill_eager_delay_slots): Strengthen locals "insn", "target_label",
22075         "insn_at_target", "fallthrough_insn" from rtx to rtx_insn *.
22076         Strengthen local "delay_list" from rtx to rtx_insn_list *.
22077         (relax_delay_slots): Strengthen param "first" and locals "insn",
22078         "next", "trial", "delay_insn", "target_label" from rtx to
22079         rtx_insn *.  Strengthen local "pat" from rtx to rtx_sequence *.
22080         Introduce a local "trial_seq" for PATTERN (trial) of type
22081         rtx_sequence *, in both cases using methods of rtx_sequence.
22082         (dbr_schedule): Strengthen param "first" and locals "insn",
22083         "next", "epilogue_insn" from rtx to rtx_insn *.
22084
22085 2014-08-28  Richard Biener  <rguenther@suse.de>
22086
22087         PR tree-optimization/62283
22088         * tree-vect-data-refs.c (vect_enhance_data_refs_alignment):
22089         Do not peel loops for alignment where the vector loop likely
22090         doesn't run at least VF times.
22091
22092 2014-08-28  Bin Cheng  <bin.cheng@arm.com>
22093
22094         * tree-ssa-loop-ivopts.c (iv_ca_add_use): Delete parameter
22095         important_candidates.  Consider all important candidates if
22096         IVS doesn't give any result.  Remove check on ivs->upto.
22097         (try_add_cand_for): Call iv_ca_add_use only once.
22098
22099 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22100             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22101             Anna Tikhonova  <anna.tikhonova@intel.com>
22102             Ilya Tocar  <ilya.tocar@intel.com>
22103             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22104             Ilya Verbin  <ilya.verbin@intel.com>
22105             Kirill Yukhin  <kirill.yukhin@intel.com>
22106             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22107
22108         (define_mode_iterator VI12_AVX2): Add V64QI and V32HI modes.
22109         (define_expand "<sse2_avx2>_<plusminus_insn><mode>3<mask_name>"): Add
22110         masking.
22111         (define_insn "*<sse2_avx2>_<plusminus_insn><mode>3<mask_name>"): Ditto.
22112         (define_expand "<sse2_avx2>_uavg<mode>3<mask_name>"): Ditto.
22113         (define_insn "*<sse2_avx2>_uavg<mode>3<mask_name>"): Ditto.
22114         (define_insn "*mul<mode>3"): Add EVEX version.
22115
22116 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22117             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22118             Anna Tikhonova  <anna.tikhonova@intel.com>
22119             Ilya Tocar  <ilya.tocar@intel.com>
22120             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22121             Ilya Verbin  <ilya.verbin@intel.com>
22122             Kirill Yukhin  <kirill.yukhin@intel.com>
22123             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22124
22125         * config/i386/sse.md
22126         (define_insn "avx512bw_interleave_highv64qi<mask_name>"): New.
22127         (define_insn "avx2_interleave_highv32qi<mask_name>"): Add masking.
22128         (define_insn "vec_interleave_highv16qi<mask_name>"): Ditto.
22129         (define_insn "avx2_interleave_lowv32qi<mask_name>"): Ditto.
22130         (define_insn "vec_interleave_lowv16qi<mask_name>"): Ditto.
22131         (define_insn "avx2_interleave_highv16hi<mask_name>"): Ditto.
22132         (define_insn "vec_interleave_highv8hi<mask_name>"): Ditto.
22133         (define_insn "avx2_interleave_lowv16hi<mask_name>"): Ditto.
22134         (define_insn "vec_interleave_lowv8hi<mask_name>"): Ditto.
22135         (define_insn "avx2_interleave_highv8si<mask_name>"): Ditto.
22136         (define_insn "vec_interleave_highv4si<mask_name>"): Ditto.
22137         (define_insn "avx2_interleave_lowv8si<mask_name>"): Ditto.
22138         (define_insn "vec_interleave_lowv4si<mask_name>"): Ditto.
22139         (define_insn "vec_interleave_highv16qi<mask_name>"): New.
22140         (define_insn "avx512bw_interleave_highv32hi<mask_name>"): Ditto.
22141         (define_insn "<mask_codefor>avx512bw_interleave_lowv32hi<mask_name>"):
22142         Ditto.
22143
22144 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22145             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22146             Anna Tikhonova  <anna.tikhonova@intel.com>
22147             Ilya Tocar  <ilya.tocar@intel.com>
22148             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22149             Ilya Verbin  <ilya.verbin@intel.com>
22150             Kirill Yukhin  <kirill.yukhin@intel.com>
22151             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22152
22153         * config/i386/sse.md
22154         (define_mode_iterator VIMAX_AVX2): Add V4TI mode.
22155         (define_insn "<sse2_avx2>_ashl<mode>3"): Add EVEX version.
22156         (define_insn "<sse2_avx2>_lshr<mode>3"): Ditto.
22157
22158 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22159             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22160             Anna Tikhonova  <anna.tikhonova@intel.com>
22161             Ilya Tocar  <ilya.tocar@intel.com>
22162             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22163             Ilya Verbin  <ilya.verbin@intel.com>
22164             Kirill Yukhin  <kirill.yukhin@intel.com>
22165             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22166
22167         * config/i386/sse.md
22168         (define_mode_iterator VI128_256): New.
22169         (define_insn "<mask_codefor><code><mode>3<mask_name>"): Ditto.
22170
22171 2014-08-28  Alexander Ivchenko  <alexander.ivchenko@intel.com>
22172             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
22173             Anna Tikhonova  <anna.tikhonova@intel.com>
22174             Ilya Tocar  <ilya.tocar@intel.com>
22175             Andrey Turetskiy  <andrey.turetskiy@intel.com>
22176             Ilya Verbin  <ilya.verbin@intel.com>
22177             Kirill Yukhin  <kirill.yukhin@intel.com>
22178             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
22179
22180         * config/i386/sse.md
22181         (define_mode_iterator VI8_256_512): New.
22182         (define_insn "<mask_codefor>avx512dq_cvtps2qq<mode><mask_name><round_name>"):
22183         Ditto.
22184         (define_insn "<mask_codefor>avx512dq_cvtps2qqv2di<mask_name>"): Ditto.
22185         (define_insn "<mask_codefor>avx512dq_cvtps2uqq<mode><mask_name><round_name>"):
22186         Ditto.
22187         (define_insn "<mask_codefor>avx512dq_cvtps2uqqv2di<mask_name>"): Ditto.
22188
22189 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22190
22191         * varasm.c (compute_reloc_for_rtx_1): Take a const_rtx.  Remove the
22192         pointer to the cumulative reloc value and return the value for
22193         this reloc instead.
22194         (compute_reloc_for_rtx): Take a const_rtx.  Call
22195         compute_reloc_for_rtx_1 directly for SYMBOL_REF and LABEL_REF,
22196         avoiding any recursion.  Use FOR_EACH_SUBRTX rather than
22197         for_each_rtx for the CONST case.
22198
22199 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22200
22201         * varasm.c (mark_constant): Replace this for_each_rtx callback with...
22202         (mark_constants_in_pattern): ...this new function to iterate over
22203         all the subrtxes.
22204         (mark_constants): Update accordingly.
22205
22206 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22207
22208         * varasm.c: Include rtl-iter.h.
22209         (const_rtx_hash_1): Take a const_rtx rather than an rtx *.
22210         Remove the pointer to the cumulative hashval_t and just return
22211         the hash for this rtx instead.  Remove recursive CONST_VECTOR case.
22212         (const_rtx_hash): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22213         Accumulate the hashval_ts here instead of const_rtx_hash_1.
22214
22215 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22216
22217         * var-tracking.c (add_uses): Take an rtx rather than an rtx *.
22218         Give real type of data parameter.  Remove return value.
22219         (add_uses_1): Use FOR_EACH_SUBRTX_VAR rather than for_each_rtx
22220         to iterate over subrtxes.
22221
22222 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22223
22224         * var-tracking.c (use_narrower_mode_test): Turn from being a
22225         for_each_rtx callback to being a function that examines each
22226         subrtx itself.
22227         (adjust_mems): Update accordingly.
22228
22229 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22230
22231         * var-tracking.c (non_suitable_const): Turn from being a for_each_rtx
22232         callback to being a function that examines each subrtx itself.
22233         Remove handling of null rtxes.
22234         (add_uses): Update accordingly.
22235
22236 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22237
22238         * var-tracking.c: Include rtl-iter.h.
22239         (rtx_debug_expr_p): Turn from being a for_each_rtx callback
22240         to being a function that examines each subrtx itself.
22241         (use_type): Update accordingly.
22242
22243 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22244
22245         * store-motion.c: Include rtl-iter.h.
22246         (extract_mentioned_regs_1): Delete.
22247         (extract_mentioned_regs): Use FOR_EACH_SUBRTX_VAR rather than
22248         for_each_rtx to iterate over subrtxes.
22249
22250 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22251
22252         * sel-sched.c: Include rtl-iter.h
22253         (count_occurrences_1): Delete.
22254         (count_occurrences_equiv): Turn rtxes into const_rtxes.
22255         Use FOR_EACH_SUBRTX rather than for_each_rtx.
22256
22257 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22258
22259         * rtl.h (tls_referenced_p): Take a const_rtx rather than an rtx.
22260         * rtlanal.c (tls_referenced_p_1): Delete.
22261         (tls_referenced_p): Take a const_rtx rather than an rtx.
22262         Use FOR_EACH_SUBRTX rather than for_each_rtx.
22263
22264 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22265
22266         * rtl.h (for_each_inc_dec_fn): Remove special case for -1.
22267         (for_each_inc_dec): Take an rtx rather than an rtx *.
22268         * cselib.c (cselib_record_autoinc_cb): Update accordingly.
22269         (cselib_record_sets): Likewise.
22270         * dse.c (emit_inc_dec_insn_before, check_for_inc_dec_1)
22271         (check_for_inc_dec): Likewise.
22272         * rtlanal.c (for_each_inc_dec_ops): Delete.
22273         (for_each_inc_dec_find_inc_dec): Take the MEM as argument,
22274         rather than a pointer to the memory address.  Replace
22275         for_each_inc_dec_ops argument with separate function and data
22276         arguments.  Abort on non-autoinc addresses.
22277         (for_each_inc_dec_find_mem): Delete.
22278         (for_each_inc_dec): Take an rtx rather than an rtx *.  Use
22279         FOR_EACH_SUBRTX_VAR to visit every autoinc MEM.
22280
22281 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22282
22283         * rtl.h (find_all_hard_regs): Declare.
22284         * rtlanal.c (find_all_hard_regs): New function.
22285         (record_hard_reg_uses_1): Delete.
22286         (record_hard_reg_uses): Use find_all_hard_regs.
22287
22288 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22289
22290         * rtl.h (replace_label_data): Delete.
22291         (replace_label): Take the old label, new label and update-nuses flag
22292         as direct arguments.  Return void.
22293         * cfgcleanup.c (outgoing_edges_match): Update accordingly.
22294         * rtlanal.c (replace_label): Update interface as above.  Handle
22295         JUMP_TABLE_DATA as a special case.  Handle JUMPs outside the
22296         iterator.  Use FOR_EACH_SUBRTX_PTR.
22297
22298 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22299
22300         * rtl.h (get_pool_constant, rtx_referenced_p): Replace rtx parameters
22301         with const_rtx parameters.
22302         * varasm.c (get_pool_constant): Likewise.
22303         * rtlanal.c (rtx_referenced_p_1): Delete.
22304         (rtx_referenced_p): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22305         Assert that the rtx we're looking for is nonnull.  Allow searches
22306         for constant pool SYMBOL_REFs.
22307
22308 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22309
22310         * reload1.c: Include rtl-iter.h.
22311         (note_reg_elim_costly): Turn from being a for_each_rtx callback
22312         to being a function that examines each subrtx itself.
22313         (eliminate_regs_1, elimination_costs_in_insn): Update accordingly.
22314
22315 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22316
22317         * regcprop.c (cprop_find_used_regs_1): Delete.
22318         (cprop_find_used_regs): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22319
22320 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22321
22322         * regcprop.c: Include rtl-iter.h.
22323         (kill_value): Take a const_rtx.
22324         (kill_autoinc_value): Turn from being a for_each_rtx callback
22325         to being a function that examines each subrtx itself.
22326         (copyprop_hardreg_forward_1): Update accordingly.
22327
22328 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22329
22330         * reg-stack.c: Include rtl-iter.h.
22331         (subst_stack_regs_in_debug_insn): Delete.
22332         (subst_all_stack_regs_in_debug_insn): Use FOR_EACH_SUBRTX_PTR
22333         instead of for_each_rtx.
22334
22335 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22336
22337         * lower-subreg.c (find_decomposable_subregs): Turn from being
22338         a for_each_rtx callback to being a function that examines each
22339         subrtx itself.  Remove handling of null rtxes.
22340         (decompose_multiword_subregs): Update accordingly.
22341
22342 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22343
22344         * lower-subreg.c (adjust_decomposed_uses): Delete.
22345         (resolve_debug): Use FOR_EACH_SUBRTX_PTR rather than for_each_rtx.
22346         Remove handling of null rtxes.
22347
22348 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22349
22350         * lower-subreg.c: Include rtl-iter.h.
22351         (resolve_subreg_use): Turn from being a for_each_rtx callback
22352         to being a function that examines each subrtx itself.  Remove
22353         handling of null rtxes.
22354         (resolve_reg_notes, resolve_simple_move): Update accordingly.
22355         (decompose_multiword_subregs): Likewise.
22356
22357 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22358
22359         * loop-iv.c (altered_reg_used): Turn from being a for_each_rtx callback
22360         to being a function that examines each subrtx itself.
22361         (simplify_using_condition, simplify_using_initial_values): Update
22362         accordingly.
22363
22364 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22365
22366         * loop-iv.c: Include rtl-iter.h.
22367         (find_single_def_src): New function.
22368         (replace_single_def_regs): Turn from being a for_each_rtx callback
22369         to being a function that examines each subrtx itself.
22370         (replace_in_expr, simplify_using_initial_values): Update accordingly.
22371
22372 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22373
22374         * jump.c (eh_returnjump_p_1): Delete.
22375         (eh_returnjump_p): Use FOR_EACH_SUBRTX rather than for_each_rtx.
22376         Remove handling of null rtxes.
22377
22378 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22379
22380         * jump.c: Include rtl-iter.h.
22381         (returnjump_p_1): Delete.
22382         (returnjump_p): Use FOR_EACH_SUBRTX rather than for_each_rtx.
22383         Remove handling of null rtxes.
22384
22385 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22386
22387         * ira.c: Include rtl-iter.h.
22388         (set_paradoxical_subreg): Turn from being a for_each_rtx callback
22389         to being a function that examines each subrtx itself.  Remove
22390         handling of null rtxes.
22391         (update_equiv_regs): Update call accordingly.
22392
22393 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22394
22395         * fwprop.c: Include rtl-iter.h.
22396         (varying_mem_p): Turn from being a for_each_rtx callback to being
22397         a function that examines each subrtx itself.
22398         (propagate_rtx): Update accordingly.
22399
22400 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22401
22402         * function.c: Include rtl-iter.h
22403         (instantiate_virtual_regs_in_rtx): Turn from being a for_each_rtx
22404         callback to being a function that examines each subrtx itself.
22405         Return the changed flag.
22406         (instantiate_virtual_regs_in_insn, instantiate_decl_rtl)
22407         (instantiate_virtual_regs): Update calls accordingly.
22408
22409 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22410
22411         * final.c: Include rtl-iter.h.
22412         (mark_symbol_ref_as_used): Delete.
22413         (mark_symbol_refs_as_used): Use FOR_EACH_SUBRTX instead of
22414         for_each_rtx.
22415
22416 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22417
22418         * emit-rtl.c: Include rtl-iter.h.
22419         (find_auto_inc): Turn from being a for_each_rtx callback to being
22420         a function that examines each subrtx itself.  Assume the first operand
22421         to an RTX_AUTOINC is the automodified register.
22422         (try_split): Update call accordingly.
22423
22424 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22425
22426         * dwarf2out.c (resolve_one_addr): Remove unused data parameter.
22427         Return a bool, inverting the result so that 0/false means "not ok".
22428         Use FOR_EACH_SUBRTX_PTR instead of for_each_rtx to iterate over
22429         subrtxes of a CONST.
22430         (mem_loc_descriptor, add_const_value_attribute)
22431         (resolve_addr_in_expr): Update calls accordingly.
22432
22433 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22434
22435         * dwarf2out.c: Include rtl-iter.h.
22436         (const_ok_for_output_1): Take the rtx instead of a pointer to it.
22437         Remove unused data parameter.  Return a bool, inverting the result
22438         so that 0/false means "not ok".
22439         (const_ok_for_output): Update accordingly.  Use FOR_EACH_SUBRTX_VAR
22440         instead of for_each_rtx.
22441
22442 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22443
22444         * dse.c: Include rtl-iter.h.
22445         (check_mem_read_rtx): Change void * parameter to real type.
22446         Remove return value.
22447         (check_mem_read_use): Fix comment.  Use FOR_EACH_SUBRTX_PTR instead of
22448         for_each_rtx.  Don't handle null rtxes.
22449
22450 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22451
22452         * df-problems.c: Include rtl-iter.h.
22453         (find_memory): Turn from being a for_each_rtx callback to being
22454         a function that examines each subrtx itself.  Continue to look for
22455         volatile references even after a nonvolatile one has been found.
22456         (can_move_insns_across): Update calls accordingly.
22457
22458 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22459
22460         * ddg.c (walk_mems_2, walk_mems_1): Delete.
22461         (insns_may_alias_p): Use FOR_EACH_SUBRTX rather than for_each_rtx
22462         to iterate over subrtxes.  Return a bool rather than an int.
22463
22464 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22465
22466         * ddg.c: Include rtl-iter.h.
22467         (mark_mem_use_1): Rename to...
22468         (mark_mem_use): ...deleting old mark_mem_use.  Use FOR_EACH_SUBRTX
22469         instead of for_each_rtx.
22470         (mem_read_insn_p): Update accordingly.
22471
22472 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22473
22474         * cse.c (change_cc_mode_args): Delete.
22475         (cse_change_cc_mode): Turn from being a for_each_rtx callback to being
22476         a function that examines each subrtx itself.  Take the fields of
22477         change_cc_mode_args as argument and return void.
22478         (cse_change_cc_mode_insn): Update calls accordingly.
22479
22480 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22481
22482         * cse.c (is_dead_reg): Change argument to const_rtx.
22483         (dead_debug_insn_data): Delete.
22484         (is_dead_debug_insn): Expand commentary.  Turn from being a
22485         for_each_rtx callback to being a function that examines
22486         each subrtx itself.  Take the fields of dead_debug_insn_data
22487         as argument.
22488         (delete_trivially_dead_insns): Update call accordingly.
22489
22490 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22491
22492         * cse.c (check_for_label_ref): Move earlier in file.  Turn from
22493         being a for_each_rtx callback to being a function that examines
22494         each subrtx itself.
22495         (cse_extended_basic_block): Update call accordingly.
22496
22497 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22498
22499         * cse.c (check_dependence_data): Delete.
22500         (check_dependence): Change from being a for_each_rtx callback to being
22501         a function that examines all subrtxes itself.  Don't handle null rtxes.
22502         (invalidate): Update call accordingly.
22503
22504 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22505
22506         * cse.c: Include rtl-iter.h.
22507         (approx_reg_cost_1): Delete.
22508         (approx_reg_cost): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22509         Don't handle null rtxes.
22510
22511 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22512
22513         * cfgcleanup.c: Include rtl-iter.h.
22514         (mentions_nonequal_regs): Turn from being a for_each_rtx callback
22515         to being a function that examines each subrtx itself.
22516         (thread_jump): Update accordingly.
22517
22518 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22519
22520         * combine-stack-adj.c: Include rtl-iter.h.
22521         (record_stack_refs_data): Delete.
22522         (record_stack_refs): Turn from being a for_each_rtx callback
22523         to being a function that examines each subrtx itself.
22524         Take a pointer to the reflist.  Invert sense of return value
22525         so that true means success and false means failure.  Don't
22526         handle null rtxes.
22527         (combine_stack_adjustments_for_block): Update accordingly.
22528
22529 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22530
22531         * combine.c (record_truncated_value): Turn from being a for_each_rtx
22532         callback to a function that takes an rtx and returns a bool
22533         (record_truncated_values): Use FOR_EACH_SUBRTX_VAR instead of
22534         for_each_rtx.
22535
22536 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22537
22538         * combine.c: Include rtl-iter.h.
22539         (unmentioned_reg_p_1): Delete.
22540         (unmentioned_reg_p): Use FOR_EACH_SUBRTX rather than for_each_rtx.
22541         Don't handle null rtxes.
22542
22543 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22544
22545         * calls.c: Include rtl-iter.h.
22546         (internal_arg_pointer_based_exp_1): Delete.
22547         (internal_arg_pointer_based_exp): Take a const_rtx.
22548         Use FOR_EACH_SUBRTX to iterate over subrtxes.
22549
22550 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22551
22552         * caller-save.c: Include rtl-iter.h.
22553         (add_used_regs_1): Delete.
22554         (add_used_regs): Use FOR_EACH_SUBRTX rather than for_each_rtx
22555         to iterate over subrtxes.  Assert that any remaining pseudos
22556         have been spilled.
22557
22558 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22559
22560         * bt-load.c: Include rtl-iter.h.
22561         (btr_reference_found, find_btr_reference, btr_referenced_p): Delete.
22562         (find_btr_use): Move further up file.  Use FOR_EACH_SUBRTX_PTR
22563         to iterate over subrtxes.
22564         (insn_sets_btr_p, new_btr_user, compute_defs_uses_and_gen): Use
22565         find_btr_use rather than btr_referenced_p.
22566
22567 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22568
22569         * alias.c: Include rtl-iter.h.
22570         (refs_newer_value_cb): Delete.
22571         (refs_newer_value_p): Use FOR_EACH_SUBRTX instead of for_each_rtx.
22572
22573 2014-08-28  Richard Sandiford  <rdsandiford@googlemail.com>
22574
22575         * rtl-iter.h: New file.
22576         * rtlanal.c: Include it.
22577         (rtx_all_subrtx_bounds, rtx_nonconst_subrtx_bounds): New variables.
22578         (generic_subrtx_iterator <T>::add_single_to_queue)
22579         (generic_subrtx_iterator <T>::add_subrtxes_to_queue)
22580         (generic_subrtx_iterator <T>::free_array): New functions.
22581         (generic_subrtx_iterator <T>::LOCAL_ELEMS): Define.
22582         (generic_subrtx_iterator <const_rtx_accessor>)
22583         (generic_subrtx_iterator <rtx_var_accessor>
22584         (generic_subrtx_iterator <rtx_ptr_accessor>): Instantiate.
22585         (setup_reg_subrtx_bounds): New function.
22586         (init_rtlanal): Call it.
22587
22588 2014-08-27  Kaz Kojima  <kkojima@gcc.gnu.org>
22589
22590         PR target/62261
22591         * config/sh/sh.md (ashlsi3): Handle negative shift count for
22592         TARGET_SHMEDIA.
22593         (ashldi3, ashrsi3, ashrdi3, lshrsi3, lshrdi3): Likewise.
22594
22595 2014-08-27  Richard Sandiford  <rdsandiford@googlemail.com>
22596
22597         * emit-rtl.c (set_unique_reg_note): Discard notes with side effects.
22598
22599 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22600
22601         * rtl.h (JUMP_LABEL_AS_INSN): New.
22602
22603 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22604
22605         * rtl.h (free_EXPR_LIST_list): Strengthen param from rtx * to
22606         rtx_expr_list **.
22607         (alloc_EXPR_LIST): Strengthen return type from rtx to
22608         rtx_expr_list *.
22609         (remove_free_EXPR_LIST_node): Likewise for param.
22610         * reload.h (struct reg_equivs_t): Strengthen field "alt_mem_list"
22611         from rtx to rtx_expr_list *.
22612         * sched-int.h (struct deps_desc): Strengthen fields
22613         "pending_read_mems" and "pending_write_mems" from rtx to
22614         rtx_expr_list *.
22615
22616         * dwarf2out.c (decl_piece_varloc_ptr): Strengthen return type from
22617         rtx to rtx_expr_list *.
22618         * lists.c (alloc_INSN_LIST): Likewise, also for local "r".
22619         (free_EXPR_LIST_list): Strengthen param "listp" from rtx * to
22620         rtx_expr_list **.
22621         (remove_free_EXPR_LIST_node): Likewise.  Strengthen local "node"
22622         from rtx to rtx_expr_list *.
22623         * loop-iv.c (simplify_using_initial_values): Strengthen local
22624         "cond_list" from rtx to rtx_expr_list *, and locals "pnode",
22625         "pnote_next" from rtx * to rtx_expr_list **.
22626         * sched-deps.c (remove_from_both_dependence_lists):  Strengthen
22627         param "exprp" from rtx * to rtx_expr_list **.
22628         (add_insn_mem_dependence): Strengthen local "mem_list" from
22629         rtx * to rtx_expr_list **.  Strengthen local "mem_node" from rtx
22630         to rtx_expr_list *.
22631         * sched-rgn.c (concat_insn_mem_list): Strengthen param "copy_mems"
22632         and local "new_mems" from rtx to rtx_expr_list *.  Strengthen
22633         param "old_mems_p" from rtx * to rtx_expr_list **.
22634         * var-tracking.c (struct adjust_mem_data): Strengthen field
22635         "side_effects" from rtx to rtx_expr_list *.
22636         (adjust_insn): Replace NULL_RTX with NULL when assigning to
22637         rtx_expr_list *.
22638         (prepare_call_arguments): Likewise.
22639
22640 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22641
22642         * function.h (struct rtl_data): Strengthen field
22643         "x_stack_slot_list" from rtx to rtx_expr_list *.
22644
22645         * emit-rtl.c (unshare_all_rtl_1): Add a checked cast
22646         when assigning to stack_slot_list.
22647
22648 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22649
22650         * function.h (struct rtl_data): Strengthen field
22651         x_nonlocal_goto_handler_labels from rtx to rtx_expr_list *.
22652         * rtl.h (remove_node_from_expr_list): Strengthen second param from
22653         rtx * to rtx_expr_list **.
22654
22655         * cfgbuild.c (make_edges): In loop over
22656         nonlocal_goto_handler_labels, strengthen local "x" from rtx to
22657         rtx_expr_list *, and use methods of the latter class to clarify
22658         the code.
22659         * cfgrtl.c (cfg_layout_initialize): Strengthen local "x" from rtx to
22660         rtx_expr_list *, and use methods of the latter class to clarify
22661         the code.
22662         * dwarf2cfi.c (create_trace_edges): Likewise for local "lab".
22663         * reload1.c (set_initial_label_offsets): Likewise for local "x".
22664         * rtlanal.c (remove_node_from_expr_list): Strengthen param "listp"
22665         from rtx * to rtx_expr_list **.  Strengthen local "temp" from rtx
22666         to rtx_expr_list *.  Use methods of the latter class to clarify
22667         the code.
22668
22669 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22670
22671         * function.h (struct expr_status): Strengthen field
22672         "x_forced_labels" from rtx to rtx_expr_list *.
22673
22674         * cfgbuild.c (make_edges): Split local "x" into two locals,
22675         strengthening one from rtx to rtx_expr_list *, and using methods
22676         of said class.
22677         * dwarf2cfi.c (create_trace_edges): Split local "lab" out; within
22678         loop over forced_labels, introduce strengthen it from rtx to
22679         rtx_expr_list *, using methods to clarify the code.
22680         * jump.c (rebuild_jump_labels_1): Strengthen local "insn" from rtx
22681         to rtx_expr_list *, using methods of said class to clarify the
22682         code.
22683         * reload1.c (set_initial_label_offsets): Split local "x" into two
22684         per-loop variables, strengthening the first from rtx to
22685         rtx_expr_list * and using methods.
22686
22687 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22688
22689         * coretypes.h (class rtx_expr_list): Add forward declaration.
22690         * emit-rtl.c (gen_rtx_EXPR_LIST): New.
22691         * gengenrtl.c (special_rtx): Add EXPR_LIST.
22692         * rtl.h (class rtx_expr_list): New subclass of rtx_def, adding
22693         invariant: GET_CODE (X) == EXPR_LIST.
22694         (is_a_helper <rtx_expr_list *>::test): New.
22695         (rtx_expr_list::next): New.
22696         (rtx_expr_list::element): New.
22697         (gen_rtx_EXPR_LIST): New.
22698
22699 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22700
22701         * varasm.c (mark_constants): Convert a GET_CODE check into a
22702         dyn_cast, strengthening local "seq" from rtx to rtx_sequence *.
22703         Use methods of rtx_sequence to clarify the code.
22704
22705 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22706
22707         * sched-vis.c (print_pattern): Within SEQUENCE case, introduce a
22708         local "seq" via a checked cast, and use methods of rtx_sequence
22709         to simplify the code.
22710
22711 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22712
22713         * resource.c (mark_referenced_resources): Strengthen local
22714         "sequence" from rtx to rtx_sequence *, adding a checked cast, and
22715         using methods of rtx_sequence to clarify the code.
22716         (find_dead_or_set_registers): Within the switch statement, convert
22717         a GET_CODE check to a dyn_cast, introducing local "seq".  Within
22718         the JUMP_P handling, introduce another local "seq", adding a
22719         checked cast to rtx_sequence *.  In both cases, use methods of
22720         rtx_sequence to clarify the code.
22721         (mark_set_resources): Within SEQUENCE case, introduce local "seq"
22722         via a checked cast, and use methods of rtx_sequence to simplify
22723         the code.
22724
22725 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22726
22727         * reorg.c (redundant_insn): In two places in the function, replace
22728         a check of GET_CODE with a dyn_cast, introducing local "seq", and
22729         usings methods of rtx_sequence to clarify the code.
22730
22731 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22732
22733         * jump.c (mark_jump_label_1): Within the SEQUENCE case, introduce
22734         local "seq" with a checked cast, and use methods of rtx_sequence
22735         to clarify the code.
22736
22737 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22738
22739         * function.c (contains): Introduce local "seq" for PATTERN (insn),
22740         with a checked cast, in the region for where we know it's a
22741         SEQUENCE.  Use methods of rtx_sequence.
22742
22743 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22744
22745         * final.c (get_attr_length_1): Replace GET_CODE check with a
22746         dyn_cast, introducing local "seq" and the use of methods of
22747         rtx_sequence.
22748         (shorten_branches): Likewise, introducing local "body_seq".
22749         Strengthen local "inner_insn" from rtx to rtx_insn *.
22750         (reemit_insn_block_notes): Replace GET_CODE check with a
22751         dyn_cast, strengthening local "body" from rtx to rtx_sequence *.
22752         Use methods of rtx_sequence.
22753         (final_scan_insn): Likewise, introducing local "seq" for when
22754         "body" is known to be a SEQUENCE, using its methods.
22755
22756 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22757
22758         * except.c (can_throw_external): Strengthen local "seq" from rtx
22759         to rtx_sequence *.  Use methods of rtx_sequence.
22760         (insn_nothrow_p): Likewise.
22761
22762 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22763
22764         * dwarf2cfi.c (create_trace_edges): Convert GET_CODE check into a
22765         dyn_cast, strengthening local "seq" from rtx to rtx_sequence *.
22766         Use methods of rtx_sequence.
22767         (scan_trace): Likewise for local "pat".
22768
22769 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22770
22771         * coretypes.h (class rtx_sequence): Add forward declaration.
22772         * rtl.h (class rtx_sequence): New subclass of rtx_def, adding
22773         invariant: GET_CODE (X) == SEQUENCE.
22774         (is_a_helper <rtx_sequence *>::test): New.
22775         (is_a_helper <const rtx_sequence *>::test): New.
22776         (rtx_sequence::len): New.
22777         (rtx_sequence::element): New.
22778         (rtx_sequence::insn): New.
22779
22780 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22781
22782         * rtl.h (free_INSN_LIST_list): Strengthen param from rtx * to
22783         rtx_insn_list **.
22784         (alloc_INSN_LIST): Strengthen return type from rtx to
22785         rtx_insn_list *.
22786         (copy_INSN_LIST): Likewise for return type and param.
22787         (concat_INSN_LIST): Likewise for both params and return type.
22788         (remove_free_INSN_LIST_elem): Strenghten first param from rtx to
22789         rtx_insn *.  Strengthen second param from rtx * to rtx_insn_list **.
22790         (remove_free_INSN_LIST_node): Strenghten return type from rtx to
22791         rtx_insn *.  Strengthen param from rtx * to rtx_insn_list **.
22792
22793         * sched-int.h (struct deps_reg): Strengthen fields "uses", "sets",
22794         "implicit_sets", "control_uses", "clobbers" from rtx to
22795         rtx_insn_list *.
22796         (struct deps_desc): Likewise for fields "pending_read_insns",
22797         "pending_write_insns", "pending_jump_insns",
22798         "last_pending_memory_flush", "last_function_call",
22799         "last_function_call_may_noreturn", "sched_before_next_call",
22800         "sched_before_next_jump".
22801         (struct _haifa_deps_insn_data): Likewise for field "cond_deps".
22802         (remove_from_deps): Strengthen second param from rtx to rtx_insn *.
22803
22804         * gcse.c (struct ls_expr): Strengthen fields "loads" and "stores"
22805         from rtx to rtx_insn_list *.
22806         (ldst_entry): Replace use of NULL_RTX with NULL when dealing with
22807         rtx_insn_list *.
22808
22809         * haifa-sched.c (insn_queue): Strengthen this variable from rtx *
22810         to rtx_insn_list **.
22811         (dep_cost_1): Strengthen local "dep_cost_rtx_link" from rtx to
22812         rtx_insn_list *.
22813         (queue_insn): Likewise for local "link".
22814         (struct haifa_saved_data): Strengthen field "insn_queue" from
22815         rtx * to rtx_insn_list **.
22816         (save_backtrack_point): Update allocation of save->insn_queue to
22817         reflect the strengthening of elements from rtx to rtx_insn_list *.
22818         (queue_to_ready): Strengthen local "link" from rtx to
22819         rtx_insn_list *; use methods "next" and "insn" when traversing the
22820         list.
22821         (early_queue_to_ready): Likewise for locals "link", "next_link",
22822         "prev_link".
22823         (schedule_block): Update allocation of insn_queue to reflect the
22824         strengthening of elements from rtx to rtx_insn_list *.  Strengthen
22825         local "link" from rtx to rtx_insn_list *, and use methods when
22826         working it.
22827         (add_to_speculative_block): Strengthen locals "twins" and
22828         "next_node" from rtx to rtx_insn_list *, and use methods when
22829         working with them.  Strengthen local "twin" from rtx to
22830         rtx_insn *, eliminating a checked cast.
22831         (fix_recovery_deps): Strengthen locals "ready_list" and "link"
22832         from rtx to rtx_insn_list *, and use methods when working with
22833         them.
22834
22835         * lists.c (alloc_INSN_LIST): Strengthen return type and local "r"
22836         from rtx to rtx_insn_list *, adding a checked cast.
22837         (free_INSN_LIST_list): Strengthen param "listp" from rtx * to
22838         rtx_insn_list **.
22839         (copy_INSN_LIST): Strengthen return type and locals "new_queue",
22840         "newlink" from rtx to rtx_insn_list *.  Strengthen local
22841         "pqueue" from rtx * to rtx_insn_list **.  Strengthen local "x"
22842         from rtx to rtx_insn *.
22843         (concat_INSN_LIST): Strengthen return type and local "new_rtx",
22844         from rtx to rtx_insn_list *.  Use methods of the latter class.
22845         (remove_free_INSN_LIST_elem): Strengthen param "elem" from rtx to
22846         rtx_insn *, and param "listp" from rtx * to rtx_insn_list **.
22847         (remove_free_INSN_LIST_node): Strengthen return type and local
22848         "elem" from rtx to rtx_insn *.  Strenghten param "listp" from
22849         rtx * to rtx_insn_list **.  Strengthen local "node" from rtx to
22850         rtx_insn_list *, using "insn" method.
22851
22852         * sched-deps.c (add_dependence_list):  Strengthen param "list"
22853         from rtx to rtx_insn_list *, and use methods when working with it.
22854         (add_dependence_list_and_free):  Strengthen param "listp" from
22855         rtx * to rtx_insn_list **.
22856         (remove_from_dependence_list): Strenghten param "listp" from rtx *
22857         to rtx_insn_list **, and use methods when working with *listp.
22858         (remove_from_both_dependence_lists): Strengthen param "listp" from
22859         rtx * to rtx_insn_list **
22860         (add_insn_mem_dependence): Strengthen local "insn_list" from rtx *
22861         to rtx_insn_list **.  Eliminate local "link", in favor of two new
22862         locals "insn_node" and "mem_node", an rtx_insn_list * and an rtx
22863         respectively.
22864         (deps_analyze_insn): Split out uses 'f local "t" as an INSN_LIST
22865         by introducing local "cond_deps".
22866         (remove_from_deps): Strengthen param "insn" from rtx to
22867         rtx_insn *.
22868
22869         * sched-rgn.c (concat_insn_mem_list): Strengthen param
22870         "copy_insns" and local "new_insns" from rtx to rtx_insn_list *.
22871         Strengthen param "old_insns_p" from rtx * to rtx_insn_list **.
22872         Use methods of rtx_insn_list.
22873
22874         * store-motion.c (struct st_expr): Strengthen fields
22875         "antic_stores" and "avail_stores" from rtx to rtx_insn_list *.
22876         (st_expr_entry): Replace NULL_RTX with NULL when dealing with
22877         rtx_insn_list *.
22878         (find_moveable_store): Split out "tmp" into multiple more-tightly
22879         scoped locals.  Use methods of rtx_insn_list *.
22880         (compute_store_table): Strengthen local "tmp" from rtx to
22881         rtx_insn *.  Use methods of rtx_insn_list *.
22882
22883 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22884
22885         * coretypes.h (class rtx_insn_list): Add forward declaration.
22886         * rtl.h (class rtx_insn_list): New subclass of rtx_def
22887         (is_a_helper <rtx_insn_list *>::test): New.
22888         (rtx_insn_list::next): New.
22889         (rtx_insn_list::insn): New.
22890         (gen_rtx_INSN_LIST): Add prototype.
22891         * emit-rtl.c (gen_rtx_INSN_LIST): New.
22892         * gengenrtl.c (special_rtx): Add INSN_LIST.
22893
22894 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22895
22896         * ira-lives.c (find_call_crossed_cheap_reg): Strengthen local
22897         "prev" from rtx to rtx_insn *.
22898
22899 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22900
22901         * rtl.h (INSN_UID): Convert from a macro to a pair of inline
22902         functions.  Require merely an rtx for now, not an rtx_insn *.
22903         (BLOCK_FOR_INSN): Likewise.
22904         (INSN_LOCATION): Likewise.
22905         (INSN_HAS_LOCATION): Convert from a macro to an inline function.
22906
22907 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22908
22909         * rtl.h (PATTERN): Convert this macro into a pair of inline
22910         functions, for now, requiring const_rtx and rtx.
22911
22912 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
22913
22914         * target.def (unwind_emit): Strengthen param "insn" from rtx to
22915         rtx_insn *.
22916         (final_postscan_insn): Likewise.
22917         (adjust_cost): Likewise.
22918         (adjust_priority): Likewise.
22919         (variable_issue): Likewise.
22920         (macro_fusion_pair_p): Likewise.
22921         (dfa_post_cycle_insn): Likewise.
22922         (first_cycle_multipass_dfa_lookahead_guard): Likewise.
22923         (first_cycle_multipass_issue): Likewise.
22924         (dfa_new_cycle): Likewise.
22925         (adjust_cost_2): Likewise for params "insn" and "dep_insn".
22926         (speculate_insn): Likewise for param "insn".
22927         (gen_spec_check): Likewise for params "insn" and "label".
22928         (get_insn_spec_ds): Likewise for param "insn".
22929         (get_insn_checked_ds): Likewise.
22930         (dispatch_do): Likewise.
22931         (dispatch): Likewise.
22932         (cannot_copy_insn_p): Likewise.
22933         (invalid_within_doloop): Likewise.
22934         (legitimate_combined_insn): Likewise.
22935         (needed): Likewise.
22936         (after): Likewise.
22937
22938         * doc/tm.texi: Automatically updated to reflect changes to
22939         target.def.
22940
22941         * haifa-sched.c (choose_ready): Convert NULL_RTX to NULL when
22942         working with insn.
22943         (schedule_block): Likewise.
22944         (sched_init): Likewise.
22945         (sched_speculate_insn): Strengthen param "insn" from rtx to
22946         rtx_insn *.
22947         (ready_remove_first_dispatch): Convert NULL_RTX to NULL when
22948         working with insn.
22949         * hooks.c (hook_bool_rtx_true): Rename to...
22950         hook_bool_rtx_insn_true): ...this, and strengthen first param from
22951         rtx to rtx_insn *.
22952         (hook_constcharptr_const_rtx_null): Rename to...
22953         (hook_constcharptr_const_rtx_insn_null): ...this, and strengthen
22954         first param from const_rtx to const rtx_insn *.
22955         (hook_bool_rtx_int_false): Rename to...
22956         (hook_bool_rtx_insn_int_false): ...this, and strengthen first
22957         param from rtx to rtx_insn *.
22958         (hook_void_rtx_int): Rename to...
22959         (hook_void_rtx_insn_int): ...this, and strengthen first param from
22960         rtx to rtx_insn *.
22961
22962         * hooks.h (hook_bool_rtx_true): Rename to...
22963         (hook_bool_rtx_insn_true): ...this, and strengthen first param from
22964         rtx to rtx_insn *.
22965         (hook_bool_rtx_int_false): Rename to...
22966         (hook_bool_rtx_insn_int_false): ...this, and strengthen first
22967         param from rtx to rtx_insn *.
22968         (hook_void_rtx_int): Rename to...
22969         (hook_void_rtx_insn_int): ...this, and strengthen first param from
22970         rtx to rtx_insn *.
22971         (hook_constcharptr_const_rtx_null): Rename to...
22972         (hook_constcharptr_const_rtx_insn_null): ...this, and strengthen
22973         first param from const_rtx to const rtx_insn *.
22974
22975         * sched-deps.c (sched_macro_fuse_insns): Strengthen param "insn"
22976         and local "prev" from rtx to rtx_insn *.
22977
22978         * sched-int.h (sched_speculate_insn): Strengthen first param from
22979         rtx to rtx_insn *.
22980
22981         * sel-sched.c (create_speculation_check): Likewise for local "label".
22982         * targhooks.c (default_invalid_within_doloop): Strengthen param
22983         "insn" from const_rtx to const rtx_insn *.
22984         * targhooks.h (default_invalid_within_doloop): Strengthen param
22985         from const_rtx to const rtx_insn *.
22986
22987         * config/alpha/alpha.c (alpha_cannot_copy_insn_p): Likewise.
22988         (alpha_adjust_cost): Likewise for params "insn", "dep_insn".
22989
22990         * config/arc/arc.c (arc_sched_adjust_priority): Likewise for param
22991         "insn".
22992         (arc_invalid_within_doloop): Likewise, with const.
22993
22994         * config/arm/arm.c (arm_adjust_cost): Likewise for params "insn", "dep".
22995         (arm_cannot_copy_insn_p): Likewise for param "insn".
22996         (arm_unwind_emit): Likewise.
22997
22998         * config/bfin/bfin.c (bfin_adjust_cost): Likewise for params "insn",
22999         "dep_insn".
23000
23001         * config/c6x/c6x.c (c6x_dfa_new_cycle): Likewise for param "insn".
23002         (c6x_variable_issue): Likewise.  Removed now-redundant checked
23003         cast.
23004         (c6x_adjust_cost): Likewise for params "insn", "dep_insn".
23005
23006         * config/epiphany/epiphany-protos.h (epiphany_mode_needed):
23007         Likewise for param "insn".
23008         (epiphany_mode_after): Likewise.
23009         * config/epiphany/epiphany.c (epiphany_adjust_cost): Likewise for
23010         params "insn", "dep_insn".
23011         (epiphany_mode_needed): Likewise for param "insn".
23012         (epiphany_mode_after): Likewise.
23013
23014         * config/i386/i386-protos.h (i386_pe_seh_unwind_emit): Likewise.
23015         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
23016         (ix86_avx_u128_mode_needed): Likewise.
23017         (ix86_i387_mode_needed): Likewise.
23018         (ix86_mode_needed): Likewise.
23019         (ix86_avx_u128_mode_after): Likewise.
23020         (ix86_mode_after): Likewise.
23021         (ix86_adjust_cost): Likewise for params "insn", "dep_insn".
23022         (ix86_macro_fusion_pair_p): Likewise for params "condgen", "condjmp".
23023         (ix86_adjust_priority): Likewise for param "insn".
23024         (core2i7_first_cycle_multipass_issue): Likewise for param "insn".
23025         (do_dispatch): Likewise.
23026         (has_dispatch): Likewise.
23027         * config/i386/winnt.c (i386_pe_seh_unwind_emit): Likewise.
23028
23029         * config/ia64/ia64.c (TARGET_INVALID_WITHIN_DOLOOP): Update to
23030         reflect renaming of default hook implementation from
23031         hook_constcharptr_const_rtx_null to
23032         hook_constcharptr_const_rtx_insn_null.
23033         (ia64_adjust_cost_2): Strengthen params "insn", "dep_insn" from
23034         rtx to rtx_insn *.
23035         (ia64_variable_issue): Likewise for param "insn".
23036         (ia64_first_cycle_multipass_dfa_lookahead_guard): Likewise.
23037         (ia64_dfa_new_cycle): Likewise.
23038         (ia64_get_insn_spec_ds): Likewise.
23039         (ia64_get_insn_checked_ds): Likewise.
23040         (ia64_speculate_insn): Likewise.
23041         (ia64_gen_spec_check): Likewise for params "insn", "label".
23042         (ia64_asm_unwind_emit): Likewise for param "insn".
23043
23044         * config/m32r/m32r.c (m32r_adjust_priority): Likewise.
23045
23046         * config/m68k/m68k.c (m68k_sched_adjust_cost): Likewise for params
23047         "insn", "def_insn".
23048         (m68k_sched_variable_issue): Likewise for param "insn".
23049
23050         * config/mep/mep.c (mep_adjust_cost): Likewise for params "insn",
23051         "def_insn".
23052
23053         * config/microblaze/microblaze.c (microblaze_adjust_cost):
23054         Likewise for params "insn", "dep".
23055
23056         * config/mips/mips.c (mips_adjust_cost): Likewise.
23057         (mips_variable_issue): Likewise for param "insn".
23058         (mips_final_postscan_insn): Likewise.
23059
23060         * config/mn10300/mn10300.c (mn10300_adjust_sched_cost): Likewise
23061         for params "insn", "dep".
23062
23063         * config/pa/pa.c (pa_adjust_cost): Likewise for params "insn",
23064         "dep_insn".
23065         (pa_adjust_priority): Likewise for param "insn".
23066
23067         * config/picochip/picochip.c (picochip_sched_adjust_cost):
23068         Likewise for params "insn", "dep_insn".
23069
23070         * config/rs6000/rs6000.c (rs6000_variable_issue_1): Likewise for
23071         param "insn".
23072         (rs6000_variable_issue): Likewise.
23073         (rs6000_adjust_cost): Likewise for params "insn", "dep_insn".
23074         (rs6000_debug_adjust_cost): Likewise.
23075         (rs6000_adjust_priority): Likewise for param "insn".
23076         (rs6000_use_sched_lookahead_guard): Likewise.
23077         (get_next_active_insn): Likewise for return type and both params.
23078         (redefine_groups): Likewise for params "prev_head_insn", "tail"
23079         and locals "insn", "next_insn".
23080         (pad_groups): Likewise.
23081
23082         * config/s390/s390.c (s390_adjust_priority): Likewise for param
23083         "insn".
23084         (s390_cannot_copy_insn_p): Likewise.
23085         (s390_sched_variable_issue): Likewise for third param, eliminating
23086         checked cast.
23087         (TARGET_INVALID_WITHIN_DOLOOP): Update to reflect renaming of
23088         default hook implementation from hook_constcharptr_const_rtx_null
23089         to hook_constcharptr_const_rtx_insn_null.
23090
23091         * config/sh/sh.c (sh_cannot_copy_insn_p): Strengthen param "insn"
23092         from rtx to rtx_insn *.
23093         (sh_adjust_cost): Likewise for params "insn", "dep_insn".
23094         (sh_variable_issue): Likewise for param "insn".
23095         (sh_dfa_new_cycle): Likewise.
23096         (sh_mode_needed): Likewise.
23097         (sh_mode_after): Likewise.
23098
23099         * config/sparc/sparc.c (supersparc_adjust_cost): Likewise for
23100         params "insn", "dep_insn".
23101         (hypersparc_adjust_cost): Likewise.
23102         (sparc_adjust_cost): Likewise.
23103
23104         * config/spu/spu.c (spu_sched_variable_issue): Likewise for third
23105         param, eliminated checked cast.
23106         (spu_sched_adjust_cost): Likewise for first and third params.
23107
23108         * config/tilegx/tilegx.c (tilegx_sched_adjust_cost): Strengthen
23109         params "insn" and "dep_insn" from rtx to rtx_insn *.
23110
23111         * config/tilepro/tilepro.c (tilepro_sched_adjust_cost): Likewise.
23112
23113 2014-08-27  David Malcolm  <dmalcolm@redhat.com>
23114
23115         * gcc/config/mn10300/mn10300.c (is_load_insn): Rename to...
23116         (set_is_load_p): ...this, updating to work on a SET pattern rather
23117         than an insn.
23118         (is_store_insn): Rename to...
23119         (set_is_store_p): ...this, updating to work on a SET pattern
23120         rather than an insn.
23121         (mn10300_adjust_sched_cost): Move call to get_attr_timings from
23122         top of function to where it is needed.  Rewrite the bogus
23123         condition that checks for "insn" and "dep" being PARALLEL to
23124         instead use single_set, introducing locals "insn_set" and
23125         "dep_set".  Given that we only ever returned "cost" for a non-pair
23126         of SETs, bail out early if we don't have a pair of SET.
23127         Rewrite all uses of PATTERN (dep) and PATTERN (insn) to instead
23128         use the new locals "insn_set" and "dep_set", and update calls to
23129         is_load_insn and is_store_insn to be calls to set_is_load_p and
23130         set_is_store_p.
23131
23132 2014-08-27  Guozhi Wei  <carrot@google.com>
23133
23134         PR target/62262
23135         * config/aarch64/aarch64.md (*andim_ashift<mode>_bfiz): Check the shift
23136         amount before using it.
23137
23138 2014-08-27  Richard Biener  <rguenther@suse.de>
23139
23140         * gimple-fold.c (get_maxval_strlen): Add overload wrapping
23141         get_maxval_strlen inside a more useful API.
23142         (gimple_fold_builtin_with_strlen): Remove and fold into ...
23143         (gimple_fold_builtin): ... caller.
23144         (gimple_fold_builtin_strlen, gimple_fold_builtin_strcpy,
23145         gimple_fold_builtin_strncpy, gimple_fold_builtin_strcat,
23146         gimple_fold_builtin_fputs, gimple_fold_builtin_memory_chk,
23147         gimple_fold_builtin_stxcpy_chk, gimple_fold_builtin_stxncpy_chk,
23148         gimple_fold_builtin_snprintf_chk, gimple_fold_builtin_snprintf,
23149         gimple_fold_builtin_sprintf): Adjust to compute maxval
23150         themselves.
23151
23152 2014-08-27  Yvan Roux  <yvan.roux@linaro.org>
23153
23154         PR other/62248
23155         * config.gcc (arm*-*-*): Check --with-fpu against arm-fpus.def.
23156
23157 2014-08-27  Alexander Ivchenko  <alexander.ivchenko@intel.com>
23158             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
23159             Anna Tikhonova  <anna.tikhonova@intel.com>
23160             Ilya Tocar  <ilya.tocar@intel.com>
23161             Andrey Turetskiy  <andrey.turetskiy@intel.com>
23162             Ilya Verbin  <ilya.verbin@intel.com>
23163             Kirill Yukhin  <kirill.yukhin@intel.com>
23164             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
23165
23166         * config/i386/sse.md
23167         (define_insn "<mask_codefor>avx512dq_broadcast<mode><mask_name>_1"):
23168         Use `concat_tg_mode' attribute to determine asm register size.
23169
23170 2014-08-27  Alexander Ivchenko  <alexander.ivchenko@intel.com>
23171             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
23172             Anna Tikhonova  <anna.tikhonova@intel.com>
23173             Ilya Tocar  <ilya.tocar@intel.com>
23174             Andrey Turetskiy  <andrey.turetskiy@intel.com>
23175             Ilya Verbin  <ilya.verbin@intel.com>
23176             Kirill Yukhin  <kirill.yukhin@intel.com>
23177             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
23178
23179         * config/i386/sse.md
23180         (define_mode_iterator VI48_AVX512VL): New.
23181         (define_mode_iterator VI_UNALIGNED_LOADSTORE): Delete.
23182         (define_mode_iterator VI_ULOADSTORE_BW_AVX512VL): New.
23183         (define_mode_iterator VI_ULOADSTORE_F_AVX512VL): Ditto.
23184         (define_expand "<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23185         with VI1): Change mode iterator.
23186         (define_expand "<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23187         with VI_ULOADSTORE_BW_AVX512VL): New.
23188         (define_expand "<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23189         with VI_ULOADSTORE_F_AVX512VL): Ditto.
23190         (define_insn "*<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23191         with VI1): Change mode iterator.
23192         (define_insn "*<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23193         with VI_ULOADSTORE_BW_AVX512VL): New.
23194         (define_insn "*<sse2_avx_avx512f>_loaddqu<mode><mask_name>"
23195         with VI_ULOADSTORE_F_AVX512VL): Ditto.
23196         (define_insn "<sse2_avx_avx512f>_storedqu<mode>
23197         with VI1): Change mode iterator.
23198         (define_insn "<sse2_avx_avx512f>_storedqu<mode>
23199         with VI_ULOADSTORE_BW_AVX512VL): New.
23200         (define_insn "<sse2_avx_avx512f>_storedqu<mode>
23201         with VI_ULOADSTORE_BW_AVX512VL): Ditto.
23202         (define_insn "avx512f_storedqu<mode>_mask"): Delete.
23203         (define_insn "<avx512>_storedqu<mode>_mask" with
23204         VI48_AVX512VL): New.
23205         (define_insn "<avx512>_storedqu<mode>_mask" with
23206         VI12_AVX512VL): Ditto.
23207
23208 2014-08-27  Alexander Ivchenko  <alexander.ivchenko@intel.com>
23209             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
23210             Anna Tikhonova  <anna.tikhonova@intel.com>
23211             Ilya Tocar  <ilya.tocar@intel.com>
23212             Andrey Turetskiy  <andrey.turetskiy@intel.com>
23213             Ilya Verbin  <ilya.verbin@intel.com>
23214             Kirill Yukhin  <kirill.yukhin@intel.com>
23215             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
23216
23217         * config/i386/sse.md
23218         (define_mode_iterator VI48_AVX2_48_AVX512F): Delete.
23219         (define_mode_iterator VI48_AVX512BW): New.
23220         (define_insn "<avx2_avx512f>_<shift_insn>v<mode><mask_name>"): Delete.
23221         (define_insn "<avx2_avx512bw>_<shift_insn>v<mode><mask_name>"
23222         with VI48_AVX2_48_AVX512F): New.
23223         (define_insn "<avx2_avx512bw>_<shift_insn>v<mode><mask_name>"
23224         with VI2_AVX512VL): Ditto.
23225
23226 2014-08-27  Richard Biener  <rguenther@suse.de>
23227
23228         PR middle-end/62239
23229         * builtins.c (fold_builtin_strcat_chk): Move to gimple-fold.c.
23230         (fold_builtin_3): Do not fold strcat_chk here.
23231         * gimple-fold.c (gimple_fold_builtin_strcat_chk): Move here
23232         from builtins.c.
23233         (gimple_fold_builtin): Fold strcat_chk here.
23234
23235 2014-08-26  Aldy Hernandez  <aldyh@redhat.com>
23236
23237         * dwarf2out.h (dwarf2out_decl): Remove prototype.
23238         * dwarf2out.c (dwarf2out_decl): Make static.
23239
23240 2014-08-26  Joel Sherrill <joel.sherrill@oarcorp.com>
23241
23242         * doc/invoke.texi: -fno-cxa-atexit should be -fno-use-cxa-atexit.
23243
23244 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23245
23246         * cselib.h (struct elt_loc_list): Strengthen field "setting_insn"
23247         from rtx to rtx_insn *.
23248         (cselib_lookup_from_insn): Likewise for final param.
23249         (cselib_subst_to_values_from_insn): Likewise.
23250         (cselib_add_permanent_equiv): Likewise.
23251
23252         * cselib.c (cselib_current_insn): Likewise for this variable.
23253         (cselib_subst_to_values_from_insn): Likewise for param "insn".
23254         (cselib_lookup_from_insn): Likewise.
23255         (cselib_add_permanent_equiv): Likewise for param "insn" and local
23256         "save_cselib_current_insn".
23257         (cselib_process_insn): Replace use of NULL_RTX with NULL.
23258
23259         * sched-deps.c (add_insn_mem_dependence): Strengthen param "insn"
23260         from rtx to rtx_insn *.
23261
23262 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23263
23264         * dse.c (dse_step6): Strengthen local "rinsn" from rtx to
23265         rtx_insn *.
23266
23267 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23268
23269         * df.h (df_dump_insn_problem_function): Strengthen first param of
23270         this callback from const_rtx to const rtx_insn *.
23271         (struct df_insn_info): Strengthen field "insn" from rtx to
23272         rtx_insn *.
23273         (DF_REF_INSN): Eliminate this function, reinstating the older
23274         macro definition.
23275         (df_find_def): Strengthen param 1 from rtx to rtx_insn *.
23276         (df_reg_defined): Likewise.
23277         (df_find_use): Likewise.
23278         (df_reg_used): Likewise.
23279         (df_dump_insn_top): Strengthen param 1 from const_rtx to
23280         const rtx_insn *.
23281         (df_dump_insn_bottom): Likewise.
23282         (df_insn_debug): Strengthen param 1 from rtx to rtx_insn *.
23283         (df_insn_debug_regno): Likewise.
23284         (debug_df_insn): Likewise.
23285         (df_rd_simulate_one_insn): Likewise for param 2.
23286         (df_word_lr_simulate_defs): Likewise for param 1.
23287         (df_word_lr_simulate_uses): Likewise.
23288         (df_md_simulate_one_insn): Likewise for param 2.
23289         (df_simulate_find_noclobber_defs): Likewise for param 1.
23290         (df_simulate_find_defs): Likewise.
23291         (df_simulate_defs): Likewise.
23292         (df_simulate_uses): Likewise.
23293         (df_simulate_one_insn_backwards): Likewise for param 2.
23294         (df_simulate_one_insn_forwards): Likewise.
23295         (df_uses_create): Likewise for param 2.
23296         (df_insn_create_insn_record): Likewise for param 1.
23297         (df_insn_delete): Likewise.
23298         (df_insn_rescan): Likewise.
23299         (df_insn_rescan_debug_internal): Likewise.
23300         (df_insn_change_bb): Likewise.
23301         (df_notes_rescan): Likewise.
23302         * rtl.h (remove_death): Likewise for param 2.
23303         (print_rtl_with_bb): Strengthen param 2 from const_rtx to
23304         const rtx_insn *.
23305         * sched-int.h (reemit_notes): Strengthen param from rtx to
23306         rtx_insn *.
23307         * valtrack.h (propagate_for_debug): Likewise for param 1.
23308
23309         * cfgrtl.c (print_rtl_with_bb): Strengthen param "rtx_first" and
23310         local "tmp_rtx" from const_rtx to const rtx_insn *.
23311         * combine.c (remove_death): Strengthen param "insn" from rtx to
23312         rtx_insn *.
23313         (move_deaths): Likewise for local "where_dead".
23314         * cse.c (delete_trivially_dead_insns): Introduce local
23315         "bind_var_loc" so that "bind" can be strengthened to an rtx_insn *.
23316         * df-core.c (df_find_def): Strengthen param "insn" from rtx to
23317         rtx_insn *.
23318         (df_reg_defined): Likewise.
23319         (df_find_use): Likewise.
23320         (df_reg_used): Likewise.
23321         (df_dump_insn_problem_data): Strengthen param "insn" from
23322         const_rtx to const rtx_insn *.
23323         (df_dump_insn_top): Likewise.
23324         (df_dump_insn_bottom): Likewise.
23325         (df_insn_debug): Strengthen param "insn" from rtx to rtx_insn *.
23326         (df_insn_debug_regno): Likewise.
23327         (debug_df_insn): Likewise.
23328         (DF_REF_INSN): Delete.
23329         * df-problems.c (df_rd_simulate_one_insn): Strengthen param "insn"
23330         from rtx to rtx_insn *.
23331         (df_chain_insn_top_dump): Strengthen param "insn" from
23332         const_rtx to const rtx_insn *.
23333         (df_chain_insn_bottom_dump): Likewise.
23334         (df_word_lr_simulate_defs): Strengthen param "insn" from rtx to
23335         rtx_insn *.
23336         (df_word_lr_simulate_uses): Likewise.
23337         (df_print_note): Likewise.
23338         (df_remove_dead_and_unused_notes): Likewise.
23339         (df_set_unused_notes_for_mw): Likewise.
23340         (df_set_dead_notes_for_mw): Likewise.
23341         (df_create_unused_note): Likewise.
23342         (df_simulate_find_defs): Likewise.
23343         (df_simulate_find_uses): Likewise.
23344         (df_simulate_find_noclobber_defs): Likewise.
23345         (df_simulate_defs): Likewise.
23346         (df_simulate_uses): Likewise.
23347         (df_simulate_one_insn_backwards): Likewise.
23348         (df_simulate_one_insn_forwards): Likewise.
23349         (df_md_simulate_one_insn): Likewise.
23350         * df-scan.c (df_uses_create): Likewise.
23351         (df_insn_create_insn_record): Likewise.
23352         (df_insn_delete): Likewise.
23353         (df_insn_rescan): Likewise.
23354         (df_insn_rescan_debug_internal): Likewise.
23355         (df_insn_change_bb): Likewise.
23356         (df_notes_rescan): Likewise.
23357         (df_refs_add_to_chains): Likewise.
23358         (df_insn_refs_verify): Likewise.
23359         * emit-rtl.c (set_insn_deleted): Add checked cast to rtx_insn *
23360         when invoking df_insn_delete.
23361         (reorder_insns): Strengthen local "x" from rtx to rtx_insn *.
23362         (set_unique_reg_note): Add checked cast.
23363         * final.c (cleanup_subreg_operands): Likewise.
23364         * gcse.c (update_ld_motion_stores): Likewise, strengthening local
23365         "insn" from rtx to rtx_insn *.
23366         * haifa-sched.c (reemit_notes): Strengthen param "insn" and local
23367         "last" from rtx to rtx_insn *.
23368         * ira-emit.c (change_regs_in_insn): New function.
23369         (change_loop): Strengthen local "insn" from rtx to rtx_insn *.
23370         Invoke change_regs_in_insn rather than change_regs.
23371         * ira.c (update_equiv_regs): Strengthen locals "insn",
23372         "init_insn", "new_insn" from rtx to rtx_insn *.  Invoke
23373         for_each_rtx_in_insn rather than for_each_rtx.
23374         * recog.c (confirm_change_group): Add checked casts.
23375         (peep2_update_life): Strengthen local "x" from rtx to rtx_insn *.
23376         Add checked cast.
23377         (peep2_fill_buffer): Add checked cast.
23378         * rtlanal.c (remove_note): Likewise.
23379         * valtrack.c (propagate_for_debug): Strengthen param "insn" and
23380         locals "next" "end" from rtx to rtx_insn *.
23381
23382 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23383
23384         * sched-int.h (sched_init_insn_luid): Strengthen param 1 from rtx
23385         to rtx_insn *.
23386         (struct reg_use_data): Likewise for field "insn".
23387         (insn_cost): Likewise for param.
23388         (real_insn_for_shadow): Likewise for return type and param.
23389         (increase_insn_priority): Likewise for param 1.
23390         (debug_dependencies): Likewise for both params.
23391
23392         * haifa-sched.c (insn_delay): Likewise for param "insn".
23393         (real_insn_for_shadow): Likewise for return type and param "insn".
23394         (update_insn_after_change): Likewise for param "insn".
23395         (recompute_todo_spec): Likewise for param "next" and locals "pro",
23396         "other".
23397         (insn_cost): Likewise for param "insn".
23398         (increase_insn_priority): Likewise.
23399         (calculate_reg_deaths): Likewise.
23400         (setup_insn_reg_pressure_info): Likewise.
23401         (model_schedule): Strengthen from vec<rtx> to vec<rtx_insn *>.
23402         (model_index): Strengthen param "insn" from rtx to rtx_insn *.
23403         (model_recompute): Likewise.
23404         (must_restore_pattern_p): Likewise for param "next".
23405         (model_excess_cost): Likewise for param "insn".
23406         (queue_remove): Likewise.
23407         (adjust_priority): Likewise for param "prev".
23408         (update_register_pressure): Likewise for param "insn".
23409         (setup_insn_max_reg_pressure): Likewise for local "insn".
23410         (update_reg_and_insn_max_reg_pressure): Likewise for param "insn".
23411         (model_add_to_schedule): Likewise.
23412         (model_reset_queue_indices): Likewise for local "insn".
23413         (unschedule_insns_until): Strengthen local "recompute_vec" from
23414         auto_vec<rtx> to auto_vec<rtx_insn *>.  Strengthen locals "last",
23415         "con" from rtx to rtx_insn *.
23416         (restore_last_backtrack_point): Likewise for both locals "x". Add
23417         checked casts.
23418         (estimate_insn_tick): Likewise for param "insn".
23419         (commit_schedule): Likewise for params "prev_head", "tail" and
23420         local "x".
23421         (verify_shadows): Likewise for locals "i1", "i2".
23422         (dump_insn_stream): Likewise for params "head", "tail" and locals
23423         "next_tail", "insn".
23424         (schedule_block): Likewise for locals "insn", "x".  Add a checked
23425         cast.
23426         (fix_inter_tick): Likewise for params "head", "tail".
23427         (create_check_block_twin): Likewise for local "jump".
23428         (haifa_change_pattern): Likewise for param "insn".
23429         (haifa_speculate_insn): Likewise.
23430         (dump_new_block_header): Likewise for params "head", "tail".
23431         (fix_jump_move): Likewise for param "jump".
23432         (move_block_after_check): Likewise.
23433         (sched_init_insn_luid): Likewise for param "insn".
23434         (sched_init_luids): Likewise for local "insn".
23435         (insn_luid): Likewise for param "insn".
23436         (init_h_i_d): Likewise.
23437         (haifa_init_h_i_d): Likewise for local "insn".
23438         (haifa_init_insn): Likewise for param "insn".
23439         * sched-deps.c (add_dependence): Likewise for local "real_pro",
23440         "other".
23441         (create_insn_reg_use): Likewise for param "insn".
23442         (setup_insn_reg_uses): Likewise.  Add a checked cast.
23443         * sched-ebb.c (debug_ebb_dependencies): Strengthen params "head",
23444         "tail" from rtx to rtx_insn *.
23445         * sched-rgn.c (void debug_dependencies): Likewise, also for locals
23446         "insn", "next_tail".
23447
23448 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23449
23450         * haifa-sched.c (struct model_insn_info): Strengthen field "insn"
23451         from rtx to rtx_insn *.
23452         (model_add_to_schedule): Likewise for locals "start", "end",
23453         "iter".
23454
23455 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23456
23457         * rtl.h (duplicate_insn_chain): Strengthen both params from rtx to
23458         rtx_insn *.
23459         * cfgrtl.c (duplicate_insn_chain): Likewise for  params "from",
23460         "to" and locals "insn", "next", "copy".  Remove now-redundant
23461         checked cast.
23462
23463 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23464
23465         * rtl.h (canonicalize_condition): Strengthen param 1 from rtx to
23466         rtx_insn * and param 4 from rtx * to rtx_insn **.
23467         (get_condition): Strengthen param 1 from rtx to rtx_insn * and
23468         param 2 from rtx * to rtx_insn **.
23469
23470         * df.h (can_move_insns_across): Strengthen params 1-4 from rtx to
23471         rtx_insn * and final param from rtx * to rtx_insn **.
23472
23473         * cfgcleanup.c (try_head_merge_bb): Strengthen local "move_before"
23474         from rtx to rtx_insn *.
23475         (try_head_merge_bb): Likewise for both locals named "move_upto".
23476         * df-problems.c (can_move_insns_across): Likewise for params
23477         "from", "to", "across_from", "across_to" and locals "insn",
23478         "next", "max_to".  Strengthen param "pmove_upto" from rtx * to
23479         rtx_insn **.
23480         * ifcvt.c (struct noce_if_info): Strengthen field "cond_earliest"
23481         from rtx to rtx_insn *.
23482         (noce_get_alt_condition): Strengthen param "earliest" from rtx *
23483         to rtx_insn **.  Strengthen local "insn" from rtx to rtx_insn *.
23484         (noce_try_minmax): Strengthen locals "earliest", "seq" from rtx to
23485         rtx_insn *.
23486         (noce_try_abs): Likewise.
23487         (noce_get_condition): Likewise for param "jump".  Strengthen param
23488         "earliest" from rtx * to rtx_insn **.
23489         (noce_find_if_block): Strengthen local "cond_earliest" from rtx to
23490         rtx_insn *.
23491         (find_cond_trap): Likewise.
23492         (dead_or_predicable): Likewise for local "earliest".
23493         * loop-iv.c (check_simple_exit): Likewise for local "at".  Add
23494         checked cast.
23495         * rtlanal.c (canonicalize_condition): Likewise for param "insn"
23496         and local "prev".  Strengthen param "earliest" from rtx * to
23497         rtx_insn **.
23498         (get_condition): Strengthen param "jump" from rtx to rtx_insn *
23499         Strengthen param "earliest" from rtx * to rtx_insn **.
23500
23501 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23502
23503         * fwprop.c (local_ref_killed_between_p): Strengthen params "from",
23504         "to" and local "insn" from rtx to rtx_insn *.
23505
23506 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23507
23508         * sel-sched.c (find_place_for_bookkeeping): Strengthen local "insn"
23509         from rtx to rtx_insn *.
23510         (need_nop_to_preserve_insn_bb): Likewise for param "insn".
23511         (code_motion_path_driver): Likewise for local "last_insn".
23512         (simplify_changed_insns): Likewise for local "insn".
23513
23514 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23515
23516         * rtl.h (push_to_sequence): Strengthen param from rtx to
23517         rtx_insn *.
23518         (push_to_sequence2): Likewise for both params.
23519         (delete_insns_since): Likewise for param.
23520         (reorder_insns_nobb): Likewise for all three params.
23521         (set_new_first_and_last_insn): Likewise for both params.
23522
23523         * emit-rtl.h (set_first_insn): Strengthen param "insn" from rtx to
23524         rtx_insn *.  Remove now-redundant cast.
23525         (set_last_insn): Likewise.
23526
23527         * builtins.c (expand_builtin_return): Strengthen local
23528         "call_fusage" from rtx to rtx_insn *.
23529         * cfgrtl.c (create_basic_block_structure): Likewise for local
23530         "after".
23531         * emit-rtl.c (set_new_first_and_last_insn): Likewise for params
23532         "first", "last" and local "insn".
23533         (delete_insns_since): Likewise for param "from".
23534         (reorder_insns_nobb): Likewise for params "from", "to", "after"
23535         and local "x".
23536         (push_to_sequence): Likewise for param "first" and local "last".
23537         (push_to_sequence2): Likewise for params "first" and "last".
23538         * lra.c (emit_add3_insn): Likewise for local "last".
23539         (lra_emit_add): Likewise.
23540         * lra-constraints.c (base_to_reg): Likewise for locals "insn",
23541         "last_insn".
23542         (process_address_1): Likewise for locals "insn", last".
23543         * modulo-sched.c (ps_first_note): Likewise for return type.
23544         * optabs.c (expand_binop_directly): Likewise for param "last".
23545
23546 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23547
23548         * rtl.h (get_last_insn_anywhere): Strengthen return type from rtx
23549         to rtx_insn*.
23550         * emit-rtl.c (get_last_insn_anywhere): Likewise.
23551
23552 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23553
23554         * function.h (struct sequence_stack): Strengthen fields "first"
23555         and "last" from rtx to rtx_insn *.
23556         (struct emit_status): Likewise for fields "x_first_insn" and
23557         "x_last_insn".
23558
23559         * emit-rtl.h (get_insns): Remove now-redundant checked cast.
23560         (set_first_insn): Add checked cast.
23561         (get_last_insn): Remove now-redundant checked cast.
23562         (set_last_insn): Add checked cast.
23563
23564         * config/m32c/m32c.c (m32c_leaf_function_p): Strengthen locals
23565         "saved_first" and "saved_last" from rtx to rtx_insn *.
23566
23567 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23568
23569         * rtl.h (add_insn): Strengthen param from rtx to rtx_insn *.
23570         (unlink_insn_chain): Strengthen both params from rtx to
23571         rtx_insn *.
23572
23573         * cfgrtl.c (cfg_layout_function_header): Likewise for this
23574         variable.
23575         (unlink_insn_chain): Likewise for params "first" and "last".
23576         Remove now-redundant checked cast.
23577         (record_effective_endpoints): Replace use of NULL_RTX with NULL.
23578         (fixup_reorder_chain): Strengthen local "insn" from rtx to
23579         rtx_insn *.
23580         * emit-rtl.c (link_insn_into_chain): Likewise for all three
23581         params.
23582         (add_insn): Likewise for param "insn" and local "prev".
23583         (add_insn_after_nobb): Likewise for both params and local "next".
23584         (add_insn_before_nobb): Likewise for both params and local "prev".
23585         (add_insn_after): Rename param "after" to "uncast_after",
23586         introducing local "after" with another checked cast.
23587         (add_insn_before): Rename params "insn" and "before", giving them
23588         "uncast_" prefixes, adding the old names back using checked casts.
23589         (emit_note_after): Likewise for param "after".
23590         (emit_note_before): Likewise for param "before".
23591         (emit_label): Add a checked cast.
23592
23593 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23594
23595         * cselib.h (cselib_record_sets_hook):  Strengthen initial param
23596         "insn" from rtx to rtx_insn *.
23597
23598         * cselib.c (cselib_record_sets_hook): Likewise.
23599
23600         * var-tracking.c (add_with_sets): Likewise, renaming back from
23601         "uncast_insn" to "insn" and eliminating the checked cast from rtx
23602         to rtx_insn *.
23603
23604 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23605
23606         * basic-block.h (struct rtl_bb_info): Strengthen fields "end_"
23607         and "header_" from rtx to rtx_insn *.
23608         (struct basic_block_d): Likewise for field "head_" within "x"
23609         field of union basic_block_il_dependent.
23610         (BB_HEAD): Drop function...
23611         (SET_BB_HEAD): ...and this function in favor of...
23612         (BB_HEAD): ...reinstate macro.
23613         (BB_END): Drop function...
23614         (SET_BB_END): ...and this function in favor of...
23615         (BB_END): ...reinstate macro.
23616         (BB_HEADER): Drop function...
23617         (SET_BB_HEADER): ...and this function in favor of...
23618         (BB_HEADER): ...reinstate macro.
23619
23620         * bb-reorder.c (add_labels_and_missing_jumps): Drop use of BB_END.
23621         (fix_crossing_unconditional_branches): Likewise.
23622         * caller-save.c (save_call_clobbered_regs): Likewise.
23623         (insert_one_insn): Drop use of SET_BB_HEAD and SET_BB_END.
23624         * cfgbuild.c (find_bb_boundaries): Drop use of SET_BB_END.
23625         * cfgcleanup.c (merge_blocks_move_successor_nojumps): Likewise.
23626         (merge_blocks_move_successor_nojumps): Likewise.
23627         (outgoing_edges_match): Update use of for_each_rtx to
23628         for_each_rtx_in_insn.
23629         * cfgexpand.c (expand_gimple_cond): Drop use of SET_BB_END.
23630         (expand_gimple_cond): Likewise.
23631         (expand_gimple_tailcall): Likewise.
23632         (expand_gimple_basic_block): Drop use of SET_BB_HEAD and
23633         SET_BB_END.
23634         (construct_exit_block): Drop use of SET_BB_END.
23635         * cfgrtl.c (cfg_layout_function_footer): Strengthen from rtx to
23636         rtx_insn *.
23637         (delete_insn): Rename param "insn" to "uncast_insn", introducing
23638         a new local "insn" with a checked cast to rtx_insn *.  Drop use of
23639         SET_BB_HEAD and SET_BB_END.
23640         (create_basic_block_structure): Drop use of SET_BB_HEAD and
23641         SET_BB_END.
23642         (rtl_delete_block): Drop use of SET_BB_HEAD.
23643         (rtl_split_block): Drop use of SET_BB_END.
23644         (emit_nop_for_unique_locus_between): Likewise.
23645         (rtl_merge_blocks): Drop use of SET_BB_END and SET_BB_HEAD.
23646         (block_label): Drop use of SET_BB_HEAD.
23647         (fixup_abnormal_edges): Drop use of SET_BB_END.
23648         (record_effective_endpoints): Drop use of SET_BB_HEADER.
23649         (relink_block_chain): Likewise.
23650         (fixup_reorder_chain): Drop use of SET_BB_END.
23651         (cfg_layout_duplicate_bb): Drop use of SET_BB_HEADER.
23652         (cfg_layout_delete_block): Strengthen local "to" from rtx * to
23653         rtx_insn **.  Drop use of SET_BB_HEADER.
23654         (cfg_layout_merge_blocks): Drop use of SET_BB_HEADER, SET_BB_END,
23655         SET_BB_HEAD.
23656         (BB_HEAD): Delete this function.
23657         (SET_BB_HEAD): Likewise.
23658         (BB_END): Likewise.
23659         (SET_BB_END): Likewise.
23660         (BB_HEADER): Likewise.
23661         (SET_BB_HEADER): Likewise.
23662         * emit-rtl.c (add_insn_after):  Rename param "insn" to
23663         "uncast_insn", adding a new local "insn" and a checked cast to
23664         rtx_insn *.  Drop use of SET_BB_END.
23665         (remove_insn): Strengthen locals "next" and "prev" from rtx to
23666         rtx_insn *.  Drop use of SET_BB_HEAD and SET_BB_END.
23667         (reorder_insns): Drop use of SET_BB_END.
23668         (emit_insn_after_1): Strengthen param "first" and locals "last",
23669         "after_after" from rtx to rtx_insn *.  Drop use of SET_BB_END.
23670         (emit_pattern_after_noloc): Add checked cast.
23671         * haifa-sched.c (get_ebb_head_tail): Drop use of SET_BB_END.
23672         (restore_other_notes): Likewise.
23673         (move_insn): Likewise.
23674         (sched_extend_bb): Likewise.
23675         (fix_jump_move): Likewise.
23676         * ifcvt.c (noce_process_if_block): Likewise.
23677         (dead_or_predicable): Likewise.
23678         * ira.c (update_equiv_regs): Drop use of SET_BB_HEAD.
23679         * reg-stack.c (change_stack): Drop use of SET_BB_END.
23680         * sel-sched-ir.c (sel_move_insn): Likewise.
23681         * sel-sched.c (move_nop_to_previous_block): Likewise.
23682
23683         * config/c6x/c6x.c (hwloop_optimize): Drop use of SET_BB_HEAD and
23684         SET_BB_END.
23685         * config/ia64/ia64.c (emit_predicate_relation_info): Likewise.
23686
23687 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23688
23689         * basic-block.h (create_basic_block_structure): Strengthen params
23690         1 "head" and 2 "end" from rtx to rtx_insn *.
23691         * cfgrtl.c (create_basic_block_structure): Likewise.
23692         (rtl_create_basic_block): Update casts from void * to rtx to
23693         rtx_insn *, so that we can pass them as rtx_insn * to
23694         create_basic_block_structure.
23695         * sel-sched-ir.c (sel_create_basic_block): Likewise.
23696
23697 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23698
23699         * rtl.h (for_each_inc_dec): Strengthen param 1 from rtx * to
23700         rtx_insn **.
23701         (check_for_inc_dec): Strengthen param "insn" from rtx to
23702         rtx_insn *.
23703
23704         * cselib.h (cselib_process_insn): Likewise.
23705
23706         * cselib.c (cselib_record_sets): Likewise.
23707         (cselib_process_insn): Likewise.
23708
23709         * dse.c (struct insn_info): Likewise for field "insn".
23710         (check_for_inc_dec_1): Likewise for local "insn".
23711         (check_for_inc_dec): Likewise for param "insn".
23712         (scan_insn): Likewise.
23713         (dse_step1): Likewise for local "insn".
23714
23715         * rtlanal.c (for_each_inc_dec): Strengthen param 1 from rtx * to
23716         rtx_insn **.  Use for_each_rtx_in_insn rather than for_each_rtx.
23717
23718 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23719
23720         * sched-int.h (struct _dep): Strengthen fields "pro" and "con"
23721         from rtx to rtx_insn *.
23722         (DEP_PRO): Delete this function and...
23723         (SET_DEP_PRO): ...this function in favor of...
23724         (DEP_PRO): ...reinstate this macro.
23725         (DEP_CON): Delete this function and...
23726         (SET_DEP_CON): ...this function in favor of...
23727         (DEP_CON): ...reinstate this old macro.
23728         (init_dep_1): Strengthen params 2 and 3 from rtx to rtx_insn *.
23729         (init_dep): Likewise.
23730         (set_priorities): Likewise for both params.
23731         (sd_copy_back_deps): Likewise for params 1 and 2.
23732
23733         * haifa-sched.c (priority): Likewise for param "insn" and local
23734         "next".
23735         (set_priorities): Likewise for params "head" and "tail" and local
23736         "insn".
23737         (process_insn_forw_deps_be_in_spec): Likewise for param "twin" and
23738         local "consumer".
23739         (add_to_speculative_block): Add a checked cast.
23740         (create_check_block_twin): Drop use of SET_DEP_CON.
23741         (add_jump_dependencies): Strengthen params "insn" and "jump" from
23742         rtx to rtx_insn *.
23743
23744         * sched-deps.c (init_dep_1): Likewise for params "pro" and "con".
23745         Drop use of SET_DEP_PRO
23746         (init_dep): Strengthen params "pro" and "con" from rtx to
23747         rtx_insn *.
23748         (sd_copy_back_deps): Likewise for params "to" and "from".  Drop
23749         use of SET_DEP_CON.
23750         (DEP_PRO): Delete.
23751         (DEP_CON): Delete.
23752         (SET_DEP_PRO): Delete.
23753         (SET_DEP_CON): Delete.
23754
23755 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23756
23757         * sel-sched-ir.h (struct vinsn_def): Strengthen field "insn_rtx"
23758         from rtx to rtx_insn *.
23759         (VINSN_INSN_RTX): Eliminate rvalue function and...
23760         (SET_VINSN_INSN): ...lvalue function in favor of...
23761         (VINSN_INSN_RTX): reinstate this old macro.
23762
23763         * sel-sched-ir.c (vinsn_init): Eliminate use of SET_VINSN_INSN_RTX
23764         in favor of VINSN_INSN_RTX.
23765         (VINSN_INSN_RTX): Delete this function.
23766         (SET_VINSN_INSN_RTX): Likewise.
23767
23768 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23769
23770         * sel-sched-ir.h (insn_t): Strengthen from rtx to rtx_insn *.
23771         (BND_TO): Delete this function and...
23772         (SET_BND_TO): ...this functions in favor of...
23773         (BND_TO): ...reinstating this macro.
23774         (struct _fence): Strengthen field "executing_insns" from
23775         vec<rtx, va_gc> * to vec<rtx_insn *, va_gc> *.  Strengthen fields
23776         "last_scheduled_insn" and "sched_next" from rtx to rtx_insn *.
23777         (_succ_iter_cond): Update param "succp" from rtx * to insn_t *
23778         and param "insn" from rtx to insn_t.
23779         (create_vinsn_from_insn_rtx): Strengthen first param from rtx to
23780         rtx_insn *.
23781
23782         * sched-int.h (insn_vec_t): Strengthen from vec<rtx> to
23783         vec<rtx_insn *> .
23784         (rtx_vec_t): Likewise.
23785         (struct sched_deps_info_def): Strengthen param of "start_insn"
23786         callback from rtx to rtx_insn *.  Likewise for param "insn2" of
23787         "note_mem_dep" callback and first param of "note_dep" callback.
23788
23789         * haifa-sched.c (add_to_speculative_block): Strengthen param
23790         "insn" from rtx to rtx_insn *.
23791         (clear_priorities): Likewise.
23792         (calc_priorities): Likewise for local "insn".
23793
23794         * sched-deps.c (haifa_start_insn): Likewise for param "insn".
23795         Remove redundant checked cast.
23796         (haifa_note_mem_dep): Likewise for param "pending_insn".
23797         (haifa_note_dep): Likewise for param "elem".
23798         (note_mem_dep): Likewise for param "e".
23799         (sched_analyze_1): Add checked casts.
23800         (sched_analyze_2): Likewise.
23801
23802         * sel-sched-dump.c (dump_insn_vector): Strengthen local "succ"
23803         from rtx to rtx_insn *.
23804         (debug): Update param from vec<rtx> & to vec<rtx_insn *>, and
23805         from vec<rtx> * to vec<rtx_insn *> *.
23806
23807         * sel-sched-ir.c (blist_add): Remove use of SET_BND_TO
23808         scaffolding.
23809         (flist_add): Strengthen param "executing_insns" from
23810         vec<rtx, va_gc> * to vec<rtx_insn *, va_gc> *.
23811         (advance_deps_context): Remove now-redundant checked cast.
23812         (init_fences): Replace uses of NULL_RTX with NULL.
23813         (merge_fences): Strengthen params "last_scheduled_insn" and
23814         "sched_next" from rtx to rtx_insn * and "executing_insns" from
23815         vec<rtx, va_gc> * to vec<rtx_insn *, va_gc> *.
23816         (add_clean_fence_to_fences): Replace uses of NULL_RTX with NULL.
23817         (get_nop_from_pool): Add local "nop_pat" so that "nop" can be
23818         an instruction, rather than doing double-duty as a pattern.
23819         (return_nop_to_pool): Update for change of insn_t.
23820         (deps_init_id): Remove now-redundant checked cast.
23821         (struct sched_scan_info_def): Strengthen param of "init_insn"
23822         callback from rtx to insn_t.
23823         (sched_scan): Strengthen local "insn" from rtx to rtx_insn *.
23824         (init_global_and_expr_for_insn): Replace uses of NULL_RTX with
23825         NULL.
23826         (get_seqno_by_succs): Strengthen param "insn" and locals "tmp",
23827         "end" from rtx to rtx_insn *.
23828         (create_vinsn_from_insn_rtx): Likewise for param "insn_rtx".
23829         (rtx insn_rtx, bool force_unique_p)
23830         (BND_TO): Delete function.
23831         (SET_BND_TO): Delete function.
23832
23833         * sel-sched.c (advance_one_cycle): Strengthen local "insn" from
23834         rtx to rtx_insn *.
23835         (extract_new_fences_from): Replace uses of NULL_RTX with NULL.
23836         (replace_dest_with_reg_in_expr): Strengthen local "insn_rtx" from
23837         rtx to rtx_insn *.
23838         (undo_transformations): Likewise for param "insn".
23839         (update_liveness_on_insn): Likewise.
23840         (compute_live_below_insn): Likewise for param "insn" and local
23841         "succ".
23842         (update_data_sets): Likewise for param "insn".
23843         (fill_vec_av_set): Replace uses of NULL_RTX with NULL.
23844         (convert_vec_av_set_to_ready): Drop now-redundant checked cast.
23845         (invoke_aftermath_hooks): Strengthen param "best_insn" from rtx to
23846         rtx_insn *.
23847         (move_cond_jump): Likewise for param "insn".
23848         (move_cond_jump): Drop use of SET_BND_TO.
23849         (compute_av_set_on_boundaries): Likewise.
23850         (update_fence_and_insn): Replace uses of NULL_RTX with NULL.
23851         (update_and_record_unavailable_insns): Strengthen local "bb_end"
23852         from rtx to rtx_insn *.
23853         (maybe_emit_renaming_copy): Likewise for param "insn".
23854         (maybe_emit_speculative_check): Likewise.
23855         (handle_emitting_transformations): Likewise.
23856         (remove_insn_from_stream): Likewise.
23857         (code_motion_process_successors): Strengthen local "succ" from rtx
23858         to insn_t.
23859
23860 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23861
23862         * sel-sched-ir.h (ilist_t): Redefine this typedef in terms of
23863         ilist_t, not _xlist_t;
23864         (ILIST_INSN): Define in terms of new union field "insn".
23865         (ILIST_NEXT): Define in terms of _LIST_NEXT rather than
23866         _XLIST_NEXT.
23867         (struct _list_node): Add new field "insn" to the union, of type
23868         insn_t.
23869         (ilist_add): Replace macro with an inline function, requiring an
23870         insn_t.
23871         (ilist_remove): Define this macro directly in terms of
23872         _list_remove, rather than indirectly via _xlist_remove.
23873         (ilist_clear): Likewise, in terms of _list_clear rather than
23874         _xlist_clear.
23875         (ilist_is_in_p): Replace macro with an inline function, requiring
23876         an insn_t.
23877         (_list_iter_cond_insn): New function.
23878         (ilist_iter_remove): Define this macro directly in terms of
23879         _list_iter_remove, rather than indirectly via _xlist_iter_remove.
23880         (ilist_iterator): Define directly in terms of _list_iterator
23881         rather than indirectly through _xlist_iterator.
23882         (FOR_EACH_INSN): Define in terms of _list_iter_cond_insn rather
23883         than in terms of _FOR_EACH_X.
23884         (FOR_EACH_INSN_1): Likewise.
23885
23886 2014-08-26  Joseph Myers  <joseph@codesourcery.com>
23887
23888         PR target/60606
23889         PR target/61330
23890         * varasm.c (make_decl_rtl): Clear DECL_ASSEMBLER_NAME and
23891         DECL_HARD_REGISTER and return for invalid register specifications.
23892         * cfgexpand.c (expand_one_var): If expand_one_hard_reg_var clears
23893         DECL_HARD_REGISTER, call expand_one_error_var.
23894         * config/arm/arm.c (arm_hard_regno_mode_ok): Do not allow
23895         CC_REGNUM with non-MODE_CC modes.
23896         (arm_regno_class): Return NO_REGS for PC_REGNUM.
23897
23898 2014-08-26  Marek Polacek  <polacek@redhat.com>
23899
23900         PR c/61271
23901         * sel-sched-ir.c (make_regions_from_the_rest): Fix condition.
23902
23903 2014-08-26  Evandro Menezes <e.menezes@samsung.com>
23904
23905         * config/arm/aarch64/aarch64.c (generic_addrcost_table): Delete
23906         qi cost; add di cost.
23907         (cortexa57_addrcost_table): Likewise.
23908
23909 2014-08-26  Marek Polacek  <polacek@redhat.com>
23910
23911         PR c/61271
23912         * expr.c (is_aligning_offset): Remove logical not.
23913
23914 2014-08-26  Marek Polacek  <polacek@redhat.com>
23915
23916         PR c/61271
23917         * tree-vectorizer.h (LOOP_REQUIRES_VERSIONING_FOR_ALIGNMENT,
23918         LOOP_REQUIRES_VERSIONING_FOR_ALIAS): Wrap in parens.
23919
23920 2014-08-26  Richard Biener  <rguenther@suse.de>
23921
23922         PR tree-optimization/62175
23923         * tree-ssa-loop-niter.c (expand_simple_operations): Do not
23924         expand possibly trapping operations.
23925
23926 2014-08-26  David Malcolm  <dmalcolm@redhat.com>
23927
23928         * config/rs6000/rs6000.c (class swap_web_entry): Strengthen field
23929         "insn" from rtx to rtx_insn *.
23930         (permute_load): Likewise for param "insn".
23931         (permute_store): Likewise.
23932         (handle_special_swappables): Likewise for local "insn".
23933         (replace_swap_with_copy): Likewise for locals "insn" and
23934         "new_insn".
23935         (rs6000_analyze_swaps): Likewise for local "insn".
23936
23937 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
23938
23939         * regrename.h (struct du_chain): Strengthen field "insn" from rtx
23940         to rtx_insn *.
23941
23942 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
23943
23944         * sel-sched-ir.h (struct sel_region_bb_info_def): Strengthen field
23945         "note_list" from rtx to rtx_insn *.
23946         (BB_NOTE_LIST): Replace this function and...
23947         (SET_BB_NOTE_LIST): ...this function with...
23948         (BB_NOTE_LIST): ...the former macro implementation.
23949
23950         * sched-int.h (concat_note_lists): Strengthen param "from_end" and
23951         local "from_start" from rtx to rtx_insn *.  Strengthen param
23952         "to_endp" from rtx * to rtx_insn **.
23953
23954         * haifa-sched.c (concat_note_lists): Likewise.
23955         * sel-sched-ir.c (init_bb): Eliminate SET_BB_NOTE_LIST in favor of
23956         BB_NOTE_LIST.
23957         (sel_restore_notes): Likewise.
23958         (move_bb_info): Likewise.
23959         (BB_NOTE_LIST): Delete this function.
23960         (SET_BB_NOTE_LIST): Delete this function.
23961         * sel-sched.c (create_block_for_bookkeeping): Eliminate
23962         SET_BB_NOTE_LIST in favor of BB_NOTE_LIST.
23963
23964 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
23965
23966         * target.def (reorder): Strengthen param "ready" of this DEFHOOK
23967         from rtx * to rtx_insn **.
23968         (reorder2): Likewise.
23969         (dependencies_evaluation_hook): Strengthen params "head", "tail"
23970         from rtx to rtx_insn *.
23971
23972         * doc/tm.texi: Update mechanically for above change to target.def.
23973
23974         * sched-int.h (note_list): Strengthen this variable from rtx to
23975         rtx_insn *.
23976         (remove_notes): Likewise for both params.
23977         (restore_other_notes): Likewise for return type and first param.
23978         (struct ready_list): Strengthen field "vec" from rtx * to
23979         rtx_insn **.
23980         (struct dep_replacement): Strenghten field "insn" from rtx to
23981         rtx_insn *.
23982         (struct deps_desc): Likewise for fields "last_debug_insn",
23983         "last_args_size".
23984         (struct haifa_sched_info): Likewise for callback field
23985         "can_schedule_ready_p"'s param, for first param of "new_ready"
23986         callback field, for both params of "rank" callback field, for
23987         first field of "print_insn" callback field (with a const), for
23988         both params of "contributes_to_priority" callback, for param
23989         of "insn_finishes_block_p" callback, for fields "prev_head",
23990         "next_tail", "head", "tail", for first param of "add_remove_insn"
23991         callback, for first param of "begin_schedule_ready" callback, for
23992         both params of "begin_move_insn" callback, and for second param
23993         of "advance_target_bb" callback.
23994         (add_dependence): Likewise for params 1 and 2.
23995         (sched_analyze): Likewise for params 2 and 3.
23996         (deps_analyze_insn): Likewise for param 2.
23997         (ready_element): Likewise for return type.
23998         (ready_lastpos): Strengthen return type from rtx * to rtx_insn **.
23999         (try_ready): Strenghten param from rtx to rtx_insn *.
24000         (sched_emit_insn): Likewise for return type.
24001         (record_delay_slot_pair): Likewise for params 1 and 2.
24002         (add_delay_dependencies): Likewise for param.
24003         (contributes_to_priority): Likewise for both params.
24004         (find_modifiable_mems): Likewise.
24005
24006         * config/arm/arm.c (cortexa7_sched_reorder):  Strengthen param
24007         "ready" from rtx * to rtx_insn **.  Strengthen locals "insn",
24008         "first_older_only_insn" from rtx to rtx_insn *.
24009         (arm_sched_reorder):  Strengthen param "ready"  from rtx * to
24010         rtx_insn **.
24011
24012         * config/c6x/c6x.c (struct c6x_sched_context): Strengthen field
24013         "last_scheduled_iter0" from rtx to rtx_insn *.
24014         (init_sched_state): Replace use of NULL_RTX with NULL for insn.
24015         (c6x_sched_reorder_1): Strengthen param "ready" and locals
24016         "e_ready", "insnp" from rtx * to rtx_insn **.  Strengthen local
24017         "insn" from rtx to rtx_insn *.
24018         (c6x_sched_reorder): Strengthen param "ready" from rtx * to
24019         rtx_insn **.
24020         (c6x_sched_reorder2): Strengthen param "ready" and locals
24021         "e_ready", "insnp" from rtx * to rtx_insn **. Strengthen local
24022         "insn" from rtx to rtx_insn *.
24023         (c6x_variable_issue):  Add a checked cast when assigning from insn
24024         to ss.last_scheduled_iter0.
24025         (split_delayed_branch): Strengthen param "insn" and local "i1"
24026         from rtx to rtx_insn *.
24027         (split_delayed_nonbranch): Likewise.
24028         (undo_split_delayed_nonbranch): Likewise for local "insn".
24029         (hwloop_optimize): Likewise for locals "seq", "insn", "prev",
24030         "entry_after", "end_packet", "head_insn", "tail_insn",
24031         "new_insns", "last_insn", "this_iter", "prev_stage_insn".
24032         Strengthen locals "orig_vec", "copies", "insn_copies" from rtx *
24033         to rtx_insn **.  Remove now-redundant checked cast on last_insn,
24034         but add a checked cast on loop->start_label.  Consolidate calls to
24035         avoid assigning result of gen_spkernel to "insn", now an
24036         rtx_insn *.
24037
24038         * config/i386/i386.c (do_reorder_for_imul): Strengthen param
24039         "ready" from rtx * to rtx_insn **.  Strengthen local "insn" from
24040         rtx to rtx_insn *.
24041         (swap_top_of_ready_list): Strengthen param "ready" from rtx * to
24042         rtx_insn **.  Strengthen locals "top", "next" from rtx to
24043         rtx_insn *.
24044         (ix86_sched_reorder): Strengthen param "ready" from rtx * to
24045         rtx_insn **.  Strengthen local "insn" from rtx to rtx_insn *.
24046         (add_parameter_dependencies): Strengthen params "call", "head" and
24047         locals "insn", "last", "first_arg" from rtx to rtx_insn *.
24048         (avoid_func_arg_motion): Likewise for params "first_arg", "insn".
24049         (add_dependee_for_func_arg): Likewise for param "arg" and local
24050         "insn".
24051         (ix86_dependencies_evaluation_hook): Likewise for params "head",
24052         "tail" and locals "insn", "first_arg".
24053
24054         * config/ia64/ia64.c (ia64_dependencies_evaluation_hook): Likewise
24055         for params "head", "tail" and locals "insn", "next", "next_tail".
24056         (ia64_dfa_sched_reorder): Strengthen param "ready" and locals
24057         "e_ready", "insnp" from rtx * to rtx_insn **. Strengthen locals
24058         "insn", "lowest", "highest" from rtx to rtx_insn *.
24059         (ia64_sched_reorder): Strengthen param "ready" from rtx * to
24060         rtx_insn **.
24061         (ia64_sched_reorder2): Likewise.
24062
24063         * config/mep/mep.c (mep_find_ready_insn): Strengthen return type
24064         and local "insn" from rtx to rtx_insn *.  Strengthen param "ready"
24065         from rtx * to rtx_insn **.
24066         (mep_move_ready_insn): Strengthen param "ready" from rtx * to
24067         rtx_insn **.
24068         (mep_print_sched_insn): Strengthen param "insn" from rtx to
24069         rtx_insn *.
24070         (mep_sched_reorder): Strengthen param "ready" from rtx * to
24071         rtx_insn **.  Strengthen locals "core_insn", "cop_insn" from rtx
24072         to rtx_insn *.
24073
24074         * config/mips/mips.c (mips_promote_ready): Strengthen param "ready"
24075         from rtx * to rtx_insn **.  Strengthen local "new_head" from rtx
24076         to rtx_insn *.
24077         (mips_maybe_swap_ready): Strengthen param "ready" from rtx * to
24078         rtx_insn **.  Strengthen local "temp" from rtx to rtx_insn *.
24079         (mips_macc_chains_reorder): Strengthen param "ready" from rtx * to
24080         rtx_insn **.
24081         (vr4130_reorder): Likewise.
24082         (mips_74k_agen_reorder): Likewise.  Strengthen local "insn" from
24083         rtx to rtx_insn *.
24084         (mips_sched_reorder_1): Strengthen param "ready" from rtx * to
24085         rtx_insn **.
24086         (mips_sched_reorder): Likewise.
24087         (mips_sched_reorder2): Likewise.
24088
24089         * config/picochip/picochip.c (picochip_sched_reorder): Likewise.
24090
24091         * config/rs6000/rs6000.c (rs6000_sched_reorder): Likewise.
24092         Strengthen local "tmp" from rtx to rtx_insn *.
24093         (rs6000_sched_reorder2): Likewise.
24094
24095         * config/s390/s390.c (s390_z10_prevent_earlyload_conflicts):
24096         Likewise.  Update sizeof(rtx) to sizeof(rtx_insn *) in memmove.
24097         (s390_sched_reorder): Strengthen param "ready" from rtx * to
24098         rtx_insn **.  Strengthen local "tmp" from rtx to rtx_insn *.
24099
24100         * config/sh/sh.c (rank_for_reorder): Strengthen locals "tmp",
24101         "tmp2" from rtx to rtx_insn *.
24102         (swap_reorder): Strengthen param "a" from rtx * to rtx_insn **.
24103         Strengthen local "insn" from rtx to rtx_insn *.
24104         (ready_reorder): Strengthen param "ready" from rtx * to
24105         rtx_insn **.  Update sizeof(rtx) to sizeof(rtx_insn *) in qsort.
24106         (sh_reorder):  Strengthen param "ready" from rtx * to rtx_insn **.
24107         (sh_reorder2): Likewise.
24108
24109         * config/spu/spu.c (spu_sched_reorder): Likewise.  Strengthen
24110         local "insn" from rtx to rtx_insn *.
24111
24112         * haifa-sched.c (note_list): Strengthen this variable from rtx to
24113         rtx_insn *.
24114         (scheduled_insns): Strengthen this variable from vec<rtx> to
24115         vec<rtx_insn *>.
24116         (set_modulo_params): Likewise for locals "i1", "i2".
24117         (record_delay_slot_pair): Likewise for params "i1", "i2".
24118         (add_delay_dependencies): Likewise for param "insn".
24119         (cond_clobbered_p): Likewise.
24120         (recompute_todo_spec): Likewise for local "prev".
24121         (last_scheduled_insn): Likewise for this variable.
24122         (nonscheduled_insns_begin): Likewise.
24123         (model_set_excess_costs): Strengthen param "insns" from rtx * to
24124         rtx_insn **.
24125         (rank_for_schedule): Strengthen locals "tmp", "tmp2" from rtx to
24126         rtx_insn *.
24127         (swap_sort): Strengthen param "a" from rtx * to rtx_insn **.
24128         Strengthen local "insn" from rtx to rtx_insn *.
24129         (queue_insn): Strengthen param "insn" from rtx to rtx_insn *.
24130         (ready_lastpos): Strengthen return type from rtx * to rtx_insn **.
24131         (ready_add): Strengthen param "insn" from rtx to rtx_insn *.
24132         (ready_remove_first): Likewise for return type and local "t".
24133         (ready_element): Likewise for return type.
24134         (ready_remove): Likewise for return type and local "t".
24135         (ready_sort): Strengthen local "first" from rtx * to rtx_insn **.
24136         (check_clobbered_conditions): Strengthen local "x" from rtx to
24137         rtx_insn *, adding a checked cast.
24138         (schedule_insn): Likewise for param "insn".
24139         (remove_notes): Likewise for params "head", "tail" and locals
24140         "next_tail", "insn", "next".
24141         (struct haifa_saved_data): Likewise for fields
24142         "last_scheduled_insn", "nonscheduled_insns_begin".
24143         (save_backtrack_point): Update for change to field "vec" of
24144         struct ready_list.
24145         (toggle_cancelled_flags): Strengthen local "first" from rtx * to
24146         rtx_insn **.
24147         (restore_last_backtrack_point): Likewise.  Strengthen local "insn"
24148         from rtx to rtx_insn *
24149         (resolve_dependencies): Strengthen param "insn" from rtx to
24150         rtx_insn *
24151         (restore_other_notes): Likewise for return type, for param "head"
24152         and local "note_head".
24153         (undo_all_replacements): Likewise for local "insn".
24154         (first_nonscheduled_insn): Likewise for return type and local "insn".
24155         (queue_to_ready): Likewise for local "insn", adding checked casts.
24156         (early_queue_to_ready): Likewise for local "insn".
24157         (debug_ready_list_1): Strengthen local "p" from rtx * to
24158         rtx_insn **.
24159         (move_insn): Strengthen param "insn" and local "note" from rtx to
24160         rtx_insn *
24161         (insn_finishes_cycle_p): Likewise for param "insn".
24162         (max_issue): Likewise for local "insn".
24163         (choose_ready): Likewise.  Strengthen param "insn_ptr" from rtx *
24164         to rtx_insn **.
24165         (commit_schedule): Strengthen param "prev_head" and local "insn"
24166         from rtx to rtx_insn *
24167         (prune_ready_list): Likewise for local "insn".
24168         (schedule_block): Likewise for locals "prev_head", "head", "tail",
24169         "skip_insn", "insn", "failed_insn", "x", adding a checked cast.
24170         (set_priorities): Likewise for local "prev_head".
24171         (try_ready): Likewise for param "next".
24172         (fix_tick_ready): Likewise.
24173         (change_queue_index): Likewise.
24174         (sched_extend_ready_list): Update for change to field "vec" of
24175         struct ready_list.
24176         (generate_recovery_code): Strengthen param "insn" from rtx to
24177         rtx_insn *.
24178         (begin_speculative_block): Likewise.
24179         (create_check_block_twin): Likewise for param "insn" and locals
24180         "label", "check", "twin".  Introduce local "check_pat" to avoid
24181         "check" being used as a plain rtx before being used as an insn.
24182         (fix_recovery_deps): Add a checked cast to rtx_insn * when
24183         extracting elements from ready_list.
24184         (sched_remove_insn): Strengthen param "insn" from rtx to
24185         rtx_insn *.
24186         (sched_emit_insn): Likewise for return type.
24187         (ready_remove_first_dispatch): Likewise for return type and local
24188         "insn".
24189
24190         * hw-doloop.c (discover_loop): Add a checked cast to rtx_insn *.
24191
24192         * modulo-sched.c (sms_print_insn): Strengthen from const_rtx to
24193         const rtx_insn *.
24194
24195         * sched-deps.c (add_dependence): Strengthen params "con", "pro"
24196         from rtx to rtx_insn *.
24197         (add_dependence_list): Likewise for param "insn".  Add a checked
24198         cast.
24199         (add_dependence_list_and_free): Strengthen param "insn" from rtx
24200         to rtx_insn *.  Strengthen param "list_p" from rtx * to
24201         rtx_insn **.
24202         (chain_to_prev_insn): Strengthen param "insn" and locals
24203         "prec_nonnote", "i" from rtx to rtx_insn *.
24204         (flush_pending_lists): Likewise for param "insn".
24205         (cur_insn): Likewise for this variable.
24206         (haifa_start_insn): Add a checked cast.
24207         (note_dep): Strengthen param "e" from rtx to rtx_insn *.
24208         (sched_analyze_reg): Likewise for param "insn".
24209         (sched_analyze_1): Likewise.
24210         (sched_analyze_2): Likewise.  Add checked casts.
24211         (sched_analyze_insn): Likewise.  Also for local "prev".
24212         (deps_analyze_insn): Likewise for param "insn".
24213         (sched_analyze): Likewise for params "head", "tail" and local "insn".
24214         (add_dependence_1): Likewise for params "insn", "elem".
24215         (struct mem_inc_info): Likewise for fields "inc_insn", "mem_insn".
24216         (parse_add_or_inc): Likewise for param "insn".
24217         (find_inc): Likewise for local "inc_cand".
24218         (find_modifiable_mems): Likewise for params "head", "tail" and
24219         locals "insn", "next_tail".
24220
24221         * sched-ebb.c (init_ready_list): Likewise for local "insn".
24222         (begin_schedule_ready): Likewise for param "insn".
24223         (begin_move_insn): Likewise for params "insn" and "last".
24224         (ebb_print_insn): Strengthen param "insn" from const_rtx to
24225         const rtx_insn *.
24226         (rank): Strengthen params "insn1", "insn2" from rtx to rtx_insn *.
24227         (ebb_contributes_to_priority): Likewise for params "next", "insn".
24228         (ebb_add_remove_insn): Likewise for param "insn".
24229         (advance_target_bb): Likewise.
24230
24231         * sched-rgn.c (rgn_estimate_number_of_insns): Likewise for local
24232         "insn".
24233         (check_live): Likewise for param "insn".
24234         (init_ready_list): Likewise for local "insn".
24235         (can_schedule_ready_p): Likewise for param "insn".
24236         (begin_schedule_ready): Likewise.
24237         (new_ready): Likewise for param "next".
24238         (rgn_print_insn): Likewise for param "insn".
24239         (rgn_rank): Likewise for params "insn1", "insn2".
24240         (contributes_to_priority): Likewise for params "next", "insn".
24241         (rgn_insn_finishes_block_p): Likewise for param "insn".
24242         (add_branch_dependences): Likewise for params "head", "tail" and
24243         locals "insn", "last".
24244         (rgn_add_remove_insn): Likewise for param "insn".
24245         (advance_target_bb): Likewise.
24246
24247         * sel-sched-dump.c (sel_print_insn): Strengthen param "insn" from
24248         const_rtx to const rtx_insn *.
24249
24250         * sel-sched-dump.h (sel_print_insn): Likewise.
24251
24252         * sel-sched-ir.c (advance_deps_context): Add a checked cast.
24253         (deps_init_id): Likewise.
24254
24255         * sel-sched.c (convert_vec_av_set_to_ready): Likewise.
24256         (invoke_reorder_hooks): Strengthen local "arr" from rtx * to
24257         rtx_insn **.
24258
24259 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24260
24261         * output.h (final_start_function): Strengthen param 1 from rtx to
24262         rtx_insn *.
24263
24264         * final.c (final_start_function): Likewise, renaming back from
24265         "uncast_first" to "first", and dropping the checked cast from rtx
24266         to rtx_insn *.
24267
24268 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24269
24270         * output.h (final): Strengthen param 1 from rtx to rtx_insn *.
24271         * final.c (final): Likewise.  Rename param back from
24272         "uncast_first" to "first" and eliminate the checked cast from rtx
24273         to rtx_insn *.
24274
24275 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24276
24277         * output.h (shorten_branches): Strengthen param from rtx to
24278         rtx_insn *.
24279
24280         * final.c (shorten_branches): Likewise, renaming param back from
24281         "uncast_first" to "first", and dropping the checked cast from rtx
24282         to rtx_insn *.
24283
24284         * genattr.c (gen_attr): Likewise when writing out the prototype of
24285         shorten_branches.
24286
24287 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24288
24289         * sched-int.h (struct haifa_sched_info): Strengthen fields
24290         "prev_head" and "next_tail" from rtx to rtx_insn *.
24291
24292 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24293
24294         * rtl.h (rtx_jump_table_data::get_labels): New method.
24295         * cfgbuild.c (make_edges): Replace hand-coded lookup of labels
24296         with use of the new rtx_jump_table_data::get_labels method.
24297         (purge_dead_tablejump_edges): Strengthen param "table" from rtx
24298         to rtx_jump_table_data *.  Simplify by using get_labels method.
24299         * cfgrtl.c (delete_insn): Replace use of JUMP_TABLE_DATA_P with
24300         a dyn_cast, introducing local "table", using it to replace
24301         label-lookup logic with a get_labels method call.
24302         (patch_jump_insn): Simplify using get_labels method.
24303         * dwarf2cfi.c (create_trace_edges): Likewise.
24304         * rtlanal.c (label_is_jump_target_p): Likewise.
24305
24306 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24307
24308         * rtl.h (unshare_all_rtl_again): Strengthen param "insn" from rtx
24309         to rtx_insn *.
24310
24311         * emit-rtl.c (unshare_all_rtl_1): Likewise.
24312         (unshare_all_rtl_again): Likewise, also for local "p".
24313
24314 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24315
24316         * rtl.h (delete_insn_and_edges): Strengthen param "insn" from rtx
24317         to rtx_insn *.
24318         * cfgrtl.c (delete_insn_and_edges): Likewise.
24319
24320 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24321
24322         * rtl.h (reorder_insns): Strengthen params "from", "to", "after"
24323         from rtx to rtx_insn *.
24324
24325         * emit-rtl.c (reorder_insns): Likewise, also for local "insn".
24326
24327 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24328
24329         * function.c (thread_prologue_and_epilogue_insns): Likewise for
24330         locals "returnjump", "epilogue_end", "insn", "next".
24331
24332         * shrink-wrap.h (get_unconverted_simple_return): Strengthen param
24333         "returnjump" from rtx * to rtx_insn **.
24334         * shrink-wrap.c (get_unconverted_simple_return): Likewise.
24335
24336 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24337
24338         * basic-block.h (struct edge_def). Strengthen "r" within
24339         union edge_def_insns from rtx to rtx_insn *.
24340
24341         * cfgexpand.c (pass_expand::execute): Remove now-redundant cast
24342         from rtx to rtx_insn *.  Strengthen local "insns" from rtx to
24343         rtx_insn *.
24344         * cfgrtl.c (commit_one_edge_insertion): Remove now-redundant cast
24345         from rtx to rtx_insn *.
24346         * cprop.c (find_bypass_set): Strengthen local "insn" from rtx to
24347         rtx_insn *.
24348         * postreload-gcse.c (reg_killed_on_edge): Likewise.
24349         (reg_used_on_edge): Likewise.
24350         * tree-cfg.c (gt_ggc_mx): New overload for rtx_insn *&.
24351         (gt_pch_nx): New overload for rtx_insn *&.
24352         * tree-outof-ssa.c (expand_phi_nodes): Strengthen local "insns"
24353         from rtx to rtx_insn *.
24354
24355 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24356
24357         * basic-block.h (struct rtl_bb_info): Strengthen field "footer_"
24358         from rtx to rtx_insn *.
24359         (BB_FOOTER): Replace function with access macro.
24360         (SET_BB_FOOTER): Delete.
24361
24362         * cfgcleanup.c (try_optimize_cfg): Replace uses of SET_BB_FOOTER
24363         with BB_FOOTER.
24364         * cfgrtl.c (try_redirect_by_replacing_jump): Likewise.
24365         (emit_barrier_after_bb): Likewise.
24366         (record_effective_endpoints): Likewise.
24367         (relink_block_chain): Likewise.
24368         (fixup_fallthru_exit_predecessor): Likewise.
24369         (cfg_layout_duplicate_bb): Likewise.
24370         (cfg_layout_split_block): Likewise.
24371         (cfg_layout_delete_block): Likewise.
24372         (cfg_layout_merge_blocks): Likewise.
24373         (BB_FOOTER): Delete function.
24374         (SET_BB_FOOTER): Delete function.
24375         * combine.c (update_cfg_for_uncondjump): Replace uses of
24376         SET_BB_FOOTER with BB_FOOTER.
24377
24378 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24379
24380         * except.h (struct eh_landing_pad_d): Strengthen field
24381         "landing_pad" from rtx to rtx_code_label *.
24382
24383         * except.c (sjlj_emit_dispatch_table): Likewise for param
24384         "dispatch_label"
24385         (sjlj_build_landing_pads): Likewise for local "dispatch_label".
24386
24387 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24388
24389         * config/xtensa/xtensa-protos.h (xtensa_emit_loop_end): Strengthen
24390         first param from rtx to rtx_insn *.
24391         * config/xtensa/xtensa.c (struct machine_function): Likewise for
24392         field "set_frame_ptr_insn".
24393         (xtensa_expand_compare_and_swap): Strengthen locals "csloop" and
24394         "csend" from rtx to rtx_code_label *.
24395         (xtensa_expand_atomic): Likewise for local "csloop".
24396         (xtensa_emit_loop_end): Strengthen param "insn" from rtx to
24397         rtx_insn *.
24398         (xtensa_call_tls_desc): Likewise for return type and locals
24399         "call_insn", "insns".
24400         (xtensa_legitimize_tls_address): Likewise for local "insns".
24401         (xtensa_expand_prologue): Likewise for locals "insn", "first".
24402
24403 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24404
24405         * config/v850/v850-protos.h (v850_adjust_insn_length): Strengthen
24406         first param from rtx to rtx_insn *.
24407         * config/v850/v850.c (v850_adjust_insn_length): Likewise for param
24408         "insn".
24409
24410 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24411
24412         * config/tilepro/tilepro-protos.h (tilepro_output_cbranch_with_opcode):
24413         Strengthen param 1 from rtx to rtx_insn *.
24414         (tilepro_output_cbranch): Likewise.
24415         (tilepro_adjust_insn_length): Likewise.
24416         (tilepro_final_prescan_insn): Likewise for sole param.
24417
24418         * config/tilepro/tilepro.c (tilepro_legitimize_tls_address):
24419         Likewise for local "last".
24420         (cbranch_predicted_p): Likewise for param "insn".
24421         (tilepro_output_simple_cbranch_with_opcode): Likewise.
24422         (tilepro_output_cbranch_with_opcode): Likewise.
24423         (tilepro_output_cbranch): Likewise.
24424         (frame_emit_load): Likewise for return type and locals "seq",
24425         "insn".
24426         (emit_sp_adjust): Likewise for return type and local "insn".
24427         (tilepro_expand_epilogue): Likewise for locals "last_insn",
24428         "insn".
24429         (tilepro_adjust_insn_length): Likewise for param "insn".
24430         (next_insn_to_bundle): Likewise for return type and params
24431         "r", "end".
24432         (tilepro_gen_bundles): Likewise for locals "insn", "next", "end".
24433         (replace_pc_relative_symbol_ref): Likewise for param "insn" and
24434         local "new_insns".
24435         (match_addli_pcrel): Likewise for param "insn".
24436         (replace_addli_pcrel): Likewise.
24437         (match_auli_pcrel): Likewise.
24438         (replace_auli_pcrel): Likewise.
24439         (tilepro_fixup_pcrel_references): Likewise for locals "insn",
24440         "next_insn".
24441         (reorder_var_tracking_notes): Likewise for locals "insn", "next",
24442         "queue", "next_queue", "prev".
24443         (tilepro_asm_output_mi_thunk): Likewise for local "insn".
24444         (tilepro_final_prescan_insn): Likewise for param "insn".
24445
24446 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24447
24448         * config/tilegx/tilegx-protos.h (tilegx_output_cbranch_with_opcode):
24449         Strengthen param 1 from rtx to rtx_insn *.
24450         (tilegx_output_cbranch): Likewise.
24451         (tilegx_adjust_insn_length): Likewise.
24452         (tilegx_final_prescan_insn): Likewise for sole param.
24453
24454         * config/tilegx/tilegx.c (tilegx_legitimize_tls_address): Likewise
24455         or local "last".
24456         (cbranch_predicted_p): Likewise for param "insn".
24457         (tilegx_output_simple_cbranch_with_opcode): Likewise.
24458         (tilegx_output_cbranch_with_opcode): Likewise.
24459         (tilegx_output_cbranch): Likewise.
24460         (frame_emit_load): Likewise for return type.
24461         (set_frame_related_p): Likewise for locals "seq", "insn".
24462         (emit_sp_adjust): Likewise for return type, and for local "insn".
24463         Introduce local "pat" for use in place of "insn" where the latter
24464         isn't an instruction.
24465         (tilegx_expand_epilogue): Strengthen locals "last_insn", "insn"
24466         from rtx to rtx_insn *.
24467         (tilegx_adjust_insn_length): Likewise for param "insn".
24468         (next_insn_to_bundle): Likewise for return type and params "r" and
24469         "end".
24470         (tilegx_gen_bundles): Likewise for locals "insn", "next", "prev",
24471         "end".
24472         (replace_insns): Likewise for params "old_insn", "new_insns".
24473         (replace_mov_pcrel_step1): Likewise for param "insn" and local
24474         "new_insns".
24475         (replace_mov_pcrel_step2): Likewise.
24476         (replace_mov_pcrel_step3): Likewise.
24477         (tilegx_fixup_pcrel_references): Likewise for locals "insn",
24478         "next_insn".
24479         (reorder_var_tracking_notes): Likewise for locals "insn", "next",
24480         "queue", "next_queue", "prev".
24481         (tilegx_output_mi_thunk): Likewise for local "insn".
24482         (tilegx_final_prescan_insn): Likewise for param "insn".
24483
24484 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24485
24486         * config/spu/spu.c (frame_emit_store): Strengthen return type from
24487         rtx to rtx_insn *.
24488         (frame_emit_load): Likewise.
24489         (frame_emit_add_imm): Likewise, also for local "insn".
24490         (spu_expand_prologue): Likewise for local "insn".
24491         (struct spu_bb_info): Likewise for field "prop_jump".
24492         (emit_nop_for_insn): Likewise for param "insn" and local
24493         "new_insn".
24494         (pad_bb): Likewise for locals "insn", "next_insn", "prev_insn",
24495         "hbr_insn".
24496         (spu_emit_branch_hint): Likewise for params "before", "branch" and
24497         locals "hint", "insn".
24498         (get_branch_target): Likewise for param "branch".
24499         (insn_clobbers_hbr): Likewise for param "insn".
24500         (insert_hbrp_for_ilb_runout): Likewise for param "first" and
24501         locals "insn", "before_4", "before_16".
24502         (insert_hbrp): Likewise for local "insn".
24503         (spu_machine_dependent_reorg): Likewise for locals "branch",
24504         "insn", "next", "bbend".
24505         (uses_ls_unit): Likewise for param "insn".
24506         (get_pipe): Likewise.
24507         (spu_sched_variable_issue): Rename param "insn" to "uncast_insn",
24508         introducing a checked cast.
24509         (spu_sched_adjust_cost): Likewise for params "insn" and
24510         "dep_insn".
24511         (ea_load_store_inline): Strengthen local "insn" from rtx to rtx_insn *.
24512         (spu_sms_res_mii): Likewise.
24513
24514 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24515
24516         * config/sparc/sparc-protos.h (output_ubranch): Strengthen param 2
24517         from rtx to rtx_insn *.
24518         (output_cbranch): Likewise for param 6.
24519         (output_return): Likewise for param 1.
24520         (output_sibcall): Likewise.
24521         (output_v8plus_shift): Likewise.
24522         (output_v8plus_mult): Likewise.
24523         (output_v9branch): Likewise for param 7.
24524         (output_cbcond):  Likewise for param 3.
24525
24526         * config/sparc/sparc.c (sparc_legitimize_tls_address): Likewise
24527         for local "insn".
24528         (sparc_legitimize_pic_address): Likewise.
24529         (sparc_emit_call_insn): Likewise.
24530         (emit_save_or_restore_regs): Likewise.
24531         (emit_window_save): Likewise for return type and local "insn".
24532         (sparc_expand_prologue): Likewise for local "insn".
24533         (sparc_flat_expand_prologue): Likewise.
24534         (output_return): Likewise for param "insn".
24535         (output_sibcall): Likewise for param "insn" and local "delay".
24536         (output_ubranch): Likewise for param "insn".
24537         (output_cbranch): Likewise.
24538         (output_cbcond): Likewise.
24539         (output_v9branch): Likewise.
24540         (output_v8plus_shift): Likewise.
24541         (sparc_output_mi_thunk): Likewise for local "insn".
24542         (get_some_local_dynamic_name): Likewise.
24543         (output_v8plus_mult): Likewise for param "insn".
24544
24545 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24546
24547         * config/sh/sh-protos.h (output_ieee_ccmpeq): Strengthen param 1
24548         from rtx to rtx_insn *.
24549         (output_branchy_insn): Likewise for param 3.
24550         (output_far_jump): Likewise for param 1.
24551         (final_prescan_insn): Likewise.
24552         (sh_insn_length_adjustment): Likewise for sole param.
24553
24554         * config/sh/sh.c (expand_cbranchsi4): Likewise for local "jump".
24555         (expand_cbranchdi4): Strengthen local "skip_label" from rtx to
24556         rtx_code_label *.
24557         (sh_emit_compare_and_set): Likewise for local "lab".
24558         (output_far_jump): Strengthen param "insn" and local "prev" from
24559         rtx to rtx_insn *.
24560         (output_branchy_insn): Likewise for param "insn" and local
24561         "next_insn".
24562         (output_ieee_ccmpeq): Likewise for param "insn".
24563         (struct label_ref_list_d): Strengthen field "label" from rtx to
24564         rtx_code_label *.
24565         (pool_node): Likewise.
24566         (pool_window_label): Likewise for this global.
24567         (add_constant): Likewise for return type and locals "lab", "new_rtx".
24568         (dump_table): Strengthen params "start", "barrier" and local
24569         "scan" from rtx to rtx_insn *.
24570         (broken_move): Likewise for param "insn".
24571         (untangle_mova): Likewise for params "first_mova" and "new_mova".
24572         Strengthen param "first_mova" from rtx * to rtx_insn **.
24573         (mova_p): Likewise for param "insn".
24574         (fixup_mova): Likewise for param "mova".
24575         (find_barrier): Likewise for return type, params "mova" and
24576         "from", and locals "barrier_before_mova", "found_barrier",
24577         "good_barrier", "orig", "last_symoff", "next".  Strengthen local
24578         "label" from rtx to rtx_code_label *.
24579         (sh_loop_align): Strengthen locals "first", "insn", "mova" from
24580         rtx to rtx_insn *.
24581         (sh_reorg): Likewise for locals "link", "scan", "barrier".
24582         (split_branches): Likewise for param "first" and local "insn".
24583         (final_prescan_insn): Likewise for param "insn".
24584         (sequence_insn_p): Likewise for locals "prev", "next".
24585         (sh_insn_length_adjustment): Likewise for param "insn".
24586         (sh_can_redirect_branch): Likewise for local "insn".
24587         (find_r0_life_regions): Likewise for locals "end", "insn".
24588         (sh_output_mi_thunk): Likewise for local "insns".
24589
24590 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24591
24592         * config/score/score.c (score_output_mi_thunk): Strengthen local
24593         "insn" from rtx to rtx_insn *.
24594         (score_prologue): Likewise.
24595
24596 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24597
24598         * config/s390/s390-protos.h (s390_match_ccmode): Strengthen param
24599         1 from rtx to rtx_insn *.
24600         (s390_emit_jump): Likewise for return type.
24601         (s390_emit_call): Likewise.
24602         (s390_load_got): Likewise.
24603
24604         * config/s390/s390.c (last_scheduled_insn): Likewise for this
24605         variable.
24606         (s390_match_ccmode): Likewise for param "insn".
24607         (s390_emit_jump): Likewise for return type.
24608         (s390_split_branches): Likewise for local "label".
24609         (struct constant): Strengthen field "label" from rtx to
24610         rtx_code_label *.
24611         (struct constant_pool): Likewise for field "label".  Strengthen
24612         fields "first_insn", "pool_insn", "emit_pool_after" from rtx to
24613         rtx_insn *.
24614         (s390_alloc_pool): Replace NULL_RTX with NULL when dealing with
24615         insns.
24616         (s390_start_pool): Strengthen param "insn" from rtx to rtx_insn *.
24617         (s390_end_pool): Likewise.
24618         (s390_dump_pool): Likewise for local "insn".
24619         (s390_mainpool_start): Likewise.
24620         (s390_chunkify_start): Likewise.
24621         (s390_chunkify_start): Replace NULL_RTX with NULL when dealing
24622         with insns.  Strengthen locals "label", "jump", "barrier", "next",
24623         "prev", "vec_insn", "insn" from rtx to rtx_insn *.
24624         (s390_chunkify_finish): Strengthen local "insn" from rtx to
24625         rtx_insn *.
24626         (s390_chunkify_cancel): Likewise for locals "insn", "barrier",
24627         "jump", "label", "next_insn".
24628         (s390_regs_ever_clobbered): Likewise for local "cur_insn".
24629         (s390_optimize_nonescaping_tx): Likewise for locals "insn",
24630         "tbegin_insn".
24631         (s390_load_got): Likewise for return type and local "insns".
24632         (s390_save_gprs_to_fprs): Likewise for local "insn".
24633         (s390_restore_gprs_from_fprs): Likewise.
24634         (pass_s390_early_mach::execute): Likewise.
24635         (s390_emit_prologue): Likewise for local "insns".
24636         (s390_expand_tbegin): Strengthen local "leave_label" from rtx to
24637         rtx_code_label *.
24638         (s390_emit_call): Strengthen return type and local "insn" from
24639         rtx to rtx_insn *.
24640         (s390_emit_tpf_eh_return): Likewise for local "insn".
24641         (s390_optimize_prologue): Likewise for locals "insn", "new_insn",
24642         "next_insn", introducing locals "s_pat", "rpat" to allow this.
24643         (s390_fix_long_loop_prediction): Likewise for param "insn" and
24644         local "cur_insn".
24645         (s390_non_addr_reg_read_p): Likewise for param "insn".
24646         (find_cond_jump): Likewise for return type and param "insn".
24647         (s390_swap_cmp): Likewise for param "insn".
24648         (s390_z10_optimize_cmp): Likewise for param "insn" and locals
24649         "prev_insn", "next_insn".
24650         (s390_reorg): Likewise for locals "insn", "target".
24651         (s390_z10_prevent_earlyload_conflicts): Likewise for local "insn".
24652         (s390_sched_variable_issue): For now, rename param "insn" to
24653         "uncast_insn", introducing a checked cast.
24654         (s390_sched_init): Replace NULL_RTX with NULL when dealing with
24655         insn.
24656         (s390_loop_unroll_adjust): Strengthen local "insn" from rtx to
24657         rtx_insn *.  Use for_each_rtx_in_insn rather than for_each_rtx.
24658
24659 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24660
24661         * config/rx/rx-protos.h (rx_adjust_insn_length): Strengthen first
24662         param from rtx to rtx_insn *.
24663         * config/rx/rx.c (rx_adjust_insn_length): Likewise for param "insn".
24664
24665 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24666
24667         * config/rs6000/rs6000-protos.h (output_cbranch): Strengthen param
24668         4 from rtx to rtx_insn *.
24669         (rs6000_final_prescan_insn): Likewise for first param.
24670         * config/rs6000/rs6000.c (rs6000_emit_set_const): Likewise for
24671         local "insn".
24672         (rs6000_get_some_local_dynamic_name): Likewise.
24673         (output_cbranch): Likewise for param "insn".
24674         (spe_func_has_64bit_regs_p): Likewise for locals "insns", "insn".
24675         (rs6000_function_ok_for_sibcall): Likewise for locals "top", "insn".
24676         (rs6000_emit_allocate_stack): Likewise for local "insn".
24677         (load_cr_save): Likewise.
24678         (restore_saved_cr): Likewise.
24679         (restore_saved_lr): Likewise.
24680         (emit_cfa_restores): Likewise.
24681         (rs6000_output_function_epilogue): Likewise for locals "insn" and
24682         "deleted_debug_label".
24683         (rs6000_output_mi_thunk): Likewise for local "insn".
24684         (rs6000_final_prescan_insn): Likewise for param "insn".
24685
24686 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24687
24688         * config/picochip/picochip-protos.h (picochip_final_prescan_insn):
24689         Strengthen param "insn" from rtx to rtx_insn *.
24690         * config/picochip/picochip.c (picochip_current_prescan_insn):
24691         Likewise for this variable.
24692         (picochip_final_prescan_insn): Likewise for param "insn".
24693
24694 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24695
24696         * config/pa/pa-protos.h (pa_output_call): Strengthen first param
24697         from rtx to rtx_insn *.
24698         (pa_output_indirect_call): Likewise.
24699         (pa_adjust_insn_length): Likewise.
24700         (pa_attr_length_millicode_call): Likewise.
24701         (pa_attr_length_call): Likewise.
24702         (pa_attr_length_indirect_call): Likewise.
24703
24704         * config/pa/pa.c (pa_adjust_insn_length): Likewise for param
24705         "insn".
24706         (pa_attr_length_millicode_call): Likewise.
24707         (pa_attr_length_call): Likewise.
24708         (pa_output_call): Likewise.
24709         (pa_attr_length_indirect_call): Likewise.
24710         (pa_output_indirect_call): Likewise.
24711
24712 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24713
24714         * config/nds32/nds32-protos.h (nds32_adjust_insn_length):
24715         Strengthen first param from rtx to rtx_insn *.
24716         * config/nds32/nds32.c (nds32_adjust_insn_length): Likewise for
24717         param "insn".
24718
24719 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24720
24721         * config/mips/mips-protos.h (mips_emit_move): Strengthen return
24722         type from rtx to rtx_insn *.
24723         (mips_expand_call): Likewise.
24724         (mips_adjust_insn_length): Likewise for first param.
24725         (mips_output_conditional_branch): Likewise.
24726         (mips_output_order_conditional_branch): Likewise.
24727         (mips_final_prescan_insn): Likewise.
24728
24729         * config/mips/mips.c (SEQ_BEGIN): For now, add checked cast to
24730         rtx_insn * for the SEQUENCE case.
24731         (SEQ_END): Likewise.
24732         (mips_emit_move): Strengthen return type from rtx to rtx_insn *.
24733         (mips_emit_call_insn): Likewise, also for local "insn".
24734         (mips16_gp_pseudo_reg): Likewise for local "scan".
24735         (mips16_build_call_stub): Likewise for return type and for local
24736         "insn".  Introduce a new local "pattern" so that "insn" can indeed
24737         be an insn.
24738         (mips_expand_call): Strengthen return type and local "insn" from
24739         rtx to rtx_insn *.
24740         (mips_block_move_loop): Strengthen local "label" from rtx to
24741         rtx_code_label *.
24742         (mips_expand_synci_loop): Likewise for locals "label",
24743         "end_label".
24744         (mips_set_frame_expr): Strengthen local "insn" from rtx to
24745         rtx_insn *.
24746         (mips16e_collect_argument_saves): Likewise for locals "insn",
24747         "next".
24748         (mips_find_gp_ref): Likewise for param of callback for "pred"
24749         param, and for local "insn".
24750         (mips_insn_has_inflexible_gp_ref_p): Likewise for param "insn".
24751         (mips_insn_has_flexible_gp_ref_p): Likewise.
24752         (mips_epilogue_emit_cfa_restores): Likewise for return type and
24753         local "insn".
24754         (mips_epilogue_set_cfa): Likewise for local "insn".
24755         (mips_expand_epilogue): Likewise.
24756         (mips_adjust_insn_length): Likewise for param "insn".
24757         (mips_output_conditional_branch): Likewise.
24758         (mips_output_order_conditional_branch): Likewise.
24759         (struct mips_ls2): Likewise for fields "alu1_turn_enabled_insn",
24760         "alu2_turn_enabled_insn", "falu1_turn_enabled_insn",
24761         "falu2_turn_enabled_insn".
24762         (mips_builtin_branch_and_move): Strengthen locals "true_label",
24763         "done_label" from rtx to rtx_code_label *.
24764         (struct mips16_constant): Likewise for field "label".
24765         (mips16_add_constant): Likewise for return type.
24766         (mips16_emit_constants_1): Strengthen return type and param "insn"
24767         from rtx to rtx_insn *.
24768         (mips16_emit_constants): Likewise for param "insn".
24769         (mips16_insn_length): Likewise.
24770         (mips16_rewrite_pool_constant): Strengthen local "label" from rtx
24771         to rtx_code_label *.
24772         (struct mips16_rewrite_pool_refs_info): Strengthen field "insn"
24773         from rtx to rtx_insn *.
24774         (mips16_lay_out_constants): Likewise for locals "insn", "barrier",
24775         "jump".  Strengthen local "label" from rtx to rtx_code_label *.
24776         (r10k_simplify_address): Strengthen param "insn" and local
24777         "def_insn" from rtx to rtx_insn *.
24778         (r10k_safe_address_p): Strengthen param "insn" from rtx to
24779         rtx_insn *.
24780         (r10k_needs_protection_p_1): Update target type of cast of data
24781         from to rtx to rtx_insn *.
24782         (r10k_needs_protection_p_store): Strengthen local "insn_ptr" from
24783         rtx * to rtx_insn **.
24784         (r10k_needs_protection_p): Strengthen param "insn" from rtx to
24785         rtx_insn *.
24786         (r10k_insert_cache_barriers): Likewise for locals "insn", "end".
24787         (mips_call_expr_from_insn): Likewise for param "insn".
24788         (mips_pic_call_symbol_from_set): Likewise for local "def_insn".
24789         (mips_find_pic_call_symbol): Likewise for param "insn".
24790         (mips_annotate_pic_calls): Likewise for local "insn".
24791         (mips_sim_insn): Likewise for this variable.
24792         (struct mips_sim): Likewise for field "insn" within elements of
24793         last_set array.
24794         (mips_sim_wait_reg): Likewise for param "insn".
24795         (mips_sim_wait_regs): Likewise.
24796         (mips_sim_wait_units): Likewise.
24797         (mips_sim_wait_insn): Likewise.
24798         (mips_sim_issue_insn): Likewise.
24799         (mips_sim_finish_insn): Likewise.
24800         (mips_seq_time): Likewise for param "seq" and local "insn".
24801         (vr4130_avoid_branch_rt_conflict): Likewise for param "insn" and
24802         locals "first", "second".
24803         (vr4130_align_insns): Likewise for locals "insn", "subinsn",
24804         "last", "last2", "next".
24805         (mips_avoid_hazard): Likewise for params "after", "insn".
24806         (mips_reorg_process_insns): Likewise for locals "insn",
24807         "last_insn", "subinsn", "next_insn".
24808         (mips_has_long_branch_p): Likewise for locals "insn", "subinsn".
24809         (mips16_split_long_branches): Likewise for locals "insn" "jump",
24810         "jump_sequence".
24811         (mips_output_mi_thunk): Likewise for local "insn".
24812         (mips_final_prescan_insn): Likewise for param "insn".
24813
24814 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24815
24816         * config/microblaze/microblaze.c (microblaze_call_tls_get_addr):
24817         Strengthen return type and local "insns" from rtx to rtx_insn *.
24818         (microblaze_legitimize_tls_address): Likewise for local "insns".
24819         (microblaze_block_move_loop): Strengthen local "label" from rtx
24820         to rtx_code_label *.
24821         (microblaze_expand_prologue): Strengthen two locals named "insn"
24822         from rtx to rtx_insn *.
24823         (microblaze_asm_output_mi_thunk): Likewise for local "insn".
24824         (microblaze_expand_divide): Likewise for locals "jump", "cjump",
24825         "insn".  Strengthen locals "div_label", "div_end_label" from rtx
24826         to rtx_code_label *.
24827
24828 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24829
24830         * config/mep/mep-protos.h (mep_mulr_source): Strengthen first
24831         param from rtx to rtx_insn *.
24832         (mep_reuse_lo): Likewise for third param.
24833         (mep_use_post_modify_p): Likewise for first param.
24834         (mep_core_address_length): Likewise.
24835         (mep_cop_address_length): Likewise.
24836         (mep_final_prescan_insn): Likewise.
24837         (mep_store_data_bypass_p): Likewise for both params.
24838         (mep_mul_hilo_bypass_p): Likewise.
24839         (mep_ipipe_ldc_p): Likewise for param.
24840
24841         * config/mep/mep.c (mep_mulr_source): Likewise for param "insn".
24842         (mep_rewrite_mult): Likewise.
24843         (mep_rewrite_mulsi3): Likewise.
24844         (mep_rewrite_maddsi3): Likewise.
24845         (mep_reuse_lo_p_1): Likewise.
24846         (mep_reuse_lo_p): Likewise.
24847         (mep_frame_expr): Likewise.
24848         (mep_make_parallel): Likewise for both params.
24849         (mep_use_post_modify_p_1): Likewise for param "set_insn" and
24850         local "insn".
24851         (mep_use_post_modify_p): Likewise for param "insn".
24852         (mep_core_address_length): Likewise.
24853         (mep_cop_address_length): Likewise.
24854         (mep_reg_set_in_function): Likewise for local "insn".
24855         (mep_asm_without_operands_p): Likewise.
24856         (F): Likewise for return type and param "x".
24857         (add_constant): Likewise for local "insn".
24858         (maybe_dead_move): Likewise for return type and local "insn".
24859         (mep_expand_prologue): Likewise for local "insn".
24860         (mep_final_prescan_insn): Likewise for param "insn".
24861         (mep_reorg_regmove): Likewise for param "insns" and locals "insn",
24862         "next", "follow", "x".
24863         (mep_insert_repeat_label_last): Likewise for return type, param
24864         "last_insn", and locals "next", "prev".  Strengthen param "label"
24865         from rtx to rtx_code_label *.
24866         (struct mep_doloop_begin): Strengthen field "insn" from rtx to
24867         rtx_insn *.
24868         (struct mep_doloop_end): Likewise for fields "insn" and
24869         "fallthrough".
24870         (mep_reorg_repeat): Likewise for param "insns" and local "insn".
24871         Strengthen local "repeat_label" from rtx to rtx_code_label *.
24872         (mep_invertable_branch_p): Strengthen param "insn" from rtx to
24873         rtx_insn *.
24874         (mep_invert_branch): Likewise for params "insn" and "after".
24875         (mep_reorg_erepeat): Likewise for param "insns" and locals
24876         "insn", "prev", "new_last", "barrier", "user".  Strengthen local
24877         "l" from rtx to rtx_code_label *.
24878         (mep_jmp_return_reorg): Strengthen param "insns" and local "insn"
24879         from rtx to rtx_insn *.
24880         (mep_reorg_addcombine): Likewise for param "insns" and locals
24881         "i", "n".
24882         (add_sp_insn_p): Likewise for param "insn".
24883         (mep_reorg_noframe): Likewise for param "insns" and locals
24884         "start_frame_insn", "end_frame_insn", "next".
24885         (mep_reorg): Likewise for local "insns".
24886         (mep_store_data_bypass_1): Likewise for param "prev".  Add checked
24887         cast.
24888         (mep_store_data_bypass_p): Likewise for params "prev", "insn".
24889         (mep_mul_hilo_bypass_p): Likewise.
24890         (mep_ipipe_ldc_p): Likewise for param "insn".
24891         (mep_make_bundle): Likewise for return type, param "cop" and local
24892         "insn", splitting out the latter into a new local "seq" for when it
24893         is a SEQUENCE rather than an insn.
24894         (core_insn_p): Likewise for param "insn".
24895         (mep_bundle_insns): Likewise for param "insns" and locals "insn",
24896         "last", "first", "note", "prev", "core_insn".
24897
24898 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24899
24900         * config/m68k/m68k-protos.h (output_btst): Strengthen param 4 from
24901         rtx to rtx_insn *.
24902         (strict_low_part_peephole_ok): Likewise for param 2 "first_insn".
24903         (m68k_final_prescan_insn): Likewise for first param.
24904
24905         * config/m68k/m68k.c (m68k_emit_movem): Likewise for return type.
24906         (m68k_set_frame_related): Likewise for param "insn".
24907         (output_btst): Likewise for param "insn".
24908         (m68k_final_prescan_insn): Likewise.
24909         (m68k_move_to_reg): Likewise for local "insn".
24910         (m68k_call_tls_get_addr): Likewise for local "insns".
24911         (m68k_call_m68k_read_tp): Likewise.
24912         (strict_low_part_peephole_ok): Likewise for param "first_insn".
24913         (m68k_output_mi_thunk): Likewise for local "insn".
24914
24915 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24916
24917         * config/iq2000/iq2000-protos.h (final_prescan_insn): Strengthen
24918         first param from rtx to rtx_insn *.
24919         (iq2000_adjust_insn_length): Likewise.
24920         (iq2000_output_conditional_branch): Likewise.
24921         * config/iq2000/iq2000.c (final_prescan_insn): Likewise for param
24922         "insn" and local "nop_insn".
24923         (iq2000_annotate_frame_insn): Likewise for param "insn".
24924         (iq2000_expand_prologue): Likewise for both locals "insn".
24925         (iq2000_adjust_insn_length): Likewise for param "insn".
24926         (iq2000_output_conditional_branch): Likewise.
24927
24928 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24929
24930         * config/ia64/ia64.c (ia64_expand_tls_address): Strengthen local
24931         "insns" from rtx to rtx_insn *.
24932         (ia64_emit_cond_move): Likewise for locals "insn", "first".
24933         (struct spill_fill_data): Likewise for field "init_after" and for
24934         elements of array field "prev_insn".
24935         (spill_restore_mem): Likewise for locals "insn", "first".
24936         (do_spill): Likewise for local "insn".
24937         (do_restore): Likewise.
24938         (ia64_expand_prologue): Likewise.
24939         (ia64_expand_epilogue): Likewise.
24940         (emit_insn_group_barriers): Likewise for locals "insn",
24941         "last_label".
24942         (emit_all_insn_group_barriers): Likewise for locals "insn",
24943         "last".
24944         (dfa_stop_insn): Likewise for this global.
24945         (dfa_pre_cycle_insn): Likewise.
24946         (ia64_nop): Likewise.
24947         (final_emit_insn_group_barriers): Likewise for locals "insn",
24948         "last".
24949         (emit_predicate_relation_info): Likewise for locals "head", "n",
24950         "insn", "b", "a".
24951         (ia64_reorg): Likewise for local "insn".
24952         (ia64_output_mi_thunk): Likewise.
24953         (expand_vec_perm_interleave_2): Likewise for local "seq".
24954
24955 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
24956
24957         * config/i386/i386-protos.h (ix86_avoid_lea_for_add): Strengthen
24958         param 1 "insn" from rtx to rtx_insn *.
24959         (ix86_use_lea_for_mov): Likewise.
24960         (ix86_avoid_lea_for_addr): Likewise.
24961         (ix86_split_lea_for_addr): Likewise.
24962         (ix86_lea_for_add_ok): Likewise.
24963         (ix86_output_call_insn): Likewise.
24964
24965         * config/i386/i386.c (ix86_va_start): Likewise for local "seq".
24966         (ix86_get_drap_rtx): Likewise for locals "seq", "insn".
24967         (ix86_output_function_epilogue): Likewise for locals "insn",
24968         "deleted_debug_label".
24969         (legitimize_tls_address): Likewise for local "insn".
24970         (get_some_local_dynamic_name): Likewise.
24971         (increase_distance): Likewise for params "prev", "next".
24972         (distance_non_agu_define_in_bb): Likewise for params "insn",
24973         "start" and locals "prev", "next".
24974         (distance_non_agu_define): Likewise for param "insn".
24975         (distance_agu_use_in_bb): Likewise for params "insn", "start" and
24976         locals "next", "prev".
24977         (distance_agu_use): Likewise for param "insn".
24978         (ix86_lea_outperforms): Likewise.
24979         (ix86_ok_to_clobber_flags): Likewise.
24980         (ix86_avoid_lea_for_add): Likewise.
24981         (ix86_use_lea_for_mov): Likewise.
24982         (ix86_avoid_lea_for_addr): Likewise.
24983         (find_nearest_reg_def): Likewise, also for locals "prev", "start".
24984         (ix86_split_lea_for_addr): Likewise for param "insn".
24985         (ix86_lea_for_add_ok): Likewise for param "insn".
24986         (ix86_expand_carry_flag_compare): Likewise for local
24987         "compare_seq".
24988         (ix86_expand_int_movcc): Likewise.
24989         (ix86_output_call_insn): Likewise for param "insn".
24990         (ix86_output_call_insn): Likewise for local "i".
24991         (x86_output_mi_thunk): Introduce local "insn", using it in place
24992         of "tmp" when dealing with insns.
24993         (ix86_avoid_jump_mispredicts): Likewise for locals "insn",
24994         "start".
24995         (ix86_pad_returns): Likewise for locals "ret", "prev".
24996         (ix86_count_insn_bb): Likewise for local "insn".
24997         (ix86_pad_short_function): Likewise for locals "ret", "insn".
24998         (ix86_seh_fixup_eh_fallthru): Likewise for locals "insn", "next".
24999         (ix86_vector_duplicate_value): Likewise for local "insn", "seq".
25000         (expand_vec_perm_interleave2): Likewise for local "seq".
25001         (expand_vec_perm_vperm2f128_vblend): Likewise.
25002         (ix86_loop_unroll_adjust): Likewise for local "insn".  Convert
25003         call to for_each_rtx with for_each_rtx_in_insn.
25004
25005 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25006
25007         * config/i386/i386.c (setup_incoming_varargs_64): Strengthen local
25008         "label" from rtx to rtx_code_label *.
25009         (ix86_expand_prologue): Likewise.
25010         (ix86_expand_split_stack_prologue): Likewise for locals "label",
25011         "varargs_label".
25012         (ix86_split_idivmod): Likewise for locals "end_label" and
25013         "qimode_label".
25014         (ix86_expand_branch): Likewise for local "label2".
25015         (ix86_expand_aligntest): Likewise for return type and local "label".
25016         (expand_set_or_movmem_via_loop): Likewise for locals "out_label" and
25017         "top_label".
25018         (expand_movmem_epilogue): Likewise for the various locals named
25019         "label".
25020         (expand_setmem_epilogue): Likewise.
25021         (expand_small_movmem_or_setmem): Likewise for local "label".
25022         (expand_set_or_movmem_prologue_epilogue_by_misaligned_moves):
25023         Strengthen param "done_label" from rtx * to rtx_code_label **.
25024         Strengthen locals "loop_label" and "label" from rtx to
25025         rtx_code_label *.
25026         (expand_set_or_movmem_prologue_epilogue_by_misaligned_moves):
25027         Likewise for locals "loop_label", "label".
25028         (ix86_expand_set_or_movmem): Likewise for locals "label",
25029         "jump_around_label", "hot_label".
25030         (ix86_expand_strlensi_unroll_1): Likewise for locals
25031         "align_2_label", align_3_label", "align_4_label", "end_0_label",
25032         "end_2_label".
25033         (x86_emit_floatuns): Likewise for locals "neglab", "donelab".
25034         (void ix86_emit_i387_log1p): Likewise for locals "label1",
25035         "label2", "jump_label".
25036         (ix86_expand_sse_compare_and_jump): Likewise for return type and
25037         local "label".
25038         (ix86_expand_lfloorceil): Likewise for local "label".
25039         (ix86_expand_rint): Likewise.
25040         (ix86_expand_floorceildf_32): Likewise.
25041         (ix86_expand_floorceil): Likewise.
25042         (ix86_expand_rounddf_32): Likewise.
25043         (ix86_expand_trunc): Likewise.
25044         (ix86_expand_truncdf_32): Likewise.
25045         (ix86_expand_round): Likewise.
25046
25047 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25048
25049         * config/h8300/h8300-protos.h (final_prescan_insn): Strengthen
25050         first param from rtx to rtx_insn *.
25051         (h8300_insn_length_from_table): Likewise.
25052         * config/h8300/h8300.c (F): Likewise for return type and param
25053         "x".
25054         (Fpa): Add a checked cast to rtx_insn *.
25055         (h8300_emit_stack_adjustment): Strengthen local "x" from rtx to
25056         rtx_insn *.
25057         (final_prescan_insn): Likewise for param "insn".
25058         (h8300_binary_length): Likewise.
25059         (h8300_insn_length_from_table): Likewise.
25060
25061 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25062
25063         * config/epiphany/epiphany-protos.h (epiphany_final_prescan_insn):
25064         Strengthen first param "insn" from rtx to rtx_insn *.
25065
25066         * config/epiphany/epiphany.c (epiphany_final_prescan_insn):
25067         Likewise.
25068         (frame_insn): Likewise for return type.  Introduce local "insn"
25069         for use in place of local "x" for use as an rtx_insn *.
25070         (frame_move_insn): Strengthen return type from rtx to rtx_insn *.
25071         (epiphany_expand_prologue): Likewise for local "insn".
25072         * config/epiphany/mode-switch-use.c (insert_uses): Likewise.
25073         * config/epiphany/resolve-sw-modes.c
25074         (pass_resolve_sw_modes::execute): Likewise for locals "insn" and
25075         "seq".
25076
25077 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25078
25079         * config/c6x/c6x-protos.h (c6x_get_unit_specifier): Strengthen
25080         param from rtx to rtx_insn *.
25081         (c6x_final_prescan_insn): Likewise for first param.
25082
25083         * config/c6x/c6x.c (c6x_current_insn): Likewise for this variable.
25084         (c6x_output_mi_thunk): Replace use of NULL_RTX with NULL.
25085         (c6x_expand_compare): Strengthen local "insns" from rtx to
25086         rtx_insn *.
25087         (c6x_get_unit_specifier): Likewise for param "insn".
25088         (c6x_print_unit_specifier_field): Likewise.
25089         (c6x_final_prescan_insn): Likewise.
25090         (emit_add_sp_const): Likewise for local "insn".
25091         (c6x_expand_prologue): Likewise.
25092
25093 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25094
25095         * config/bfin/bfin-protos.h (asm_conditional_branch): Strengthen
25096         param 1 from rtx to rtx_insn *.
25097         * config/bfin/bfin.c (expand_prologue_reg_save): Likewise for
25098         the various locals named "insn".
25099         (expand_epilogue_reg_restore): Likewise.
25100         (frame_related_constant_load): Likewise.
25101         (add_to_reg): Likewise.
25102         (emit_link_insn): Likewise.
25103         (do_link): Likewise.
25104         (expand_interrupt_handler_prologue): Likewise.
25105         (branch_dest): Likewise for param "branch".
25106         (asm_conditional_branch): Likewise for param "insn".
25107         (gen_one_bundle): Likewise for elements of param "slot" and local
25108         "t".
25109         (bfin_gen_bundles): Likewise for locals "insn", "next" and
25110         elements of local "slot".
25111         (reorder_var_tracking_notes): Likewise for locals "insn", "next",
25112         "queue", "next_queue", "prev".
25113         (workaround_rts_anomaly): Likewise for locals "insn", "first_insn".
25114         (add_sched_insns_for_speculation): Likewise for local "insn".
25115
25116 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25117
25118         * config/avr/avr-protos.h (output_movqi): Strengthen first param
25119         from rtx to rtx_insn *.
25120         (output_movhi): Likewise.
25121         (output_movsisf): Likewise.
25122         (avr_out_tstsi): Likewise.
25123         (avr_out_tsthi): Likewise.
25124         (avr_out_tstpsi): Likewise.
25125         (avr_out_compare): Likewise.
25126         (avr_out_compare64): Likewise.
25127         (avr_out_movpsi): Likewise.
25128         (ashlqi3_out): Likewise.
25129         (ashlhi3_out): Likewise.
25130         (ashlsi3_out): Likewise.
25131         (ashrqi3_out): Likewise.
25132         (ashrhi3_out): Likewise.
25133         (ashrsi3_out): Likewise.
25134         (lshrqi3_out): Likewise.
25135         (lshrhi3_out): Likewise.
25136         (lshrsi3_out): Likewise.
25137         (avr_out_ashlpsi3): Likewise.
25138         (avr_out_ashrpsi3): Likewise.
25139         (avr_out_lshrpsi3): Likewise.
25140         (avr_out_fract): Likewise.
25141         (avr_out_sbxx_branch): Likewise.
25142         (avr_out_round): Likewise.
25143         (avr_out_xload): Likewise.
25144         (avr_out_movmem): Likewise.
25145         (adjust_insn_length): Likewise.
25146         (avr_out_lpm): Likewise.
25147         (reg_unused_after): Likewise.
25148         (_reg_unused_after): Likewise.
25149         (avr_jump_mode): Likewise for second param.
25150         (jump_over_one_insn): Likewise for first param.
25151         (avr_final_prescan_insn): Likewise.
25152         (out_shift_with_cnt): Likewise for second param.
25153
25154         * config/avr/avr.c (get_sequence_length): Likewise for param
25155         "insns" and local "insn".
25156         (emit_push_byte): Likewise for local "insn".
25157         (emit_push_sfr): Likewise.
25158         (avr_prologue_setup_frame): Likewise for locals "insn",
25159         "fp_plus_insns", "sp_plus_insns".
25160         (avr_expand_epilogue): Likewise for local "fp_plus_insns",
25161         "sp_plus_insns".
25162         (avr_jump_mode): Likewise for param "insn".
25163         (avr_final_prescan_insn): Likewise.
25164         (avr_find_unused_d_reg): Likewise.
25165         (avr_out_lpm_no_lpmx): Likewise.
25166         (avr_out_lpm): Likewise.
25167         (avr_out_xload): Likewise.
25168         (output_movqi): Likewise.
25169         (output_movhi): Likewise.
25170         (out_movqi_r_mr): Likewise.
25171         (out_movhi_r_mr): Likewise.
25172         (out_movsi_r_mr): Likewise.
25173         (out_movsi_mr_r): Likewise.
25174         (output_movsisf): Likewise.
25175         (avr_out_load_psi): Likewise.
25176         (avr_out_store_psi): Likewise.
25177         (avr_out_movpsi): Likewise.
25178         (out_movqi_mr_r): Likewise.
25179         (avr_out_movhi_mr_r_xmega): Likewise.
25180         (out_movhi_mr_r): Likewise.
25181         (compare_condition): Likewise for param "insn" and local "next".
25182         (compare_sign_p): Likewise for param "insn".
25183         (compare_diff_p): Likewise.
25184         (compare_eq_p): Likewise.
25185         (avr_out_compare): Likewise.
25186         (avr_out_compare64): Likewise.
25187         (avr_out_tsthi): Likewise.
25188         (avr_out_tstpsi): Likewise.
25189         (avr_out_tstsi): Likewise.
25190         (out_shift_with_cnt): Likewise.
25191         (ashlqi3_out): Likewise.
25192         (ashlhi3_out): Likewise.
25193         (avr_out_ashlpsi3): Likewise.
25194         (ashlsi3_out): Likewise.
25195         (ashrqi3_out): Likewise.
25196         (ashrhi3_out): Likewise.
25197         (avr_out_ashrpsi3): Likewise.
25198         (ashrsi3_out): Likewise.
25199         (lshrqi3_out): Likewise.
25200         (lshrhi3_out): Likewise.
25201         (avr_out_lshrpsi3): Likewise.
25202         (lshrsi3_out): Likewise.
25203         (avr_out_fract): Likewise.
25204         (avr_out_round): Likewise.
25205         (avr_adjust_insn_length): Likewise.
25206         (reg_unused_after): Likewise.
25207         (_reg_unused_after): Likewise.
25208         (avr_compare_pattern): Likewise.
25209         (avr_reorg_remove_redundant_compare): Likewise for param "insn1"
25210         and locals "branch1", "branch2", "insn2", "jump".
25211         (avr_reorg): Likewise for local "insn".
25212         (avr_2word_insn_p): Likewise for param "insn".
25213         (jump_over_one_insn_p): Likewise.
25214         (avr_out_sbxx_branch): Likewise.
25215         (avr_out_movmem): Likewise.
25216
25217 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25218
25219         * config/arm/arm-protos.h (arm_final_prescan_insn): Strengthen
25220         param from rtx to rtx_insn *.
25221         (thumb1_final_prescan_insn): Likewise.
25222         (thumb2_final_prescan_insn): Likewise.
25223
25224         * config/arm/arm.c (emit_set_insn): Strengthen return type from
25225         rtx to rtx_insn *.
25226         (struct minipool_node): Likewise for field "insn".
25227         (dump_minipool): Likewise for param "scan".
25228         (create_fix_barrier): Likewise for local "from".  Strengthen local
25229         "label" from rtx to rtx_code_label *.
25230         (push_minipool_barrier): Strengthen param "insn" from rtx to
25231         rtx_insn *.
25232         (push_minipool_fix): Likewise.
25233         (note_invalid_constants): Likewise.
25234         (thumb2_reorg): Likewise for local "insn".
25235         (arm_reorg): Likewise.
25236         (thumb2_final_prescan_insn): Likewise for param
25237         "insn" and local "first_insn".
25238         (arm_final_prescan_insn): Likewise for param "insn" and locals
25239         "start_insn", "this_insn".
25240         (arm_debugger_arg_offset): Likewise for param "insn".
25241         (thumb1_emit_multi_reg_push): Likewise for return type and local
25242         "insn".
25243         (thumb1_final_prescan_insn): Likewise for param "insn".
25244         (thumb_far_jump_used_p): Likewise for local "insn".
25245         (thumb1_expand_prologue): Likewise.
25246         (arm_expand_epilogue_apcs_frame): Likewise.
25247         (arm_expand_epilogue): Likewise for locals "insn", "tmp".
25248         (arm_split_compare_and_swap): Strengthen locals "label1", "label2"
25249         from rtx to rtx_code_label *.
25250         (arm_split_atomic_op): Likewise for local "label".
25251         (arm_emit_coreregs_64bit_shift): Likewise for local "done_label".
25252
25253 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25254
25255         * config/arc/arc-protos.h (arc_final_prescan_insn): Strengthen
25256         first param from rtx to rtx_insn *.
25257         (arc_verify_short): Likewise.
25258         (arc_short_long): Likewise.
25259         (arc_need_delay): Likewise.
25260
25261         * config/arc/arc.c (struct arc_ccfsm): Likewise for field
25262         "target_insn".
25263         (arc_ccfsm_advance): Likewise for param "insn" and locals
25264         "start_insn", "this_insn".
25265         (arc_ccfsm_record_condition): Likewise for local "seq_insn".
25266         (arc_ccfsm_post_advance): Likewise for param "insn".
25267         (arc_next_active_insn): Likewise for return type and param "insn".
25268         Convert NULL_RTX to NULL as appropriate.  Add a checked cast.
25269         (arc_verify_short): Strengthen param "insn" from rtx to rtx_insn *.
25270         (output_short_suffix): Likewise for local "insn".
25271         (arc_final_prescan_insn): Likewise for param "insn".  Remove
25272         now-redundant checked cast.
25273         (arc_reorg): Strengthen locals "insn", "top_label", "lp", "prev",
25274         "lp_simple", "next", "mov", "scan", "link_insn" from rtx to
25275         rtx_insn *.  Add a checked cast.  Introduce local "lc_set_insn"
25276         for use where lc_set became an insn.
25277         (arc_adjust_insn_length): Strengthen locals "prev", "succ" from
25278         rtx to rtx_insn *.
25279         (arc_get_insn_variants): Likewise for local "prev".
25280         (arc_ifcvt): Likewise for locals "insn", "seq", "prev", "pprev",
25281         "next".
25282         (arc_predicate_delay_insns): Likewise for local "insn".
25283         (arc_pad_return): Likewise for local "prev".  For now, add a
25284         checked cast when extracting the insn from "final_sequence".
25285         (arc_short_long): Likewise for param "insn".
25286         (arc_need_delay): Likewise for param "insn" and local "next".
25287         (arc_label_align): Likewise for locals "prev", "next".
25288
25289 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25290
25291         * config/alpha/alpha.c (alpha_emit_set_const): Strengthen local
25292         "insn" from rtx to rtx_insn *.
25293         (alpha_gp_save_rtx): Likewise for local "seq".
25294         (alpha_instantiate_decls): Likewise for local "top".
25295         (get_some_local_dynamic_name): Likewise for local "insn".
25296         (alpha_does_function_need_gp): Likewise.
25297         (set_frame_related_p): Likewise for return type and for locals
25298         "seq" and "insn".
25299         (emit_frame_store_1): Likewise for local "insn".
25300         (alpha_expand_prologue): Likewise for locals "insn", "seq".
25301         (alpha_end_function): Likewise for local "insn".
25302         (alpha_output_mi_thunk_osf): Likewise.
25303         (alphaev4_insn_pipe): Likewise for param "insn".
25304         (alphaev5_insn_pipe): Likewise.
25305         (alphaev4_next_group): Likewise for return type and param 1
25306         "insn".
25307         (alphaev5_next_group): Likewise.
25308         (alpha_align_insns_1): Likewise for return type and param 1 of
25309         callback param "next_group", and for locals "i", "next", "prev",
25310         "where", "where2", "insn".
25311
25312 2014-08-25  Bernd Schmidt  <bernds@codesourcery.com>
25313
25314         * tree-nested.c (finalize_nesting_tree_1): Initialize temporary earlier
25315         rather than modifying the stmt.
25316
25317 2014-08-25  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
25318
25319         * config/rs6000/rs6000.c (rs6000_return_in_msb): Fix fallout from
25320         cgraph_state conversion.
25321
25322 2014-08-25  David Malcolm  <dmalcolm@redhat.com>
25323
25324         * config/aarch64/aarch64.c (aarch64_load_symref_appropriately):
25325         Strengthen local "insns" from rtx to rtx_insn *.
25326         (aarch64_set_frame_expr): Likewise for local "insn".
25327         (aarch64_save_or_restore_fprs): Likewise.
25328         (aarch64_save_or_restore_callee_save_registers): Likewise.
25329         (aarch64_expand_prologue): Likewise.
25330         (aarch64_expand_epilogue): Likewise.
25331         (aarch64_output_mi_thunk): Likewise.
25332         (aarch64_split_compare_and_swap): Strengthen locals "label1" and
25333         "label2" from rtx to rtx_code_label *.
25334         (aarch64_split_atomic_op): Likewise for local "label".
25335
25336 2014-08-25  Martin Liska  <mliska@suse.cz>
25337
25338         * cgraph.h (symtab_node):
25339         (bool needed_p (void)): created from decide_is_symbol_needed
25340         (bool referred_to_p (void)): created from referred_to_p
25341         (static cgraph_node *get_for_asmname (tree asmname)):
25342         created from symtab_node_for_asm
25343         * cgraph.h (cgraph_node):
25344         (void assemble_thunks_and_aliases (void)):
25345         created from assemble_thunks_and_aliases
25346         (void expand (void)): created from expand_function
25347         (static void finalize_function (tree, bool)):
25348         created from cgraph_finalize_function
25349         (static cgraph_local_info *local_info (tree decl)):
25350         created from cgraph_local_info
25351         (static cgraph_global_info *global_info (tree)):
25352         created from cgraph_global_info
25353         (static cgraph_rtl_info *rtl_info (tree)): created from cgraph_rtl_info
25354         * cgraph.h (varpool_node):
25355         (static void add (tree decl): created from varpool_add_new_variable
25356         * cgraph.h (cgraph_edge):
25357         void remove (void);
25358         (void remove_caller (void)): created from cgraph_edge_remove_caller
25359         (void remove_callee (void)): created from cgraph_edge_remove_callee
25360         (void set_call_stmt (gimple new_stmt, bool update_speculative = true)):
25361         created from cgraph_set_call_stmt
25362         (void redirect_callee (cgraph_node *n)): created from
25363         cgraph_redirect_edge_callee
25364         (cgraph_edge *make_direct (cgraph_node *callee)): created from
25365         cgraph_make_edge_direct
25366         (cgraph_edge *make_speculative (cgraph_node *n2, gcov_type direct_count,
25367         gimple redirect_call_stmt_to_callee (void)): created from
25368         cgraph_turn_edge_to_speculative
25369         (void speculative_call_info (cgraph_edge *&direct,
25370         cgraph_edge *&indirect, ipa_ref *&reference)): created from
25371         cgraph_speculative_call_info
25372         (cgraph_edge * clone (cgraph_node *n, gimple call_stmt,
25373         unsigned stmt_uid, gcov_type count_scale,
25374         int freq_scale, bool update_original)): created from cgraph_clone_edge
25375         (cgraph_edge *resolve_speculation (tree callee_decl)):
25376         created from cgraph_resolve_speculation
25377         (bool cannot_lead_to_return_p (void)): created from
25378         cannot_lead_to_return_p
25379         (bool recursive_p (void)): created from cgraph_edge_recursive_p
25380         (bool maybe_hot_p (void)): created from cgraph_maybe_hot_edge_p
25381         (static unsigned int rebuild_edges (void)): created from
25382         rebuild_cgraph_edges
25383         (static void rebuild_references (void)): created from
25384         cgraph_rebuild_references
25385         * cgraph.h (symbol_table):
25386         (create_reference): renamed from add_reference
25387         (maybe_create_reference): renamed from maybe_add_reference
25388         (void register_symbol (symtab_node *node)): new function
25389         (void clear_asm_symbols (void)): new function
25390         (void unregister (symtab_node *node)): new function
25391         (void release_symbol (cgraph_node *node, int uid)): new function
25392         (cgraph_node * allocate_cgraph_symbol (void)): new function
25393         (void initialize (void)): created from cgraph_init
25394         (symtab_node *first_symbol (void)):new function
25395         (asm_node *first_asm_symbol (void)):new function
25396         (symtab_node *first_defined_symbol (void)):new function
25397         (varpool_node *first_variable (void)):new function
25398         (varpool_node *next_variable (varpool_node *node)):new function
25399         (varpool_node *first_static_initializer (void)):new function
25400         (varpool_node *next_static_initializer (varpool_node *node)):new
25401         function
25402         (varpool_node *first_defined_variable (void)):new function
25403         (varpool_node *next_defined_variable (varpool_node *node)):new function
25404         (cgraph_node *first_defined_function (void)):new function
25405         (cgraph_node *next_defined_function (cgraph_node *node)):new function
25406         (cgraph_node *first_function (void)):new function
25407         (cgraph_node *next_function (cgraph_node *node)):new function
25408         (cgraph_node *first_function_with_gimple_body (void)):new function
25409         (asm_node *finalize_toplevel_asm (tree asm_str)): created from
25410         add_asm_node
25411         (bool remove_unreachable_nodes (bool before_inlining_p, FILE *file)):
25412         created from symtab_remove_unreachable_nodes
25413         (void remove_unreferenced_decls (void)): created from
25414         varpool_remove_unreferenced_decls
25415         (void process_new_functions (void)): created from
25416         cgraph_process_new_functions
25417         (void process_same_body_aliases (void)): created from
25418         cgraph_process_same_body_aliases
25419         (bool output_variables (void)): created from
25420         varpool_node::output_variables
25421         (void output_asm_statements (void)): created from output_asm_statements
25422         (void finalize_compilation_unit (void)): created from
25423         finalize_compilation_unit
25424         (void compile (void)): created from compile
25425         (void output_weakrefs (void)): created from output_weakrefs
25426         (cgraph_node *create_empty (void)): created from
25427         cgraph_node::create_empty
25428         (cgraph_edge *create_edge (cgraph_node *caller, cgraph_node *callee,
25429         gimple call_stmt, gcov_type count, int freq,
25430         bool indir_unknown_callee)): created from cgraph_node::create_edge
25431         (void free_edge (cgraph_edge *e)): created from cgraph_free_edge
25432         (cgraph_node *next_function_with_gimple_body (cgraph_node *node)):
25433         created from cgraph_next_function_with_gimple_body
25434         (void remove_edge_removal_hook (cgraph_edge_hook_list *)):
25435         created from cgraph_remove_edge_removal_hook
25436         (cgraph_node_hook_list *add_cgraph_removal_hook (cgraph_node_hook,
25437         void *)): created from cgraph_add_node_removal_hook
25438         (void remove_cgraph_removal_hook (cgraph_node_hook_list *)):
25439         created from cgraph_remove_node_removal_hook
25440         (varpool_node_hook_list *add_varpool_removal_hook (varpool_node_hook,
25441         void *)): created from varpool_add_node_removal_hook
25442         (void remove_varpool_removal_hook (varpool_node_hook_list *)):
25443         created from varpool_remove_node_removal_hook
25444         (cgraph_node_hook_list *add_cgraph_insertion_hook (cgraph_node_hook,
25445         void *)): created from cgraph_add_function_insertion_hook
25446         (void remove_cgraph_insertion_hook (cgraph_node_hook_list *)):
25447         created from cgraph_remove_function_insertion_hook
25448         (varpool_node_hook_list *add_varpool_insertion_hook (varpool_node_hook,
25449         void *)): created from varpool_add_variable_insertion_hook
25450         (void remove_varpool_insertion_hook (varpool_node_hook_list *)):
25451           created from varpool_remove_variable_insertion_hook
25452         (cgraph_2edge_hook_list *add_edge_duplication_hook (cgraph_2edge_hook,
25453         void *)): created from cgraph_add_edge_duplication_hook
25454         (void remove_edge_duplication_hook (cgraph_2edge_hook_list *)):
25455         created from cgraph_remove_edge_duplication_hook
25456         (cgraph_2node_hook_list *add_cgraph_duplication_hook (cgraph_2node_hook,
25457         void *)): created from cgraph_add_node_duplication_hook
25458         (void remove_cgraph_duplication_hook (cgraph_2node_hook_list *)):
25459         created from cgraph_remove_node_duplication_hook
25460         (void call_edge_removal_hooks (cgraph_edge *e)):
25461         created from cgraph_call_edge_removal_hooks
25462         (void call_cgraph_insertion_hooks (cgraph_node *node)):
25463         created from call_function_insertion_hooks
25464         (void call_cgraph_removal_hooks (cgraph_node *node)):
25465         created from cgraph_call_node_removal_hooks
25466         (void call_cgraph_duplication_hooks (cgraph_node *node,
25467         cgraph_node *node2)): created from cgraph_node::call_duplication_hooks
25468         (void call_edge_duplication_hooks (cgraph_edge *cs1, cgraph_edge *cs2)):
25469         created from cgraph_call_edge_duplication_hooks
25470         (void call_varpool_removal_hooks (varpool_node *node)):
25471         created from varpool_call_node_removal_hooks
25472         (void call_varpool_insertion_hooks (varpool_node *node)):
25473         created from varpool_call_variable_insertion_hooks
25474         (void insert_to_assembler_name_hash (symtab_node *node,
25475         bool with_clones)): created from insert_to_assembler_name_hash
25476         (void unlink_from_assembler_name_hash (symtab_node *node,
25477         bool with_clones)): created from unlink_from_assembler_name_hash
25478         (void symtab_prevail_in_asm_name_hash (symtab_node *node)):
25479         created from symtab_prevail_in_asm_name_hash
25480         (void symtab_initialize_asm_name_hash (void)):
25481         created from symtab_initialize_asm_name_hash
25482         (void change_decl_assembler_name (tree decl, tree name)):
25483         created from change_decl_assembler_name
25484         (void materialize_all_clones (void)): created from
25485         cgraph_materialize_all_clones
25486         (static hashval_t decl_assembler_name_hash (const_tree asmname)):
25487         created from decl_assembler_name_hash
25488         (static bool decl_assembler_name_equal (tree decl, const_tree asmname)):
25489         created from decl_assembler_name_equal
25490         (static hashval_t hash_node_by_assembler_name (const void *p)):
25491         created from hash_node_by_assembler_name
25492         (static int eq_assembler_name (const void *p1, const void *p2)):
25493         created from eq_assembler_name
25494
25495 2014-08-25  Marek Polacek  <polacek@redhat.com>
25496
25497         * config/i386/i386.md (SWI1248_AVX512BW): Add missing paren.
25498
25499 2014-08-25  Petr Murzin  <petr.murzin@intel.com>
25500
25501         * config/i386/i386.md (SWI1248_AVX512BW): New mode iterator.
25502         (*k<logic><mode>): Add *k<logic>qi and *k<logic>hi and use
25503         SWI1248_AVX512BW mode iterator.
25504
25505 2014-08-25  Kaz Kojima  <kkojima@gcc.gnu.org>
25506
25507         PR target/62111
25508         * config/sh/predicates.md (general_extend_operand): Disable
25509         TRUNCATE before reload completes.
25510
25511 2014-08-24  Gerald Pfeifer  <gerald@pfeifer.com>
25512
25513         * doc/invoke.texi (Optimize Options): Fix markup in two cases.
25514
25515 2014-08-24  Oleg Endo  <olegendo@gcc.gnu.org>
25516
25517         PR target/61996
25518         * config/sh/sh.opt (musermode): Allow negative form.
25519         * config/sh/sh.c (sh_option_override): Disable TARGET_USERMODE for
25520         targets that don't support it.
25521         * doc/invoke.texi (SH Options): Rename sh-*-linux* to sh*-*-linux*.
25522         Document -mno-usermode option.
25523
25524 2014-08-24  Kito Cheng  <kito@0xlab.org>
25525
25526         * system.h (CALLER_SAVE_PROFITABLE): Poison.
25527         * regs.h (CALLER_SAVE_PROFITABLE): Remove.
25528         * doc/tm.texi.in (CALLER_SAVE_PROFITABLE): Remove.
25529         * doc/tm.texi: Regenerate.
25530
25531 2014-08-24  Kito Cheng  <kito@0xlab.org>
25532
25533         * ira.c: Fix typo in comment.
25534
25535 2014-08-23  Edward Smith-Rowland  <3dw4rd@verizon.net>
25536
25537         * doc/invoke.texi: Change c++1y to c++14 and gnu++1y to gnu++14.
25538         Deprecate c++1y. Change language to reflect greater confidence in C++14.
25539
25540 2014-08-23  John David Anglin  <danglin@gcc.gnu.org>
25541
25542         PR target/62038
25543         * config/pa/pa.c (pa_output_function_epilogue): Don't set
25544         last_address when the current function is a thunk.
25545         (pa_asm_output_mi_thunk): When we don't have named sections or they
25546         are not being used, check that thunk can reach the stub table with a
25547         short branch.
25548
25549 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25550
25551         * web.c (union_match_dups): Strengthen param "insn" from rtx to
25552         rtx_insn *.
25553         (pass_web::execute): Likewise for local "insn".
25554
25555 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25556
25557         * var-tracking.c (struct micro_operation_def): Strengthen field
25558         "insn" from rtx to rtx_insn *.
25559         (struct emit_note_data_def): Likewise.
25560         (insn_stack_adjust_offset_pre_post): Likewise for param "insn".
25561         (vt_stack_adjustments): Likewise for local "insn".
25562         (adjust_insn): Likewise for param "insn".
25563         (val_store): Likewise.
25564         (val_resolve): Likewise.
25565         (struct count_use_info): Likewise for field "insn".
25566         (log_op_type): Likewise for param "insn".
25567         (reverse_op): Likewise.
25568         (prepare_call_arguments): Likewise.
25569         (add_with_sets):  The initial param takes an insn, but we can't
25570         yet strengthen it from rtx to rtx_insn * since it's used as a
25571         cselib_record_sets_hook callback.  For now rename initial param
25572         from "insn" to "uncast_insn", and introduce a local "insn" of
25573         the stronger rtx_insn * type, with a checked cast.
25574         (compute_bb_dataflow): Strengthen local "insn" from rtx to
25575         rtx_insn *.
25576         (emit_note_insn_var_location): Likewise.
25577         (emit_notes_for_changes): Likewise.
25578         (emit_notes_for_differences): Likewise.
25579         (next_non_note_insn_var_location): Likewise for return type and
25580         for param "insn".
25581         (emit_notes_in_bb): Likewise for locals "insn" and "next_insn".
25582         (vt_initialize): Likewise for local "insn".
25583         (delete_debug_insns): Likewise for locals "insn" and "next".
25584
25585 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25586
25587         * varasm.c (mark_constants): Strengthen param "insn" from rtx to
25588         rtx_insn *.
25589         (mark_constant_pool): Likewise for local "insn".
25590
25591 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25592
25593         * valtrack.c (dead_debug_reset_uses): Strengthen local "insn" from
25594         rtx to rtx_insn *.
25595         (dead_debug_promote_uses): Likewise.
25596         (dead_debug_insert_temp): Likewise.
25597
25598 2014-08-23  David Malcolm  <dmalcolm@redhat.com>
25599
25600         * store-motion.c (store_killed_in_insn): Strengthen param "insn"
25601         from const_rtx to const rtx_insn *.
25602         (store_killed_after): Likewise.  Strengthen locals "last", "act"
25603         from rtx to rtx_insn *.
25604         (store_killed_before): Strengthen param "insn" from const_rtx to
25605         const rtx_insn *.  Strengthen local "first" from rtx to rtx_insn *.
25606         (find_moveable_store): Strengthen param "insn" from rtx to
25607         rtx_insn *.
25608         (compute_store_table): Likewise for local "insn".
25609         (insert_insn_start_basic_block): Likewise for param "insn" and
25610         locals "prev", "before", "insn".
25611         (insert_store): For now, add a checked cast to rtx_insn * on the
25612         result of gen_move_insn.
25613         (remove_reachable_equiv_notes): Strengthen local "insn" from rtx
25614         to rtx_insn *.
25615         (replace_store_insn): Likewise.  For now, add a checked cast to
25616         rtx_insn * on the result of gen_move_insn.
25617
25618 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25619
25620         * stmt.c (expand_case): Strengthen local "before_case" from rtx to
25621         rtx_insn *.
25622         (expand_sjlj_dispatch_table): Likewise.
25623
25624 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25625
25626         * stack-ptr-mod.c (pass_stack_ptr_mod::execute): Strengthen local
25627         "insn" from rtx to rtx_insn *.
25628
25629 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25630
25631         * shrink-wrap.h (requires_stack_frame_p): Strengthen param 1
25632         "insn" from rtx to rtx_insn *.
25633         (dup_block_and_redirect): Likewise for param 3 "before".
25634
25635         * shrink-wrap.c (requires_stack_frame_p): Strengthen param "insn"
25636         from rtx to rtx_insn *.
25637         (move_insn_for_shrink_wrap): Likewise.
25638         (prepare_shrink_wrap): Likewise for locals "insn", "curr".
25639         (dup_block_and_redirect): Likewise for param "before" and local
25640         "insn".
25641         (try_shrink_wrapping): Likewise for locals "insn", "insert_point",
25642         "end".
25643         (convert_to_simple_return): Likewise for local "start".
25644
25645         * config/i386/i386.c (ix86_finalize_stack_realign_flags):
25646         Strengthen local "insn" from rtx to rtx_insn *, for use when
25647         invoking requires_stack_frame_p.
25648
25649 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25650
25651         * sel-sched-ir.c (vinsn_copy): Strengthen local "copy" from rtx to
25652         rtx_insn *.
25653         (speculate_expr): Likewise for locals "orig_insn_rtx",
25654         "spec_insn_rtx".
25655         (eq_transformed_insns): Likewise for locals "i1", "i2".
25656         (check_for_new_jump): Likewise for return type and local "end".
25657         (find_new_jump): Likewise for return type and local "jump".
25658         (sel_split_edge): Likewise for local "jump".
25659         (sel_create_recovery_block): Likewise.
25660         (sel_redirect_edge_and_branch_force): Likewise.
25661         (sel_redirect_edge_and_branch): Likewise.
25662
25663 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25664
25665         * sel-sched.c (substitute_reg_in_expr): Strengthen local
25666         "new_insn" from rtx to rtx_insn *.
25667         (create_insn_rtx_with_rhs): Likewise for return type and for local
25668         "insn_rtx".
25669         (create_insn_rtx_with_lhs): Likewise.
25670         (create_speculation_check): Likewise for local "insn_rtx".
25671         (implicit_clobber_conflict_p): Likewise for local "insn".
25672         (get_expr_cost): Likewise.
25673         (emit_bookkeeping_insn): Likewise for local "new_insn_rtx".
25674         (move_cond_jump): Likewise for locals "next", "prev", "link",
25675         "head", "from", "to".
25676
25677 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25678
25679         * sched-rgn.c (is_cfg_nonregular): Strengthen locals "insn" and
25680         "next" from rtx to rtx_insn *.
25681         (find_conditional_protection): Likewise for local "next".
25682         (is_conditionally_protected): Likewise for local "insn1".
25683         (is_pfree): Likewise for locals "insn1", "insn2".
25684
25685 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25686
25687         * sched-int.h (schedule_ebb): Strengthen params "head", "tail"
25688         from rtx to rtx_insn *.
25689
25690         * sched-ebb.c (earliest_block_with_similiar_load): Strengthen
25691         locals "insn1", "insn2" from rtx to rtx_insn *.
25692         (add_deps_for_risky_insns): Likewise for params "head", "tail" and
25693         locals "insn", "prev", "last_jump", "next_tail".
25694         (schedule_ebb): Likewise for params "head", "tail".
25695         (schedule_ebbs): Likewise for locals "tail", "head".
25696
25697         * config/c6x/c6x.c (hwloop_optimize): For now, add a checked cast
25698         to rtx_insn on "last_insn" in one of the invocations of
25699         schedule_ebb.
25700
25701 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25702
25703         * sched-deps.c (maybe_add_or_update_dep_1): Strengthen locals
25704         "elem", "insn" from rtx to rtx_insn *.
25705         (change_spec_dep_to_hard): Likewise.
25706         (get_back_and_forw_lists): Likewise for local "con".
25707         (sd_add_dep): Likewise for locals "elem", "insn".
25708         (sd_resolve_dep): Likewise for locals "pro", "con".
25709         (sd_unresolve_dep): Likewise.
25710         (sd_delete_dep): Likewise.
25711         (chain_to_prev_insn): Likewise for local "pro".
25712         (find_inc): Likewise for locals "pro", "con".
25713
25714 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25715
25716         * rtlanal.c (reg_used_between_p): Strengthen local "insn" from rtx
25717         to rtx_insn *.
25718         (reg_set_between_p): Strengthen local "insn" from const_rtx to
25719         const rtx_insn *.
25720         (modified_between_p): Strengthen local "insn" from rtx to
25721         rtx_insn *.
25722         (remove_reg_equal_equiv_notes_for_regno): Likewise.
25723         (keep_with_call_p): Strengthen local "i2" from const_rtx to
25724         const rtx_insn *.
25725
25726 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25727
25728         * resource.c (next_insn_no_annul): Strengthen local "next" from
25729         rtx to rtx_insn *.
25730         (mark_referenced_resources): Likewise for local "insn".
25731
25732 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25733
25734         * reload.h (struct insn_chain): Strengthen field "insn" from rtx
25735         to rtx_insn *.
25736         (find_reloads): Likewise for param 1.
25737         (subst_reloads): Likewise for sole param.
25738         (find_equiv_reg): Likwise for param 2.
25739         (regno_clobbered_p): Likwise for param 2.
25740         (reload): Likewise for param 1.
25741
25742         * caller-save.c (save_call_clobbered_regs): Strengthen local
25743         "insn" from rtx to rtx_insn *.
25744         (insert_one_insn): Likewise for local "insn".
25745
25746         * reload.c (this_insn): Likewise for this global.
25747         (find_reloads): Likewise for param "insn".
25748         (find_reloads_toplev): Likewise.
25749         (find_reloads_address): Likewise.
25750         (subst_reg_equivs): Likewise.
25751         (update_auto_inc_notes): Likewise.
25752         (find_reloads_address_1): Likewise.
25753         (find_reloads_subreg_address): Likewise.
25754         (subst_reloads): Likewise.
25755         (find_equiv_reg): Likewise, also for local "p".
25756         (regno_clobbered_p): Likewise for param "insn".
25757
25758         * reload1.c (reg_reloaded_insn): Likewise for the elements of this
25759         array.
25760         (spill_reg_store): Likewise for the elements of this array.
25761         (remove_init_insns): Likewise for local "equiv_insn".
25762         (will_delete_init_insn_p): Likewise for param "insn".
25763         (reload): Likewise for param ""first" and local "insn".
25764         (calculate_needs_all_insns): Strengthen local "insn" from rtx to
25765         rtx_insn *.
25766         (calculate_elim_costs_all_insns): Likewise.
25767         (delete_caller_save_insns): Likewise.
25768         (spill_failure): Likewise for param "insn".
25769         (delete_dead_insn): Likewise.
25770         (set_label_offsets): Likewise.
25771         (eliminate_regs_in_insn): Likewise, also for locals "base_insn" and
25772         "prev_insn".
25773         (elimination_costs_in_insn): Likewise for param "insn".
25774         (set_initial_eh_label_offset): Replace use of NULL_RTX with NULL
25775         when referring to an insn.
25776         (set_initial_label_offsets): Likewise.
25777         (set_offsets_for_label): Strengthen param "insn" from rtx to
25778         rtx_insn *.
25779         (init_eliminable_invariants): Likewise for param "first" and local
25780         "insn".
25781         (fixup_eh_region_note): Likewise for param "insn".
25782         (reload_as_needed): Likewise for locals "prev", "insn",
25783         "old_next", "old_prev", "next".
25784         (gen_reload_chain_without_interm_reg_p): Likewise for locals "insn",
25785         "last".
25786         (reload_inheritance_insn): Strengthen elements of this array from
25787         rtx to rtx_insn *.
25788         (failed_reload): Likewise for param "insn".
25789         (choose_reload_regs): Likewise for local "insn".  Replace use of
25790         NULL_RTX with NULL when referring to an insn.
25791         (input_reload_insns): Strengthen elements of this array from rtx
25792         to rtx_insn *.
25793         (other_input_address_reload_insns): Likewise for this global.
25794         (other_input_reload_insns): Likewise for this global.
25795         (input_address_reload_insns): Likwise for the elements of this
25796         array.
25797         (inpaddr_address_reload_insns): Likwise for the elements of this
25798         array.
25799         (output_reload_insns): Likewise for the elements of this array.
25800         (output_address_reload_insns): Likewise for the elements of this
25801         array.
25802         (outaddr_address_reload_insns): Likewise for the elements of this
25803         array.
25804         (operand_reload_insns): Likewise for this global.
25805         (other_operand_reload_insns): Likewise for this global.
25806         (other_output_reload_insns): Likewise for the elements of this
25807         array.
25808         (new_spill_reg_store): Likewise for the elements of this
25809         array.
25810         (emit_input_reload_insns): Likewise for locals "insn", "temp".
25811         Strengthen local "where" from rtx * to rtx_insn **.
25812         (emit_output_reload_insns): Strengthen locals "insn", "p", "next"
25813         from rtx to rtx_insn *.
25814         (do_input_reload): Likewise for local "insn".
25815         (do_output_reload): Likewise for local "insn".
25816         (emit_reload_insns): Likewise for locals "insn" and "store_insn".
25817         (emit_insn_if_valid_for_reload): Likewise for return type and local
25818         "last".  Add checked cast to rtx_insn when returning "insn" since
25819         this has been through emit_insn.
25820         (gen_reload): Strengthen return type and locals "last", "insn", "set"
25821         from rtx to rtx_insn *.  Add checked cast to rtx_insn when
25822         returning "insn" since it's been through
25823         emit_insn_if_valid_for_reload at this point.
25824         (delete_output_reload): Strengthen param "insn" and locals
25825         "output_reload_insn", "i2" from rtx to rtx_insn *.
25826         (delete_address_reloads): Likewise for params "dead_insn",
25827         "current_insn" and locals "prev", "next".
25828         (delete_address_reloads_1): Likewise for params "dead_insn",
25829         "current_insn" and locals "prev", "i2".
25830         (inc_for_reload): Likewise for locals "last", "add_insn".
25831         (add_auto_inc_notes): Strengthen param "insn" from rtx to
25832         rtx_insn *.
25833
25834         * config/arc/arc-protos.h (regno_clobbered_p): Likewise for 2nd
25835         param of this duplicate of the prototype from reload.h
25836
25837 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25838
25839         * regstat.c (regstat_bb_compute_ri): Strengthen local "insn" from
25840         rtx to rtx_insn *.
25841         (regstat_bb_compute_calls_crossed): Likewise.
25842
25843 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25844
25845         * regrename.c (create_new_chain): Strengthen param "insn" from rtx
25846         to rtx_insn *.
25847         (init_rename_info): Replace use of NULL_RTX with NULL when dealing
25848         with an insn.
25849         (regrename_analyze): Strengthen local "insn" from rtx to
25850         rtx_insn *.
25851         (scan_rtx_reg): Likewise for param "insn".
25852         (scan_rtx_address): Likewise.
25853         (scan_rtx): Likewise.
25854         (restore_operands): Likewise.
25855         (record_out_operands): Likewise.
25856         (build_def_use): Likewise for local "insn".  Replace use of
25857         NULL_RTX with NULL when dealing with an insn.
25858
25859 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25860
25861         * rtl.h (reg_scan): Strengthen param "f" from rtx to rtx_insn *.
25862         * reginfo.c (reg_scan): Likewise, also for local "insn".
25863         (reg_scan_mark_refs): Likewise for param "insn".
25864         (init_subregs_of_mode): Likewise for local "insn".
25865
25866 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25867
25868         * regcprop.c (struct queued_debug_insn_change): Strengthen field
25869         "insn" from rtx to rtx_insn *.
25870         (replace_oldest_value_reg): Likewise for param "insn".
25871         (replace_oldest_value_addr): Likewise.
25872         (replace_oldest_value_mem): Likewise.
25873         (apply_debug_insn_changes): Likewise for local "last_insn".
25874         (copyprop_hardreg_forward_1): Likewise for local "insn".
25875
25876 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25877
25878         * reg-stack.c (next_flags_user): Strengthen return type and param
25879         "insn" from rtx to rtx_insn *.
25880         (straighten_stack): Likewise for param "insn".
25881         (check_asm_stack_operands): Likewise.
25882         (remove_regno_note): Likewise.
25883         (emit_pop_insn): Likewise for return type, param "insn", local
25884         "pop_insn".
25885         (emit_swap_insn):  Strengthen param "insn" and locals "i1", "tmp",
25886         "limit" from rtx to rtx_insn *.
25887         (swap_to_top): Likewise for param "insn".
25888         (move_for_stack_reg): Likewise.
25889         (move_nan_for_stack_reg): Likewise.
25890         (swap_rtx_condition): Likewise.
25891         (compare_for_stack_reg): Likewise.
25892         (subst_all_stack_regs_in_debug_insn): Likewise.
25893         (subst_stack_regs_pat): Likewise, and local "insn2".
25894         (subst_asm_stack_regs): Strengthen param "insn" from rtx to
25895         rtx_insn *.
25896         (subst_stack_regs): Likewise.
25897         (change_stack): Likewise.
25898         (convert_regs_1): Likewise for locals "insn", "next".
25899
25900 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25901
25902         * ree.c (struct ext_cand): Strengthen field "insn" from rtx to
25903         rtx_insn *.
25904         (combine_set_extension): Likewise for param "curr_insn".
25905         (transform_ifelse): Likewise for param "def_insn".
25906         (get_defs): Likewise for param "def_insn".  Strengthen param "dest"
25907         from vec<rtx> * to vec<rtx_insn *> *.
25908         (is_cond_copy_insn): Likewise for param "insn".
25909         (struct ext_state): Strengthen the four vec fields from vec<rtx>
25910         to vec<rtx_insn *>.
25911         (make_defs_and_copies_lists): Strengthen param "extend_insn" and
25912         local "def_insn" from rtx to rtx_insn *.
25913         (get_sub_rtx): Likewise for param "def_insn".
25914         (merge_def_and_ext): Likewise.
25915         (combine_reaching_defs): Likewise.
25916         (add_removable_extension): Likewise for param "insn".
25917         (find_removable_extensions): Likewise for local "insn".
25918         (find_and_remove_re): Likewise for locals "curr_insn" and
25919         "def_insn".  Strengthen locals "reinsn_del_list" and
25920         "reinsn_del_list" from auto_vec<rtx> to auto_vec<rtx_insn *>.
25921
25922 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25923
25924         * recog.c (split_insn): Strengthen param "insn" and locals
25925         "first", "last" from rtx to rtx_insn *.
25926         (split_all_insns): Likewise for locals "insn", "next".
25927         (split_all_insns_noflow): Likewise.
25928
25929 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25930
25931         * rtl.h (debug_rtx_list): Strengthen param 1 "x" from const_rtx to
25932         const rtx_insn *.
25933         (debug_rtx_range): Likewise for params 1 and 2 "start" and "end".
25934         (debug_rtx_find): Likewise for param 1 "x".
25935
25936         * print-rtl.c (debug_rtx_list): Strengthen param 1 "x" from
25937         const_rtx to const rtx_insn *.  Likewise for local "insn".
25938         (debug_rtx_range): Likewise for params 1 and 2 "start" and "end".
25939         (debug_rtx_find): Likewise for param 1 "x".
25940         (print_rtl): Likewise for local "tmp_rtx", adding a checked cast
25941         from const_rtx to const rtx_insn * within the appropriate cases of
25942         the switch statement.
25943
25944         * config/rs6000/rs6000.c (rs6000_debug_legitimize_address):
25945         Strengthen local "insns" from rtx to rtx_insn * since this is
25946         passed to a call to debug_rtx_list.
25947
25948 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25949
25950         * predict.h (predict_insn_def): Strengthen param "insn" from rtx
25951         to rtx_insn *.
25952
25953         * function.c (stack_protect_epilogue): Add checked cast to
25954         rtx_insn for now when invoking predict_insn_def.
25955
25956         * predict.c (predict_insn): Strengthen param "insn" from rtx to
25957         rtx_insn *.
25958         (predict_insn_def): Likewise.
25959         (rtl_predict_edge): Likewise for local "last_insn".
25960         (can_predict_insn_p): Strengthen param "insn" from const_rtx to
25961         const rtx_insn *.
25962         (combine_predictions_for_insn): Strengthen param "insn" from rtx
25963         to rtx_insn *.
25964         (bb_estimate_probability_locally): Likewise for local "last_insn".
25965         (expensive_function_p): Likewise for local "insn".
25966
25967         * config/cris/cris.c (cris_emit_trap_for_misalignment): Likewise for
25968         local "jmp", since this is used when invoking predict_insn_def.
25969
25970 2014-08-22  Marek Polacek  <polacek@redhat.com>
25971
25972         PR c++/62199
25973         * doc/invoke.texi: Update -Wlogical-not-parentheses description.
25974
25975 2014-08-22  Marek Polacek  <polacek@redhat.com>
25976
25977         PR c/61271
25978         * ira-color.c (coalesced_pseudo_reg_slot_compare): Wrap LHS of
25979         a comparison in parens.
25980         * lra-spills.c (pseudo_reg_slot_compare): Wrap LHS of a comparison
25981         in parens.
25982
25983 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
25984
25985         * rtl.h (fis_get_condition): Strengthen param "jump" from rtx to
25986         rtx_insn *.
25987
25988         * cprop.c (fis_get_condition): Likewise.
25989
25990         * postreload.c (reload_cse_regs): Likewise for param "first".
25991         (reload_cse_simplify): Likewise for param "insn".
25992         (reload_cse_regs_1): Likewise for local "insn".
25993         (reload_cse_simplify_set): Likewise for param "insn".
25994         (reload_cse_simplify_operands): Likewise.
25995         (struct reg_use): Likewise for field "insn".
25996         (reload_combine_purge_insn_uses): Likewise for param "insn".
25997         (fixup_debug_insns): Likewise for params "from", "to" and local
25998         "insn".
25999         (try_replace_in_use): Likewise for local "use_insn".
26000         (reload_combine_recognize_const_pattern): Likewise for param
26001         "insn" and locals "add_moved_after_insn", "use_insn".
26002         (reload_combine_recognize_pattern): Likewise for param "insn" and
26003         local "prev".
26004         (reload_combine): Likewise for locals "insn", "prev".
26005         (reload_combine_note_use): Likewise for param "insn".
26006         (move2add_use_add2_insn): Likewise.
26007         (move2add_use_add3_insn): Likewise.
26008         (reload_cse_move2add): Likewise, also for local "next".
26009         (move2add_note_store): Likewise for local "insn".
26010
26011 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26012
26013         * postreload-gcse.c (struct occr): Strengthen field "insn" from
26014         rtx to rtx_insn *.
26015         (struct unoccr): Likewise.
26016         (struct modifies_mem): Likewise.
26017         (alloc_mem): Likewise for local "insn".
26018         (insert_expr_in_table): Likewise for param "insn".
26019         (dump_expr_hash_table_entry): Likewise for local "insn".
26020         (oprs_unchanged_p): Likewise for param "insn".
26021         (load_killed_in_block_p): Likewise for local "setter".
26022         (record_last_reg_set_info): Likewise for param "insn".
26023         (record_last_reg_set_info_regno): Likewise.
26024         (record_last_mem_set_info): Likewise.
26025         (record_last_set_info): Likewise for local "last_set_insn".
26026         (record_opr_changes): Likewise for param "insn".
26027         (hash_scan_set): Likewise.
26028         (compute_hash_table): Likewise for local "insn".
26029         (get_avail_load_store_reg): Likewise for param "insn".
26030         (eliminate_partially_redundant_load): Likewise, also for locals
26031         "avail_insn", "next_pred_bb_end".  Replace use of NULL_RTX with
26032         RTX for insns.
26033         (eliminate_partially_redundant_loads): Likewise for local "insn".
26034
26035 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26036
26037         * optabs.c (expand_doubleword_shift): Strengthen local "insn" from
26038         rtx to rtx_insn *.
26039         (expand_binop): Likewise for locals "entry_last", "last", "insns"
26040         (expand_twoval_unop): Likewise for locals entry_last", "last".
26041         (expand_twoval_binop): Likewise.
26042         (expand_twoval_binop_libfunc): Likewise for local "insns".
26043         (widen_leading): Likewise for local "last".
26044         (expand_doubleword_clz): Likewise for local "seq".  Strengthen
26045         locals "hi0_label", "after_label" from rtx to rtx_code_label *.
26046         (widen_bswap): Strengthen local "last" from rtx to rtx_insn *.
26047         (expand_parity): Likewise for locals "last" and "seq".
26048         (expand_ffs): Likewise for local "seq".  Strengthen local
26049         "nonzero_label" from rtx to rtx_code_label *.
26050         (expand_absneg_bit): Strengthen local "insns" from rtx to
26051         rtx_insn *.
26052         (expand_unop_direct): Likewise for local "last".
26053         (expand_unop): Likewise for locals "last", "insns".
26054         (expand_abs_nojump): Likewise for local "last".
26055         (expand_abs): Strengthen local "op1" from rtx to rtx_code_label *.
26056         (expand_one_cmpl_abs_nojump): Strengthen local "last" from rtx to
26057         rtx_insn *.
26058         (expand_copysign_absneg): Strengthen local "label" from rtx to
26059         rtx_code_label *.
26060         (expand_copysign_bit): Strengthen local "insns" from rtx to
26061         rtx_insn *.
26062         (struct no_conflict_data): Likewise for fields "first", "insn".
26063         (emit_libcall_block_1): Likewise for param "insns" and locals
26064         "next", "last", "insn".
26065         (emit_libcall_block): For now, add a checked cast to rtx_insn *
26066         on "insns" when invoking emit_libcall_block_1.  Ultimately we
26067         want to strengthen insns itself.
26068         (prepare_cmp_insn): Strengthen local "last" from rtx to
26069         rtx_insn *.
26070         (emit_cmp_and_jump_insn_1): Likewise for local "insn".
26071         (prepare_float_lib_cmp): Likewise for local "insns".
26072         (emit_conditional_move): Likewise for local "last".
26073         (emit_conditional_add): Likewise.
26074         (have_sub2_insn): Likewise for local "seq".
26075         (expand_float): Likewise for local "insns".  Strengthen locals
26076         "label", "neglabel" from rtx to rtx_code_label *.
26077         (expand_fix): Likewise for locals "last", "insn", "insns" (to
26078         rtx_insn *) and locals "lab1", "lab2" (to rtx_code_label *).
26079         (expand_fixed_convert): Likewise for local "insns" (to
26080         rtx_insn *).
26081         (expand_sfix_optab): Likewise for local "last".
26082         (expand_compare_and_swap_loop): Strengthen local "label" from rtx
26083         to rtx_code_label *.
26084         (maybe_emit_sync_lock_test_and_set): Strengthen local "last_insn"
26085         from rtx to rtx_insn *.
26086         (expand_atomic_fetch_op): Likewise for local "insn".
26087         (maybe_legitimize_operand_same_code): Likewise for local "last".
26088         (maybe_legitimize_operands): Likewise.
26089
26090 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26091
26092         * modulo-sched.c (struct ps_reg_move_info): Strengthen field
26093         "insn" from rtx to rtx_insn *.
26094         (ps_rtl_insn): Likewise for return type.
26095         (doloop_register_get): Likewise for params "head", "tail" and
26096         locals "insn", "first_insn_not_to_check".
26097         (schedule_reg_move): Likewise for local "this_insn".
26098         (schedule_reg_moves): Add a checked cast to rtx_insn * to result
26099         of gen_move_insn for now.
26100         (reset_sched_times): Strengthen local "insn" from rtx to
26101         rtx_insn *.
26102         (permute_partial_schedule): Likewise.
26103         (duplicate_insns_of_cycles): Likewise for local "u_insn".
26104         (dump_insn_location): Likewise for param "insn".
26105         (loop_canon_p): Likewise for local "insn".
26106         (sms_schedule): Likewise.
26107         (print_partial_schedule): Likewise.
26108         (ps_has_conflicts): Likewise.
26109
26110 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26111
26112         * sched-int.h (get_ebb_head_tail): Strengthen params "headp" and
26113         "tailp" from rtx * to rtx_insn **.
26114
26115         * ddg.c (build_intra_loop_deps): Strengthen locals head", "tail"
26116         from rtx to rtx_insn *.
26117         * haifa-sched.c (get_ebb_head_tail): Strengthen params "headp" and
26118         "tailp" from rtx * to rtx_insn **.  Strengthen locals "beg_head",
26119         "beg_tail", "end_head", "end_tail", "note", "next", "prev" from
26120         rtx to rtx_insn *.
26121         * modulo-sched.c (const_iteration_count): Strengthen return type
26122         and locals "insn", "head", "tail" from rtx to rtx_insn *.  Replace
26123         use of NULL_RTX with NULL when working with insns.
26124         (loop_single_full_bb_p): Strengthen locals "head", "tail" from rtx
26125         to rtx_insn *.
26126         (sms_schedule): Likewise.
26127         * sched-rgn.c (init_ready_list): Likewise, also for locals
26128         "src_head" and "src_next_tail".
26129         (compute_block_dependences): Likewise.
26130         (free_block_dependencies): Likewise.
26131         (debug_rgn_dependencies): Likewise.
26132         (free_rgn_deps): Likewise.
26133         (compute_priorities): Likewise.
26134         (schedule_region): Likewise.
26135         * sel-sched.c (find_ebb_boundaries): Likewise.
26136
26137         * config/sh/sh.c (find_insn_regmode_weight): Strengthen locals
26138         "insn", "next_tail", "head", "tail" from rtx to rtx_insn *.
26139
26140 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26141
26142         * mode-switching.c (struct seginfo): Strengthen field "insn_ptr"
26143         from rtx to rtx_insn *.
26144         (new_seginfo): Likewise for param "insn".
26145         (create_pre_exit): Likewise for locals "last_insn",
26146         "before_return_copy", "return_copy".
26147         (optimize_mode_switching): Likewise for locals "insn", "ins_pos",
26148         "mode_set".
26149
26150 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26151
26152         * lra-int.h (struct lra_insn_recog_data): Strengthen field "insn"
26153         from rtx to rtx_insn *.
26154         (lra_push_insn): Likewise for 1st param.
26155         (lra_push_insn_and_update_insn_regno_info): Likewise.
26156         (lra_pop_insn): Likewise for return type.
26157         (lra_invalidate_insn_data): Likewise for 1st param.
26158         (lra_set_insn_deleted): Likewise.
26159         (lra_delete_dead_insn): Likewise.
26160         (lra_process_new_insns): Likewise for first 3 params.
26161         (lra_set_insn_recog_data): Likewise for 1st param.
26162         (lra_update_insn_recog_data): Likewise.
26163         (lra_set_used_insn_alternative): Likewise.
26164         (lra_invalidate_insn_regno_info): Likewise.
26165         (lra_update_insn_regno_info): Likewise.
26166         (lra_former_scratch_operand_p): Likewise.
26167         (lra_eliminate_regs_1): Likewise.
26168         (lra_get_insn_recog_data): Likewise.
26169
26170         * lra-assigns.c (assign_by_spills): Strengthen local "insn" from
26171         rtx to rtx_insn *.
26172
26173         * lra-coalesce.c (move_freq_compare_func): Likewise for locals
26174         "mv1" and "mv2".
26175         (substitute_within_insn): New.
26176         (lra_coalesce): Strengthen locals "mv", "insn", "next" from rtx to
26177         rtx_insn *.  Strengthen sorted_moves from rtx * to rxt_insn **.
26178         Replace call to "substitute" with call to substitute_within_insn.
26179
26180         * lra-constraints.c (curr_insn): Strengthen from rtx to
26181         rtx_insn *.
26182         (get_equiv_with_elimination): Likewise for param "insn".
26183         (match_reload): Strengthen params "before" and "after" from rtx *
26184         to rtx_insn **.
26185         (emit_spill_move): Likewise for return type.  Add a checked cast
26186         to rtx_insn * on result of gen_move_insn for now.
26187         (check_and_process_move): Likewise for local "before".  Replace
26188         NULL_RTX with NULL when referring to insns.
26189         (process_addr_reg): Strengthen params "before" and "after" from
26190         rtx * to rtx_insn **.
26191         (insert_move_for_subreg): Likewise.
26192         (simplify_operand_subreg): Strengthen locals "before" and "after"
26193         from rtx to rtx_insn *.
26194         (process_address_1): Strengthen params "before" and "after" from
26195         rtx * to rtx_insn **.  Strengthen locals "insns", "last_insn" from
26196         rtx to rtx_insn *.
26197         (process_address): Strengthen params "before" and "after" from
26198         rtx * to rtx_insn **.
26199         (emit_inc): Strengthen local "last" from rtx to rtx_insn *.
26200         (curr_insn_transform): Strengthen locals "before" and "after"
26201         from rtx to rtx_insn *.  Replace NULL_RTX with NULL when referring
26202         to insns.
26203         (loc_equivalence_callback): Update cast of "data", changing
26204         resulting type from rtx to rtx_insn *.
26205         (substitute_pseudo_within_insn): New.
26206         (inherit_reload_reg): Strengthen param "insn" from rtx to
26207         rtx_insn *; likewise for local "new_insns".  Replace NULL_RTX with
26208         NULL when referring to insns.  Add a checked cast to rtx_insn *
26209         when using usage_insn to invoke lra_update_insn_regno_info.
26210         (split_reg): Strengthen param "insn" from rtx to rtx_insn *;
26211         likewise for locals "restore", "save".  Add checked casts to
26212         rtx_insn * when using usage_insn to invoke
26213         lra_update_insn_regno_info and lra_process_new_insns.  Replace
26214         NULL_RTX with NULL when referring to insns.
26215         (split_if_necessary): Strengthen param "insn" from rtx to
26216         rtx_insn *.
26217         (update_ebb_live_info): Likewise for params "head", "tail" and local
26218         "prev_insn".
26219         (get_last_insertion_point): Likewise for return type and local "insn".
26220         (get_live_on_other_edges): Likewise for local "last".
26221         (inherit_in_ebb): Likewise for params "head", "tail" and locals
26222         "prev_insn", "next_insn", "restore".
26223         (remove_inheritance_pseudos): Likewise for local "prev_insn".
26224         (undo_optional_reloads): Likewise for local "insn".
26225
26226         * lra-eliminations.c (lra_eliminate_regs_1): Likewise for param
26227         "insn".
26228         (lra_eliminate_regs): Replace NULL_RTX with NULL when referring to
26229         insns.
26230         (eliminate_regs_in_insn): Strengthen param "insn" from rtx to
26231         rtx_insn *.
26232         (spill_pseudos): Likewise for local "insn".
26233         (init_elimination): Likewise.
26234         (process_insn_for_elimination): Likewise for param "insn".
26235
26236         * lra-lives.c (curr_insn): Likewise.;
26237
26238         * lra-spills.c (assign_spill_hard_regs): Likewise for local "insn".
26239         (remove_pseudos): Likewise for param "insn".
26240         (spill_pseudos): Likewise for local "insn".
26241         (lra_final_code_change): Likewise for locals "insn", "curr".
26242
26243         * lra.c (lra_invalidate_insn_data): Likewise for param "insn".
26244         (lra_set_insn_deleted): Likewise.
26245         (lra_delete_dead_insn): Likewise, and for local "prev".
26246         (new_insn_reg): Likewise for param "insn".
26247         (lra_set_insn_recog_data): Likewise.
26248         (lra_update_insn_recog_data): Likewise.
26249         (lra_set_used_insn_alternative): Likewise.
26250         (get_insn_freq): Likewise.
26251         (invalidate_insn_data_regno_info): Likewise.
26252         (lra_invalidate_insn_regno_info): Likewise.
26253         (lra_update_insn_regno_info): Likewise.
26254         (lra_constraint_insn_stack): Strengthen from vec<rtx> to
26255         vec<rtx_insn *>.
26256         (lra_push_insn_1): Strengthen param "insn" from rtx to
26257         rtx_insn *.
26258         (lra_push_insn): Likewise.
26259         (lra_push_insn_and_update_insn_regno_info): Likewise.
26260         (lra_pop_insn): Likewise for return type and local "insn".
26261         (push_insns): Likewise for params "from", "to", and local "insn".
26262         (setup_sp_offset): Likewise for params "from", "last" and locals
26263         "before", "insn".
26264         (lra_process_new_insns): Likewise for params "insn", "before",
26265         "after" and local "last".
26266         (struct sloc): Likewise for field "insn".
26267         (lra_former_scratch_operand_p): Likewise for param "insn".
26268         (remove_scratches): Likewise for locals "insn", "last".
26269         (check_rtl): Likewise for local "insn".
26270         (add_auto_inc_notes): Likewise for param "insn".
26271         (update_inc_notes): Likewise for local "insn".
26272         (lra): Replace NULL_RTX with NULL when referring to insn.
26273
26274 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26275
26276         * lower-subreg.c (simple_move): Strengthen param "insn" from rtx
26277         to rtx_insn *.
26278         (resolve_reg_notes): Likewise.
26279         (resolve_simple_move): Likewise for return type, param "insn", and
26280         locals "insns", "minsn".
26281         (resolve_clobber): Strengthen param "insn" from rtx to rtx_insn *.
26282         (resolve_use): Likewise.
26283         (resolve_debug): Likewise.
26284         (find_decomposable_shift_zext): Likewise.
26285         (resolve_shift_zext): Likewise for return type, param "insn", and
26286         locals "insns", "in".  Eliminate use of NULL_RTX in favor of NULL.
26287         (decompose_multiword_subregs): Likewise for local "insn",
26288         "orig_insn", "decomposed_shift", "end".
26289
26290 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26291
26292         * basic-block.h (basic_block split_edge_and_insert): Strengthen
26293         param "insns" from rtx to rtx_insn *.
26294
26295         * loop-unroll.c (struct iv_to_split): Strengthen field "insn" from
26296         rtx to rtx_insn *.
26297         (struct iv_to_split): Likewise.
26298         (loop_exit_at_end_p): Likewise for local "insn".
26299         (split_edge_and_insert): Likewise for param "insns".
26300         (compare_and_jump_seq): Likewise for return type, param "cinsn",
26301         and locals "seq", "jump".
26302         (unroll_loop_runtime_iterations): Likewise for locals "init_code",
26303         "branch_code"; update invocations of compare_and_jump_seq to
26304         eliminate NULL_RTX in favor of NULL.
26305         (referenced_in_one_insn_in_loop_p): Strengthen local "insn" from
26306         rtx to rtx_insn *.
26307         (reset_debug_uses_in_loop): Likewise.
26308         (analyze_insn_to_expand_var): Likewise for param "insn".
26309         (analyze_iv_to_split_insn): Likewise.
26310         (analyze_insns_in_loop): Likewise for local "insn".
26311         (insert_base_initialization): Likewise for param
26312         "insn" and local "seq".
26313         (split_iv): Likewise for param "insn" and local "seq".
26314         (expand_var_during_unrolling): Likewise for param "insn".
26315         (insert_var_expansion_initialization): Likewise for local "seq".
26316         (combine_var_copies_in_loop_exit): Likewise.
26317         (combine_var_copies_in_loop_exit): Likewise for locals "seq" and
26318         "insn".
26319         (maybe_strip_eq_note_for_split_iv): Likewise for param "insn".
26320         (apply_opt_in_copies): Likewise for locals "insn", "orig_insn",
26321         "next".
26322
26323 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26324
26325         * cfgloop.h (iv_analyze): Strengthen param 1 "insn" from rtx to
26326         rtx_insn *.
26327         (iv_analyze_result): Likewise.
26328         (iv_analyze_expr): Likewise.
26329         (biv_p): Likewise.
26330
26331         * loop-iv.c (iv_get_reaching_def): Strengthen param "insn" and
26332         local "def_insn" from rtx to rtx_insn *.
26333         (get_biv_step_1): Likewise for local "insn".
26334         (iv_analyze_expr): Likewise for param "insn".
26335         (iv_analyze_def): Likewise for local "insn".
26336         (iv_analyze_op): Likewise for param "insn".
26337         (iv_analyze): Likewise.
26338         (iv_analyze_result): Likewise.
26339         (biv_p): Likewise.
26340         (suitable_set_for_replacement): Likewise.
26341         (simplify_using_initial_values): Likewise for local "insn".
26342         (iv_number_of_iterations): Likewise for param "insn".
26343         (check_simple_exit): Add checked cast to rtx_insn when invoking
26344         iv_number_of_iterations for now (until get_condition is
26345         strengthened).
26346
26347         * loop-unroll.c (analyze_iv_to_split_insn): Strengthen param
26348         "insn" from rtx to rtx_insn *.
26349         (analyze_insns_in_loop): Likewise for local "insn".
26350
26351 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26352
26353         * loop-invariant.c (struct use): Strengthen field "insn" from rtx
26354         to rtx_insn *.
26355         (struct invariant): Likewise.
26356         (hash_invariant_expr_1): Likewise for param "insn".
26357         (invariant_expr_equal_p): Likewise for param "insn1", "insn2".
26358         (find_exits): Likewise for local "insn".
26359         (create_new_invariant): Likewise for param "insn".
26360         (check_dependencies): Likewise.
26361         (find_invariant_insn): Likewise.
26362         (record_uses): Likewise.
26363         (find_invariants_insn): Likewise.
26364         (find_invariants_bb): Likewise for local "insn".
26365         (get_pressure_class_and_nregs): Likewise for param "insn".
26366         (calculate_loop_reg_pressure): Likewise for local "insn".
26367
26368 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26369
26370         * loop-doloop.c (doloop_valid_p): Strengthen local "insn" from rtx
26371         to rtx_insn *.
26372         (add_test): Likewise for locals "seq", "jump".
26373         (doloop_modify): Likewise for locals "sequence", "jump_insn".
26374
26375 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26376
26377         * rtl.h (rebuild_jump_labels): Strengthen param "f" from rtx to
26378         rtx_insn *.
26379         (rebuild_jump_labels_chain): Likewise for param "chain".
26380
26381         * cfgexpand.c (pass_expand::execute): Add checked cast to
26382         rtx_insn * when calling rebuild_jump_labels_chain in region where
26383         we know e->insns.r is non-NULL.
26384
26385         * jump.c (rebuild_jump_labels_1): Strengthen param "f" from rtx to
26386         rtx_insn *.
26387         (rebuild_jump_labels): Likewise.
26388         (rebuild_jump_labels_chain): Likewise for param "chain".
26389         (cleanup_barriers): Likewise for locals "insn", "next", "prev".
26390         (init_label_info): Likewise for param "f".
26391         (maybe_propagate_label_ref): Likewise for params "jump_insn",
26392         "prev_nonjump_insn".
26393         (mark_all_labels): Likewise for param "f" and locals "insn",
26394         "prev_nonjump_insn".
26395
26396 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26397
26398         * ira-int.h (struct ira_allocno_copy): Strengthen field "insn"
26399         from rtx to rtx_insn *insn.
26400         (ira_create_copy): Strengthen param "insn" from rtx to rtx_insn *.
26401         (ira_add_allocno_copy): Likewise.
26402         * ira-build.c (find_allocno_copy): Strengthen param "insn" from
26403         rtx to rtx_insn *.
26404         (ira_create_copy): Likewise.
26405         (ira_add_allocno_copy): Likewise.
26406         (create_bb_allocnos): Likewise for local "insn".
26407         * ira-conflicts.c (process_regs_for_copy): Likewise for param "insn".
26408         (process_reg_shuffles): Update NULL_RTX to NULL in invocation of
26409         process_regs_for_copy for rtx_insn * param.
26410         (add_insn_allocno_copies): Strengthen param "insn" from rtx to
26411         rtx_insn *insn.  Update NULL_RTX to NULL in invocation of
26412         process_regs_for_copy for rtx_insn * param.
26413         (add_copies): Strengthen local "insn" from rtx to rtx_insn *insn.
26414         * ira-costs.c (record_reg_classes): Likewise for param "insn".
26415         (record_operand_costs): Likewise.
26416         (scan_one_insn): Likewise for return type, and for param "insn".
26417         (process_bb_for_costs): Likewise for local "insn".
26418         (process_bb_node_for_hard_reg_moves): Likewise.
26419         * ira-emit.c (struct move): Likewise for field "insn".
26420         (create_move): Eliminate use of NULL_RTX when dealing with an
26421         rtx_insn *.
26422         (emit_move_list): Strengthen return type and locals "result",
26423         "insn" from rtx to rtx_insn *insn.
26424         (emit_moves): Likewise for locals "insns", "tmp".
26425         (ira_emit): Likewise for local "insn".
26426         * ira-lives.c (mark_hard_reg_early_clobbers): Likewise for param
26427         "insn".
26428         (find_call_crossed_cheap_reg): Likewise.
26429         (process_bb_node_lives): Likewise for local "insn".
26430         * ira.c (decrease_live_ranges_number): Likewise.
26431         (compute_regs_asm_clobbered): Likewise.
26432         (build_insn_chain): Likewise.
26433         (find_moveable_pseudos): Likewise, also locals "def_insn",
26434         "use_insn", "x".  Also strengthen local "closest_uses" from rtx *
26435         to rtx_insn **.  Add a checked cast when assigning from
26436         "closest_use" into closest_uses array in a region where we know
26437         it's a non-NULL insn.
26438         (interesting_dest_for_shprep): Strengthen param "insn" from rtx
26439         to rtx_insn *.
26440         (split_live_ranges_for_shrink_wrap): Likewise for locals "insn",
26441         "last_interesting_insn", "uin".
26442         (move_unallocated_pseudos): Likewise for locals "def_insn",
26443         "move_insn", "newinsn".
26444
26445 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26446
26447         * internal-fn.c (ubsan_expand_si_overflow_addsub_check):
26448         Strengthen locals "done_label", "do_error" from rtx to
26449         rtx_code_label *.
26450         (ubsan_expand_si_overflow_addsub_check): Strengthen local "last"
26451         from rtx to rtx_insn *.  Strengthen local "sub_check from rtx to
26452         rtx_code_label *.
26453         (ubsan_expand_si_overflow_neg_check): Likewise for locals
26454         "done_label", "do_error" to rtx_code_label * and local  "last" to
26455         rtx_insn *.
26456         (ubsan_expand_si_overflow_mul_check): Likewise for locals
26457         "done_label", "do_error", "large_op0", "small_op0_large_op1",
26458         "one_small_one_large", "both_ops_large", "after_hipart_neg",
26459         "after_lopart_neg", "do_overflow", "hipart_different"  to
26460         rtx_code_label * and local  "last" to rtx_insn *.
26461
26462 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26463
26464         * init-regs.c (initialize_uninitialized_regs): Strengthen locals
26465         "insn" and "move_insn" from rtx to rtx_insn *.
26466
26467 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26468
26469         * ifcvt.c (count_bb_insns): Strengthen local "insn" from rtx to
26470         rtx_insn *.
26471         (cheap_bb_rtx_cost_p): Likewise.
26472         (first_active_insn): Likewise for return type and local "insn".
26473         (last_active_insn):  Likewise for return type and locals "insn",
26474         "head".
26475         (struct noce_if_info): Likewise for fields "jump", "insn_a",
26476         "insn_b".
26477         (end_ifcvt_sequence): Likewise for return type and locals "insn",
26478         "seq".
26479         (noce_try_move): Likewise for local "seq".
26480         (noce_try_store_flag): Likewise.
26481         (noce_try_store_flag_constants): Likewise.
26482         (noce_try_addcc): Likewise.
26483         (noce_try_store_flag_mask): Likewise.
26484         (noce_try_cmove): Likewise.
26485         (noce_try_minmax): Likewise.
26486         (noce_try_abs): Likewise.
26487         (noce_try_sign_mask): Likewise.
26488         (noce_try_bitop): Likewise.
26489         (noce_can_store_speculate_p): Likewise for local "insn".
26490         (noce_process_if_block): Likewise for locals "insn_a", "insn_b",
26491         seq".
26492         (check_cond_move_block): Likewise for local "insn".
26493         (cond_move_convert_if_block): Likewise.
26494         (cond_move_process_if_block): Likewise for locals "seq",
26495         "loc_insn".
26496         (noce_find_if_block): Likewise for local "jump".
26497         (merge_if_block): Likewise for local "last".
26498         (block_jumps_and_fallthru_p): Likewise for locals "insn", "end".
26499         (find_cond_trap): Likewise for locals "trap", "jump", "newjump".
26500         (block_has_only_trap): Likewise for return type and local "trap".
26501         (find_if_case_1): Likewise for local "jump".
26502         (dead_or_predicable): Likewise for locals "head", "end", "jump",
26503         "insn".
26504
26505 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26506
26507         * hw-doloop.h (struct hwloop_info_d): Strengthen fields
26508         "last_insn", "loop_end" from rtx to rtx_insn *.
26509
26510         * hw-doloop.c (scan_loop): Likewise for local "insn".
26511         (discover_loop): Likewise for param "tail_insn".
26512         (discover_loops): Likewise for local "tail".
26513
26514         * config/bfin/bfin.c (hwloop_optimize): For now, add a checked
26515         cast to rtx_insn * when assigning from an rtx local to a
26516         hwloop_info's "last_insn" field.
26517
26518 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26519
26520         * haifa-sched.c (bb_header): Strengthen from rtx * to rtx_insn **.
26521         (add_delay_dependencies): Strengthen local "pro" from rtx to
26522         rtx_insn *.
26523         (recompute_todo_spec): Likewise.
26524         (dep_cost_1): Likewise for locals "insn", "used".
26525         (schedule_insn): Likewise for local "dbg".
26526         (schedule_insn): Likewise for locals "pro", "next".
26527         (unschedule_insns_until): Likewise for local "con".
26528         (restore_pattern): Likewise for local "next".
26529         (estimate_insn_tick): Likewise for local "pro".
26530         (resolve_dependencies): Likewise for local "next".
26531         (fix_inter_tick): Likewise.
26532         (fix_tick_ready): Likewise for local "pro".
26533         (add_to_speculative_block): Likewise for locals "check", "twin",
26534         "pro".
26535         (sched_extend_bb): Likewise for locals "end", "insn".
26536         (init_before_recovery): Likewise for local "x".
26537         (sched_create_recovery_block): Likewise for local "barrier".
26538         (create_check_block_twin): Likewise for local "pro".
26539         (fix_recovery_deps): Likewise for locals "note", "insn", "jump",
26540         "consumer".
26541         (unlink_bb_notes): Update for change to type of bb_header.
26542         Strengthen locals "prev", "label", "note", "next" from rtx to
26543         rtx_insn *.
26544         (clear_priorities): Likewise for local "pro".
26545
26546 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26547
26548         * gcse.c (struct occr): Strengthen field "insn" from rtx to
26549         rtx_insn *.
26550         (test_insn): Likewise for this global.
26551         (oprs_unchanged_p): Strengthen param "insn" from const_rtx to
26552         const rtx_insn *.
26553         (oprs_anticipatable_p): Likewise.
26554         (oprs_available_p): Likewise.
26555         (insert_expr_in_table): Strengthen param "insn" from  rtx to
26556         rtx_insn *.
26557         (hash_scan_set): Likewise.
26558         (hash_scan_clobber): Likewise.
26559         (hash_scan_call): Likewise.
26560         (hash_scan_insn): Likewise.
26561         (compute_hash_table_work): Likewise for local "insn".
26562         (process_insert_insn): Likewise for return type and local "pat".
26563         (insert_insn_end_basic_block): Likewise for locals "new_insn",
26564         "pat", "pat_end", "maybe_cc0_setter".
26565         (pre_edge_insert): Likewise for local "insn".
26566         (pre_insert_copy_insn): Likewise for param "insn".
26567         (pre_insert_copies): Likewise for local "insn".
26568         (struct set_data): Likewise for field "insn".
26569         (single_set_gcse): Likewise for param "insn".
26570         (gcse_emit_move_after): Likewise.
26571         (pre_delete): Likewise for local "insn".
26572         (update_bb_reg_pressure): Likewise for param "from" and local
26573         "insn".
26574         (should_hoist_expr_to_dom): Likewise for param "from".
26575         (hoist_code): Likewise for local "insn".
26576         (get_pressure_class_and_nregs): Likewise for param "insn".
26577         (calculate_bb_reg_pressure): Likewise for local "insn".
26578         (compute_ld_motion_mems): Likewise.
26579
26580 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26581
26582         * genpeep.c (main): Rename param back from "uncast_ins1" to
26583         "ins1", strengthening from rtx to rtx_insn *.  Drop now-redundant
26584         checked cast.
26585
26586         * output.h (peephole): Strengthen param from rtx to rtx_insn *.
26587
26588 2014-08-22  Michael Meissner  <meissner@linux.vnet.ibm.com>
26589
26590         PR target/62195
26591         * doc/md.texi (Machine Constraints): Update PowerPC wi constraint
26592         documentation to state it is only for VSX operations.
26593
26594         * config/rs6000/rs6000.c (rs6000_init_hard_regno_mode_ok): Make wi
26595         constraint only active if VSX.
26596
26597         * config/rs6000/rs6000.md (lfiwax): Use wj constraint instead of
26598         wi cosntraint for ISA 2.07 lxsiwax/lxsiwzx instructions.
26599         (lfiwzx): Likewise.
26600
26601 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26602
26603         * fwprop.c (single_def_use_dom_walker::before_dom_children):
26604         Strengthen local "insn" from rtx to rtx_insn *.
26605         (use_killed_between): Likewise for param "target_insn".
26606         (all_uses_available_at): Likewise for param "target_insn" and
26607         local "next".
26608         (update_df_init): Likewise for params "def_insn", "insn".
26609         (update_df): Likewise for param "insn".
26610         (try_fwprop_subst): Likewise for param "def_insn" and local
26611         "insn".
26612         (free_load_extend): Likewise for param "insn".
26613         (forward_propagate_subreg): Likewise for param "def_insn" and
26614         local "use_insn".
26615         (forward_propagate_asm): Likewise for param "def_insn" and local
26616         "use_insn".
26617         (forward_propagate_and_simplify): Likewise for param "def_insn"
26618         and local "use_insn".
26619         (forward_propagate_into): Likewise for locals "def_insn" and
26620         "use_insn".
26621
26622 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26623
26624         * function.c (emit_initial_value_sets): Strengthen local "seq"
26625         from rtx to rtx_insn *.
26626         (instantiate_virtual_regs_in_insn): Likewise for param "insn" and
26627         local "seq".
26628         (instantiate_virtual_regs): Likewise for local "insn".
26629         (assign_parm_setup_reg): Likewise for locals "linsn", "sinsn".
26630         (reorder_blocks_1): Likewise for param "insns" and local "insn".
26631         (expand_function_end): Likewise for locals "insn" and "seq".
26632         (epilogue_done): Likewise for local "insn".
26633         (thread_prologue_and_epilogue_insns): Likewise for locals "prev",
26634         "last", "trial".
26635         (reposition_prologue_and_epilogue_notes): Likewise for locals
26636         "insn", "last", "note", "first".
26637         (match_asm_constraints_1): Likewise for param "insn" and local "insns".
26638         (pass_match_asm_constraints::execute): Likewise for local "insn".
26639
26640 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26641
26642         * output.h (final_scan_insn): Strengthen return type from rtx to
26643         rtx_insn *.
26644         (final_forward_branch_p): Likewise for param.
26645         (current_output_insn): Likewise for this global.
26646
26647         * final.c (rtx debug_insn): Likewise for this variable.
26648         (current_output_insn): Likewise.
26649         (get_attr_length_1): Rename param "insn" to "uncast_insn",
26650         adding "insn" back in as an rtx_insn * with a checked cast, so
26651         that macro ADJUST_INSN_LENGTH can be passed an rtx_insn * as the
26652         first param.
26653         (compute_alignments): Strengthen local "label" from rtx to
26654         rtx_insn *.
26655         (shorten_branches): Rename param from "first" to "uncast_first",
26656         introducing a new local rtx_insn * "first" using a checked cast to
26657         effectively strengthen "first" from rtx to rtx_insn * without
26658         affecting the type signature.  Strengthen locals "insn", "seq",
26659         "next", "label" from rtx to rtx_insn *.
26660         (change_scope): Strengthen param "orig_insn" and local "insn" from
26661         rtx to rtx_insn *.
26662         (final_start_function): Rename param from "first" to "uncast_first",
26663         introducing a new local rtx_insn * "first" using a checked cast to
26664         effectively strengthen "first" from rtx to rtx_insn * without
26665         affecting the type signature.  Strengthen local "insn" from rtx to
26666         rtx_insn *.
26667         (dump_basic_block_info): Strengthen param "insn" from rtx to
26668         rtx_insn *.
26669         (final): Rename param from "first" to "uncast_first",
26670         introducing a new local rtx_insn * "first" using a checked cast to
26671         effectively strengthen "first" from rtx to rtx_insn * without
26672         affecting the type signature.  Strengthen locals "insn", "next"
26673         from rtx to rtx_insn *.
26674         (output_alternate_entry_point): Strengthen param "insn" from rtx to
26675         rtx_insn *.
26676         (call_from_call_insn): Strengthen param "insn" from rtx to
26677         rtx_call_insn *.
26678         (final_scan_insn): Rename param from "insn" to "uncast_insn",
26679         introducing a new local rtx_insn * "insn" using a checked cast to
26680         effectively strengthen "insn" from rtx to rtx_insn * without
26681         affecting the type signature.  Strengthen return type and locals
26682         "next", "note", "prev", "new_rtx" from rtx to rtx_insn *.  Remove
26683         now-redundant checked cast to rtx_insn * from both invocations of
26684         debug_hooks->var_location.  Convert CALL_P into a dyn_cast,
26685         introducing a local "call_insn" for use when invoking
26686         call_from_call_insn.
26687         (notice_source_line): Strengthen param "insn" from rtx to
26688         rtx_insn *.
26689         (leaf_function_p): Likewise for local "insn".
26690         (final_forward_branch_p): Likewise.
26691         (leaf_renumber_regs): Likewise for param "first".
26692         (rest_of_clean_state): Likewise for locals "insn" and "next".
26693         (self_recursive_call_p): Likewise for param "insn".
26694         (collect_fn_hard_reg_usage): Likewise for local "insn".
26695         (get_call_fndecl): Likewise for param "insn".
26696         (get_call_cgraph_rtl_info): Likewise.
26697         (get_call_reg_set_usage): Rename param from "insn" to "uncast_insn",
26698         introducing a new local rtx_insn * "insn" using a checked cast to
26699         effectively strengthen "insn" from rtx to rtx_insn * without
26700         affecting the type signature.
26701
26702         * config/arc/arc.c (arc_final_prescan_insn): For now, add checked
26703         cast when assigning from param "insn" to current_output_insn.
26704         (arc_pad_return): Strengthen local "insn" from rtx to rtx_insn *
26705         so that we can assign it back to current_output_insn.
26706
26707 2014-08-20  Pitchumani Sivanupandi <pitchumani.s@atmel.com>
26708
26709         * config/avr/avr-mcus.def: Remove atmega26hvg, atmega64rfa2,
26710         atmega48hvf, atxmega32x1, atmxt224, atmxt224e, atmxt336s,
26711         atmxt540s and atmxt540sreva devices.
26712         * config/avr/avr-tables.opt: Regenerate.
26713         * config/avr/t-multilib: Regenerate.
26714         * doc/avr-mmcu.texi: Regenerate.
26715
26716 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26717
26718         * expr.c (convert_move): Strengthen local "insns" from rtx to
26719         rtx_insn *.
26720         (emit_block_move_via_loop): Strengthen locals "cmp_label" and
26721         "top_label" from rtx to rtx_code_label *.
26722         (move_block_to_reg): Strengthen local "insn", "last" from rtx to
26723         rtx_insn *.
26724         (emit_single_push_insn): Likewise for locals "prev", "last".
26725         (store_expr): Strengthen locals "lab1", "lab2", "label" from rtx
26726         to rtx_code_label *.
26727         (store_constructor): Likewise for locals "loop_start", "loop_end".
26728         (expand_cond_expr_using_cmove): Strengthen local "seq" from rtx to
26729         rtx_insn *.
26730         (expand_expr_real_2): Likewise.
26731         (expand_expr_real_1): Strengthen local "label" from rtx to
26732         rtx_code_label *.
26733
26734 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26735
26736         * expmed.c (store_bit_field_using_insv): Strengthen local "last"
26737         from rtx to rtx_insn *.
26738         (store_bit_field_1): Likewise.
26739         (extract_bit_field_1): Likewise.
26740         (expand_mult_const): Likewise for local "insns".
26741         (expmed_mult_highpart): Strengthen local "label" from rtx to
26742         rtx_code_label *.
26743         (expand_smod_pow2): Likewise.
26744         (expand_sdiv_pow2): Likewise.
26745         (expand_divmod): Strengthen locals "last", "insn" from rtx to
26746         rtx_insn *.  Strengthen locals "label", "label1", "label2",
26747         "label3", "label4", "label5", "lab" from rtx to rtx_code_label *.
26748         (emit_cstore): Strengthen local "last" from rtx to rtx_insn *.
26749         (emit_store_flag): Likewise.
26750         (emit_store_flag_force): Strengthen local "label" from rtx to
26751         rtx_code_label *.
26752         (do_cmp_and_jump): Likewise for param "label".
26753
26754 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26755
26756         * explow.c (force_reg): Strengthen local "insn" from rtx to
26757         rtx_insn *.
26758         (adjust_stack_1): Likewise.
26759         (allocate_dynamic_stack_space): Likewise.  Strengthen locals
26760         "final_label", "available_label", "space_available" from rtx to
26761         rtx_code_label *.
26762         (probe_stack_range): Likewise for locals "loop_lab", "end_lab".
26763         (anti_adjust_stack_and_probe): Likewise.
26764
26765 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26766
26767         * except.h (sjlj_emit_function_exit_after): Strengthen param
26768         "after" from rtx to rtx_insn *.  This is only called with
26769         result of get_last_insn (in function.c) so type-change should be
26770         self-contained.
26771
26772         * function.h (struct rtl_eh): Strengthen field "ehr_label" from
26773         rtx to rtx_code_label *, and field "sjlj_exit_after" from rtx
26774         to rtx_insn *.  These fields are only used from except.c so this
26775         type-change should be self-contained to this patch.
26776
26777         * except.c (emit_to_new_bb_before): Strengthen param "seq" and
26778         local "last" from rtx to rtx_insn *.
26779         (dw2_build_landing_pads): Likewise for local "seq".
26780         (sjlj_mark_call_sites): Likewise for locals "insn", "before", p".
26781         (sjlj_emit_function_enter): Strengthen param "dispatch_label" from
26782         rtx to rtx_code_label *.  Strengthen locals "fn_begin", "seq" from
26783         rtx to rtx_insn *.
26784         (sjlj_emit_function_exit_after): Strengthen param "after" from rtx
26785         to rtx_insn *.
26786         (sjlj_emit_function_exit): Likewise for locals "seq", "insn".
26787         (sjlj_emit_dispatch_table): Likewise for locals "seq", "seq2".
26788         (sjlj_build_landing_pads): Replace NULL_RTX with NULL when
26789         referring to an insn.  Strengthen local "dispatch_label" from
26790         rtx to rtx_code_label *.
26791         (set_nothrow_function_flags): Strengthen local "insn" from rtx to
26792         rtx_insn *.
26793         (expand_eh_return): Strengthen local "around_label" from
26794         rtx to rtx_code_label *.
26795         (convert_to_eh_region_ranges): Strengthen locals "iter",
26796         "last_action_insn", "first_no_action_insn",
26797         "first_no_action_insn_before_switch",
26798         "last_no_action_insn_before_switch", from rtx to rtx_insn *.
26799
26800 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26801
26802         * dwarf2out.c (last_var_location_insn): Strengthen this variable
26803         from rtx to rtx_insn *.
26804         (cached_next_real_insn): Likewise.
26805         (dwarf2out_end_epilogue): Replace use of NULL_RTX with NULL when
26806         working with insns.
26807         (dwarf2out_var_location): Strengthen locals "next_real",
26808         "next_note", "expected_next_loc_note", "last_start", "insn" from
26809         rtx to rtx_insn *.
26810
26811 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26812
26813         * dwarf2cfi.c (add_cfis_to_fde): Strengthen locals "insn", "next"
26814         from rtx to rtx_insn *.
26815         (create_pseudo_cfg): Likewise for local "insn".
26816
26817 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26818
26819         * df-core.c (df_bb_regno_first_def_find): Strengthen local "insn"
26820         from rtx to rtx_insn *.
26821         (df_bb_regno_last_def_find): Likewise.
26822
26823         * df-problems.c (df_rd_bb_local_compute): Likewise.
26824         (df_lr_bb_local_compute): Likewise.
26825         (df_live_bb_local_compute): Likewise.
26826         (df_chain_remove_problem): Likewise.
26827         (df_chain_create_bb): Likewise.
26828         (df_word_lr_bb_local_compute): Likewise.
26829         (df_remove_dead_eq_notes): Likewise for param "insn".
26830         (df_note_bb_compute): Likewise for local "insn".
26831         (simulate_backwards_to_point): Likewise.
26832         (df_md_bb_local_compute): Likewise.
26833
26834         * df-scan.c (df_scan_free_bb_info): Likewise.
26835         (df_scan_start_dump): Likewise.
26836         (df_scan_start_block): Likewise.
26837         (df_install_ref_incremental): Likewise for local "insn".
26838         (df_insn_rescan_all): Likewise.
26839         (df_reorganize_refs_by_reg_by_insn): Likewise.
26840         (df_reorganize_refs_by_insn_bb): Likewise.
26841         (df_recompute_luids): Likewise.
26842         (df_bb_refs_record): Likewise.
26843         (df_update_entry_exit_and_calls): Likewise.
26844         (df_bb_verify): Likewise.
26845
26846 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26847
26848         * ddg.h (struct ddg_node): Strengthen fields "insn" and
26849         "first_note" from rtx to rtx_insn *.
26850         (get_node_of_insn): Likewise for param 2 "insn".
26851         (autoinc_var_is_used_p): Likewise for params "def_insn" and "use_insn".
26852
26853         * ddg.c (mem_read_insn_p): Strengthen param "insn" from rtx to
26854         rtx_insn *.
26855         (mem_write_insn_p): Likewise.
26856         (mem_access_insn_p): Likewise.
26857         (autoinc_var_is_used_p): Likewise for params "def_insn" and "use_insn".
26858         (def_has_ccmode_p): Likewise for param "insn".
26859         (add_cross_iteration_register_deps): Likewise for locals
26860         "def_insn" and "use_insn".
26861         (insns_may_alias_p): Likewise for params "insn1" and "insn2".
26862         (build_intra_loop_deps): Likewise for local "src_insn".
26863         (create_ddg): Strengthen locals "insn" and "first_note" from rtx
26864         to rtx_insn *.
26865         (get_node_of_insn): Likewise for param "insn".
26866
26867 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26868
26869         * dce.c (worklist): Strengthen from vec<rtx> to vec<rtx_insn *>.
26870         (deletable_insn_p): Strengthen param "insn" from rtx to
26871         rtx_insn *.  Add checked cast to rtx_call_insn when invoking
26872         find_call_stack_args, since this is guarded by CALL_P (insn).
26873         (marked_insn_p): Strengthen param "insn" from rtx to
26874         rtx_insn *.
26875         (mark_insn): Likewise.  Add checked cast to rtx_call_insn when
26876         invoking find_call_stack_args, since this is guarded by
26877         CALL_P (insn).
26878         (mark_nonreg_stores_1): Strengthen cast of "data" from rtx to
26879         rtx_insn *; we know this is an insn since this was called by
26880         mark_nonreg_stores.
26881         (mark_nonreg_stores_2): Likewise.
26882         (mark_nonreg_stores): Strengthen param "insn" from rtx to
26883         rtx_insn *.
26884         (find_call_stack_args): Strengthen param "call_insn" from rtx to
26885         rtx_call_insn *; strengthen locals "insn" and "prev_insn" from rtx
26886         to rtx_insn *.
26887         (remove_reg_equal_equiv_notes_for_defs): Strengthen param "insn"
26888         from rtx to rtx_insn *.
26889         (reset_unmarked_insns_debug_uses): Likewise for locals "insn",
26890         "next", "ref_insn".
26891         (delete_unmarked_insns): Likewise for locals "insn", "next".
26892         (prescan_insns_for_dce): Likewise for locals "insn", "prev".
26893         (mark_reg_dependencies): Likewise for param "insn".
26894         (rest_of_handle_ud_dce): Likewise for local "insn".
26895         (word_dce_process_block): Likewise.
26896         (dce_process_block): Likewise.
26897
26898 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
26899
26900         * cse.c (struct qty_table_elem): Strengthen field "const_insn"
26901         from rtx to rtx_insn *.
26902         (struct change_cc_mode_args): Likewise for field "insn".
26903         (this_insn): Strengthen from rtx to rtx_insn *.
26904         (make_new_qty): Replace use of NULL_RTX with NULL when dealing
26905         with insn.
26906         (validate_canon_reg): Strengthen param "insn" from rtx to
26907         rtx_insn *.
26908         (canon_reg): Likewise.
26909         (fold_rtx): Likewise.  Replace use of NULL_RTX with NULL when
26910         dealing with insn.
26911         (record_jump_equiv): Strengthen param "insn" from rtx to
26912         rtx_insn *.
26913         (try_back_substitute_reg): Likewise, also for locals "prev",
26914         "bb_head".
26915         (find_sets_in_insn): Likewise for param "insn".
26916         (canonicalize_insn): Likewise.
26917         (cse_insn): Likewise.  Add a checked cast.
26918         (invalidate_from_clobbers): Likewise for param "insn".
26919         (invalidate_from_sets_and_clobbers): Likewise.
26920         (cse_process_notes_1): Replace use of NULL_RTX with NULL when
26921         dealing with insn.
26922         (cse_prescan_path): Strengthen local "insn" from rtx to
26923         rtx_insn *.
26924         (cse_extended_basic_block): Likewise for locals "insn" and
26925         "prev_insn".
26926         (cse_main): Likewise for param "f".
26927         (check_for_label_ref): Likewise for local "insn".
26928         (set_live_p): Likewise for second param ("insn").
26929         (insn_live_p): Likewise for first param ("insn") and for local
26930         "next".
26931         (cse_change_cc_mode_insn): Likewise for first param "insn".
26932         (cse_change_cc_mode_insns): Likewise for first and second params
26933         "start" and "end".
26934         (cse_cc_succs): Likewise for locals "insns", "last_insns", "insn"
26935         and "end".
26936         (cse_condition_code_reg): Likewise for locals "last_insn", "insn",
26937         "cc_src_insn".
26938
26939 2014-08-22  Alexander Ivchenko  <alexander.ivchenko@intel.com>
26940             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
26941             Anna Tikhonova  <anna.tikhonova@intel.com>
26942             Ilya Tocar  <ilya.tocar@intel.com>
26943             Andrey Turetskiy  <andrey.turetskiy@intel.com>
26944             Ilya Verbin  <ilya.verbin@intel.com>
26945             Kirill Yukhin  <kirill.yukhin@intel.com>
26946             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
26947
26948         * config/i386/subst.md (define_subst_attr "mask_avx512bw_condition"):
26949         New.
26950         * config/i386/sse.md
26951         (define_mode_iterator VI248_AVX2): Delete.
26952         (define_mode_iterator VI2_AVX2_AVX512BW): New.
26953         (define_mode_iterator VI48_AVX2): Ditto.
26954         (define_insn <shift_insn><mode>3): Delete.
26955         (define_insn "<shift_insn><mode>3<mask_name>" with
26956         VI2_AVX2_AVX512BW): New.
26957         (define_insn "<shift_insn><mode>3<mask_name>" with
26958         VI48_AVX2): Ditto.
26959
26960 2014-08-22  Alexander Ivchenko  <alexander.ivchenko@intel.com>
26961             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
26962             Anna Tikhonova  <anna.tikhonova@intel.com>
26963             Ilya Tocar  <ilya.tocar@intel.com>
26964             Andrey Turetskiy  <andrey.turetskiy@intel.com>
26965             Ilya Verbin  <ilya.verbin@intel.com>
26966             Kirill Yukhin  <kirill.yukhin@intel.com>
26967             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
26968
26969         * config/i386/sse.md
26970         (define_mode_iterator VI4F_BRCST32x2): New.
26971         (define_mode_attr 64x2_mode): Ditto.
26972         (define_mode_attr 32x2mode): Ditto.
26973         (define_insn "<mask_codefor>avx512dq_broadcast<mode><mask_name>"
26974         with VI4F_BRCST32x2): Ditto.
26975         (define_insn "<mask_codefor>avx512vl_broadcast<mode><mask_name>_1"
26976         with V16FI mode iterator): Ditto.
26977         (define_insn "<mask_codefor>avx512dq_broadcast<mode><mask_name>_1"
26978         with V16FI): Ditto.
26979         (define_insn "<mask_codefor>avx512dq_broadcast<mode><mask_name>_1"
26980         with VI8F_BRCST64x2): Ditto.
26981
26982 2014-08-22  Alexander Ivchenko  <alexander.ivchenko@intel.com>
26983             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
26984             Anna Tikhonova  <anna.tikhonova@intel.com>
26985             Ilya Tocar  <ilya.tocar@intel.com>
26986             Andrey Turetskiy  <andrey.turetskiy@intel.com>
26987             Ilya Verbin  <ilya.verbin@intel.com>
26988             Kirill Yukhin  <kirill.yukhin@intel.com>
26989             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
26990
26991         * config/i386/sse.md
26992         (define_mode_iterator VI8_AVX512VL): New.
26993         (define_insn "avx512cd_maskb_vec_dup<mode>"): Macroize.
26994
26995 2014-08-22  Kirill Yukhin  <kirill.yukhin@intel.com>
26996
26997         * gcc/config/i386/sse.md (define_mode_iterator V_AVX512VL): Delete.
26998         (define_mode_iterator V48_AVX512VL): New.
26999         (define_mode_iterator V12_AVX512VL): Ditto.
27000         (define_insn <avx512>_load<mode>_mask): Split into two similar
27001         patterns which use different mode iterators: V48_AVX512VL V12_AVX512VL.
27002         Refactor output template.
27003         (define_insn "<avx512>_store<mode>_mask"): Ditto.
27004
27005 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
27006
27007         * cprop.c (struct occr): Strengthen field "insn" from rtx to
27008         rtx_insn *.
27009         (reg_available_p): Likewise for param "insn".
27010         (insert_set_in_table): Likewise.
27011         (hash_scan_set): Likewise.
27012         (hash_scan_insn): Likewise.
27013         (make_set_regs_unavailable): Likewise.
27014         (compute_hash_table_work): Likewise for local "insn".
27015         (reg_not_set_p): Strengthen param "insn" from const_rtx to
27016         const rtx_insn *.
27017         (mark_oprs_set): Strengthen param "insn" from rtx to rtx_insn *.
27018         (try_replace_reg): Likewise.
27019         (find_avail_set): Likewise.
27020         (cprop_jump): Likewise for params "setcc", "jump".
27021         (constprop_register): Likewise for param "insn".
27022         (cprop_insn): Likewise.
27023         (do_local_cprop): Likewise.
27024         (local_cprop_pass): Likewise for local "insn".
27025         (bypass_block): Likewise for params "setcc" and "jump".
27026         (bypass_conditional_jumps): Likewise for locals "setcc" and
27027         "insn".
27028         (one_cprop_pass): Likewise for local "insn".
27029
27030 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
27031
27032         * compare-elim.c (struct comparison_use): Strengthen field "insn"
27033         from rtx to rtx_insn *.
27034         (struct comparison): Likewise, also for field "prev_clobber".
27035         (conforming_compare): Likewise for param "insn".
27036         (arithmetic_flags_clobber_p): Likewise.
27037         (find_flags_uses_in_insn): Likewise.
27038         (find_comparison_dom_walker::before_dom_children): Likewise for
27039         locals "insn", "next", "last_clobber".
27040         (try_eliminate_compare): Likewise for locals "insn", "bb_head".
27041
27042 2014-08-22  David Malcolm  <dmalcolm@redhat.com>
27043
27044         * combine-stack-adj.c (struct csa_reflist): Strengthen field
27045         "insn" from rtx to rtx_insn *.
27046         (single_set_for_csa): Likewise for param "insn".
27047         (record_one_stack_ref): Likewise.
27048         (try_apply_stack_adjustment): Likewise.
27049         (struct record_stack_refs_data): Likewise for field "insn".
27050         (maybe_move_args_size_note): Likewise for params "last" and "insn".
27051         (prev_active_insn_bb): Likewise for return type and param "insn".
27052         (next_active_insn_bb): Likewise.
27053         (force_move_args_size_note): Likewise for params "prev" and "last"
27054         and locals "test", "next_candidate", "prev_candidate".
27055         (combine_stack_adjustments_for_block): Strengthen locals
27056         "last_sp_set", "last2_sp_set", "insn", "next" from rtx to
27057         rtx_insn *.
27058
27059 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27060
27061         * combine.c (i2mod): Strengthen this variable from rtx to rtx_insn *.
27062         (struct reg_stat_struct): Likewise for fields "last_death", "last_set".
27063         (subst_insn): Likewise for this variable.
27064         (added_links_insn): Likewise.
27065         (struct insn_link): Likewise for field "insn".
27066         (alloc_insn_link): Likewise for param "insn".
27067         (struct undobuf): Likewise for field "other_insn".
27068         (find_single_use): Likewise for param "insn" and local "next".
27069         (combine_validate_cost): Likewise for params "i0", "i1", "i2", "i3".
27070         (delete_noop_moves): Likewise for locals "insn", "next".
27071         (create_log_links): Likewise for locals "insn", "use_insn".
27072         Strengthen local "next_use" from rtx * to rtx_insn **.
27073         (insn_a_feeds_b): Likewise for params "a", "b".
27074         (combine_instructions): Likewise for param "f" and locals "insn",
27075         "next", "prev", "first", "last_combined_insn", "link", "link1",
27076         "temp".  Replace use of NULL_RTX with NULL when referring to
27077         insns.
27078         (setup_incoming_promotions): Likewise for param "first"
27079         (set_nonzero_bits_and_sign_copies): Likewise for local "insn".
27080         (can_combine_p): Likewise for params "insn", "i3", "pred",
27081         "pred2", "succ", "succ2" and for local "p".
27082         (combinable_i3pat): Likewise for param "i3".
27083         (cant_combine_insn_p): Likewise for param "insn".
27084         (likely_spilled_retval_p): Likewise.
27085         (adjust_for_new_dest): Likewise.
27086         (update_cfg_for_uncondjump): Likewise, also for local "insn".
27087         (try_combine): Likewise for return type and for params "i3", "i2",
27088         "i1", "i0", "last_combined_insn", and for locals "insn",
27089         "cc_use_insn", "p", "first", "last", "i2_insn", "i1_insn",
27090         "i0_insn".  Eliminate local "tem" in favor of new locals
27091         "tem_note" and "tem_insn", the latter being an rtx_insn *.  Add a
27092         checked cast for now to rtx_insn * on the return type of
27093         gen_rtx_INSN.  Replace use of NULL_RTX with NULL when referring to
27094         insns.
27095         (find_split_point): Strengthen param "insn" from rtx to
27096         rtx_insn *.
27097         (simplify_set): Likewise for local "other_insn".
27098         (recog_for_combine): Likewise for param "insn".
27099         (record_value_for_reg): Likewise.
27100         (record_dead_and_set_regs_1): Likewise for local
27101         "record_dead_insn".
27102         (record_dead_and_set_regs): Likewise for param "insn".
27103         (record_promoted_value): Likewise.
27104         (check_promoted_subreg): Likewise.
27105         (get_last_value_validate): Likewise.
27106         (reg_dead_at_p): Likewise.
27107         (move_deaths): Likewise for param "to_insn".
27108         (distribute_notes): Likewise for params "from_insn", "i3", "i2"
27109         and locals "place", "place2", "cc0_setter".  Eliminate local "tem
27110         in favor of new locals "tem_note" and "tem_insn", the latter being
27111         an rtx_insn *.
27112         (distribute_links): Strengthen locals "place", "insn" from rtx to
27113         rtx_insn *.
27114
27115 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27116
27117         * cfgrtl.c (can_delete_note_p): Require a const rtx_note * rather
27118         than a const_rtx.
27119         (can_delete_label_p): Require a const rtx_code_label * rather than
27120         a const_rtx.
27121         (delete_insn): Add checked cast to rtx_code_label * when we know
27122         we're dealing with LABEL_P (insn).  Strengthen local "bb_note" from
27123         rtx to rtx_insn *.
27124         (delete_insn_chain): Strengthen locals "prev" and "current" from
27125         rtx to rtx_insn *.  Add a checked cast when assigning from
27126         "finish" (strengthening the params will come later).  Add a
27127         checked cast to rtx_note * in region where we know
27128         NOTE_P (current).
27129         (rtl_delete_block): Strengthen locals "insn" and "end" from rtx to
27130         rtx_insn *.
27131         (compute_bb_for_insn): Likewise.
27132         (free_bb_for_insn): Likewise for local "insn".
27133         (compute_bb_for_insn): Likewise.
27134         (update_bb_for_insn_chain): Strengthen params "begin", "end" and
27135         local "insn" from rtx to rtx_insn *
27136         (flow_active_insn_p): Require a const rtx_insn * rather than a
27137         const_rtx.
27138         (contains_no_active_insn_p): Strengthen local "insn" from rtx to
27139         rtx_insn *.
27140         (can_fallthru): Likewise for locals "insn" and "insn2".
27141         (bb_note): Likewise for local "note".
27142         (first_insn_after_basic_block_note): Likewise for local "note" and
27143         for return type.
27144         (rtl_split_block): Likewise for locals "insn" and "next".
27145         (unique_locus_on_edge_between_p): Likewise for locals "insn" and
27146         "end".
27147         (rtl_merge_blocks): Likewise for locals "b_head", "b_end",
27148         "a_end", "del_first", "del_last", "b_debug_start", "b_debug_end",
27149         "prev", "tmp".
27150         (try_redirect_by_replacing_jump): Likewise for locals "insn" (both of
27151         them), "kill_from", "barrier", "new_insn".
27152         (patch_jump_insn): Likewise for params "insn", "old_label".
27153         (redirect_branch_edge): Likewise for locals "old_label", "insn".
27154         (force_nonfallthru_and_redirect): Likewise for locals "insn",
27155         "old_label", "new_label".
27156         (rtl_tidy_fallthru_edge): Likewise for local "q".
27157         (rtl_split_edge): Likewise for locals "before", "last".
27158         (commit_one_edge_insertion): Likewise for locals "before",
27159         "after", "insns", "tmp", "last", adding a checked cast where
27160         currently necessary.
27161         (commit_edge_insertions): Likewise.
27162         (rtl_dump_bb): Likewise for locals "insn", "last".
27163         (print_rtl_with_bb): Likewise for local "x".
27164         (rtl_verify_bb_insns): Likewise for local "x".
27165         (rtl_verify_bb_pointers): Likewise for local "insn".
27166         (rtl_verify_bb_insn_chain): Likewise for locals "x", "last_head",
27167         "head", "end".
27168         (rtl_verify_fallthru): Likewise for local "insn".
27169         (rtl_verify_bb_layout): Likewise for locals "x" and "rtx_first".
27170         (purge_dead_edges): Likewise for local "insn".
27171         (fixup_abnormal_edges): Likewise for locals "insn", "stop", "next".
27172         (skip_insns_after_block): Likewise for return type and for locals
27173         "insn", "last_insn", "next_head", "prev".
27174         (record_effective_endpoints): Likewise for locals "next_insn",
27175         "insn", "end".
27176         (fixup_reorder_chain): Likewise for locals "bb_end_insn" and "end".
27177         (verify_insn_chain): Likewise for locals "x", "prevx", "nextx".
27178         (cfg_layout_can_duplicate_bb_p): Likewise for local "insn".
27179         (duplicate_insn_chain): For now, add checked cast from rtx to
27180         rtx_insn * when returning insn.
27181         (cfg_layout_duplicate_bb): Likewise for local "insn".
27182         (cfg_layout_delete_block): Likewise for locals "insn", "next",
27183         "prev", "remaints".
27184         (cfg_layout_merge_blocks): Likewise for local "insn", "last".
27185         (rtl_block_empty_p): Likewise.
27186         (rtl_split_block_before_cond_jump): Likewise for locals "insn",
27187         "split_point", "last".
27188         (rtl_block_ends_with_call_p): Likewise for local "insn".
27189         (need_fake_edge_p): Strengthen param "insn" from const_rtx to
27190         const rtx_insn *.
27191         (rtl_flow_call_edges_add): Strengthen locals "insn", "prev_insn",
27192         "split_at_insn" from rtx to rtx_insn *.
27193         (rtl_lv_add_condition_to_bb): Likewise for locals "seq", "jump".
27194         (rtl_can_remove_branch_p): Strengthen local "insn" from const_rtx
27195         to const rtx_insn *.
27196         (rtl_account_profile_record): Likewise.
27197
27198 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27199
27200         * cfgloopanal.c (num_loop_insns): Strengthen local "insn" from
27201         rtx to rtx_insn *.
27202         (average_num_loop_insns): Likewise.
27203         (init_set_costs): Likewise for local "seq".
27204         (seq_cost): Likewise for param "seq", from const_rtx to const
27205         rtx_insn *.
27206
27207 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27208
27209         * cfgloop.c (loop_exits_from_bb_p): Strengthen local "insn" from
27210         rtx to rtx_insn *.
27211
27212 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27213
27214         * basic-block.h (flow_find_cross_jump): Strengthen params 3 and 4
27215         "f1" and "f2" from rtx * to rtx_insn **.
27216         (flow_find_head_matching_sequence): Likewise.
27217
27218         * cfgcleanup.c (try_simplify_condjump): Strengthen local
27219         "cbranch_insn" from rtx to rtx_insn *.
27220         (thread_jump): Likewise for local "insn".
27221         (try_forward_edges): Likewise for local "last".
27222         (merge_blocks_move_predecessor_nojumps): Likewise for local "barrier".
27223         (merge_blocks_move_successor_nojumps): Likewise for locals "barrier",
27224         "real_b_end".
27225         (can_replace_by): Likewise for params "i1", "i2".
27226         (old_insns_match_p): Likewise.
27227         (merge_notes): Likewise.
27228         (walk_to_nondebug_insn): Likewise for param "i1".
27229         (flow_find_cross_jump): Strengthen params "f1" and "f2" from rtx *
27230         to rtx_insn **.  Strengthen locals "i1", "i2", "last1", "last2",
27231         "afterlast1", "afterlast2" from rtx to rtx_insn *.
27232         (flow_find_head_matching_sequence): Strengthen params "f1" and
27233         "f2" from rtx * to rtx_insn **.  Strengthen locals "i1", "i2",
27234         "last1", "last2", "beforelast1", "beforelast2" from rtx to
27235         rtx_insn *.
27236         (outgoing_edges_match): Likewise for locals "last1", "last2".
27237         (try_crossjump_to_edge): Likewise for local "insn".
27238         Replace call to for_each_rtx with for_each_rtx_in_insn.
27239
27240         (try_crossjump_to_edge): Likewise for locals "newpos1", "newpos2".
27241         (try_head_merge_bb): Likewise for locals "e0_last_head_, "jump",
27242         "e0_last", "e_last", "head", "curr", "insn".  Strengthen locals
27243         "headptr", "currptr", "nextptr" from rtx * to rtx_insn **.
27244         (try_optimize_cfg): Strengthen local "last" from rtx to
27245         rtx_insn *.
27246         (delete_dead_jumptables): Likewise for locals "insn", "next",
27247         "label".
27248
27249         * ifcvt.c (cond_exec_process_if_block): Likewise for locals
27250         "rtx then_last_head", "rtx else_last_head", "rtx then_first_tail",
27251         "rtx else_first_tail", to reflect the basic-block.h changes above.
27252
27253 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27254
27255         * cfgbuild.c (make_edges): Strengthen local "insn" from rtx to
27256         rtx_insn *.
27257         (purge_dead_tablejump_edges): Likewise.
27258         (find_bb_boundaries): Likewise for locals "insn", "end",
27259         "flow_transfer_insn".
27260
27261 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27262
27263         * caller-save.c (save_call_clobbered_regs): Strengthen locals
27264         "ins" and "prev" from rtx to rtx_insn *.
27265
27266 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27267
27268         * calls.c (emit_call_1): Strengthen local "call_insn" from rtx to
27269         rtx_insn *.
27270         (internal_arg_pointer_exp_state): Likewise for field "scan_start".
27271         (internal_arg_pointer_based_exp_scan): Likewise for locals "insn",
27272         "scan_start".
27273         (load_register_parameters): Likewise for local "before_arg".
27274         (check_sibcall_argument_overlap): Likewise for param "insn".
27275         (expand_call): Likewise for locals "normal_call_insns",
27276         "tail_call_insns", "insns", "before_call", "after_args",
27277         "before_arg", "last", "prev".  Strengthen one of the "last" from
27278         rtx to rtx_call_insn *.
27279         (fixup_tail_calls): Strengthen local "insn" from rtx to
27280         rtx_insn *.
27281         (emit_library_call_value_1): Likewise for locals "before_call" and
27282         "last".
27283
27284 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27285
27286         * builtins.c (expand_builtin_longjmp): Strengthen locals "insn"
27287         and "last" from rtx to rtx_insn *.
27288         (expand_builtin_nonlocal_goto): Likewise for local "insn".
27289         (expand_builtin_apply): Strengthen local "call_insn" from rtx to
27290         rtx_call_insn *.
27291         (expand_errno_check): Strengthen local "lab" from rtx to
27292         rtx_code_label *.
27293         (expand_builtin_mathfn): Strengthen local "insns" from rtx to
27294         rtx_insn *.
27295         (expand_builtin_mathfn_2): Likewise.
27296         (expand_builtin_mathfn_ternary): Likewise.
27297         (expand_builtin_mathfn_3): Likewise.
27298         (expand_builtin_interclass_mathfn): Likewise for local "last".
27299         (expand_builtin_int_roundingfn): Likewise for local "insns".
27300         (expand_builtin_int_roundingfn_2): Likewise.
27301         (expand_builtin_strlen): Likewise for local "before_strlen".
27302         (expand_builtin_strncmp): Likewise for local "seq".
27303         (expand_builtin_signbit): Likewise for local "last".
27304         (expand_builtin_atomic_compare_exchange): Strengthen local "label"
27305         from rtx to rtx_code_label *.
27306         (expand_stack_restore):  Strengthen local "prev" from rtx to
27307         rtx_insn *.
27308
27309 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27310
27311         * bt-load.c (struct btr_user_s): Strengthen field "insn" from rtx
27312         to rtx_insn *.
27313         (struct btr_def_s): Likewise.
27314         (insn_sets_btr_p): Strengthen param "insn" from const_rtx to
27315         const rtx_insn *.
27316         (add_btr_def): Likewise.
27317         (new_btr_user): Likewise.
27318         (compute_defs_uses_and_gen): Strengthen locals "insn", "last" from
27319         rtx to rtx_insn *.
27320         (link_btr_uses): Likewise.
27321         (move_btr_def): Likewise for locals "insp", "old_insn",
27322         "new_insn".  Add checked cast to rtx_insn * for now on result of
27323         gen_move_insn.
27324         (can_move_up): Strengthen param "insn" from const_rtx to
27325         const rtx_insn *.
27326
27327 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27328
27329         * bb-reorder.c (copy_bb_p): Strengthen local "insn" from rtx to
27330         rtx_insn *.
27331         (get_uncond_jump_length): Likewise for locals "label", "jump".
27332         (fix_up_crossing_landing_pad): Likewise for locals "new_label",
27333         "jump", "insn".
27334         (add_labels_and_missing_jumps): Likewise for local "new_jump".
27335         (fix_up_fall_thru_edges): Likewise for local "old_jump".
27336         (find_jump_block): Likewise for local "insn".
27337         (fix_crossing_conditional_branches): Likewise for locals
27338         "old_jump", "new_jump".
27339         (fix_crossing_unconditional_branches): Likewise for locals
27340         "last_insn", "indirect_jump_sequence", "jump_insn", "cur_insn".
27341         (pass_duplicate_computed_gotos::execute): Likewise for local "insn".
27342
27343 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27344
27345         * auto-inc-dec.c (struct inc_insn): Strengthen field "insn" from
27346         rtx to rtx_insn *.
27347         (struct mem_insn): Likewise for field "insn".
27348         (reg_next_use): Strengthen from rtx * to rtx_insn **.
27349         (reg_next_inc_use): Likewise.
27350         (reg_next_def): Likewise.
27351         (move_dead_notes): Strengthen params "to_insn" and "from_insn"
27352         from rtx to rtx_insn *.
27353         (move_insn_before): Likewise for param "next_insn" and local "insns".
27354         (attempt_change): Likewise for local "mov_insn".
27355         (try_merge): Likewise for param "last_insn".
27356         (get_next_ref): Likewise for return type and local "insn".
27357         Strengthen param "next_array" from rtx * to rtx_insn **.
27358         (parse_add_or_inc): Strengthen param "insn" from rtx to
27359         rtx_insn *.
27360         (find_inc): Likewise for locals "insn" and "other_insn" (three of
27361         the latter).
27362         (merge_in_block): Likewise for locals "insn", "curr",
27363         "other_insn".
27364         (pass_inc_dec::execute): Update allocations of the arrays to
27365         reflect the stronger types.
27366
27367 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27368
27369         * asan.c (asan_clear_shadow): Strengthen locals "insn", "insns"
27370         and "jump" from rtx to rtx_insn *.  Strengthen local "top_label"
27371         from rtx to rtx_code_label *.
27372
27373 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27374
27375         * alias.c (init_alias_analysis): Strengthen local "insn" from rtx
27376         to rtx_insn *.
27377
27378 2014-08-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
27379
27380         * config/rs6000/rs6000.c (print_operand, 'y' case): Fix code that
27381         generated a warning and prevented bootstrapping the compiler.
27382
27383 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27384
27385         * rtl.h (delete_related_insns): Strengthen return type from rtx to
27386         rtx_insn *.
27387
27388         * jump.c (delete_related_insns): Likewise, also for locals "next"
27389         and "prev".
27390
27391 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27392
27393         * genautomata.c (output_internal_insn_latency_func): When writing
27394         the function "internal_insn_latency" to insn-automata.c,
27395         strengthen params "insn" and "insn2" from rtx to rtx_insn *, thus
27396         allowing the optional guard function of (define_bypass) clauses to
27397         expect a pair of rtx_insn *, rather than a pair of rtx.
27398         (output_insn_latency_func): When writing the function
27399         "insn_latency", add an "uncast_" prefix to params "insn" and
27400         "insn2", reintroducing "insn" and "insn2" as rtx_insn * locals
27401         using checked casts from the params, thus enabling the above
27402         change to the generated "internal_insn_latency" function.
27403
27404 2014-08-21  Jan Hubicka  <hubicka@ucw.cz>
27405
27406         PR tree-optimization/62091
27407         * ipa-devirt.c (ipa_polymorphic_call_context::restrict_to_inner_type):
27408         handle correctly arrays.
27409         (extr_type_from_vtbl_ptr_store): Add debug output; handle multiple
27410         inheritance binfos.
27411         (record_known_type): Walk into inner type.
27412         (ipa_polymorphic_call_context::get_dynamic_type): Likewise; strenghten
27413         condition on no type changes.
27414
27415 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27416
27417         * genattrtab.c (write_attr_get): Within the generated get_attr_
27418         functions, rename param "insn" to "uncast_insn" and reintroduce
27419         "insn" as an local rtx_insn * using a checked cast, so that "insn"
27420         is an rtx_insn * within insn-attrtab.c
27421
27422 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27423
27424         * output.h (peephole): Strengthen return type from rtx to
27425         rtx_insn *.
27426         * rtl.h (delete_for_peephole): Likewise for both params.
27427         * genpeep.c (main): In generated "peephole" function, strengthen
27428         return type and local "insn" from rtx to rtx_insn *.  For now,
27429         rename param "ins1" to "uncast_ins1", adding "ins1" back as an
27430         rtx_insn *, with a checked cast.
27431         * jump.c (delete_for_peephole): Strengthen params "from", "to" and
27432         locals "insn", "next", "prev" from rtx to rtx_insn *.
27433
27434 2014-08-21  Marc Glisse  <marc.glisse@inria.fr>
27435
27436         PR tree-optimization/62112
27437         * gimple-iterator.c (gsi_replace): Return whether EH cleanup is needed.
27438         * gimple-iterator.h (gsi_replace): Return bool.
27439         * tree-ssa-alias.c (ref_may_alias_global_p_1): New helper, code
27440         moved from ref_may_alias_global_p.
27441         (ref_may_alias_global_p, refs_may_alias_p, ref_maybe_used_by_stmt_p):
27442         New overloads.
27443         (ref_maybe_used_by_call_p): Take ao_ref* instead of tree.
27444         (stmt_kills_ref_p_1): Rename...
27445         (stmt_kills_ref_p): ... to this.
27446         * tree-ssa-alias.h (ref_may_alias_global_p, ref_maybe_used_by_stmt_p,
27447         stmt_kills_ref_p): Declare.
27448         * tree-ssa-dse.c (dse_possible_dead_store_p): New argument, use it.
27449         Move the self-assignment case...
27450         (dse_optimize_stmt): ... here. Handle builtin calls. Remove dead code.
27451
27452 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27453
27454         * rtl.h (try_split): Strengthen return type from rtx to rtx_insn *.
27455
27456         * emit-rtl.c (try_split): Likewise, also for locals "before" and
27457         "after".  For now, don't strengthen param "trial", which requires
27458         adding checked casts when returning it.
27459
27460 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27461
27462         * debug.h (struct gcc_debug_hooks): Strengthen param 1 of hook
27463         "label" from rtx to rtx_code_label *.  Strengthen param 1 of
27464         "var_location" hook from rtx to rtx_insn *.
27465         (debug_nothing_rtx): Delete in favor of...
27466         (debug_nothing_rtx_code_label): New prototype.
27467         (debug_nothing_rtx_rtx): Delete unused prototype.
27468         (debug_nothing_rtx_insn): New prototype.
27469
27470         * final.c (final_scan_insn): Add checked cast to rtx_insn * when
27471         invoking debug_hooks->var_location (in two places, one in a NOTE
27472         case of a switch statement, the other guarded by a CALL_P
27473         conditional.  Add checked cast to rtx_code_label * when invoking
27474         debug_hooks->label (within CODE_LABEL case of switch statement).
27475
27476         * dbxout.c (dbx_debug_hooks): Update "label" hook from
27477         debug_nothing_rtx to debug_nothing_rtx_code_label.  Update
27478         "var_location" from debug_nothing_rtx to debug_nothing_rtx_insn.
27479         (xcoff_debug_hooks): Likewise.
27480         * debug.c (do_nothing_debug_hooks): Likewise.
27481         (debug_nothing_rtx): Delete in favor of...
27482         (debug_nothing_rtx_insn): New function.
27483         (debug_nothing_rtx_rtx): Delete unused function.
27484         (debug_nothing_rtx_code_label): New function.
27485         * dwarf2out.c (dwarf2_debug_hooks): Update "label" hook from
27486         debug_nothing_rtx to debug_nothing_rtx_code_label.
27487         (dwarf2out_var_location): Strengthen param "loc_note" from rtx
27488         to rtx_insn *.
27489         * sdbout.c (sdb_debug_hooks): Update "var_location" hook from
27490         debug_nothing_rtx to debug_nothing_rtx_insn.
27491         (sdbout_label): Strengthen param "insn" from rtx to
27492         rtx_code_label *.
27493         * vmsdbgout.c (vmsdbg_debug_hooks): Update "label" hook from
27494         debug_nothing_rtx to debug_nothing_rtx_code_label.  Update
27495         "var_location" hook from debug_nothing_rtx to
27496         debug_nothing_rtx_insn.
27497
27498 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27499
27500         * recog.h (insn_output_fn): Update this function typedef to match
27501         the changes below to the generated output functions, strengthening
27502         the 2nd param from rtx to rtx_insn *.
27503
27504         * final.c (get_insn_template): Add a checked cast to rtx_insn * on
27505         insn when invoking an output function, to match the new signature
27506         of insn_output_fn with a stronger second param.
27507
27508         * genconditions.c (write_header): In the generated code for
27509         gencondmd.c, strengthen the global "insn" from rtx to rtx_insn *
27510         to match the other changes in this patch.
27511
27512         * genemit.c (gen_split): Strengthen the 1st param "curr_insn" of
27513         the generated "gen_" functions from rtx to rtx_insn * within their
27514         implementations.
27515
27516         * genrecog.c (write_subroutine): Strengthen the 2nd param "insn" of
27517         the subfunctions within the generated "recog_", "split", "peephole2"
27518         function trees from rtx to rtx_insn *.  For now, the top-level
27519         generated functions ("recog", "split", "peephole2") continue to
27520         take a plain rtx for "insn", to avoid introducing dependencies on
27521         other patches.  Rename this 2nd param from "insn" to
27522         "uncast_insn", and reintroduce "insn" as a local variable of type
27523         rtx_insn *, initialized at the top of the generated function with
27524         a checked cast on "uncast_insn".
27525         (make_insn_sequence): Strengthen the 1st param "curr_insn" of
27526         the generated "gen_" functions from rtx to rtx_insn * within their
27527         prototypes.
27528
27529         * genoutput.c (process_template): Strengthen the 2nd param within
27530         the generated "output_" functions "insn" from rtx to rtx_insn *.
27531
27532 2014-08-20  Jan Hubicka  <hubicka@ucw.cz>
27533
27534         * tree-profile.c (tree_profiling): Skip external functions
27535         when doing coverage instrumentation.
27536         * cgraphunit.c (compile): Do not assert that all nodes are reachable.
27537
27538 2014-08-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
27539
27540         * config/rs6000/altivec.h (vec_cpsgn): New #define.
27541         (vec_mergee): Likewise.
27542         (vec_mergeo): Likewise.
27543         (vec_cntlz): Likewise.
27544         * config/rs600/rs6000-c.c (altivec_overloaded_builtins): Add new
27545         entries for VEC_AND, VEC_ANDC, VEC_MERGEH, VEC_MERGEL, VEC_NOR,
27546         VEC_OR, VEC_PACKSU, VEC_XOR, VEC_PERM, VEC_SEL, VEC_VCMPGT_P,
27547         VMRGEW, and VMRGOW.
27548         * doc/extend.texi: Document various forms of vec_cpsgn,
27549         vec_splats, vec_and, vec_andc, vec_mergeh, vec_mergel, vec_nor,
27550         vec_or, vec_perm, vec_sel, vec_sub, vec_xor, vec_all_eq,
27551         vec_all_ge, vec_all_gt, vec_all_le, vec_all_lt, vec_all_ne,
27552         vec_any_eq, vec_any_ge, vec_any_gt, vec_any_le, vec_any_lt,
27553         vec_any_ne, vec_mergee, vec_mergeo, vec_packsu, and vec_cntlz.
27554
27555 2014-08-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
27556
27557         * config/rs6000/rs6000.c (context.h): New include.
27558         (tree-pass.h): Likewise.
27559         (make_pass_analyze_swaps): New decl.
27560         (rs6000_option_override): Register pass_analyze_swaps.
27561         (swap_web_entry): New subsclass of web_entry_base (df.h).
27562         (special_handling_values): New enum.
27563         (union_defs): New function.
27564         (union_uses): Likewise.
27565         (insn_is_load_p): Likewise.
27566         (insn_is_store_p): Likewise.
27567         (insn_is_swap_p): Likewise.
27568         (rtx_is_swappable_p): Likewise.
27569         (insn_is_swappable_p): Likewise.
27570         (chain_purpose): New enum.
27571         (chain_contains_only_swaps): New function.
27572         (mark_swaps_for_removal): Likewise.
27573         (swap_const_vector_halves): Likewise.
27574         (adjust_subreg_index): Likewise.
27575         (permute_load): Likewise.
27576         (permute_store): Likewise.
27577         (handle_special_swappables): Likewise.
27578         (replace_swap_with_copy): Likewise.
27579         (dump_swap_insn_table): Likewise.
27580         (rs6000_analyze_swaps): Likewise.
27581         (pass_data_analyze_swaps): New pass_data.
27582         (pass_analyze_swaps): New rtl_opt_pass.
27583         (make_pass_analyze_swaps): New function.
27584         * config/rs6000/rs6000.opt (moptimize-swaps): New option.
27585
27586 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27587
27588         * sel-sched-ir.h (create_insn_rtx_from_pattern): Strengthen return
27589         type from rtx to rtx_insn *.
27590         (create_copy_of_insn_rtx): Likewise.
27591         * sel-sched-ir.c (create_insn_rtx_from_pattern): Likewise.
27592         (create_copy_of_insn_rtx): Likewise, also for local "res".
27593
27594 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27595
27596         * rtl.h (find_first_parameter_load): Strengthen return type from
27597         rtx to rtx_insn *.
27598         * rtlanal.c (find_first_parameter_load): Strengthen return type
27599         from rtx to rtx_insn *.  Add checked cast for now, to postpone
27600         strengthening the params.
27601
27602 2014-08-21  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27603
27604         PR fortran/44054
27605         * diagnostic.c: Set default caret.
27606         (diagnostic_show_locus): Use it. Tell pretty-printer that a new
27607         line is needed.
27608         * diagnostic.h (struct diagnostic_context):
27609
27610 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27611
27612         * sel-sched-ir.h (exit_insn): Strengthen from rtx to rtx_insn *.
27613         (sel_bb_head): Strengthen return type insn_t (currently just an
27614         rtx) to rtx_insn *.
27615         (sel_bb_end): Likewise.
27616
27617         * sel-sched-ir.c (exit_insn): Strengthen from rtx to rtx_insn *.
27618         (sel_bb_head): Strengthen return type and local "head" from
27619         insn_t (currently just an rtx) to rtx_insn *.
27620         (sel_bb_end): Likewise for return type.
27621         (free_nop_and_exit_insns): Replace use of NULL_RTX with NULL when
27622         working with insn.
27623
27624 2014-08-21  David Malcolm  <dmalcolm@redhat.com>
27625
27626         * basic-block.h (get_last_bb_insn): Strengthen return type from
27627         rtx to rtx_insn *.
27628         * cfgrtl.c (get_last_bb_insn): Likewise, and for locals "tmp" and
27629         end".
27630
27631 2014-08-21  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27632
27633         PR fortran/44054
27634         * diagnostic.c (default_diagnostic_finalizer): Move caret printing
27635         to here ...
27636         (diagnostic_report_diagnostic): ... from here.
27637         * toplev.c (general_init): Move code to c-family.
27638
27639 2014-08-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
27640
27641         * df.h (web_entry_base): Replace existing struct web_entry with a
27642         new class web_entry_base with only the predecessor member.
27643         (unionfind_root): Remove declaration and move to class member.
27644         (unionfind_union): Remove declaration and move to friend
27645         function.
27646         (union_defs): Remove declaration.
27647         * web.c (web_entry_base::unionfind_root): Modify to be member
27648         function and adjust accessors.
27649         (unionfind_union): Modify to be friend function and adjust
27650         accessors.
27651         (web_entry): New subclass of web_entry_base containing the reg
27652         member.
27653         (union_match_dups): Modify for struct -> class changes.
27654         (union_defs): Likewise.
27655         (entry_register): Likewise.
27656         (pass_web::execute): Likewise.
27657
27658 2014-08-20  Bill Schmidt  <wschmidt@vnet.ibm.com>
27659
27660         * config/rs6000/rs6000-c.c (rs6000_cpu_cpp_builtins): Provide
27661         builtin define __VEC_ELEMENT_REG_ORDER__.
27662
27663 2014-08-20  Martin Jambor  <mjambor@suse.cz>
27664             Wei Mi  <wmi@google.com>
27665
27666         PR ipa/60449
27667         PR middle-end/61776
27668         * tree-ssa-operands.c (update_stmt_operands): Remove
27669         MODIFIED_NORETURN_CALLS.
27670         * tree-cfgcleanup.c (cleanup_call_ctrl_altering_flag): New func.
27671         (cleanup_control_flow_bb): Use cleanup_call_ctrl_altering_flag.
27672         (split_bb_on_noreturn_calls): Renamed from split_bbs_on_noreturn_calls.
27673         (cleanup_tree_cfg_1): Use split_bb_on_noreturn_calls.
27674         * tree-ssanames.h: Remove MODIFIED_NORETURN_CALLS.
27675         * gimple.h (enum gf_mask): Add GF_CALL_CTRL_ALTERING.
27676         (gimple_call_set_ctrl_altering): New func.
27677         (gimple_call_ctrl_altering_p): Ditto.
27678         * tree-cfg.c (gimple_call_initialize_ctrl_altering): Ditto.
27679         (make_blocks): Use gimple_call_initialize_ctrl_altering.
27680         (is_ctrl_altering_stmt): Use gimple_call_ctrl_altering_p.
27681         (execute_fixup_cfg): Use gimple_call_ctrl_altering_p and
27682         remove MODIFIED_NORETURN_CALLS.
27683
27684 2014-08-20  Jan Hubicka  <hubicka@ucw.cz>
27685
27686         * coverage.c (coverage_compute_profile_id): Return non-0;
27687         also handle symbols with unique name.
27688         (coverage_end_function): Do not skip DECL_EXTERNAL functions.
27689
27690 2014-08-20  Steve Ellcey  <sellcey@mips.com>
27691
27692         PR middle-end/49191
27693         * doc/sourcebuild.texi (non_strict_align): New.
27694
27695 2014-08-20  Jan Hubicka  <hubicka@ucw.cz>
27696
27697         * cgraphunit.c (ipa_passes, compile): Reshedule
27698         symtab_remove_unreachable_nodes passes; update comments.
27699         * ipa-inline.c (pass_data_ipa_inline): Do not schedule
27700         TODO_remove_functions before the pass; the functions ought to be
27701         already removed.
27702         * ipa.c (pass_data_ipa_free_inline_summary): Enable dump; schedule
27703         TODO_remove_functions.
27704         * passes.c (pass_data_early_local_passes): Do not schedule function
27705         removal.
27706         (execute_one_pass): Fix call of symtab_remove_unreachable_nodes.
27707
27708 2014-08-20  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27709
27710         PR c/59304
27711         * opts-common.c (set_option): Call diagnostic_classify_diagnostic
27712         before setting the option.
27713         * diagnostic.c (diagnostic_classify_diagnostic): Record
27714         command-line status.
27715
27716 2014-08-20  Richard Biener  <rguenther@suse.de>
27717
27718         PR lto/62190
27719         * tree.c (build_common_tree_nodes): Use make_or_reuse_type
27720         to build uint{16,32,64}_type_node.
27721
27722 2014-08-20  Terry Guo  <terry.guo@arm.com>
27723
27724         * config/arm/thumb1.md (64bit splitter): Replace const_double_operand
27725         with immediate_operand.
27726
27727 2014-08-20  David Malcolm  <dmalcolm@redhat.com>
27728
27729         * cfgrtl.c (duplicate_insn_chain): Convert the checked cast on
27730         "insn" from an as_a to a safe_as_a, for the case when "insn" is
27731         NULL.
27732
27733 2014-08-20  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27734
27735         PR preprocessor/51303
27736         * incpath.c (remove_duplicates): Use cpp_warning.
27737
27738 2014-08-20  Manuel López-Ibáñez  <manu@gcc.gnu.org>
27739
27740         PR c/60975
27741         PR c/53063
27742         * doc/options.texi (CPP): Document it.
27743         * doc/invoke.texi (Wvariadic-macros): Fix documentation.
27744         * optc-gen.awk: Handle CPP.
27745         * opth-gen.awk: Likewise.
27746
27747 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27748
27749         * rtl.h (unlink_insn_chain): Strengthen return type from rtx to
27750         rtx_insn *.
27751         (duplicate_insn_chain): Likewise.
27752         * cfgrtl.c (unlink_insn_chain): Strengthen return type from rtx to
27753         rtx_insn *, also for locals "prevfirst" and "nextlast".  Add a
27754         checked cast for now (until we can strengthen the params in the
27755         same way).
27756         (duplicate_insn_chain): Likewise.
27757
27758 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27759
27760         * rtl.h (next_cc0_user): Strengthen return type from rtx to
27761         rtx_insn *.
27762         (prev_cc0_setter): Likewise.
27763
27764         * emit-rtl.c (next_cc0_user): Strengthen return type from rtx to
27765         rtx_insn *, adding checked casts for now as necessary.
27766         (prev_cc0_setter): Likewise.
27767
27768 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27769
27770         * expr.h (emit_move_insn): Strengthen return type from rtx to
27771         rtx_insn *.
27772         (emit_move_insn_1): Likewise.
27773         (emit_move_complex_push): Likewise.
27774         (emit_move_complex_parts): Likewise.
27775
27776         * expr.c (emit_move_via_integer): Strengthen return type from rtx
27777         to rtx_insn *.  Replace use of NULL_RTX with NULL when working
27778         with insns.
27779         (emit_move_complex_push): Strengthen return type from rtx to
27780         rtx_insn *.
27781         (emit_move_complex): Likewise, also for local "ret".
27782         (emit_move_ccmode): Likewise.
27783         (emit_move_multi_word): Likewise for return type and locals
27784         "last_insn", "seq".
27785         (emit_move_insn_1): Likewise for return type and locals "result",
27786         "ret".
27787         (emit_move_insn): Likewise for return type and local "last_insn".
27788         (compress_float_constant): Likewise.
27789
27790 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27791
27792         * emit-rtl.h (emit_copy_of_insn_after): Strengthen return type
27793         from rtx to rtx_insn *.
27794
27795         * rtl.h (emit_insn_before): Likewise.
27796         (emit_insn_before_noloc): Likewise.
27797         (emit_insn_before_setloc): Likewise.
27798         (emit_jump_insn_before): Likewise.
27799         (emit_jump_insn_before_noloc): Likewise.
27800         (emit_jump_insn_before_setloc): Likewise.
27801         (emit_call_insn_before): Likewise.
27802         (emit_call_insn_before_noloc): Likewise.
27803         (emit_call_insn_before_setloc): Likewise.
27804         (emit_debug_insn_before): Likewise.
27805         (emit_debug_insn_before_noloc): Likewise.
27806         (emit_debug_insn_before_setloc): Likewise.
27807         (emit_label_before): Likewise.
27808         (emit_insn_after): Likewise.
27809         (emit_insn_after_noloc): Likewise.
27810         (emit_insn_after_setloc): Likewise.
27811         (emit_jump_insn_after): Likewise.
27812         (emit_jump_insn_after_noloc): Likewise.
27813         (emit_jump_insn_after_setloc): Likewise.
27814         (emit_call_insn_after): Likewise.
27815         (emit_call_insn_after_noloc): Likewise.
27816         (emit_call_insn_after_setloc): Likewise.
27817         (emit_debug_insn_after): Likewise.
27818         (emit_debug_insn_after_noloc): Likewise.
27819         (emit_debug_insn_after_setloc): Likewise.
27820         (emit_label_after): Likewise.
27821         (emit_insn): Likewise.
27822         (emit_debug_insn): Likewise.
27823         (emit_jump_insn): Likewise.
27824         (emit_call_insn): Likewise.
27825         (emit_label): Likewise.
27826         (gen_clobber): Likewise.
27827         (emit_clobber): Likewise.
27828         (gen_use): Likewise.
27829         (emit_use): Likewise.
27830         (emit): Likewise.
27831
27832         (emit_barrier_before): Strengthen return type from rtx to
27833         rtx_barrier *.
27834         (emit_barrier_after): Likewise.
27835         (emit_barrier): Likewise.
27836
27837         * emit-rtl.c (emit_pattern_before_noloc):  Strengthen return type
27838         from rtx to rtx_insn *.  Add checked casts for now when converting
27839         "last" from rtx to rtx_insn *.
27840         (emit_insn_before_noloc): Likewise for return type.
27841         (emit_jump_insn_before_noloc): Likewise.
27842         (emit_call_insn_before_noloc): Likewise.
27843         (emit_debug_insn_before_noloc): Likewise.
27844         (emit_barrier_before): Strengthen return type and local "insn"
27845         from rtx to rtx_barrier *.
27846         (emit_label_before): Strengthen return type from rtx to
27847         rtx_insn *.  Add checked cast for now when returning param
27848         (emit_pattern_after_noloc): Strengthen return type from rtx to
27849         rtx_insn *.  Add checked casts for now when converting "last" from
27850         rtx to rtx_insn *.
27851         (emit_insn_after_noloc): Strengthen return type from rtx to
27852         rtx_insn *.
27853         (emit_jump_insn_after_noloc): Likewise.
27854         (emit_call_insn_after_noloc): Likewise.
27855         (emit_debug_insn_after_noloc): Likewise.
27856         (emit_barrier_after): Strengthen return type from rtx to
27857         rtx_barrier *.
27858         (emit_label_after): Strengthen return type from rtx to rtx_insn *.
27859         Add checked cast for now when converting "label" from rtx to
27860         rtx_insn *.
27861         (emit_pattern_after_setloc): Strengthen return type from rtx to
27862         rtx_insn *.  Add checked casts for now when converting "last" from
27863         rtx to rtx_insn *.
27864         (emit_pattern_after): Strengthen return type from rtx to
27865         rtx_insn *.
27866         (emit_insn_after_setloc): Likewise.
27867         (emit_insn_after): Likewise.
27868         (emit_jump_insn_after_setloc): Likewise.
27869         (emit_jump_insn_after): Likewise.
27870         (emit_call_insn_after_setloc): Likewise.
27871         (emit_call_insn_after): Likewise.
27872         (emit_debug_insn_after_setloc): Likewise.
27873         (emit_debug_insn_after): Likewise.
27874         (emit_pattern_before_setloc): Likewise.  Add checked casts for now
27875         when converting "last" from rtx to rtx_insn *.
27876         (emit_pattern_before): Strengthen return type from rtx to
27877         rtx_insn *.
27878         (emit_insn_before_setloc): Likewise.
27879         (emit_insn_before): Likewise.
27880         (emit_jump_insn_before_setloc): Likewise.
27881         (emit_jump_insn_before): Likewise.
27882         (emit_call_insn_before_setloc): Likewise.
27883         (emit_call_insn_before): Likewise.
27884         (emit_debug_insn_before_setloc): Likewise.
27885         (emit_debug_insn_before): Likewise.
27886         (emit_insn): Strengthen return type and locals "last", "insn",
27887         "next" from rtx to rtx_insn *.  Add checked cast to rtx_insn
27888         within cases where we know we have an insn.
27889         (emit_debug_insn): Likewise.
27890         (emit_jump_insn): Likewise.
27891         (emit_call_insn): Strengthen return type and local "insn" from rtx
27892         to rtx_insn *.
27893         (emit_label): Strengthen return type from rtx to rtx_insn *.  Add
27894         a checked cast to rtx_insn * for now on "label".
27895         (emit_barrier): Strengthen return type from rtx to rtx_barrier *.
27896         (emit_clobber): Strengthen return type from rtx to rtx_insn *.
27897         (emit_use): Likewise.
27898         (gen_use): Likewise, also for local "seq".
27899         (emit): Likewise for return type and local "insn".
27900         (rtx_insn): Likewise for return type and local "new_rtx".
27901
27902         * cfgrtl.c (emit_barrier_after_bb): Strengthen local "barrier"
27903         from rtx to rtx_barrier *.
27904
27905         * config/sh/sh.c (output_stack_adjust): Since emit_insn has
27906         changed return type from rtx to rtx_insn *, we must update
27907         "emit_fn" type, and this in turn means updating...
27908         (frame_insn): ...this.  Strengthen return type from rtx to
27909         rtx_insn *.  Introduce a new local "insn" of the appropriate type.
27910
27911 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27912
27913         * emit-rtl.c (emit_jump_table_data): Strengthen return type from
27914         rtx to rtx_jump_table_data *.  Also for local.
27915         * rtl.h (emit_jump_table_data): Likewise.
27916
27917 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27918
27919         * basic-block.h (create_basic_block_structure): Strengthen third
27920         param "bb_note" from rtx to rtx_note *.
27921         * rtl.h (emit_note_before): Strengthen return type from rtx to
27922         rtx_note *.
27923         (emit_note_after): Likewise.
27924         (emit_note): Likewise.
27925         (emit_note_copy): Likewise.  Also, strengthen param similarly.
27926         * function.h (struct rtl_data): Strengthen field
27927         "x_stack_check_probe_note" from rtx to rtx_note *.
27928
27929         * cfgexpand.c (expand_gimple_basic_block): Strengthen local "note"
27930         from rtx to rtx_note *.
27931         * cfgrtl.c (create_basic_block_structure): Strengthen third param
27932         "bb_note" from rtx to rtx_note *.
27933         (duplicate_insn_chain): Likewise for local "last".  Add a checked cast
27934         when calling emit_note_copy.
27935         * emit-rtl.c (make_note_raw): Strengthen return type from rtx to
27936         rtx_note *.
27937         (emit_note_after): Likewise.
27938         (emit_note_before): Likewise.
27939         (emit_note_copy): Likewise.  Also, strengthen param similarly.
27940         (emit_note): Likewise.
27941         * except.c (emit_note_eh_region_end): Likewise for return type.
27942         Strengthen local "next" from rtx to rtx_insn *.
27943         (convert_to_eh_region_ranges): Strengthen local "note"
27944         from rtx to rtx_note *.
27945         * final.c (change_scope): Likewise.
27946         (reemit_insn_block_notes): Likewise, for both locals named "note".
27947         Also, strengthen local "insn" from rtx to rtx_insn *.
27948         * haifa-sched.c (sched_extend_bb): Strengthen local "note" from
27949         rtx to rtx_note *.
27950         * reg-stack.c (compensate_edge): Likewise for local "after". Also,
27951         strengthen local "seq" from rtx to rtx_insn *.
27952         * reload1.c (reload_as_needed): Strengthen local "marker" from rtx
27953         to rtx_note *.
27954         * sel-sched-ir.c (bb_note_pool): Strengthen from rtx_vec_t to
27955         vec<rtx_note *>.
27956         (get_bb_note_from_pool): Strengthen return type from rtx to
27957         rtx_note *.
27958         (sel_create_basic_block): Strengthen local "new_bb_note" from
27959         insn_t to rtx_note *.
27960         * var-tracking.c (emit_note_insn_var_location): Strengthen local
27961         "note" from rtx to rtx_note *.
27962         (emit_notes_in_bb): Likewise.
27963
27964 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27965
27966         * function.h (struct rtl_data): Strengthen field
27967         "x_parm_birth_insn" from rtx to rtx_insn *.
27968         * function.c (struct assign_parm_data_all): Strengthen fields
27969         "first_conversion_insn" and "last_conversion_insn" from rtx to
27970         rtx_insn *.
27971
27972 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27973
27974         * cfgexpand.c (expand_used_vars): Strengthen return type from rtx
27975         to rtx_insn *; also for local "var_end_seq".
27976         (maybe_dump_rtl_for_gimple_stmt): Likewise for param "since".
27977         (maybe_cleanup_end_of_block): Likewise for param "last" and local
27978         "insn".
27979         (expand_gimple_cond): Likewise for locals "last2" and "last".
27980         (mark_transaction_restart_calls): Likewise for local "insn".
27981         (expand_gimple_stmt): Likewise for return type and locals "last"
27982         and "insn".
27983         (expand_gimple_tailcall): Likewise for locals "last2" and "last".
27984         (avoid_complex_debug_insns): Likewise for param "insn".
27985         (expand_debug_locations): Likewise for locals "insn", "last",
27986         "prev_insn" and "insn2".
27987         (expand_gimple_basic_block): Likewise for local "last".
27988         (construct_exit_block): Likewise for locals "head", "end",
27989         "orig_end".
27990         (pass_expand::execute): Likewise for locals "var_seq",
27991         "var_ret_seq", "next".
27992
27993 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
27994
27995         * asan.h (asan_emit_stack_protection): Strengthen return type from
27996         rtx to rtx_insn *.
27997         * asan.c (asan_emit_stack_protection): Likewise.  Add local
27998         "insns" to hold the return value.
27999
28000 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28001
28002         * basic-block.h (bb_note): Strengthen return type from rtx to
28003         rtx_note *.
28004         * sched-int.h (bb_note): Likewise.
28005         * cfgrtl.c (bb_note): Likewise.  Add a checked cast to rtx_note *.
28006
28007 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28008
28009         * rtl.h (make_insn_raw): Strengthen return type from rtx to
28010         rtx_insn *.
28011
28012         * emit-rtl.c (make_insn_raw): Strengthen return type and local
28013         "insn" from rtx to rtx_insn *.
28014         (make_debug_insn_raw): Strengthen return type from rtx to
28015         rtx_insn *; strengthen local "insn" from rtx to rtx_debug_insn *.
28016         (make_jump_insn_raw):  Strengthen return type from rtx to
28017         rtx_insn *; strengthen local "insn" from rtx to rtx_jump_insn *.
28018         (make_call_insn_raw):  Strengthen return type from rtx to
28019         rtx_insn *; strengthen local "insn" from rtx to rtx_call_insn *.
28020         (emit_pattern_before_noloc): Strengthen return type of "make_raw"
28021         callback from rtx to rtx_insn *; likewise for local "insn" and
28022         "next", adding a checked cast to rtx_insn in the relevant cases of
28023         the switch statement.
28024         (emit_pattern_after_noloc): Strengthen return type of "make_raw"
28025         callback from rtx to rtx_insn *.
28026         (emit_pattern_after_setloc): Likewise.
28027         (emit_pattern_after): Likewise.
28028         (emit_pattern_before_setloc): Likewise.
28029         (emit_pattern_before): Likewise.
28030
28031 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28032
28033         * emit-rtl.c (last_call_insn): Strengthen return type from rtx to
28034         rtx_call_insn *.
28035         * rtl.h (is_a_helper <rtx_call_insn *>::test): New overload,
28036         accepting an rtx_insn *.
28037         (last_call_insn): Strengthen return type from rtx to
28038         rtx_call_insn *.
28039
28040 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28041
28042         * rtl.h (delete_trivially_dead_insns): Strengthen initial param
28043         "insns" from rtx to rtx_insn *.
28044         * cse.c (delete_trivially_dead_insns): Likewise, also do it for
28045         locals "insn" and "prev".
28046
28047 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28048
28049         * rtl.h (tablejump_p): Strengthen third param from rtx * to
28050         rtx_jump_table_data **.
28051
28052         * cfgbuild.c (make_edges): Introduce local "table", using it in
28053         place of "tmp" for jump table data.
28054         (find_bb_boundaries): Strengthen local "table" from rtx to
28055         rtx_jump_table_data *.
28056         * cfgcleanup.c (merge_blocks_move_successor_nojumps): Likewise.
28057         (outgoing_edges_match): Likewise for locals "table1" and "table2".
28058         (try_crossjump_to_edge): Likewise.
28059         * cfgrtl.c (try_redirect_by_replacing_jump): Likewise for local
28060         "table".
28061         (patch_jump_insn): Introduce local "table", using it in place of
28062         "tmp" for jump table data.
28063         (force_nonfallthru_and_redirect): Introduce local "table", so that
28064         call to tablejump_p can receive an rtx_jump_table_data **.  Update
28065         logic around the call to overwrite "note" appropriately if
28066         tablejump_p returns non-zero.
28067         (get_last_bb_insn): Introduce local "table", using it in place of
28068         "tmp" for jump table data.
28069         * dwarf2cfi.c (create_trace_edges): Likewise.
28070
28071         * config/arm/arm.c (get_jump_table_size): Strengthen param "insn"
28072         from rtx to rtx_jump_table_data *.
28073         (create_fix_barrier): Strengthen local "tmp" from rtx to
28074         rtx_jump_table_data *.
28075         (arm_reorg): Likewise for local "table".
28076
28077         * config/s390/s390.c (s390_chunkify_start): Likewise.
28078
28079         * config/spu/spu.c (spu_emit_branch_hint): Likewise.
28080
28081         * jump.c (delete_related_insns): Strengthen local "lab_next" from
28082         rtx to rtx_jump_table_data *.
28083
28084         * rtlanal.c (tablejump_p): Strengthen param "tablep" from rtx * to
28085         rtx_jump_table_data **.  Add a checked cast when writing through
28086         the pointer: we know there that local "table" is non-NULL and that
28087         JUMP_TABLE_DATA_P (table) holds.
28088         (label_is_jump_target_p): Introduce local "table", using it in
28089         place of "tmp" for jump table data.
28090
28091 2014-08-19  Marek Polacek  <polacek@redhat.com>
28092
28093         PR c++/62153
28094         * doc/invoke.texi: Document -Wbool-compare.
28095
28096 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28097
28098         * rtl.h (entry_of_function): Strengthen return type from rtx to
28099         rtx_insn *.
28100         * cfgrtl.c (entry_of_function): Likewise.
28101
28102 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28103
28104         * emit-rtl.h (get_insns): Strengthen return type from rtx to
28105         rtx_insn *, adding a checked cast for now.
28106         (get_last_insn): Likewise.
28107
28108 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28109
28110         * rtl.h (gen_label_rtx): Strengthen return type from rtx to
28111         rtx_code_label *.
28112
28113         * emit-rtl.c (gen_label_rtx): Likewise.
28114
28115 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28116
28117         * rtl.h (previous_insn): Strengthen return type from rtx to
28118         rtx_insn *.
28119         (next_insn): Likewise.
28120         (prev_nonnote_insn): Likewise.
28121         (prev_nonnote_insn_bb): Likewise.
28122         (next_nonnote_insn): Likewise.
28123         (next_nonnote_insn_bb): Likewise.
28124         (prev_nondebug_insn): Likewise.
28125         (next_nondebug_insn): Likewise.
28126         (prev_nonnote_nondebug_insn): Likewise.
28127         (next_nonnote_nondebug_insn): Likewise.
28128         (prev_real_insn): Likewise.
28129         (next_real_insn): Likewise.
28130         (prev_active_insn): Likewise.
28131         (next_active_insn): Likewise.
28132
28133         * emit-rtl.c (next_insn): Strengthen return type from rtx to
28134         rtx_insn *, adding a checked cast.
28135         (previous_insn): Likewise.
28136         (next_nonnote_insn): Likewise.
28137         (next_nonnote_insn_bb): Likewise.
28138         (prev_nonnote_insn): Likewise.
28139         (prev_nonnote_insn_bb): Likewise.
28140         (next_nondebug_insn): Likewise.
28141         (prev_nondebug_insn): Likewise.
28142         (next_nonnote_nondebug_insn): Likewise.
28143         (prev_nonnote_nondebug_insn): Likewise.
28144         (next_real_insn): Likewise.
28145         (prev_real_insn): Likewise.
28146         (next_active_insn): Likewise.
28147         (prev_active_insn): Likewise.
28148
28149         * config/sh/sh-protos.h (sh_find_set_of_reg): Convert function ptr
28150         param "stepfunc" so that it returns an rtx_insn * rather than an
28151         rtx, to track the change to prev_nonnote_insn_bb, which is the
28152         only function this is called with.
28153         * config/sh/sh.c (sh_find_set_of_reg): Likewise.
28154
28155 2014-08-19  Jan Hubicka  <hubicka@ucw.cz>
28156
28157         * ipa-visibility.c (update_visibility_by_resolution_info): Fix
28158         assert.
28159
28160 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28161
28162         * coretypes.h (class rtx_debug_insn): Add forward declaration.
28163         (class rtx_nonjump_insn): Likewise.
28164         (class rtx_jump_insn): Likewise.
28165         (class rtx_call_insn): Likewise.
28166         (class rtx_jump_table_data): Likewise.
28167         (class rtx_barrier): Likewise.
28168         (class rtx_code_label): Likewise.
28169         (class rtx_note): Likewise.
28170
28171         * rtl.h (class rtx_debug_insn): New, a subclass of rtx_insn,
28172         adding the invariant DEBUG_INSN_P (X).
28173         (class rtx_nonjump_insn): New, a subclass of rtx_insn, adding
28174         the invariant NONJUMP_INSN_P (X).
28175         (class rtx_jump_insn): New, a subclass of rtx_insn, adding
28176         the invariant JUMP_P (X).
28177         (class rtx_call_insn): New, a subclass of rtx_insn, adding
28178         the invariant CALL_P (X).
28179         (class rtx_jump_table): New, a subclass of rtx_insn, adding the
28180         invariant JUMP_TABLE_DATA_P (X).
28181         (class rtx_barrier): New, a subclass of rtx_insn, adding the
28182         invariant BARRIER_P (X).
28183         (class rtx_code_label): New, a subclass of rtx_insn, adding
28184         the invariant LABEL_P (X).
28185         (class rtx_note): New, a subclass of rtx_insn, adding
28186         the invariant NOTE_P(X).
28187         (is_a_helper <rtx_debug_insn *>::test): New.
28188         (is_a_helper <rtx_nonjump_insn *>::test): New.
28189         (is_a_helper <rtx_jump_insn *>::test): New.
28190         (is_a_helper <rtx_call_insn *>::test): New.
28191         (is_a_helper <rtx_jump_table_data *>::test): New functions,
28192         overloaded for both rtx and rtx_insn *.
28193         (is_a_helper <rtx_barrier *>::test): New.
28194         (is_a_helper <rtx_code_label *>::test): New functions, overloaded
28195         for both rtx and rtx_insn *.
28196         (is_a_helper <rtx_note *>::test): New.
28197
28198 2014-08-19  Marek Polacek  <polacek@redhat.com>
28199
28200         * config/alpha/alpha.h (CLZ_DEFINED_VALUE_AT_ZERO,
28201         CTZ_DEFINED_VALUE_AT_ZERO): Return 0/1 rather than bool.
28202         * config/i386/i386.h (CLZ_DEFINED_VALUE_AT_ZERO,
28203         CTZ_DEFINED_VALUE_AT_ZERO): Return 0/1 rather than bool.
28204
28205 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28206
28207         * sel-sched-ir.h (BND_TO): insn_t will eventually be an
28208         rtx_insn *.  To help with transition, for now, convert from an
28209         access macro into a pair of functions: BND_TO, returning an
28210         rtx_insn *, and...
28211         (SET_BND_TO): New function, for use where BND_TO is used as an
28212         lvalue.
28213
28214         * sel-sched-ir.c (blist_add): Update lvalue usage of BND_TO to
28215         SET_BND_TO.
28216         (BND_TO): New function, adding a checked cast.
28217         (SET_BND_TO): New function.
28218
28219         * sel-sched.c (move_cond_jump): Update lvalue usage of BND_TO to
28220         SET_BND_TO.
28221         (compute_av_set_on_boundaries): Likewise.
28222
28223 2014-08-19  H.J. Lu  <hongjiu.lu@intel.com>
28224
28225         * config/i386/i386.md (*ctz<mode>2_falsedep_1): Don't clear
28226         destination if it is used in source.
28227         (*clz<mode>2_lzcnt_falsedep_1): Likewise.
28228         (*popcount<mode>2_falsedep_1): Likewise.
28229
28230 2014-08-19  H.J. Lu  <hongjiu.lu@intel.com>
28231
28232         PR other/62168
28233         * configure.ac: Set install_gold_as_default to no first.
28234         * configure: Regenerated.
28235
28236 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28237
28238         * sel-sched-ir.h (BB_NOTE_LIST): struct sel_region_bb_info_def's
28239         "note_list" field will eventually be an rtx_insn *.  To help with
28240         transition, for now, convert from an access macro into a pair of
28241         functions: BB_NOTE_LIST, returning an rtx_insn *, and...
28242         (SET_BB_NOTE_LIST): New function, for use where BB_NOTE_LIST is
28243         used as an lvalue.
28244
28245         * sel-sched.c (create_block_for_bookkeeping): Update lvalue usage
28246         of BB_NOTE_LIST to SET_BB_NOTE_LIST.
28247
28248         * sel-sched-ir.c (init_bb): Likewise.
28249         (sel_restore_notes): Likewise.
28250         (move_bb_info): Likewise.
28251         (BB_NOTE_LIST): New function, adding a checked cast to rtx_insn *.
28252         (SET_BB_NOTE_LIST): New function.
28253
28254 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28255
28256         * sel-sched-ir.h (VINSN_INSN_RTX): struct vinsn_def's "insn_rtx"
28257         field will eventually be an rtx_insn *.  To help with transition,
28258         for now, convert from an access macro into a pair of functions:
28259         VINSN_INSN_RTX, returning an rtx_insn *, and...
28260         (SET_VINSN_INSN_RTX): New function, for use where VINSN_INSN_RTX
28261         is used as an lvalue.
28262
28263         * sel-sched-ir.c (vinsn_init): Replace VINSN_INSN_RTX with
28264         SET_VINSN_INSN_RTX where it's used as an lvalue.
28265         (VINSN_INSN_RTX): New function.
28266         (SET_VINSN_INSN_RTX): New function.
28267
28268 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28269
28270         * sched-int.h (DEP_PRO): struct _dep's "pro" and "con" fields will
28271         eventually be rtx_insn *, but to help with transition, for now,
28272         convert from an access macro into a pair of functions: DEP_PRO
28273         returning an rtx_insn * and...
28274         (SET_DEP_PRO): New function, for use where DEP_PRO is used as an
28275         lvalue, returning an rtx&.
28276         (DEP_CON): Analogous changes to DEP_PRO above.
28277         (SET_DEP_CON): Likewise.
28278
28279         * haifa-sched.c (create_check_block_twin): Replace DEP_CON used as
28280         an lvalue to SET_DEP_CON.
28281         * sched-deps.c (init_dep_1): Likewise for DEP_PRO and DEP_CON.
28282         (sd_copy_back_deps): Likewise for DEP_CON.
28283         (DEP_PRO): New function, adding a checked cast for now.
28284         (DEP_CON): Likewise.
28285         (SET_DEP_PRO): New function.
28286         (SET_DEP_CON): Likewise.
28287
28288 2014-08-19  Yaakov Selkowitz  <yselkowi@redhat.com>
28289
28290         * config.gcc (*-*-cygwin*): Use __cxa_atexit by default.
28291         (extra_options): Add i386/cygwin.opt.
28292         * config/i386/cygwin.h (STARTFILE_SPEC): Use crtbeginS.o if shared.
28293         (CPP_SPEC): Accept -pthread.
28294         (LINK_SPEC): Ditto.
28295         (GOMP_SELF_SPECS): Update comment.
28296         * config/i386/cygwin.opt: New file for -pthread flag.
28297
28298 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28299
28300         * df-core.c (DF_REF_INSN): New, using a checked cast for now.
28301         * df.h (DF_REF_INSN): Convert from a macro to a function, so
28302         that we can return an rtx_insn *.
28303
28304 2014-08-19  Yaakov Selkowitz  <yselkowi@redhat.com>
28305
28306         * config/i386/cygwin.h (LINK_SPEC): Pass --tsaware flag only
28307         when building executables, not DLLs.  Add --large-address-aware
28308         under the same conditions.
28309         * config/i386/cygwin-w64.h (LINK_SPEC): Pass --tsaware flag only
28310         when building executables, not DLLs.  Add --large-address-aware
28311         under the same conditions when using -m32.
28312
28313         * config/i386/cygwin-stdint.h: Throughout, make type
28314         definitions dependent on target architecture, not host.
28315
28316 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28317
28318         * rtl.h (PREV_INSN): Convert to an inline function.  Strengthen
28319         the return type from rtx to rtx_insn *,  which will enable various
28320         conversions in followup patches.  For now this is is done by a
28321         checked cast.
28322         (NEXT_INSN): Likewise.
28323         (SET_PREV_INSN): Convert to an inline function.  This is intended
28324         for use as an lvalue, and so returns an rtx& to allow in-place
28325         modification.
28326         (SET_NEXT_INSN): Likewise.
28327
28328 2014-07-08  Mark Wielaard  <mjw@redhat.com>
28329
28330         PR debug/59051
28331         * dwarf2out.c (modified_type_die): Handle TYPE_QUAL_RESTRICT.
28332
28333 2014-08-19  Marek Polacek  <polacek@redhat.com>
28334
28335         PR c/61271
28336         * cgraphunit.c (handle_alias_pairs): Fix condition.
28337
28338 2014-08-19  Richard Biener  <rguenther@suse.de>
28339
28340         * gimple-fold.c (fold_gimple_assign): Properly build a
28341         null-pointer constant when devirtualizing addresses.
28342
28343 2014-07-07  Mark Wielaard  <mjw@redhat.com>
28344
28345         * dwarf2out.c (decl_quals): New function.
28346         (modified_type_die): Take one cv_quals argument instead of two,
28347         one for const and one for volatile.
28348         (add_type_attribute): Likewise.
28349         (generic_parameter_die): Call add_type_attribute with one modifier
28350         argument.
28351         (base_type_for_mode): Likewise.
28352         (add_bounds_info): Likewise.
28353         (add_subscript_info): Likewise.
28354         (gen_array_type_die): Likewise.
28355         (gen_descr_array_type_die): Likewise.
28356         (gen_entry_point_die): Likewise.
28357         (gen_enumeration_type_die): Likewise.
28358         (gen_formal_parameter_die): Likewise.
28359         (gen_subprogram_die): Likewise.
28360         (gen_variable_die): Likewise.
28361         (gen_const_die): Likewise.
28362         (gen_field_die): Likewise.
28363         (gen_pointer_type_die): Likewise.
28364         (gen_reference_type_die): Likewise.
28365         (gen_ptr_to_mbr_type_die): Likewise.
28366         (gen_inheritance_die): Likewise.
28367         (gen_subroutine_type_die): Likewise.
28368         (gen_typedef_die): Likewise.
28369         (force_type_die): Likewise.
28370
28371 2014-08-19  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
28372
28373         * configure.ac (gcc_cv_as_comdat_group_group): Only default to no
28374         if unset.
28375         * configure: Regenerate.
28376
28377 2014-08-19  Richard Biener  <rguenther@suse.de>
28378
28379         * lto-streamer-out.c (DFS::DFS_write_tree_body): Stream
28380         DECL_EXTERNALs in BLOCKs as non-references.
28381         * tree-streamer-out.c (streamer_write_chain): Likewise.
28382
28383 2014-08-19  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28384             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28385             Anna Tikhonova  <anna.tikhonova@intel.com>
28386             Ilya Tocar  <ilya.tocar@intel.com>
28387             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28388             Ilya Verbin  <ilya.verbin@intel.com>
28389             Kirill Yukhin  <kirill.yukhin@intel.com>
28390             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28391
28392         * config/i386/sse.md
28393         (define_mode_iterator VI48_AVX512F): Delete.
28394         (define_mode_iterator VI48_AVX512F_AVX512VL): New.
28395         (define_mode_iterator VI2_AVX512VL): Ditto.
28396         (define_insn "<mask_codefor>avx512f_ufix_notruncv16sfv16si<mask_name><round_name>"):
28397         Delete.
28398         (define_insn
28399         ("<mask_codefor><avx512>_ufix_notrunc<sf2simodelower><mode><mask_name><round_name>"):
28400         New.
28401         (define_insn "avx512cd_maskw_vec_dup<mode>"): Macroize.
28402         (define_insn "<avx2_avx512f>_ashrv<mode><mask_name>"): Delete.
28403         (define_insn "<avx2_avx512bw>_ashrv<mode><mask_name>",
28404         with VI48_AVX512F_AVX512VL): New.
28405         (define_insn "<avx2_avx512bw>_ashrv<mode><mask_name>",
28406         with VI2_AVX512VL): Ditto.
28407
28408 2014-08-19  Marek Polacek  <polacek@redhat.com>
28409
28410         * doc/invoke.texi: Document -Wc99-c11-compat.
28411
28412 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28413
28414         * rtl.h (PREV_INSN): Split macro in two: the existing one,
28415         for rvalues, and...
28416         (SET_PREV_INSN): New macro, for use as an lvalue.
28417         (NEXT_INSN, SET_NEXT_INSN): Likewise.
28418
28419         * caller-save.c (save_call_clobbered_regs): Convert lvalue use of
28420         PREV_INSN/NEXT_INSN into SET_PREV_INSN/SET_NEXT_INSN.
28421         * cfgrtl.c (try_redirect_by_replacing_jump): Likewise.
28422         (fixup_abnormal_edges): Likewise.
28423         (unlink_insn_chain): Likewise.
28424         (fixup_reorder_chain): Likewise.
28425         (cfg_layout_delete_block): Likewise.
28426         (cfg_layout_merge_blocks): Likewise.
28427         * combine.c (update_cfg_for_uncondjump): Likewise.
28428         * emit-rtl.c (link_insn_into_chain): Likewise.
28429         (remove_insn): Likewise.
28430         (delete_insns_since): Likewise.
28431         (reorder_insns_nobb): Likewise.
28432         (emit_insn_after_1): Likewise.
28433         * final.c (rest_of_clean_state): Likewise.
28434         (final_scan_insn): Likewise.
28435         * gcse.c (can_assign_to_reg_without_clobbers_p): Likewise.
28436         * haifa-sched.c (concat_note_lists): Likewise.
28437         (remove_notes): Likewise.
28438         (restore_other_notes): Likewise.
28439         (move_insn): Likewise.
28440         (unlink_bb_notes): Likewise.
28441         (restore_bb_notes): Likewise.
28442         * jump.c (delete_for_peephole): Likewise.
28443         * optabs.c (emit_libcall_block_1): Likewise.
28444         * reorg.c (emit_delay_sequence): Likewise.
28445         (fill_simple_delay_slots): Likewise.
28446         * sel-sched-ir.c (sel_move_insn): Likewise.
28447         (sel_remove_insn): Likewise.
28448         (get_bb_note_from_pool): Likewise.
28449         * sel-sched.c (move_nop_to_previous_block): Likewise.
28450
28451         * config/bfin/bfin.c (reorder_var_tracking_notes): Likewise.
28452         * config/c6x/c6x.c (gen_one_bundle): Likewise.
28453         (c6x_gen_bundles): Likewise.
28454         (hwloop_optimize): Likewise.
28455         * config/frv/frv.c (frv_function_prologue): Likewise.
28456         (frv_register_nop): Likewise.
28457         * config/ia64/ia64.c (ia64_init_dfa_pre_cycle_insn): Likewise.
28458         (ia64_reorg): Likewise.
28459         * config/mep/mep.c (mep_reorg_addcombine): Likewise.
28460         (mep_make_bundle): Likewise.
28461         (mep_bundle_insns): Likewise.
28462         * config/picochip/picochip.c (reorder_var_tracking_notes): Likewise.
28463         * config/tilegx/tilegx.c (reorder_var_tracking_notes): Likewise.
28464         * config/tilepro/tilepro.c (reorder_var_tracking_notes): Likewise.
28465
28466 2014-08-19  David Malcolm  <dmalcolm@redhat.com>
28467
28468         * basic-block.h (BB_HEAD): Convert to a function.  Strengthen the
28469         return type from rtx to rtx_insn *.
28470         (BB_END): Likewise.
28471         (BB_HEADER): Likewise.
28472         (BB_FOOTER): Likewise.
28473         (SET_BB_HEAD): Convert to a function.
28474         (SET_BB_END): Likewise.
28475         (SET_BB_HEADER): Likewise.
28476         (SET_BB_FOOTER): Likewise.
28477
28478         * cfgrtl.c (BB_HEAD): New function, from macro of same name.
28479         Strengthen the return type from rtx to rtx_insn *.  For now, this
28480         is done by adding a checked cast, but this will eventually
28481         become a field lookup.
28482         (BB_END): Likewise.
28483         (BB_HEADER): Likewise.
28484         (BB_FOOTER): Likewise.
28485         (SET_BB_HEAD): New function, from macro of same name.  This is
28486         intended for use as an lvalue, and so returns an rtx& to allow
28487         in-place modification.
28488         (SET_BB_END): Likewise.
28489         (SET_BB_HEADER): Likewise.
28490         (SET_BB_FOOTER): Likewise.
28491
28492 2014-08-18  David Malcolm  <dmalcolm@redhat.com>
28493
28494         * basic-block.h (BB_HEAD): Split macro in two: the existing one,
28495         for rvalues, and...
28496         (SET_BB_HEAD): New macro, for use as a lvalue.
28497         (BB_END, SET_BB_END): Likewise.
28498         (BB_HEADER, SET_BB_HEADER): Likewise.
28499         (BB_FOOTER, SET_BB_FOOTER): Likewise.
28500
28501         * bb-reorder.c (add_labels_and_missing_jumps): Convert lvalue use
28502         of BB_* macros into SET_BB_* macros.
28503         (fix_crossing_unconditional_branches): Likewise.
28504         * caller-save.c (save_call_clobbered_regs): Likewise.
28505         (insert_one_insn): Likewise.
28506         * cfgbuild.c (find_bb_boundaries): Likewise.
28507         * cfgcleanup.c (merge_blocks_move_successor_nojumps): Likewise.
28508         (outgoing_edges_match): Likewise.
28509         (try_optimize_cfg): Likewise.
28510         * cfgexpand.c (expand_gimple_cond): Likewise.
28511         (expand_gimple_tailcall): Likewise.
28512         (expand_gimple_basic_block): Likewise.
28513         (construct_exit_block): Likewise.
28514         * cfgrtl.c (delete_insn): Likewise.
28515         (create_basic_block_structure): Likewise.
28516         (rtl_delete_block): Likewise.
28517         (rtl_split_block): Likewise.
28518         (emit_nop_for_unique_locus_between): Likewise.
28519         (rtl_merge_blocks): Likewise.
28520         (block_label): Likewise.
28521         (try_redirect_by_replacing_jump): Likewise.
28522         (emit_barrier_after_bb): Likewise.
28523         (fixup_abnormal_edges): Likewise.
28524         (record_effective_endpoints): Likewise.
28525         (relink_block_chain): Likewise.
28526         (fixup_reorder_chain): Likewise.
28527         (fixup_fallthru_exit_predecessor): Likewise.
28528         (cfg_layout_duplicate_bb): Likewise.
28529         (cfg_layout_split_block): Likewise.
28530         (cfg_layout_delete_block): Likewise.
28531         (cfg_layout_merge_blocks): Likewise.
28532         * combine.c (update_cfg_for_uncondjump): Likewise.
28533         * emit-rtl.c (add_insn_after): Likewise.
28534         (remove_insn): Likewise.
28535         (reorder_insns): Likewise.
28536         (emit_insn_after_1): Likewise.
28537         * haifa-sched.c (get_ebb_head_tail): Likewise.
28538         (restore_other_notes): Likewise.
28539         (move_insn): Likewise.
28540         (sched_extend_bb): Likewise.
28541         (fix_jump_move): Likewise.
28542         * ifcvt.c (noce_process_if_block): Likewise.
28543         (dead_or_predicable): Likewise.
28544         * ira.c (update_equiv_regs): Likewise.
28545         * reg-stack.c (change_stack): Likewise.
28546         * sel-sched-ir.c (sel_move_insn): Likewise.
28547         * sel-sched.c (move_nop_to_previous_block): Likewise.
28548
28549         * config/c6x/c6x.c (hwloop_optimize): Likewise.
28550         * config/ia64/ia64.c (emit_predicate_relation_info): Likewise.
28551
28552 2014-08-18  David Malcolm  <dmalcolm@redhat.com>
28553
28554         * rtl.h (for_each_rtx_in_insn): New function.
28555         * rtlanal.c (for_each_rtx_in_insn): Likewise.
28556
28557 2014-08-18  David Malcolm  <dmalcolm@redhat.com>
28558
28559         * coretypes.h (class rtx_insn): Add forward declaration.
28560
28561         * rtl.h: Include is-a.h.
28562         (struct rtx_def): Add dummy "desc" and "tag" GTY options as a
28563         workaround to ensure gengtype knows inheritance is occurring,
28564         whilst continuing to use the pre-existing special-casing for
28565         rtx_def.
28566         (class rtx_insn): New subclass of rtx_def, adding the
28567         invariant that we're dealing with something we can sanely use
28568         INSN_UID, NEXT_INSN, PREV_INSN on.
28569         (is_a_helper <rtx_insn *>::test): New.
28570         (is_a_helper <const rtx_insn *>::test): New.
28571
28572 2014-08-18  David Malcolm  <dmalcolm@redhat.com>
28573
28574         * is-a.h (template<T, U> safe_as_a <U *p>) New function.
28575
28576 2014-08-18  Jan Hubicka  <hubicka@ucw.cz>
28577
28578         * ipa-visibility.c (update_visibility_by_resolution_info): Do no
28579         turn UNDEF comdats as extern.
28580
28581 2014-08-18  Jan Hubicka  <hubicka@ucw.cz>
28582
28583         * gimple-fold.c (fold_gimple_assign): Do not intorudce referneces
28584         to BUILT_IN_UNREACHABLE.
28585
28586 2014-08-18  Uros Bizjak  <ubizjak@gmail.com>
28587
28588         PR target/62011
28589         * config/i386/x86-tune.def (X86_TUNE_AVOID_FALSE_DEP_FOR_BMI):
28590         New tune flag.
28591         * config/i386/i386.h (TARGET_AVOID_FALSE_DEP_FOR_BMI): New define.
28592         * config/i386/i386.md (unspec) <UNSPEC_INSN_FALSE_DEP>: New unspec.
28593         (ffs<mode>2): Do not expand with tzcnt for
28594         TARGET_AVOID_FALSE_DEP_FOR_BMI.
28595         (ffssi2_no_cmove): Ditto.
28596         (*tzcnt<mode>_1): Disable for TARGET_AVOID_FALSE_DEP_FOR_BMI.
28597         (ctz<mode>2): New expander.
28598         (*ctz<mode>2_falsedep_1): New insn_and_split pattern.
28599         (*ctz<mode>2_falsedep): New insn.
28600         (*ctz<mode>2): Rename from ctz<mode>2.
28601         (clz<mode>2_lzcnt): New expander.
28602         (*clz<mode>2_lzcnt_falsedep_1): New insn_and_split pattern.
28603         (*clz<mode>2_lzcnt_falsedep): New insn.
28604         (*clz<mode>2): Rename from ctz<mode>2.
28605         (popcount<mode>2): New expander.
28606         (*popcount<mode>2_falsedep_1): New insn_and_split pattern.
28607         (*popcount<mode>2_falsedep): New insn.
28608         (*popcount<mode>2): Rename from ctz<mode>2.
28609         (*popcount<mode>2_cmp): Remove.
28610         (*popcountsi2_cmp_zext): Ditto.
28611
28612 2014-08-18  Ajit Agarwal  <ajitkum@xilinx.com>
28613
28614         * config/microblaze/microblaze.c (microblaze_elf_asm_cdtor): New.
28615         (microblaze_elf_asm_constructor,microblaze_elf_asm_destructor): New.
28616         * config/microblaze/microblaze.h
28617         (TARGET_ASM_CONSTRUCTOR,TARGET_ASM_DESTRUCTOR): New Macros.
28618
28619 2014-08-18  H.J. Lu  <hongjiu.lu@intel.com>
28620
28621         PR other/62168
28622         * configure.ac: Set install_gold_as_default to no for
28623         --enable-gold=no.
28624         * configure: Regenerated.
28625
28626 2014-08-18 Roman Gareev  <gareevroman@gmail.com>
28627
28628         * Makefile.in: Add definition of ISLLIBS, HOST_ISLLIBS.
28629         * config.in: Add undef of HAVE_isl.
28630         * configure: Regenerate.
28631         * configure.ac: Add definition of HAVE_isl.
28632         * graphite-blocking.c: Add checking of HAVE_isl.
28633         * graphite-dependences.c: Likewise.
28634         * graphite-interchange.c: Likewise.
28635         * graphite-isl-ast-to-gimple.c: Likewise.
28636         * graphite-optimize-isl.c: Likewise.
28637         * graphite-poly.c: Likewise.
28638         * graphite-scop-detection.c: Likewise.
28639         * graphite-sese-to-poly.c: Likewise.
28640         * graphite.c: Likewise.
28641         * toplev.c: Replace the checking of HAVE_cloog with the checking
28642         of HAVE_isl.
28643
28644 2014-08-18  Richard Biener  <rguenther@suse.de>
28645
28646         PR tree-optimization/62090
28647         * builtins.c (fold_builtin_snprintf): Move to gimple-fold.c.
28648         (fold_builtin_3): Do not fold snprintf.
28649         (fold_builtin_4): Likewise.
28650         * gimple-fold.c (gimple_fold_builtin_snprintf): New function
28651         moved from builtins.c.
28652         (gimple_fold_builtin_with_strlen): Fold snprintf and sprintf.
28653         (gimple_fold_builtin): Do not fold sprintf here.
28654
28655 2014-08-18  Richard Biener  <rguenther@suse.de>
28656
28657         * gimple-fold.c (maybe_fold_reference): Move re-gimplification
28658         code to ...
28659         (maybe_canonicalize_mem_ref_addr): ... this function.
28660         (fold_stmt_1): Apply it here before all simplification.
28661
28662 2014-08-18  Ilya Enkovich  <ilya.enkovich@intel.com>
28663
28664         PR ipa/61800
28665         * cgraph.h (cgraph_node::create_indirect_edge): Add
28666         compute_indirect_info param.
28667         * cgraph.c (cgraph_node::create_indirect_edge): Compute
28668         indirect_info only when it is required.
28669         * cgraphclones.c (cgraph_clone_edge): Do not recompute
28670         indirect_info fore cloned indirect edge.
28671
28672 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28673             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28674             Anna Tikhonova  <anna.tikhonova@intel.com>
28675             Ilya Tocar  <ilya.tocar@intel.com>
28676             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28677             Ilya Verbin  <ilya.verbin@intel.com>
28678             Kirill Yukhin  <kirill.yukhin@intel.com>
28679             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28680
28681         * config/i386/sse.md
28682         (define_mode_iterator VI8_AVX2_AVX512BW): New.
28683         (define_insn "<sse2_avx2>_psadbw"): Add evex version.
28684
28685 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28686             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28687             Anna Tikhonova  <anna.tikhonova@intel.com>
28688             Ilya Tocar  <ilya.tocar@intel.com>
28689             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28690             Ilya Verbin  <ilya.verbin@intel.com>
28691             Kirill Yukhin  <kirill.yukhin@intel.com>
28692             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28693
28694         * config/i386/sse.md
28695         (define_mode_iterator VF1_AVX512VL): New.
28696         (define_insn "ufloatv16siv16sf2<mask_name><round_name>"): Delete.
28697         (define_insn "ufloat<sseintvecmodelower><mode>2<mask_name><round_name>"):
28698         New.
28699
28700 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28701             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28702             Anna Tikhonova  <anna.tikhonova@intel.com>
28703             Ilya Tocar  <ilya.tocar@intel.com>
28704             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28705             Ilya Verbin  <ilya.verbin@intel.com>
28706             Kirill Yukhin  <kirill.yukhin@intel.com>
28707             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28708
28709         * config/i386/i386.c: Rename ufloatv8siv8df_mask to
28710         ufloatv8siv8df2_mask.
28711         * config/i386/i386.md
28712         (define_code_iterator any_float): New.
28713         (define_code_attr floatsuffix): New.
28714         * config/i386/sse.md
28715         (define_mode_iterator VF1_128_256VL): New.
28716         (define_mode_iterator VF2_512_256VL): New.
28717         (define_insn "float<si2dfmodelower><mode>2<mask_name>"): Remove
28718         unnecessary TARGET check.
28719         (define_insn "ufloatv8siv8df<mask_name>"): Delete.
28720         (define_insn "<floatsuffix>float<sseintvecmodelower><mode>2<mask_name><round_name>"):
28721         New.
28722         (define_mode_attr qq2pssuff): New.
28723         (define_mode_attr sselongvecmode): New.
28724         (define_mode_attr sselongvecmodelower): New.
28725         (define_mode_attr sseintvecmode3): New.
28726         (define_insn "<floatsuffix>float<sselongvecmodelower><mode>2<mask_name><round_name>"):
28727         New.
28728         (define_insn "*<floatsuffix>floatv2div2sf2"): New.
28729         (define_insn "<floatsuffix>floatv2div2sf2_mask"): New.
28730         (define_insn "ufloat<si2dfmodelower><mode>2<mask_name>"): New.
28731         (define_insn "ufloatv2siv2df2<mask_name>"): New.
28732
28733 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28734             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28735             Anna Tikhonova  <anna.tikhonova@intel.com>
28736             Ilya Tocar  <ilya.tocar@intel.com>
28737             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28738             Ilya Verbin  <ilya.verbin@intel.com>
28739             Kirill Yukhin  <kirill.yukhin@intel.com>
28740             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28741
28742         * config/i386/sse.md
28743         (define_mode_iterator VF2_AVX512VL): New.
28744         (define_mode_attr sseintvecmode2): New.
28745         (define_insn "ufix_truncv2dfv2si2<mask_name>"): Add masking.
28746         (define_insn "fix_truncv4dfv4si2<mask_name>"): New.
28747         (define_insn "ufix_truncv4dfv4si2<mask_name>"): Ditto.
28748         (define_insn
28749         "<fixsuffix>fix_trunc<mode><sseintvecmodelower>2<mask_name><round_saeonly_name>"):
28750         Ditto.
28751         (define_insn "fix_notrunc<mode><sseintvecmodelower>2<mask_name><round_name>"):
28752         Ditto.
28753         (define_insn "ufix_notrunc<mode><sseintvecmodelower>2<mask_name><round_name>"):
28754         Ditto.
28755
28756 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28757             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28758             Anna Tikhonova  <anna.tikhonova@intel.com>
28759             Ilya Tocar  <ilya.tocar@intel.com>
28760             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28761             Ilya Verbin  <ilya.verbin@intel.com>
28762             Kirill Yukhin  <kirill.yukhin@intel.com>
28763             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28764
28765         * config/i386/i386.md
28766         (define_insn "*movoi_internal_avx"): Add evex version.
28767         (define_insn "*movti_internal"): Ditto.
28768
28769 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28770             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28771             Anna Tikhonova  <anna.tikhonova@intel.com>
28772             Ilya Tocar  <ilya.tocar@intel.com>
28773             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28774             Ilya Verbin  <ilya.verbin@intel.com>
28775             Kirill Yukhin  <kirill.yukhin@intel.com>
28776             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28777
28778         * config/i386/i386.md
28779         (define_attr "isa"): Add avx512dq, noavx512dq.
28780         (define_attr "enabled"): Ditto.
28781         * config/i386/sse.md
28782         (define_insn "vec_extract_hi_<mode><mask_name>"): Support masking.
28783
28784 2014-08-18  Alexander Ivchenko  <alexander.ivchenko@intel.com>
28785             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
28786             Anna Tikhonova  <anna.tikhonova@intel.com>
28787             Ilya Tocar  <ilya.tocar@intel.com>
28788             Andrey Turetskiy  <andrey.turetskiy@intel.com>
28789             Ilya Verbin  <ilya.verbin@intel.com>
28790             Kirill Yukhin  <kirill.yukhin@intel.com>
28791             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
28792
28793         * config/i386/i386.c
28794         (ix86_expand_special_args_builtin): Handle avx512vl_storev8sf_mask,
28795         avx512vl_storev8si_mask, avx512vl_storev4df_mask, avx512vl_storev4di_mask,
28796         avx512vl_storev4sf_mask, avx512vl_storev4si_mask, avx512vl_storev2df_mask,
28797         avx512vl_storev2di_mask, avx512vl_loadv8sf_mask, avx512vl_loadv8si_mask,
28798         avx512vl_loadv4df_mask, avx512vl_loadv4di_mask, avx512vl_loadv4sf_mask,
28799         avx512vl_loadv4si_mask, avx512vl_loadv2df_mask, avx512vl_loadv2di_mask,
28800         avx512bw_loadv64qi_mask, avx512vl_loadv32qi_mask, avx512vl_loadv16qi_mask,
28801         avx512bw_loadv32hi_mask, avx512vl_loadv16hi_mask, avx512vl_loadv8hi_mask.
28802         * config/i386/i386.md (define_mode_attr ssemodesuffix): Allow V32HI mode.
28803         * config/i386/sse.md
28804         (define_mode_iterator VMOVE): Allow V4TI mode.
28805         (define_mode_iterator V_AVX512VL): New.
28806         (define_mode_iterator V): New handling for AVX512VL.
28807         (define_insn "avx512f_load<mode>_mask"): Delete.
28808         (define_insn "<avx512>_load<mode>_mask"): New.
28809         (define_insn "avx512f_store<mode>_mask"): Delete.
28810         (define_insn "<avx512>_store<mode>_mask"): New.
28811
28812
28813 2014-08-18  Yury Gribov  <y.gribov@samsung.com>
28814
28815         PR sanitizer/62089
28816         * asan.c (instrument_derefs): Fix bitfield check.
28817
28818 2014-08-17  Segher Boessenkool  <segher@kernel.crashing.org>
28819
28820         * config/rs6000/constraints.md ("S"): Require TARGET_POWERPC64.
28821         * config/rs6000/htm.md (ttest): Remove clobber.
28822         * config/rs6000/predicates.md (any_mask_operand): New predicate.
28823         (and_operand): Reformat.
28824         (and_2rld_operand): New predicate.
28825         * config/rs6000/rs6000-protos.h (rs6000_split_logical): Remove last
28826         parameter.
28827         * config/rs6000/rs6000.c (rs6000_split_logical_inner): Remove last
28828         parameter.  Handle AND directly.
28829         (rs6000_split_logical_di): Remove last parameter.
28830         (rs6000_split_logical): Remove last parameter.  Remove obsolete
28831         comment.
28832         * config/rs6000/rs6000.md (BOOL_REGS_AND_CR0): Delete.
28833         (one_cmpl<mode>2): Adjust call of rs6000_split_logical.
28834         (ctz<mode>2, ffs<mode>2): Delete clobber.  Reformat.
28835         (andsi3, andsi3_mc, andsi3_nomc, *andsi3_internal2_mc,
28836         *andsi3_internal3_mc, *andsi3_internal4, *andsi3_internal5_mc,
28837         and 5 anonymous splitters):  Delete.
28838         (and<mode>3): New expander.
28839         (*and<mode>3, *and<mode>3_dot, *and<mode>3_dot2): New.
28840         (and<mode>3_imm, *and<mode>3_imm_dot, *and<mode>3_imm_dot2): New.
28841         (*and<mode>3_mask, *and<mode>3_mask_dot, *and<mode>3_mask_dot2): New.
28842         (ior<mode>, xor<mode>3): Adjust call of rs6000_split_logical.
28843         (floatdisf2_internal1): Remove clobbers.
28844         (anddi3, anddi3_mc, anddi3_nomc, anddi3_internal2_mc,
28845         *anddi3_internal3_mc, and 4 anonymous splitters): Delete.
28846         (*anddi3_2rld, *anddi3_2rld_dot, *anddi3_2rld_dot2): New.
28847         (and<mode>3 for BOOL_128): Remove clobber.
28848         (*and<mode>3_internal for BOOL_128): Remove clobber.  Adjust call of
28849         rs6000_split_logical.
28850         (*bool<mode>3_internal for BOOL_128): Adjust call of
28851         rs6000_split_logical.
28852         (*boolc<mode>3_internal1 for BOOL_128,
28853         *boolc<mode>3_internal2 for BOOL_128,
28854         *boolcc<mode>3_internal1 for BOOL_128,
28855         *boolcc<mode>3_internal2 for BOOL_128,
28856         *eqv<mode>3_internal1 for BOOL_128,
28857         *eqv<mode>3_internal2 for BOOL_128,
28858         *one_cmpl<mode>3_internal for BOOL_128): Ditto.
28859         * config/rs6000/vector.md (*vec_reload_and_plus_<mptrsize): Remove
28860         clobber.
28861         (*vec_reload_and_reg_<mptrsize>): Delete.
28862
28863 2014-08-17  Segher Boessenkool  <segher@kernel.crashing.org>
28864
28865         * config/rs6000/rs6000.md (*boolccsi3_internal1, *boolccsi3_internal2
28866         and split, *boolccsi3_internal3 and split): Delete.
28867         (*boolccdi3_internal1, *boolccdi3_internal2 and split,
28868         *boolccdi3_internal3 and split): Delete.
28869         (*boolcc<mode>3, *boolcc<mode>3_dot, *boolcc<mode>3_dot2): New.
28870         (*eqv<mode>3): Move.  Add TODO comment.  Fix attributes.
28871
28872 2014-08-17  Segher Boessenkool  <segher@kernel.crashing.org>
28873
28874         * config/rs6000/rs6000.md (*boolcsi3_internal1, *boolcsi3_internal2
28875         and split, *boolcsi3_internal3 and split): Delete.
28876         (*boolcdi3_internal1, *boolcdi3_internal2 and split,
28877         *boolcdi3_internal3 and split): Delete.
28878         (*boolc<mode>3, *boolc<mode>3_dot, *boolc<mode>3_dot2): New.
28879
28880 2014-08-17  Segher Boessenkool  <segher@kernel.crashing.org>
28881
28882         * config/rs6000/rs6000.c (print_operand) <'e'>: New.
28883         <'u'>: Also support printing the low-order 16 bits.
28884         * config/rs6000/rs6000.md (iorsi3, xorsi3, *boolsi3_internal1,
28885         *boolsi3_internal2 and split, *boolsi3_internal3 and split): Delete.
28886         (iordi3, xordi3, *booldi3_internal1, *booldi3_internal2 and split,
28887         *booldi3_internal3 and split): Delete.
28888         (ior<mode>3, xor<mode>3, *bool<mode>3, *bool<mode>3_dot,
28889         *bool<mode>3_dot2): New.
28890         (two anonymous define_splits for non_logical_cint_operand): Merge.
28891
28892 2014-08-17  Marek Polacek  <polacek@redhat.com>
28893             Manuel López-Ibáñez  <manu@gcc.gnu.org>
28894
28895         PR c/62059
28896         * diagnostic.c (adjust_line): Add gcc_checking_assert.
28897         (diagnostic_show_locus): Don't print caret diagnostic
28898         if a column is larger than the line_width.
28899
28900 2014-08-17 Roman Gareev  <gareevroman@gmail.com>
28901
28902         * common.opt: Make the ISL AST generator to be the main code generator
28903         of Graphite.
28904
28905 2014-08-16  Gerald Pfeifer  <gerald@pfeifer.com>
28906
28907         * wide-int.h (generic_wide_int): Declare as class instead of struct.
28908
28909 2014-08-16  John David Anglin  <danglin@gcc.gnu.org>
28910
28911         PR target/61641
28912         * config/pa/pa-protos.h (pa_output_addr_vec, pa_output_addr_diff_vec):
28913         Declare.
28914         * config/pa/pa.c (pa_reorg): Remove code to insert brtab marker insns.
28915         (pa_output_addr_vec, pa_output_addr_diff_vec): New.
28916         * config/pa/pa.h (ASM_OUTPUT_ADDR_VEC, ASM_OUTPUT_ADDR_DIFF_VEC):
28917         Define.
28918         * config/pa/pa.md (begin_brtab): Delete insn.
28919         (end_brtab): Likewise.
28920
28921 2014-08-16  Manuel López-Ibáñez  <manu@gcc.gnu.org>
28922
28923         * doc/cppopts.texi (ftrack-macro-expansion): Add missing @code.
28924
28925 2014-08-15  Jan Hubicka  <hubicka@ucw.cz>
28926
28927         * ipa-utils.h (ipa_polymorphic_call_context): Turn into class; add ctors.
28928         (possible_polymorphic_call_targets, dump_possible_polymorphic_call_targets,
28929         possible_polymorphic_call_target_p, possible_polymorphic_call_target_p): Simplify.
28930         (get_dynamic_type): Remove.
28931         * ipa-devirt.c (ipa_dummy_polymorphic_call_context): Remove.
28932         (clear_speculation): Bring to ipa-deivrt.h
28933         (get_class_context): Rename to ...
28934         (ipa_polymorphic_call_context::restrict_to_inner_class): ... this one.
28935         (contains_type_p): Update.
28936         (get_dynamic_type): Rename to ...
28937         ipa_polymorphic_call_context::get_dynamic_type(): ... this one.
28938         (possible_polymorphic_call_targets): UPdate.
28939         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children): Update.
28940         * ipa-prop.c (ipa_analyze_call_uses): Update.
28941
28942 2014-08-15  Oleg Endo  <olegendo@gcc.gnu.org>
28943
28944         * doc/invoke.texi (SH options): Document missing processor variant
28945         options.  Remove references to Hitachi.  Undocument deprecated mspace
28946         option.
28947
28948 2014-08-15  Jason Merrill  <jason@redhat.com>
28949
28950         * tree.c (type_hash_canon): Uncomment assert.
28951
28952 2014-08-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
28953
28954         * input.h (in_system_header_at): Add comment.
28955
28956 2014-08-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
28957
28958         PR fortran/44054
28959         * diagnostic.c (build_message_string): Make it extern.
28960         * diagnostic.h (build_message_string): Make it extern.
28961
28962 2014-08-15  Vladimir Makarov  <vmakarov@redhat.com>
28963
28964         * config/rs6000/rs6000.c (rs6000_emit_move): Use SDmode for
28965         load/store from/to non-floating class pseudo.
28966
28967 2014-08-15  Manuel López-Ibáñez  <manu@gcc.gnu.org>
28968
28969         * input.c (diagnostic_file_cache_fini): Fix typo in comment.
28970
28971 2014-08-15  Richard Biener  <rguenther@suse.de>
28972
28973         * tree-ssa-structalias.c (readonly_id): Rename to string_id.
28974         (get_constraint_for_ssa_var): Remove dead code.
28975         (get_constraint_for_1): Adjust.
28976         (find_what_var_points_to): Likewise.
28977         (init_base_vars): Likewise.  STRING_CSTs do not contain pointers.
28978
28979 2014-08-15  Ilya Tocar  <tocarip@gmail.com>
28980
28981         PR target/61878
28982         * config/i386/avx512fintrin.h (_mm512_mask_cmpge_epi32_mask): New.
28983         (_mm512_mask_cmpge_epu32_mask): Ditto.
28984         (_mm512_cmpge_epu32_mask): Ditto.
28985         (_mm512_mask_cmpge_epi64_mask): Ditto.
28986         (_mm512_cmpge_epi64_mask): Ditto.
28987         (_mm512_mask_cmpge_epu64_mask): Ditto.
28988         (_mm512_cmpge_epu64_mask): Ditto.
28989         (_mm512_mask_cmple_epi32_mask): Ditto.
28990         (_mm512_cmple_epi32_mask): Ditto.
28991         (_mm512_mask_cmple_epu32_mask): Ditto.
28992         (_mm512_cmple_epu32_mask): Ditto.
28993         (_mm512_mask_cmple_epi64_mask): Ditto.
28994         (_mm512_cmple_epi64_mask): Ditto.
28995         (_mm512_mask_cmple_epu64_mask): Ditto.
28996         (_mm512_cmple_epu64_mask): Ditto.
28997         (_mm512_mask_cmplt_epi32_mask): Ditto.
28998         (_mm512_cmplt_epi32_mask): Ditto.
28999         (_mm512_mask_cmplt_epu32_mask): Ditto.
29000         (_mm512_cmplt_epu32_mask): Ditto.
29001         (_mm512_mask_cmplt_epi64_mask): Ditto.
29002         (_mm512_cmplt_epi64_mask): Ditto.
29003         (_mm512_mask_cmplt_epu64_mask): Ditto.
29004         (_mm512_cmplt_epu64_mask): Ditto.
29005         (_mm512_mask_cmpneq_epi32_mask): Ditto.
29006         (_mm512_mask_cmpneq_epu32_mask): Ditto.
29007         (_mm512_cmpneq_epu32_mask): Ditto.
29008         (_mm512_mask_cmpneq_epi64_mask): Ditto.
29009         (_mm512_cmpneq_epi64_mask): Ditto.
29010         (_mm512_mask_cmpneq_epu64_mask): Ditto.
29011         (_mm512_cmpneq_epu64_mask): Ditto.
29012         (_mm512_castpd_ps): Ditto.
29013         (_mm512_castpd_si512): Ditto.
29014         (_mm512_castps_pd): Ditto.
29015         (_mm512_castps_si512): Ditto.
29016         (_mm512_castsi512_ps): Ditto.
29017         (_mm512_castsi512_pd): Ditto.
29018         (_mm512_castpd512_pd128): Ditto.
29019         (_mm512_castps512_ps128): Ditto.
29020         (_mm512_castsi512_si128): Ditto.
29021         (_mm512_castpd512_pd256): Ditto.
29022         (_mm512_castps512_ps256): Ditto.
29023         (_mm512_castsi512_si256): Ditto.
29024         (_mm512_castpd128_pd512): Ditto.
29025         (_mm512_castps128_ps512): Ditto.
29026         (_mm512_castsi128_si512): Ditto.
29027         (_mm512_castpd256_pd512): Ditto.
29028         (_mm512_castps256_ps512): Ditto.
29029         (_mm512_castsi256_si512): Ditto.
29030         (_mm512_cmpeq_epu32_mask): Ditto.
29031         (_mm512_mask_cmpeq_epu32_mask): Ditto.
29032         (_mm512_mask_cmpeq_epu64_mask): Ditto.
29033         (_mm512_cmpeq_epu64_mask): Ditto.
29034         (_mm512_cmpgt_epu32_mask): Ditto.
29035         (_mm512_mask_cmpgt_epu32_mask): Ditto.
29036         (_mm512_mask_cmpgt_epu64_mask): Ditto.
29037         (_mm512_cmpgt_epu64_mask): Ditto.
29038         * config/i386/i386-builtin-types.def: Add V16SF_FTYPE_V8SF,
29039         V16SI_FTYPE_V8SI, V16SI_FTYPE_V4SI, V8DF_FTYPE_V2DF.
29040         * config/i386/i386.c (enum ix86_builtins): Add
29041         IX86_BUILTIN_SI512_SI256, IX86_BUILTIN_PD512_PD256,
29042         IX86_BUILTIN_PS512_PS256, IX86_BUILTIN_SI512_SI,
29043         IX86_BUILTIN_PD512_PD, IX86_BUILTIN_PS512_PS.
29044         (bdesc_args): Add __builtin_ia32_si512_256si,
29045         __builtin_ia32_ps512_256ps, __builtin_ia32_pd512_256pd,
29046         __builtin_ia32_si512_si, __builtin_ia32_ps512_ps,
29047         __builtin_ia32_pd512_pd.
29048         (ix86_expand_args_builtin): Handle new FTYPEs.
29049         * config/i386/sse.md (castmode): Add 512-bit modes.
29050         (AVX512MODE2P): New.
29051         (avx512f_<castmode><avxsizesuffix>_<castmode): New.
29052         (avx512f_<castmode><avxsizesuffix>_256<castmode): Ditto.
29053
29054 2014-08-15  Richard Biener  <rguenther@suse.de>
29055
29056         * fold-const.c (tree_swap_operands_p): Put all constants
29057         last, also strip sign-changing NOPs when considering further
29058         canonicalization.  Canonicalize also when optimizing for size.
29059
29060 2014-08-15  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29061
29062         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate): Move
29063         one_match > zero_match case to just before simple_sequence.
29064
29065 2014-08-15  Richard Biener  <rguenther@suse.de>
29066
29067         * data-streamer.h (streamer_string_index, string_for_index):
29068         Remove.
29069         * data-streamer-out.c (streamer_string_index): Make static.
29070         * data-streamer-in.c (string_for_index): Likewise.
29071         * lto-streamer-out.c (lto_output_location): Use bp_pack_string.
29072         * lto-streamer-in.c (lto_input_location): Use bp_unpack_string.
29073
29074 2014-08-15  Richard Biener  <rguenther@suse.de>
29075
29076         PR tree-optimization/62031
29077         * tree-data-ref.c (dr_analyze_indices): Do not set
29078         DR_UNCONSTRAINED_BASE.
29079         (dr_may_alias_p): All indirect accesses have to go the
29080         formerly DR_UNCONSTRAINED_BASE path.
29081         * tree-data-ref.h (struct indices): Remove
29082         unconstrained_base member.
29083         (DR_UNCONSTRAINED_BASE): Remove.
29084
29085 2014-08-15  Jakub Jelinek  <jakub@redhat.com>
29086
29087         PR middle-end/62092
29088         * gimplify.c (gimplify_adjust_omp_clauses_1): Don't remove
29089         OMP_CLAUSE_SHARED for global vars if the global var is mentioned
29090         in OMP_CLAUSE_MAP in some outer target region.
29091
29092 2014-08-15  Bin Cheng  <bin.cheng@arm.com>
29093
29094         * tree-ssa-loop-ivopts.c (ivopts_data): New field
29095         name_expansion_cache.
29096         (tree_ssa_iv_optimize_init): Initialize name_expansion_cache.
29097         (tree_ssa_iv_optimize_finalize): Free name_expansion_cache.
29098         (strip_wrap_conserving_type_conversions, expr_equal_p): Delete.
29099         (difference_cannot_overflow_p): New parameter.  Use affine
29100         expansion for equality check.
29101         (iv_elimination_compare_lt): Pass new argument.
29102
29103 2014-08-14  DJ Delorie  <dj@redhat.com>
29104
29105         * config/rl78/rl78-real.md (addqi3_real): Allow adding global
29106         variables to the accumulator.
29107
29108         * config/rl78/predicates.md (rl78_near_mem_operand): New.
29109         * config/rl78/rl78-virt.md (movqi_virt_mm, movqi_virt)
29110         (movhi_virt_mm): Split out near mem-mem moves to avoid problems
29111         with far-far moves.
29112
29113         * config/rl78/rl78-expand.md (umulqihi3): Disable for G10.
29114         * config/rl78/rl78-virt.md (umulhi3_shift_virt): Likewise.
29115         (umulqihi3_virt): Likewise.
29116         * config/rl78/rl78-real.md (umulhi3_shift_real): Likewise.
29117         (umulqihi3_real): Likewise.
29118
29119         * config/rl78/rl78-virt.md (movhi_virt): Allow const->far moves.
29120
29121 2014-08-14  Jan Hubicka  <hubicka@ucw.cz>
29122
29123         PR tree-optimization/62091
29124         * tree-ssa-alias.c (walk_aliased_vdefs_1): Do not clear
29125         function_entry_reached.
29126         (walk_aliased_vdefs): Clear it here.
29127         * ipa-devirt.c (check_stmt_for_type_change): Handle static storage.
29128
29129 2014-08-14  Jan Hubicka  <hubicka@ucw.cz>
29130
29131         * ipa-utils.h (compare_virtual_tables): Declare.
29132         * ipa-devirt.c (odr_subtypes_equivalent_p): New function
29133
29134 2014-08-14  Marek Polacek  <polacek@redhat.com>
29135
29136         DR 458
29137         * ginclude/stdatomic.h (__atomic_type_lock_free): Remove.
29138         (ATOMIC_*_LOCK_FREE): Map to __GCC_ATOMIC_*_LOCK_FREE.
29139
29140 2014-08-14  Tom de Vries  <tom@codesourcery.com>
29141
29142         * emit-rtl.h (mem_attrs_eq_p): Remove duplicate declaration.
29143
29144 2014-08-14  Tom de Vries  <tom@codesourcery.com>
29145
29146         PR rtl-optimization/62004
29147         PR rtl-optimization/62030
29148         * ifcvt.c (rtx_interchangeable_p): New function.
29149         (noce_try_move, noce_process_if_block): Use rtx_interchangeable_p.
29150         * emit-rtl.h (mem_attrs_eq_p): Declare.
29151
29152 2014-08-14  Roman Gareev  <gareevroman@gmail.com>
29153
29154         * graphite-scop-detection.c:
29155         Add inclusion of cp-tree.h.
29156         (graphite_can_represent_scev): Disables the handling of SSA_NAME nodes
29157         in case they are pointers to object types
29158
29159 2014-08-14  Richard Biener  <rguenther@suse.de>
29160
29161         * BASE-VER: Change to 5.0.0
29162
29163 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29164             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29165             Anna Tikhonova  <anna.tikhonova@intel.com>
29166             Ilya Tocar  <ilya.tocar@intel.com>
29167             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29168             Ilya Verbin  <ilya.verbin@intel.com>
29169             Kirill Yukhin  <kirill.yukhin@intel.com>
29170             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29171
29172         * config/i386/sse.md (define_mode_attr avx512): New.
29173         (define_mode_attr sse2_avx_avx512f): Allow V8HI, V16HI, V32HI, V2DI,
29174         V4DI modes.
29175         (define_mode_attr sse2_avx2): Allow V64QI, V32HI, V4TI modes.
29176         (define_mode_attr ssse3_avx2): Ditto.
29177         (define_mode_attr sse4_1_avx2): Allow V64QI, V32HI, V8DI modes.
29178         (define_mode_attr avx2_avx512bw): New.
29179         (define_mode_attr ssedoublemodelower): New.
29180         (define_mode_attr ssedoublemode): Allow V8SF, V8SI, V4DI, V4DF, V4SI,
29181         V32HI, V64QI modes.
29182         (define_mode_attr ssebytemode): Allow V8DI modes.
29183         (define_mode_attr sseinsnmode): Allow V4TI, V32HI, V64QI modes.
29184         (define_mode_attr sseintvecmodelower): Allow V8DF, V4TI modes.
29185         (define_mode_attr ssePSmode2): New.
29186         (define_mode_attr ssescalarsize): Allow V64QI, V32QI, V16QI, V8HI,
29187         V16HI, V32HI modes.
29188         (define_mode_attr dbpsadbwmode): New.
29189         (define_mode_attr bcstscalarsuff): Allow V64QI, V32QI, V16QI, V32HI,
29190         V16HI, V8HI, V8SI, V4SI, V4DI, V2DI, V8SF, V4SF, V4DF, V2DF modes.
29191         (vi8_sse4_1_avx2_avx512): New.
29192         (define_insn <sse4_1_avx2>_movntdqa): Use <vi8_sse4_1_avx2_avx512>
29193         mode attribute.
29194         (define_mode_attr blendbits): Move before its immediate use.
29195
29196 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29197             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29198             Anna Tikhonova  <anna.tikhonova@intel.com>
29199             Ilya Tocar  <ilya.tocar@intel.com>
29200             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29201             Ilya Verbin  <ilya.verbin@intel.com>
29202             Kirill Yukhin  <kirill.yukhin@intel.com>
29203             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29204
29205         * config/i386/sse.md: Allow V64QI, V32QI, V32HI, V4HI modes.
29206         * config/i386/subst.md
29207         (define_mode_iterator SUBST_V): Update.
29208         (define_mode_iterator SUBST_A): Ditto.
29209         (define_subst_attr "mask_operand7"): New.
29210         (define_subst_attr "mask_operand10"): New.
29211         (define_subst_attr "mask_operand_arg34") : New.
29212         (define_subst_attr "mask_expand_op3"): New.
29213         (define_subst_attr "mask_mode512bit_condition"): Handle TARGET_AVX512VL.
29214         (define_subst_attr "sd_mask_mode512bit_condition"): Ditto.
29215         (define_subst_attr "mask_avx512vl_condition"): New.
29216         (define_subst_attr "round_mask_operand4"): Ditto.
29217         (define_subst_attr "round_mask_scalar_op3"): Delete.
29218         (define_subst_attr "round_mask_op4"): New.
29219         (define_subst_attr "round_mode512bit_condition"): Allow V8DImode,
29220         V16SImode.
29221         (define_subst_attr "round_modev8sf_condition"): New.
29222         (define_subst_attr "round_modev4sf_condition"): GET_MODE instead of
29223         <MODE>mode.
29224         (define_subst_attr "round_saeonly_mask_operand4"): New.
29225         (define_subst_attr "round_saeonly_mask_op4"): New.
29226         (define_subst_attr "round_saeonly_mode512bit_condition"): Allow
29227         V8DImode, V16SImode.
29228         (define_subst_attr "round_saeonly_modev8sf_condition"): New.
29229         (define_subst_attr "mask_expand4_name" "mask_expand4"): New.
29230         (define_subst_attr "mask_expand4_args"): New.
29231         (define_subst "mask_expand4"): New.
29232
29233 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29234             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29235             Anna Tikhonova  <anna.tikhonova@intel.com>
29236             Ilya Tocar  <ilya.tocar@intel.com>
29237             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29238             Ilya Verbin  <ilya.verbin@intel.com>
29239             Kirill Yukhin  <kirill.yukhin@intel.com>
29240             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29241
29242         * config/i386/i386.md
29243         (define_attr "isa"): Add avx512bw,noavx512bw.
29244         (define_attr "enabled"): Ditto.
29245         (define_split): Add 32/64-bit mask logic.
29246         (define_insn "*k<logic>qi"): New.
29247         (define_insn "*k<logic>hi"): New.
29248         (define_insn "*anddi_1"): Add mask version.
29249         (define_insn "*andsi_1"): Ditto.
29250         (define_insn "*<code><mode>_1"): Ditto.
29251         (define_insn "*<code>hi_1"): Ditto.
29252         (define_insn "kxnor<mode>"): New.
29253         (define_insn "kunpcksi"): New.
29254         (define_insn "kunpckdi"): New.
29255         (define_insn "*one_cmpl<mode>2_1"): Add mask version.
29256         (define_insn "*one_cmplhi2_1"): Ditto.
29257
29258 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29259             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29260             Anna Tikhonova  <anna.tikhonova@intel.com>
29261             Ilya Tocar  <ilya.tocar@intel.com>
29262             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29263             Ilya Verbin  <ilya.verbin@intel.com>
29264             Kirill Yukhin  <kirill.yukhin@intel.com>
29265             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29266
29267         * config/i386/i386.c (ix86_preferred_simd_mode): Allow V64QImode and
29268         V32HImode.
29269
29270 2014-08-14  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29271             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29272             Anna Tikhonova  <anna.tikhonova@intel.com>
29273             Ilya Tocar  <ilya.tocar@intel.com>
29274             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29275             Ilya Verbin  <ilya.verbin@intel.com>
29276             Kirill Yukhin  <kirill.yukhin@intel.com>
29277             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29278
29279         * config/i386/i386.c (print_reg): Ð¡orrectly print 64-bit mask
29280         registers.
29281         (inline_secondary_memory_needed): Allow 64 bit wide mask registers.
29282         (ix86_hard_regno_mode_ok): Allow 32/64-bit mask registers and
29283         xmm/ymm16+ when availble.
29284         * config/i386/i386.h
29285         (HARD_REGNO_NREGS): Add mask regs.
29286         (VALID_AVX512F_REG_MODE): Ditto.
29287         (VALID_AVX512F_REG_MODE) : Define.
29288         (VALID_MASK_AVX512BW_MODE): Ditto.
29289         (reg_class) (MASK_REG_P(X)): Define.
29290         * config/i386/i386.md: Do not split long moves with mask register,
29291         use kmovb if avx512bw is availible.
29292         (movdi_internal): Handle mask registers.
29293
29294 2014-08-14  Richard Biener  <rguenther@suse.de>
29295
29296         PR tree-optimization/62081
29297         * tree-ssa-loop.c (pass_fix_loops): New pass.
29298         (pass_tree_loop::gate):  Do not fixup loops here.
29299         * tree-pass.h (make_pass_fix_loops): Declare.
29300         * passes.def: Schedule pass_fix_loops before GIMPLE loop passes.
29301
29302 2014-08-14  Richard Biener  <rguenther@suse.de>
29303
29304         * tree.c (type_hash_lookup, type_hash_add): Merge into ...
29305         (type_hash_canon): ... this and avoid 2nd lookup for the add.
29306
29307 2014-08-14  Richard Biener  <rguenther@suse.de>
29308
29309         PR tree-optimization/62090
29310         * builtins.c (fold_builtin_sprintf): Move to gimple-fold.c.
29311         (fold_builtin_2): Do not fold sprintf.
29312         (fold_builtin_3): Likewise.
29313         * gimple-fold.c (gimple_fold_builtin_sprintf): New function
29314         moved from builtins.c.
29315         (gimple_fold_builtin): Fold sprintf.
29316
29317 2014-08-14  Richard Biener  <rguenther@suse.de>
29318
29319         PR rtl-optimization/62079
29320         * recog.c (peephole2_optimize): If peep2_do_cleanup_cfg
29321         run cleanup_cfg.
29322
29323 2014-08-14  Ilya Enkovich  <ilya.enkovich@intel.com>
29324
29325         * ipa-devirt.c (get_polymorphic_call_info): Use fndecl instead of
29326         current_function_decl.
29327
29328 2014-08-14  Ilya Enkovich  <ilya.enkovich@intel.com>
29329
29330         * cgraph.c (cgraph_node::function_symbol): Fix wrong
29331         cgraph_function_node to cgraph_node::function_symbol
29332         refactoring.
29333
29334 2014-08-14  Zhenqiang Chen  <zhenqiang.chen@arm.com>
29335
29336         * config/arm/arm.c (arm_option_override): Set max_insns_skipped
29337         to MAX_INSN_PER_IT_BLOCK when optimize_size for THUMB2.
29338
29339 2014-08-13  Chen Gang  gang.chen.5i5j@gmail.com
29340
29341         * microblaze/microblaze.md: Remove redundant '@' to avoid compiling
29342         warning.
29343
29344 2014-08-13  Roman Gareev  <gareevroman@gmail.com>
29345
29346         * gcc.dg/graphite/pr35356-2.c: Update according to the ISL code
29347         generator.
29348
29349 2014-08-12  Jakub Jelinek  <jakub@redhat.com>
29350
29351         PR target/62025
29352         * sched-deps.c (find_inc): Check if inc_insn doesn't clobber
29353         any registers that are used in mem_insn.
29354
29355 2014-08-12  Steve Ellcey  <sellcey@mips.com>
29356
29357         * config/mips/mips.h (ASM_SPEC): Pass float options to assembler.
29358
29359 2014-08-12  Steve Ellcey  <sellcey@mips.com>
29360
29361         * config/mips/t-mti-elf (MULTILIB_OPTIONS): Remove fp64 multilib.
29362         (MULTILIB_DIRNAMES): Ditto.
29363         * config/mips/t-mti-elf (MULTILIB_OPTIONS): Ditto.
29364         * config/mips/t-mti-elf (MULTILIB_EXCEPTIONS): Ditto.
29365         * config/mips/t-mti-linux (MULTILIB_OPTIONS): Ditto.
29366         * config/mips/t-mti-linux (MULTILIB_DIRNAMES): Ditto.
29367         * config/mips/t-mti-linux (MULTILIB_EXCEPTIONS): Ditto.
29368         * config/mips/mti-linux.h (SYSROOT_SUFFIX_SPEC): Ditto.
29369
29370 2014-08-12  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
29371
29372         PR target/61413
29373         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Fix definition
29374         of __ARM_SIZEOF_WCHAR_T.
29375
29376 2014-08-12  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
29377
29378         PR target/62098
29379         * config/arm/vfp.md (*combine_vcvtf2i): Fix constraint.
29380         Remove unnecessary attributes.
29381
29382 2014-08-12  Yury Gribov  <y.gribov@samsung.com>
29383
29384         * internal-fn.c (init_internal_fns): Fix off-by-one.
29385
29386 2014-08-12  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29387             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29388             Anna Tikhonova  <anna.tikhonova@intel.com>
29389             Ilya Tocar  <ilya.tocar@intel.com>
29390             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29391             Ilya Verbin  <ilya.verbin@intel.com>
29392             Kirill Yukhin  <kirill.yukhin@intel.com>
29393             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29394
29395         * config/i386/i386.c (standard_sse_constant_opcode): Use
29396         vpxord/vpternlog if avx512 is availible.
29397
29398 2014-08-12  Thomas Preud'homme  <thomas.preudhomme@arm.com>
29399
29400         PR middle-end/62103
29401         * gimple-fold.c (fold_ctor_reference): Don't fold in presence of
29402         bitfields, that is when size doesn't match the size of type or the
29403         size of the constructor.
29404
29405 2014-08-11  Michael Meissner  <meissner@linux.vnet.ibm.com>
29406
29407         * config/rs6000/constraints.md (wh constraint): New constraint,
29408         for FP registers if direct move is available.
29409         (wi constraint): New constraint, for VSX/FP registers that can
29410         handle 64-bit integers.
29411         (wj constraint): New constraint for VSX/FP registers that can
29412         handle 64-bit integers for direct moves.
29413         (wk constraint): New constraint for VSX/FP registers that can
29414         handle 64-bit doubles for direct moves.
29415         (wy constraint): Make documentation match implementation.
29416
29417         * config/rs6000/rs6000.c (struct rs6000_reg_addr): Add
29418         scalar_in_vmx_p field to simplify tests of whether SFmode or
29419         DFmode can go in the Altivec registers.
29420         (rs6000_hard_regno_mode_ok): Use scalar_in_vmx_p field.
29421         (rs6000_setup_reg_addr_masks): Likewise.
29422         (rs6000_debug_print_mode): Add debug support for scalar_in_vmx_p
29423         field, and wh/wi/wj/wk constraints.
29424         (rs6000_init_hard_regno_mode_ok): Setup scalar_in_vmx_p field, and
29425         the wh/wi/wj/wk constraints.
29426         (rs6000_preferred_reload_class): If SFmode/DFmode can go in the
29427         upper registers, prefer VSX registers unless the operation is a
29428         memory operation with REG+OFFSET addressing.
29429
29430         * config/rs6000/vsx.md (VSr mode attribute): Add support for
29431         DImode.  Change SFmode to use ww constraint instead of d to allow
29432         SF registers in the upper registers.
29433         (VSr2): Likewise.
29434         (VSr3): Likewise.
29435         (VSr5): Fix thinko in comment.
29436         (VSa): New mode attribute that is an alternative to wa, that
29437         returns the VSX register class that a mode can go in, but may not
29438         be the preferred register class.
29439         (VS_64dm): New mode attribute for appropriate register classes for
29440         referencing 64-bit elements of vectors for direct moves and normal
29441         moves.
29442         (VS_64reg): Likewise.
29443         (vsx_mov<mode>): Change wa constraint to <VSa> to limit the
29444         register allocator to only registers the data type can handle.
29445         (vsx_le_perm_load_<mode>): Likewise.
29446         (vsx_le_perm_store_<mode>): Likewise.
29447         (vsx_xxpermdi2_le_<mode>): Likewise.
29448         (vsx_xxpermdi4_le_<mode>): Likewise.
29449         (vsx_lxvd2x2_le_<mode>): Likewise.
29450         (vsx_lxvd2x4_le_<mode>): Likewise.
29451         (vsx_stxvd2x2_le_<mode>): Likewise.
29452         (vsx_add<mode>3): Likewise.
29453         (vsx_sub<mode>3): Likewise.
29454         (vsx_mul<mode>3): Likewise.
29455         (vsx_div<mode>3): Likewise.
29456         (vsx_tdiv<mode>3_internal): Likewise.
29457         (vsx_fre<mode>2): Likewise.
29458         (vsx_neg<mode>2): Likewise.
29459         (vsx_abs<mode>2): Likewise.
29460         (vsx_nabs<mode>2): Likewise.
29461         (vsx_smax<mode>3): Likewise.
29462         (vsx_smin<mode>3): Likewise.
29463         (vsx_sqrt<mode>2): Likewise.
29464         (vsx_rsqrte<mode>2): Likewise.
29465         (vsx_tsqrt<mode>2_internal): Likewise.
29466         (vsx_fms<mode>4): Likewise.
29467         (vsx_nfma<mode>4): Likewise.
29468         (vsx_eq<mode>): Likewise.
29469         (vsx_gt<mode>): Likewise.
29470         (vsx_ge<mode>): Likewise.
29471         (vsx_eq<mode>_p): Likewise.
29472         (vsx_gt<mode>_p): Likewise.
29473         (vsx_ge<mode>_p): Likewise.
29474         (vsx_xxsel<mode>): Likewise.
29475         (vsx_xxsel<mode>_uns): Likewise.
29476         (vsx_copysign<mode>3): Likewise.
29477         (vsx_float<VSi><mode>2): Likewise.
29478         (vsx_floatuns<VSi><mode>2): Likewise.
29479         (vsx_fix_trunc<mode><VSi>2): Likewise.
29480         (vsx_fixuns_trunc<mode><VSi>2): Likewise.
29481         (vsx_x<VSv>r<VSs>i): Likewise.
29482         (vsx_x<VSv>r<VSs>ic): Likewise.
29483         (vsx_btrunc<mode>2): Likewise.
29484         (vsx_b2trunc<mode>2): Likewise.
29485         (vsx_floor<mode>2): Likewise.
29486         (vsx_ceil<mode>2): Likewise.
29487         (vsx_<VS_spdp_insn>): Likewise.
29488         (vsx_xscvspdp): Likewise.
29489         (vsx_xvcvspuxds): Likewise.
29490         (vsx_float_fix_<mode>2): Likewise.
29491         (vsx_set_<mode>): Likewise.
29492         (vsx_extract_<mode>_internal1): Likewise.
29493         (vsx_extract_<mode>_internal2): Likewise.
29494         (vsx_extract_<mode>_load): Likewise.
29495         (vsx_extract_<mode>_store): Likewise.
29496         (vsx_splat_<mode>): Likewise.
29497         (vsx_xxspltw_<mode>): Likewise.
29498         (vsx_xxspltw_<mode>_direct): Likewise.
29499         (vsx_xxmrghw_<mode>): Likewise.
29500         (vsx_xxmrglw_<mode>): Likewise.
29501         (vsx_xxsldwi_<mode>): Likewise.
29502         (vsx_xscvdpspn): Tighten constraints to only use register classes
29503         the types use.
29504         (vsx_xscvspdpn): Likewise.
29505         (vsx_xscvdpspn_scalar): Likewise.
29506
29507         * config/rs6000/rs6000.h (enum rs6000_reg_class_enum): Add wh, wi,
29508         wj, and wk constraints.
29509         (GPR_REG_CLASS_P): New helper macro for register classes targeting
29510         general purpose registers.
29511
29512         * config/rs6000/rs6000.md (f32_dm): Use wh constraint for SDmode
29513         direct moves.
29514         (zero_extendsidi2_lfiwz): Use wj constraint for direct move of
29515         DImode instead of wm.  Use wk constraint for direct move of DFmode
29516         instead of wm.
29517         (extendsidi2_lfiwax): Likewise.
29518         (lfiwax): Likewise.
29519         (lfiwzx): Likewise.
29520         (movdi_internal64): Likewise.
29521
29522         * doc/md.texi (PowerPC and IBM RS6000): Document wh, wi, wj, and
29523         wk constraints. Make the wy constraint documentation match them
29524         implementation.
29525
29526 2014-08-11  Mircea Namolaru  <mircea.namolaru@inria.fr>
29527
29528         Replacement of isl_int by isl_val
29529         * graphite-clast-to-gimple.c: include isl/val.h, isl/val_gmp.h
29530         (compute_bounds_for_param): use isl_val instead of isl_int
29531         (compute_bounds_for_loop): likewise
29532         * graphite-interchange.c: include isl/val.h, isl/val_gmp.h
29533         (build_linearized_memory_access): use isl_val instead of isl_int
29534         (pdr_stride_in_loop): likewise
29535         * graphite-optimize-isl.c:
29536         (getPrevectorMap): use isl_val instead of isl_int
29537         * graphite-poly.c:
29538         (pbb_number_of_iterations_at_time): use isl_val instead of isl_int
29539         graphite-sese-to-poly.c: include isl/val.h, isl/val_gmp.h
29540         (extern the_isl_ctx): declare
29541         (build_pbb_scattering_polyhedrons): use isl_val instead of isl_int
29542         (extract_affine_gmp): likewise
29543         (wrap): likewise
29544         (build_loop_iteration_domains): likewise
29545         (add_param_constraints): likewise
29546
29547 2014-08-11  Richard Biener  <rguenther@suse.de>
29548
29549         PR tree-optimization/62075
29550         * tree-vect-slp.c (vect_detect_hybrid_slp_stmts): Properly
29551         handle uses in patterns.
29552
29553 2014-08-11  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29554             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29555             Anna Tikhonova  <anna.tikhonova@intel.com>
29556             Ilya Tocar  <ilya.tocar@intel.com>
29557             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29558             Ilya Verbin  <ilya.verbin@intel.com>
29559             Kirill Yukhin  <kirill.yukhin@intel.com>
29560             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29561
29562         * common/config/i386/i386-common.c
29563         (OPTION_MASK_ISA_AVX512VL_SET): Define.
29564         (OPTION_MASK_ISA_AVX512F_UNSET): Update.
29565         (ix86_handle_option): Handle OPT_mavx512vl.
29566         * config/i386/cpuid.h (bit_AVX512VL): Define.
29567         * config/i386/driver-i386.c (host_detect_local_cpu): Detect avx512vl,
29568         set -mavx512vl accordingly.
29569         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
29570         OPTION_MASK_ISA_AVX512VL.
29571         * config/i386/i386.c (ix86_target_string): Handle -mavx512vl.
29572         (ix86_option_override_internal): Define PTA_AVX512VL, handle
29573         PTA_AVX512VL and OPTION_MASK_ISA_AVX512VL.
29574         (ix86_valid_target_attribute_inner_p): Handle OPT_mavx512vl.
29575         * config/i386/i386.h (TARGET_AVX512VL): Define.
29576         (TARGET_AVX512VL_P(x)): Ditto.
29577         * config/i386/i386.opt: Add mavx512vl.
29578
29579 2014-08-11  Felix Yang  <fei.yang0953@gmail.com>
29580
29581         PR tree-optimization/62073
29582         * tree-vect-loop.c (vect_is_simple_reduction_1): Check that DEF1 has
29583         a basic block.
29584
29585 2014-08-11  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29586             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29587             Anna Tikhonova  <anna.tikhonova@intel.com>
29588             Ilya Tocar  <ilya.tocar@intel.com>
29589             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29590             Ilya Verbin  <ilya.verbin@intel.com>
29591             Kirill Yukhin  <kirill.yukhin@intel.com>
29592             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29593
29594         * common/config/i386/i386-common.c
29595         (OPTION_MASK_ISA_AVX512BW_SET) : Define.
29596         (OPTION_MASK_ISA_AVX512BW_UNSET): Ditto.
29597         (OPTION_MASK_ISA_AVX512VL_UNSET) : Ditto.
29598         (ix86_handle_option): Handle OPT_mavx512bw.
29599         * config/i386/cpuid.h (bit_AVX512BW): Define.
29600         * config/i386/driver-i386.c (host_detect_local_cpu): Detect avx512bw,
29601         set -mavx512bw accordingly.
29602         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
29603         OPTION_MASK_ISA_AVX512BW.
29604         * config/i386/i386.c (ix86_target_string): Handle -mavx512bw.
29605         (ix86_option_override_internal): Define PTA_AVX512BW, handle
29606         PTA_AVX512BW and OPTION_MASK_ISA_AVX512BW.
29607         (ix86_valid_target_attribute_inner_p): Handle OPT_mavx512bw.
29608         * config/i386/i386.h (TARGET_AVX512BW): Define.
29609         (TARGET_AVX512BW_P(x)): Ditto.
29610         * config/i386/i386.opt: Add mavx512bw.
29611
29612 2014-08-11  Richard Biener  <rguenther@suse.de>
29613
29614         PR tree-optimization/62070
29615         * tree-ssa-loop-manip.c (gimple_duplicate_loop_to_header_edge):
29616         Remove SSA checking.
29617
29618 2014-08-11  Yury Gribov  <y.gribov@samsung.com>
29619
29620         * asan.c (asan_check_flags): New enum.
29621         (build_check_stmt_with_calls): Removed function.
29622         (build_check_stmt): Split inlining logic to
29623         asan_expand_check_ifn.
29624         (instrument_derefs): Rename parameter.
29625         (instrument_mem_region_access): Rename parameter.
29626         (instrument_strlen_call): Likewise.
29627         (asan_expand_check_ifn): New function.
29628         (asan_instrument): Remove old code.
29629         (pass_sanopt::execute): Change handling of
29630         asan-instrumentation-with-call-threshold.
29631         (asan_clear_shadow): Fix formatting.
29632         (asan_function_start): Likewise.
29633         (asan_emit_stack_protection): Likewise.
29634         * doc/invoke.texi (asan-instrumentation-with-call-threshold):
29635         Update description.
29636         * internal-fn.c (expand_ASAN_CHECK): New function.
29637         * internal-fn.def (ASAN_CHECK): New internal function.
29638         * params.def (PARAM_ASAN_INSTRUMENTATION_WITH_CALL_THRESHOLD):
29639         Update description.
29640         (PARAM_ASAN_USE_AFTER_RETURN): Likewise.
29641         * tree.c: Small comment fix.
29642
29643 2014-08-11  Yury Gribov  <y.gribov@samsung.com>
29644
29645         * gimple.c (gimple_call_fnspec): Support internal functions.
29646         (gimple_call_return_flags): Use const.
29647         * Makefile.in (GTFILES): Add internal-fn.h to list of GC files.
29648         * internal-fn.def: Add fnspec information.
29649         * internal-fn.h (internal_fn_fnspec): New function.
29650         (init_internal_fns): Declare new function.
29651         * internal-fn.c (internal_fn_fnspec_array): New global variable.
29652         (init_internal_fns): New function.
29653         * tree-core.h: Update macro call.
29654         * tree.c (build_common_builtin_nodes): Initialize internal fns.
29655
29656 2014-08-10  Gerald Pfeifer  <gerald@pfeifer.com>
29657
29658         * lto-streamer.h (struct output_block::symbol): Change from
29659         struct symtab_node to plain symtab_node.
29660         (referenced_from_this_partition_p): Change first parameter
29661         from struct symtab_node to plain symtab_node.
29662
29663 2014-08-10  Marek Polacek  <polacek@redhat.com>
29664
29665         PR c/51849
29666         * gcc/doc/invoke.texi: Document -Wc90-c99-compat.
29667
29668 2014-08-09  Jan Hubicka  <hubicka@ucw.cz>
29669
29670         * ipa-devirt.c (get_dynamic_type): Handle case when instance is in
29671         DECL correctly; do not give up on types in static storage.
29672
29673 2014-08-09  Paolo Carlini  <paolo.carlini@oracle.com>
29674
29675         * doc/invoke.texi ([Wnarrowing]): Update for non-constants in C++11.
29676
29677 2014-08-09  Roman Gareev  <gareevroman@gmail.com>
29678
29679         * graphite-isl-ast-to-gimple.c:
29680         (translate_isl_ast_node_user): Use nb_loops instead of loop->num + 1.
29681
29682         * gcc.dg/graphite/isl-ast-gen-user-1.c: New testcase.
29683
29684 2014-08-08  Guozhi Wei  <carrot@google.com>
29685
29686         * config/rs6000/rs6000.md (*movdi_internal64): Add a new constraint.
29687
29688 2014-08-08  Cary Coutant  <ccoutant@google.com>
29689
29690         * dwarf2out.c (get_skeleton_type_unit): Remove.
29691         (output_skeleton_debug_sections): Remove skeleton type units.
29692         (output_comdat_type_unit): Likewise.
29693         (dwarf2out_finish): Likewise.
29694
29695 2014-08-07  Yi Yang  <ahyangyi@google.com>
29696
29697         * predict.c (expr_expected_value_1): Remove the redundant assignment.
29698
29699 2014-08-08  Richard Biener  <rguenther@suse.de>
29700
29701         * lto-streamer.h (struct lto_input_block): Make it a class
29702         with a constructor.
29703         (LTO_INIT_INPUT_BLOCK, LTO_INIT_INPUT_BLOCK_PTR): Remove.
29704         (struct lto_function_header, struct lto_simple_header,
29705         struct lto_simple_header_with_strings,
29706         struct lto_decl_header, struct lto_function_header): Make
29707         a simple inheritance hieararchy.  Remove unused fields.
29708         (struct lto_asm_header): Remove.
29709         * lto-streamer-out.c (produce_asm): Adjust.
29710         (lto_output_toplevel_asms): Likewise.
29711         (produce_asm_for_decls): Likewise.
29712         * lto-section-out.c (lto_destroy_simple_output_block): Likewise.
29713         * data-streamer-in.c (string_for_index): Likewise.
29714         * ipa-inline-analysis.c (inline_read_section): Likewise.
29715         * ipa-prop.c (ipa_prop_read_section): Likewise.
29716         (read_replacements_section): Likewise.
29717         * lto-cgraph.c (input_cgraph_opt_section): Likewise.
29718         * lto-section-in.c (lto_create_simple_input_block): Likewise.
29719         (lto_destroy_simple_input_block): Likewise.
29720         * lto-streamer-in.c (lto_read_body_or_constructor): Likewise.
29721         (lto_input_toplevel_asms): Likewise.
29722
29723 2014-08-08  Alexander Ivchenko  <alexander.ivchenko@intel.com>
29724             Maxim Kuznetsov  <maxim.kuznetsov@intel.com>
29725             Anna Tikhonova  <anna.tikhonova@intel.com>
29726             Ilya Tocar  <ilya.tocar@intel.com>
29727             Andrey Turetskiy  <andrey.turetskiy@intel.com>
29728             Ilya Verbin  <ilya.verbin@intel.com>
29729             Kirill Yukhin  <kirill.yukhin@intel.com>
29730             Michael Zolotukhin  <michael.v.zolotukhin@intel.com>
29731
29732         * common/config/i386/i386-common.c
29733         (OPTION_MASK_ISA_AVX512DQ_SET): Define.
29734         (OPTION_MASK_ISA_AVX512DQ_UNSET): Ditto.
29735         (ix86_handle_option): Handle OPT_mavx512dq.
29736         * config/i386/cpuid.h (bit_AVX512DQ): Define.
29737         * config/i386/driver-i386.c (host_detect_local_cpu): Detect avx512dq,
29738         set -mavx512dq accordingly.
29739         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
29740         OPTION_MASK_ISA_AVX512DQ.
29741         * config/i386/i386.c (ix86_target_string): Handle -mavx512dq.
29742         (ix86_option_override_internal): Define PTA_AVX512DQ, handle
29743         PTA_AVX512DQ and OPTION_MASK_ISA_AVX512DQ.
29744         (ix86_valid_target_attribute_inner_p): Handle OPT_mavx512dq.
29745         * config/i386/i386.h (TARGET_AVX512DQ): Define.
29746         (TARGET_AVX512DQ_P(x)): Ditto.
29747         * config/i386/i386.opt: Add mavx512dq.
29748
29749 2014-08-08  Richard Biener  <rguenther@suse.de>
29750
29751         * builtins.c (c_getstr, readonly_data_expr, init_target_chars,
29752         target_percent, target_percent_s): Export.
29753         (var_decl_component_p, fold_builtin_memory_op, fold_builtin_memset,
29754         fold_builtin_bzero, fold_builtin_strcpy, fold_builtin_strncpy,
29755         fold_builtin_strcat, fold_builtin_fputs, fold_builtin_memory_chk,
29756         fold_builtin_stxcpy_chk, fold_builtin_stxncpy_chk,
29757         fold_builtin_sprintf_chk_1, fold_builtin_snprintf_chk_1):
29758         Move to gimple-fold.c.
29759         (fold_builtin_2): Remove handling of bzero, fputs, fputs_unlocked,
29760         strcat and strcpy.
29761         (fold_builtin_3): Remove handling of memset, bcopy, memcpy,
29762         mempcpy, memmove, strncpy, strcpy_chk and stpcpy_chk.
29763         (fold_builtin_4): Remove handling of memcpy_chk, mempcpy_chk,
29764         memmove_chk, memset_chk, strncpy_chk and stpncpy_chk.
29765         (rewrite_call_expr_array): Remove.
29766         (fold_builtin_sprintf_chk): Likewise.
29767         (fold_builtin_snprintf_chk): Likewise.
29768         (fold_builtin_varargs): Remove handling of sprintf_chk,
29769         vsprintf_chk, snprintf_chk and vsnprintf_chk.
29770         (gimple_fold_builtin_sprintf_chk): Remove.
29771         (gimple_fold_builtin_snprintf_chk): Likewise.
29772         (gimple_fold_builtin_varargs): Likewise.
29773         (fold_call_stmt): Do not call gimple_fold_builtin_varargs.
29774         * predict.c (optimize_bb_for_size_p): Handle NULL bb.
29775         * gimple.c (gimple_seq_add_seq_without_update): New function.
29776         * gimple.h (gimple_seq_add_seq_without_update): Declare.
29777         * gimple-fold.c: Include output.h.
29778         (gsi_replace_with_seq_vops): New function, split out from ...
29779         (gimplify_and_update_call_from_tree): ... here.
29780         (replace_call_with_value): New function.
29781         (replace_call_with_call_and_fold): Likewise.
29782         (var_decl_component_p): Moved from builtins.c.
29783         (gimple_fold_builtin_memory_op): Moved from builtins.c
29784         fold_builtin_memory_op and rewritten to GIMPLE.
29785         (gimple_fold_builtin_memset): Likewise.
29786         (gimple_fold_builtin_strcpy): Likewise.
29787         (gimple_fold_builtin_strncpy): Likewise.
29788         (gimple_fold_builtin_strcat): Likewise.
29789         (gimple_fold_builtin_fputs): Likewise.
29790         (gimple_fold_builtin_memory_chk): Likewise.
29791         (gimple_fold_builtin_stxcpy_chk): Likewise.
29792         (gimple_fold_builtin_stxncpy_chk): Likewise.
29793         (gimple_fold_builtin_snprintf_chk): Likewise.
29794         (gimple_fold_builtin_sprintf_chk): Likewise.
29795         (gimple_fold_builtin_strlen): New function.
29796         (gimple_fold_builtin_with_strlen): New function split out from
29797         gimple_fold_builtin.
29798         (gimple_fold_builtin): Change signature and handle
29799         bzero, memset, bcopy, memcpy, mempcpy and memmove folding
29800         here.  Call gimple_fold_builtin_with_strlen.
29801         (gimple_fold_call): Adjust.
29802
29803 2014-08-08  Kugan Vivekanandarajah  <kuganv@linaro.org>
29804
29805         * calls.c (precompute_arguments): Check
29806         promoted_for_signed_and_unsigned_p and set the promoted mode.
29807         (promoted_for_signed_and_unsigned_p): New function.
29808         (expand_expr_real_1): Check promoted_for_signed_and_unsigned_p
29809         and set the promoted mode.
29810         * expr.h (promoted_for_signed_and_unsigned_p): New function definition.
29811         * cfgexpand.c (expand_gimple_stmt_1): Call emit_move_insn if
29812         SUBREG is promoted with SRP_SIGNED_AND_UNSIGNED.
29813
29814
29815 2014-08-08  Kugan Vivekanandarajah  <kuganv@linaro.org>
29816
29817         * calls.c (precompute_arguments): Use new SUBREG_PROMOTED_SET
29818         instead of SUBREG_PROMOTED_UNSIGNED_SET.
29819         (expand_call): Likewise.
29820         * cfgexpand.c (expand_gimple_stmt_1): Use SUBREG_PROMOTED_SIGN
29821         to get promoted mode.
29822         * combine.c (record_promoted_value): Skip > 0 comparison with
29823         SUBREG_PROMOTED_UNSIGNED_P as it now returns only 0 or 1.
29824         * expr.c (convert_move): Use SUBREG_CHECK_PROMOTED_SIGN instead
29825         of SUBREG_PROMOTED_UNSIGNED_P.
29826         (convert_modes): Likewise.
29827         (store_expr): Use SUBREG_PROMOTED_SIGN to get promoted mode.
29828         Use SUBREG_CHECK_PROMOTED_SIGN instead of SUBREG_PROMOTED_UNSIGNED_P.
29829         (expand_expr_real_1): Use new SUBREG_PROMOTED_SET instead of
29830         SUBREG_PROMOTED_UNSIGNED_SET.
29831         * function.c (assign_parm_setup_reg): Use new SUBREG_PROMOTED_SET
29832         instead of SUBREG_PROMOTED_UNSIGNED_SET.
29833         * ifcvt.c (noce_emit_cmove): Updated to use SUBREG_PROMOTED_GET and
29834         SUBREG_PROMOTED_SET.
29835         * internal-fn.c (ubsan_expand_si_overflow_mul_check): Use
29836         SUBREG_PROMOTED_SET instead of SUBREG_PROMOTED_UNSIGNED_SET.
29837         * optabs.c (widen_operand): Use SUBREG_CHECK_PROMOTED_SIGN instead
29838         of SUBREG_PROMOTED_UNSIGNED_P.
29839         * rtl.h (SUBREG_PROMOTED_UNSIGNED_SET): Remove.
29840         (SUBREG_PROMOTED_SET): New define.
29841         (SUBREG_PROMOTED_GET): Likewise.
29842         (SUBREG_PROMOTED_SIGN): Likewise.
29843         (SUBREG_PROMOTED_SIGNED_P): Likewise.
29844         (SUBREG_CHECK_PROMOTED_SIGN): Likewise.
29845         (SUBREG_PROMOTED_UNSIGNED_P): Updated.
29846         * rtlanal.c (unsigned_reg_p): Use new SUBREG_PROMOTED_GET
29847         instead of SUBREG_PROMOTED_UNSIGNED_GET.
29848         (nonzero_bits1): Skip > 0 comparison with the results as
29849         SUBREG_PROMOTED_UNSIGNED_P now returns only 0 or 1.
29850         (num_sign_bit_copies1): Use SUBREG_PROMOTED_SIGNED_P instead
29851         of !SUBREG_PROMOTED_UNSIGNED_P.
29852         * simplify-rtx.c (simplify_unary_operation_1): Use new
29853         SUBREG_PROMOTED_SIGNED_P instead of !SUBREG_PROMOTED_UNSIGNED_P.
29854         (simplify_subreg): Use new SUBREG_PROMOTED_SIGNED_P,
29855         SUBREG_PROMOTED_UNSIGNED_P and SUBREG_PROMOTED_SET instead of
29856         SUBREG_PROMOTED_UNSIGNED_P and SUBREG_PROMOTED_UNSIGNED_SET.
29857
29858 2014-08-07  Jan Hubicka  <hubicka@ucw.cz>
29859
29860         * ipa-devirt.c: Include gimple-pretty-print.h
29861         (referenced_from_vtable_p): Exclude DECL_EXTERNAL from
29862         further tests.
29863         (decl_maybe_in_construction_p): Fix conditional on cdtor check
29864         (get_polymorphic_call_info): Fix return value
29865         (type_change_info): New sturcture based on ipa-prop
29866         variant.
29867         (noncall_stmt_may_be_vtbl_ptr_store): New predicate
29868         based on ipa-prop variant.
29869         (extr_type_from_vtbl_ptr_store): New function
29870         based on ipa-prop variant.
29871         (record_known_type): New function.
29872         (check_stmt_for_type_change): New function.
29873         (get_dynamic_type): New function.
29874         * ipa-prop.c (ipa_analyze_call_uses): Use get_dynamic_type.
29875         * tree-ssa-pre.c: ipa-utils.h
29876         (eliminate_dom_walker::before_dom_children): Use ipa-devirt
29877         machinery; sanity check with ipa-prop devirtualization.
29878         * trans-mem.c (ipa_tm_insert_gettmclone_call): Clear
29879         polymorphic flag.
29880
29881 2014-08-07  Trevor Saunders  <tsaunders@mozilla.com>
29882
29883         * Makefile.in: Remove references to pointer-set.c and pointer-set.h.
29884         * alias.c, cfgexpand.c, cgraphbuild.c,
29885         config/aarch64/aarch64-builtins.c, config/aarch64/aarch64.c,
29886         config/alpha/alpha.c, config/darwin.c, config/i386/i386.c,
29887         config/i386/winnt.c, config/ia64/ia64.c, config/m32c/m32c.c,
29888         config/mep/mep.c, config/mips/mips.c, config/rs6000/rs6000.c,
29889         config/s390/s390.c, config/sh/sh.c, config/sparc/sparc.c,
29890         config/spu/spu.c, config/stormy16/stormy16.c, config/tilegx/tilegx.c,
29891         config/tilepro/tilepro.c, config/xtensa/xtensa.c, dominance.c,
29892         dse.c, except.c, gengtype.c, gimple-expr.c,
29893         gimple-ssa-strength-reduction.c, gimplify.c, ifcvt.c,
29894         ipa-visibility.c, lto-streamer.h, omp-low.c, predict.c, stmt.c,
29895         tree-affine.c, tree-cfg.c, tree-eh.c, tree-inline.c, tree-nested.c,
29896         tree-scalar-evolution.c, tree-ssa-loop-im.c, tree-ssa-loop-niter.c,
29897         tree-ssa-phiopt.c, tree-ssa-structalias.c, tree-ssa-uninit.c,
29898         tree-ssa.c, tree.c, var-tracking.c, varpool.c: Remove includes of
29899         pointer-set.h.
29900         * pointer-set.c: Remove file.
29901         * pointer-set.h: Remove file.
29902
29903 2014-08-07  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29904
29905         * config/arm/arm.md (*cmov<mode>): Set type attribute to fcsel.
29906         * config/arm/types.md (f_sels, f_seld): Delete.
29907
29908 2014-08-07  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29909
29910         * config/aarch64/aarch64.md (absdi2): Set simd attribute.
29911         (aarch64_reload_mov<mode>): Predicate on TARGET_FLOAT.
29912         (aarch64_movdi_<mode>high): Likewise.
29913         (aarch64_mov<mode>high_di): Likewise.
29914         (aarch64_movdi_<mode>low): Likewise.
29915         (aarch64_mov<mode>low_di): Likewise.
29916         (aarch64_movtilow_tilow): Likewise.
29917         Add comment explaining usage of fp,simd attributes and of
29918         TARGET_FLOAT and TARGET_SIMD.
29919
29920 2014-08-07  Ian Bolton  <ian.bolton@arm.com>
29921             Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
29922
29923         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate):
29924         Use MOVN when one of the half-words is 0xffff.
29925
29926 2014-08-07  Marat Zakirov  <m.zakirov@samsung.com>
29927
29928         * config/arm/thumb1.md (*thumb1_movqi_insn): Copy of thumb1_movhi_insn.
29929
29930 2014-08-07  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
29931
29932         * haifa-sched.c (SCHED_SORT): Delete.  Macro used exactly once.
29933         (enum rfs_decition:RFS_*): New constants wrapped in an enum.
29934         (rfs_str): String corresponding to RFS_* constants.
29935         (rank_for_schedule_stats_t): New typedef.
29936         (rank_for_schedule_stats): New static variable.
29937         (rfs_result): New static function.
29938         (rank_for_schedule): Track statistics for deciding heuristics.
29939         (rank_for_schedule_stats_diff, print_rank_for_schedule_stats): New
29940         static functions.
29941         (ready_sort): Use them for debug printouts.
29942         (schedule_block): Init statistics state.  Print statistics on
29943         rank_for_schedule decisions.
29944
29945 2014-08-07  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
29946
29947         * haifa-sched.c (rank_for_schedule): Fix INSN_TICK-based heuristics.
29948
29949 2014-08-07  Ilya Tocar  <ilya.tocar@intel.com>
29950
29951         * config/i386/sse.md (vec_extract_lo_<mode><mask_name>): Fix
29952         constraint.
29953
29954 2014-08-07  Trevor Saunders  <tsaunders@mozilla.com>
29955
29956         * hash-map.h (default_hashmap_traits): Adjust overloads of hash
29957         function to not conflict.
29958         * alias.c, cfgexpand.c, dse.c, except.h, gimple-expr.c,
29959         gimple-ssa-strength-reduction.c, gimple-ssa.h, ifcvt.c,
29960         lto-streamer-out.c, lto-streamer.h, tree-affine.c, tree-affine.h,
29961         tree-predcom.c, tree-scalar-evolution.c, tree-ssa-loop-im.c,
29962         tree-ssa-loop-niter.c, tree-ssa.c, value-prof.c: Use hash_map instead
29963         of pointer_map.
29964
29965 2014-08-07  Marek Polacek  <polacek@redhat.com>
29966
29967         * fold-const.c (fold_binary_loc): Add folding of
29968         (PTR0 - (PTR1 p+ A) -> (PTR0 - PTR1) - A.
29969
29970 2013-08-07  Ilya Enkovich  <ilya.enkovich@intel.com>
29971
29972         * config/elfos.h (ASM_DECLARE_OBJECT_NAME): Use decl size
29973         instead of type size.
29974         (ASM_FINISH_DECLARE_OBJECT): Likewise.
29975
29976 2014-08-07  Marat Zakirov  <m.zakirov@samsung.com>
29977
29978         * config/arm/thumb1.md (*thumb1_movhi_insn): Handle stack pointer.
29979         (*thumb1_movqi_insn): Likewise.
29980         * config/arm/thumb2.md (*thumb2_movhi_insn): Likewise.
29981
29982 2014-08-07  Tom de Vries  <tom@codesourcery.com>
29983
29984         * doc/sourcebuild.texi (glibc, glibc_2_12_or_later)
29985         (glibc_2_11_or_earlier): Remove effective-target keywords.
29986
29987 2014-08-07  Kugan Vivekanandarajah  <kuganv@linaro.org>
29988
29989         * config/arm/arm.c (bdesc_2arg): Fix typo.
29990         (arm_atomic_assign_expand_fenv): Remove The default implementation.
29991
29992 2014-08-07  Zhenqiang Chen  <zhenqiang.chen@arm.com>
29993
29994         * tree-ssa-loop-ivopts.c (get_address_cost): Try aligned offset.
29995
29996 2014-08-06  Vladimir Makarov  <vmakarov@redhat.com>
29997
29998         PR debug/61923
29999         * haifa-sched.c (advance_one_cycle): Fix dump.
30000         (schedule_block): Don't advance cycle if we are already at the
30001         beginning of the cycle.
30002
30003 2014-08-06  Martin Jambor  <mjambor@suse.cz>
30004
30005         PR ipa/61393
30006         * cgraphclones.c (cgraph_node::create_clone): Also copy tm_clone.
30007
30008 2014-08-06  Richard Biener  <rguenther@suse.de>
30009
30010         PR lto/62034
30011         * lto-streamer-in.c (lto_input_tree_1): Assert we do not read
30012         SCCs here.
30013         (lto_input_tree): Pop SCCs here.
30014
30015 2014-08-06  Richard Biener  <rguenther@suse.de>
30016
30017         PR tree-optimization/61320
30018         * tree-ssa-loop-ivopts.c (may_be_unaligned_p): Properly
30019         handle misaligned loads.
30020
30021 2014-08-06  Alan Lawrence  <alan.lawrence@arm.com>
30022
30023         * config/aarch64/aarch64.c (aarch64_evpc_dup): Enable for bigendian.
30024         (aarch64_expand_vec_perm_const): Check for dup before zip.
30025
30026 2014-08-06  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30027
30028         * config/aarch64/aarch64.c (aarch64_classify_address): Use REG_P and
30029         CONST_INT_P instead of GET_CODE and compare.
30030         (aarch64_select_cc_mode): Likewise.
30031         (aarch64_print_operand): Likewise.
30032         (aarch64_rtx_costs): Likewise.
30033         (aarch64_simd_valid_immediate): Likewise.
30034         (aarch64_simd_check_vect_par_cnst_half): Likewise.
30035         (aarch64_simd_emit_pair_result_insn): Likewise.
30036
30037 2014-08-05  David Malcolm  <dmalcolm@redhat.com>
30038
30039         * gdbhooks.py (find_gcc_source_dir): New helper function.
30040         (class PassNames): New class, locating and parsing passes.def.
30041         (class BreakOnPass): New command "break-on-pass".
30042
30043 2014-08-05  Trevor Saunders  <tsaunders@mozilla.com>
30044
30045         * tree-ssa.c (redirect_edge_var_map_dup): insert newe before
30046         getting olde.
30047
30048 2014-08-05  Richard Biener  <rguenther@suse.de>
30049
30050         PR rtl-optimization/61672
30051         * emit-rtl.h (mem_attrs_eq_p): Declare.
30052         * emit-rtl.c (mem_attrs_eq_p): Export.  Handle NULL mem-attrs.
30053         * cse.c (exp_equiv_p): Use mem_attrs_eq_p.
30054         * cfgcleanup.c (merge_memattrs): Likewise.
30055         Include emit-rtl.h.
30056
30057 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30058
30059         * config/aarch64/arm_neon.h (vqdmlals_lane_s32): Use scalar types
30060         rather than singleton vectors.
30061         (vqdmlsls_lane_s32): Likewise.
30062
30063 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30064
30065         * config/aarch64/aarch64-simd.md (aarch64_sqdmulh_laneq<mode>):
30066         Use VSDQ_HSI mode iterator.
30067         (aarch64_sqrdmulh_laneq<mode>): Likewise.
30068         (aarch64_sq<r>dmulh_laneq<mode>_internal): New define_insn.
30069         * config/aarch64/aarch64-simd-builtins.def (sqdmulh_laneq):
30070         Use BUILTIN_VDQHS macro.
30071         (sqrdmulh_laneq): Likewise.
30072         * config/aarch64/arm_neon.h (vqdmlalh_laneq_s16): New intrinsic.
30073         (vqdmlals_laneq_s32): Likewise.
30074         (vqdmlslh_laneq_s16): Likewise.
30075         (vqdmlsls_laneq_s32): Likewise.
30076         (vqdmulhh_laneq_s16): Likewise.
30077         (vqdmulhs_laneq_s32): Likewise.
30078         (vqrdmulhh_laneq_s16): Likewise.
30079         (vqrdmulhs_laneq_s32): Likewise.
30080
30081 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30082
30083         * config/aarch64/arm_neon.h (vmul_f64): New intrinsic.
30084         (vmuld_laneq_f64): Likewise.
30085         (vmuls_laneq_f32): Likewise.
30086         (vmul_n_f64): Likewise.
30087         (vmuld_lane_f64): Reimplement in C.
30088         (vmuls_lane_f32): Likewise.
30089
30090 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30091
30092         * config/arm/cortex-a15.md (cortex_a15_alu_shift): Add crc type
30093         to reservation.
30094         * config/arm/cortex-a53.md (cortex_a53_alu_shift): Likewise.
30095
30096 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30097
30098         * config/arm/arm.md (clzsi2): Set predicable_short_it attr to no.
30099         (rbitsi2): Likewise.
30100         (*arm_rev): Set predicable and predicable_short_it attributes.
30101
30102 2014-08-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30103
30104         * convert.c (convert_to_integer): Guard transformation to lrint by
30105         -fno-math-errno.
30106
30107 2014-08-05  James Greenhalgh  <james.greenhalgh@arm.com>
30108
30109         * config/aarch64/aarch64-builtins.c
30110         (aarch64_simd_builtin_type_mode): Delete.
30111         (v8qi_UP): Remap to V8QImode.
30112         (v4hi_UP): Remap to V4HImode.
30113         (v2si_UP): Remap to V2SImode.
30114         (v2sf_UP): Remap to V2SFmode.
30115         (v1df_UP): Remap to V1DFmode.
30116         (di_UP): Remap to DImode.
30117         (df_UP): Remap to DFmode.
30118         (v16qi_UP):V16QImode.
30119         (v8hi_UP): Remap to V8HImode.
30120         (v4si_UP): Remap to V4SImode.
30121         (v4sf_UP): Remap to V4SFmode.
30122         (v2di_UP): Remap to V2DImode.
30123         (v2df_UP): Remap to V2DFmode.
30124         (ti_UP): Remap to TImode.
30125         (ei_UP): Remap to EImode.
30126         (oi_UP): Remap to OImode.
30127         (ci_UP): Map to CImode.
30128         (xi_UP): Remap to XImode.
30129         (si_UP): Remap to SImode.
30130         (sf_UP): Remap to SFmode.
30131         (hi_UP): Remap to HImode.
30132         (qi_UP): Remap to QImode.
30133         (aarch64_simd_builtin_datum): Make mode a machine_mode.
30134         (VAR1): Build builtin name.
30135         (aarch64_init_simd_builtins): Remove dead code.
30136
30137 2014-08-05  Roman Gareev  <gareevroman@gmail.com>
30138
30139         * graphite-isl-ast-to-gimple.c:
30140         (set_options): New function.
30141         (scop_to_isl_ast): Add calling of set_options.
30142
30143 2014-08-05  Jakub Jelinek  <jakub@redhat.com>
30144
30145         * loop-unroll.c (struct iv_to_split): Remove n_loc and loc fields.
30146         (analyze_iv_to_split_insn): Don't initialize them.
30147         (get_ivts_expr): Removed.
30148         (allocate_basic_variable, insert_base_initialization): Use
30149         SET_SRC instead of *get_ivts_expr.
30150         (split_iv): Use &SET_SRC instead of get_ivts_expr.
30151
30152 2014-08-05  Roman Gareev  <gareevroman@gmail.com>
30153
30154         * graphite-isl-ast-to-gimple.c: Add a new struct ast_build_info.
30155         (translate_isl_ast_for_loop): Add checking of the
30156         flag_loop_parallelize_all.
30157         (ast_build_before_for): New function.
30158         (scop_to_isl_ast): Add checking of the
30159         flag_loop_parallelize_all.
30160         * graphite-dependences.c: Move the defenition of the
30161         scop_get_dependences from graphite-optimize-isl.c to this file.
30162         (apply_schedule_on_deps): Add checking of the ux's emptiness.
30163         (carries_deps): Add checking of the x's value.
30164         * graphite-optimize-isl.c: Move the defenition of the
30165         scop_get_dependences to graphite-dependences.c.
30166         * graphite-poly.h: Add declarations of scop_get_dependences
30167         and carries_deps.
30168
30169 2014-08-04  Rohit  <rohitarulraj@freescale.com>
30170
30171         PR target/60102
30172         * config/rs6000/rs6000.c (rs6000_reg_names): Add SPE high register
30173         names.
30174         (alt_reg_names): Likewise.
30175         (rs6000_dwarf_register_span): For SPE high registers, replace
30176         dwarf register numbers with GCC hard register numbers.
30177         (rs6000_init_dwarf_reg_sizes_extra): Likewise.
30178         (rs6000_dbx_register_number): For SPE high registers, return dwarf
30179         register number for the corresponding GCC hard register number.
30180         * config/rs6000/rs6000.h (FIRST_PSEUDO_REGISTER): Update based on 32
30181         newly added GCC hard register numbers for SPE high registers.
30182         (DWARF_FRAME_REGISTERS):  Likewise.
30183         (DWARF_REG_TO_UNWIND_COLUMN): Likewise.
30184         (DWARF_FRAME_REGNUM): Likewise.
30185         (FIXED_REGISTERS): Likewise.
30186         (CALL_USED_REGISTERS): Likewise.
30187         (CALL_REALLY_USED_REGISTERS): Likewise.
30188         (REG_ALLOC_ORDER): Likewise.
30189         (enum reg_class): Likewise.
30190         (REG_CLASS_NAMES): Likewise.
30191         (REG_CLASS_CONTENTS): Likewise.
30192         (SPE_HIGH_REGNO_P): New macro to identify SPE high registers.
30193
30194 2014-08-04  Richard Biener  <rguenther@suse.de>
30195
30196         * gimple-fold.h (gimple_fold_builtin): Remove.
30197         * gimple-fold.c (gimple_fold_builtin): Make static.
30198         * tree-ssa-ccp.c (pass_fold_builtins::execute): Use
30199         fold_stmt, not gimple_fold_builtin.
30200
30201 2014-08-04  Martin Liska <mliska@suse.cz>
30202
30203         * cgraph.h (csi_end_p): Removed.
30204         (csi_next): Likewise.
30205         (csi_node): Likewise.
30206         (csi_start): Likewise.
30207         (cgraph_node_in_set_p): Likewise.
30208         (cgraph_node_set_size): Likewise.
30209         (vsi_end_p): Likewise.
30210         (vsi_next): Likewise.
30211         (vsi_node): Likewise.
30212         (vsi_start): Likewise.
30213         (varpool_node_set_size): Likewise.
30214         (cgraph_node_set_nonempty_p): Likewise.
30215         (varpool_node_set_nonempty_p): Likewise.
30216         * cgraphunit.c (cgraph_process_new_functions): vec replaces
30217         cgraph_node_set.
30218         * ipa-inline-transform.c: Likewise.
30219         * ipa-utils.c (cgraph_node_set_new): Removed.
30220         (cgraph_node_set_add): Likewise.
30221         (cgraph_node_set_remove): Likewise.
30222         (cgraph_node_set_find): Likewise.
30223         (dump_cgraph_node_set): Likewise.
30224         (debug_cgraph_node_set): Likewise.
30225         (free_cgraph_node_set): Likewise.
30226         (varpool_node_set_new): Likewise.
30227         (varpool_node_set_add): Likewise.
30228         (varpool_node_set_remove): Likewise.
30229         (varpool_node_set_find): Likewise.
30230         (dump_varpool_node_set): Likewise.
30231         (free_varpool_node_set): Likewise.
30232         (debug_varpool_node_set): Likewise.
30233         * tree-emutls.c (struct tls_var_data):
30234         (emutls_index): Removed.
30235         (emutls_decl): Likewise.
30236         (gen_emutls_addr): Function implementation uses newly added
30237         hash_map<varpool_node *, tls_var_data>.
30238         (clear_access_vars): Likewise.
30239         (create_emultls_var): Likewise.
30240         (ipa_lower_emutls): Likewise.
30241         (reset_access): New function.
30242
30243 2014-08-04 Ganesh Gopalasubramanian  <Ganesh.Gopalasubramanian@amd.com>
30244
30245         * config/i386/i386.c (ix86_option_override_internal): Add
30246         PTA_RDRND and PTA_MOVBE for bdver4.
30247
30248 2014-08-04  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30249             James Greenhalgh  <james.greenhalgh@arm.com>
30250
30251         * doc/md.texi (clrsb): Document.
30252         (clz): Change reference to x into operand 1.
30253         (ctz): Likewise.
30254         (popcount): Likewise.
30255
30256 2014-08-04  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30257
30258         PR target/61713
30259         * gcc/optabs.c (expand_atomic_test_and_set): Do not try to emit
30260         move to subtarget in serial version if result is ignored.
30261
30262 2014-08-04  Ramana Radhakrishnan <ramana.radhakrishnan@arm.com>
30263             Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
30264
30265         * sched-deps.c (try_group_insn): Generalise macro fusion hook usage
30266         to any two insns.  Update comment.  Rename to sched_macro_fuse_insns.
30267         (sched_analyze_insn): Update use of try_group_insn to
30268         sched_macro_fuse_insns.
30269         * config/i386/i386.c (ix86_macro_fusion_pair_p): Reject 2nd
30270         arguments that are not conditional jumps.
30271
30272 2014-08-04  Ganesh Gopalasubramanian  <Ganesh.Gopalasubramanian@amd.com>
30273
30274         * config/i386/driver-i386.c (host_detect_local_cpu): Handle AMD's
30275         extended family information. Handle BTVER2 cpu with cpuid family value.
30276
30277 2014-08-04  Tom de Vries  <tom@codesourcery.com>
30278
30279         * doc/sourcebuild.texi (glibc, glibc_2_12_or_later)
30280         (glibc_2_11_or_earlier): Document effective-target keywords.
30281
30282 2014-08-01  Jan Hubicka  <hubicka@ucw.cz>
30283
30284         * ipa-devirt.c (odr_type_warn_count): Add type.
30285         (possible_polymorphic_call_targets): Set it.
30286         (ipa_devirt): Use it.
30287
30288 2014-08-01  Jan Hubicka  <hubicka@ucw.cz>
30289
30290         * doc/invoke.texi (Wsuggest-final-types, Wsuggest-final-methods):
30291         Document.
30292         * ipa-devirt.c: Include hash-map.h
30293         (struct polymorphic_call_target_d): Add type_warning and decl_warning.
30294         (clear_speculation): Break out of ...
30295         (get_class_context): ... here; speed up handling obviously useless
30296         speculations.
30297         (odr_type_warn_count, decl_warn_count): New structures.
30298         (final_warning_record): New structure.
30299         (final_warning_records): New static variable.
30300         (possible_polymorphic_call_targets): Cleanup handling of
30301         speculative info; do not build speculation when user do not care;
30302         record info about warnings when asked for.
30303         (add_decl_warning): New function.
30304         (type_warning_cmp): New function.
30305         (decl_warning_cmp): New function.
30306         (ipa_devirt): Handle -Wsuggest-final-methods and -Wsuggest-final-types.
30307         (gate): Enable pass when warnings are requested.
30308         * common.opt (Wsuggest-final-types, Wsuggest-final-methods): New
30309         options.
30310
30311 2014-08-02  Trevor Saunders  <tsaunders@mozilla.com>
30312
30313         * hash-map.h (default_hashmap_traits::mark_key_deleted):
30314         Fix cast.
30315         (hash_map::remove): New method.
30316         (hash_map::traverse): New method.
30317         * cgraph.h, except.c, except.h, gimple-ssa-strength-reduction.c,
30318         ipa-utils.c, lto-cgraph.c, lto-streamer.h, omp-low.c, predict.c,
30319         tree-cfg.c, tree-cfgcleanup.c, tree-eh.c, tree-eh.h, tree-inline.c,
30320         tree-inline.h, tree-nested.c, tree-sra.c, tree-ssa-loop-im.c,
30321         tree-ssa-loop-ivopts.c, tree-ssa-reassoc.c, tree-ssa-structalias.c,
30322         tree-ssa.c, tree-ssa.h, var-tracking.c: Use hash_map instead of
30323         pointer_map.
30324
30325 2014-08-02  Trevor Saunders  <tsaunders@mozilla.com>
30326
30327         * hash-set.h: new File.
30328         * cfgexpand.c, cfgloop.c, cgraph.c, cgraphbuild.c, cgraphunit.c,
30329         cprop.c, cse.c, gimple-walk.c, gimple-walk.h, gimplify.c, godump.c,
30330         ipa-devirt.c, ipa-pure-const.c, ipa-visibility.c, ipa.c, lto-cgraph.c,
30331         lto-streamer-out.c, stmt.c, tree-cfg.c, tree-core.h, tree-eh.c,
30332         tree-inline.c, tree-inline.h, tree-nested.c, tree-pretty-print.c,
30333         tree-ssa-loop-niter.c, tree-ssa-phiopt.c, tree-ssa-threadedge.c,
30334         tree-ssa-uninit.c, tree.c, tree.h, value-prof.c, varasm.c,
30335         varpool.c: Use hash_set instead of pointer_set.
30336
30337 2014-08-01  Alan Lawrence  <alan.lawrence@arm.com>
30338
30339         * config/aarch64/aarch64-simd-builtins.def (dup_lane, get_lane): Delete.
30340
30341 2014-08-01  Jiong Wang <jiong.wang@arm.com>
30342
30343         * config/aarch64/aarch64.c (aarch64_classify_address): Accept all offset
30344         for frame access when strict_p is false.
30345
30346 2014-08-01  Renlin Li <renlin.li@arm.com>
30347 2014-08-01  Jiong Wang <jiong.wang@arm.com>
30348
30349         * config/aarch64/aarch64.c (offset_7bit_signed_scaled_p): Rename to
30350         aarch64_offset_7bit_signed_scaled_p, remove static and use it.
30351         * config/aarch64/aarch64-protos.h (aarch64_offset_7bit_signed_scaled_p):
30352         Declaration.
30353         * config/aarch64/predicates.md (aarch64_mem_pair_offset): Define new
30354         predicate.
30355         * config/aarch64/aarch64.md (loadwb_pair, storewb_pair): Use
30356         aarch64_mem_pair_offset.
30357
30358 2014-08-01  Jiong Wang <jiong.wang@arm.com>
30359
30360         * config/aarch64/aarch64.md (loadwb_pair<GPI:mode>_<P:mode>): Fix
30361         offset.
30362         (loadwb_pair<GPI:mode>_<P:mode>): Likewise.
30363         * config/aarch64/aarch64.c (aarch64_gen_loadwb_pair): Likewise.
30364
30365 2014-08-01  Matthew Fortune  <matthew.fortune@imgtec.com>
30366
30367         * config/mips/mips.h (REGISTER_PREFIX): Define macro.
30368
30369 2014-08-01  James Greenhalgh  <james.greenhalgh@arm.com>
30370
30371         PR regression/61510
30372         * cgraphunit.c (analyze_functions): Use get_create rather than get
30373         for decls which are clones of abstract functions.
30374
30375 2014-08-01  Martin Liska  <mliska@suse.cz>
30376
30377         * gimple-iterator.h (gsi_next_nonvirtual_phi): New function.
30378         * ipa-prop.h (count_formal_params): Global function created from static.
30379         * ipa-prop.c (count_formal_params): Likewise.
30380         * ipa-utils.c (ipa_merge_profiles): Be more tolerant if we merge
30381         profiles for semantically equivalent functions.
30382         * passes.c (do_per_function): If we load body of a function
30383         during WPA, this condition should behave same.
30384         * varpool.c (ctor_for_folding): More tolerant assert for variable
30385         aliases created during WPA.
30386
30387 2014-08-01  Martin Liska  <mliska@suse.cz>
30388
30389         * doc/invoke.texi (Options That Control Optimization): Documentation
30390         for -foptimize-strlen introduced. Optimization levels default options
30391         fixed.
30392
30393 2014-08-01  Jakub Jelinek  <jakub@redhat.com>
30394
30395         * opts.c (common_handle_option): Handle -fsanitize=alignment.
30396         * ubsan.h (enum ubsan_null_ckind): Add UBSAN_CTOR_CALL.
30397         (ubsan_expand_bounds_ifn, ubsan_expand_null_ifn): Change return
30398         type to bool.
30399         * stor-layout.h (min_align_of_type): New prototype.
30400         * asan.c (pass_sanopt::execute): Don't perform gsi_next if
30401         ubsan_expand* told us not to do it.  Remove the extra gsi_end_p
30402         check.
30403         * ubsan.c: Include builtins.h.
30404         (ubsan_expand_bounds_ifn): Change return type to bool,
30405         always return true.
30406         (ubsan_expand_null_ifn): Change return type to bool, change
30407         argument to gimple_stmt_iterator *.  Handle both null and alignment
30408         sanitization, take type from ckind argument's type rather than
30409         first argument.
30410         (instrument_member_call): Removed.
30411         (instrument_mem_ref): Remove t argument, add mem and base arguments.
30412         Handle both null and alignment sanitization, don't say whole
30413         struct access is member access.  Build 3 argument IFN_UBSAN_NULL
30414         call instead of 2 argument.
30415         (instrument_null): Adjust instrument_mem_ref caller.  Don't
30416         instrument calls here.
30417         (pass_ubsan::gate, pass_ubsan::execute): Handle SANITIZE_ALIGNMENT
30418         like SANITIZE_NULL.
30419         * stor-layout.c (min_align_of_type): New function.
30420         * flag-types.h (enum sanitize_code): Add SANITIZE_ALIGNMENT.
30421         Or it into SANITIZE_UNDEFINED.
30422         * doc/invoke.texi (-fsanitize=alignment): Document.
30423
30424 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30425
30426         * tree-ssa-tail-merge.c (same_succ_hash): Convert to inchash.
30427
30428 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30429
30430         * tree-ssa-sccvn.c (vn_reference_op_compute_hash): Convert to
30431         inchash.
30432         (vn_reference_compute_hash): Dito.
30433         (vn_nary_op_compute_hash): Dito.
30434         (vn_phi_compute_hash): Dito.
30435         * tree-ssa-sccvn.h (vn_hash_constant_with_type): Dito.
30436
30437 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30438
30439         * tree-ssa-dom.c (iterative_hash_exprs_commutative):
30440         Rename to inchash:add_expr_commutative. Convert to inchash.
30441         (iterative_hash_hashable_expr): Rename to
30442         inchash:add_hashable_expr. Convert to inchash.
30443         (avail_expr_hash): Dito.
30444
30445 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30446
30447         * ipa-devirt.c (polymorphic_call_target_hasher::hash):
30448         Convert to inchash.
30449
30450 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30451
30452         * asan.c (asan_mem_ref_hasher::hash): Convert to inchash.
30453
30454 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30455
30456         * Makefile.in (OBJS): Add rtlhash.o
30457         * dwarf2out.c (addr_table_entry_do_hash): Convert to inchash.
30458         (loc_checksum): Dito.
30459         (loc_checksum_ordered): Dito.
30460         (hash_loc_operands): Dito.
30461         (hash_locs): Dito.
30462         (hash_loc_list): Dito.
30463         * rtl.c (iterative_hash_rtx): Moved to rtlhash.c
30464         * rtl.h (iterative_hash_rtx): Moved to rtlhash.h
30465         * rtlhash.c: New file.
30466         * rtlhash.h: New file.
30467
30468 2014-07-31  Andi Kleen  <ak@linux.intel.com>
30469
30470         * inchash.h (inchash): Change inchash class to namespace.
30471         (class hash): ... Rename from inchash.
30472         (add_object): Move from macro to class template.
30473         * lto-streamer-out.c (hash_tree): Change inchash
30474         to inchash::hash.
30475         * tree.c (build_type_attribute_qual_variant): Dito.
30476         (type_hash_list): Dito.
30477         (attribute_hash_list): Dito.
30478         (iterative_hstate_expr): Rename to inchash::add_expr
30479         (build_range_type_1): Change inchash to inchash::hash
30480         and use hash::add_expr.
30481         (build_array_type_1): Dito.
30482         (build_function_type): Dito
30483         (build_method_type_directly): Dito.
30484         (build_offset_type): Dito.
30485         (build_complex_type): Dito.
30486         (make_vector_type): Dito.
30487         * tree.h (iterative_hash_expr): Dito.
30488
30489 2014-07-31  Chen Gang  <gang.chen.5i5j@gmail.com>
30490
30491         * gcc.c (do_spec_1): Allocate enough space for saved_suffix.
30492
30493 2014-07-31  James Greenhalgh  <james.greenhalgh@arm.com>
30494
30495         * config/aarch64/arm_neon.h (vpadd_<suf><8,16,32,64>): Move to
30496         correct alphabetical position.
30497         (vpaddd_f64): Rewrite using builtins.
30498         (vpaddd_s64): Move to correct alphabetical position.
30499         (vpaddd_u64): New.
30500
30501 2014-07-31  Oleg Endo  <olegendo@gcc.gnu.org>
30502
30503         PR target/61844
30504         * config/sh/sh.c (sh_legitimate_address_p,
30505         sh_legitimize_reload_address): Handle reg+reg address modes when
30506         ALLOW_INDEXED_ADDRESS is false.
30507         * config/sh/predicates.md (general_movsrc_operand,
30508         general_movdst_operand): Likewise.
30509
30510 2014-07-31  James Greenhalgh  <james.greenhalgh@arm.com>
30511
30512         * config/aarch64/aarch64-builtins.c
30513         (aarch64_gimple_fold_builtin): Don't fold reduction operations for
30514         BYTES_BIG_ENDIAN.
30515
30516 2014-07-31  James Greenhalgh  <james.greenhalgh@arm.com>
30517
30518         * config/aarch64/aarch64.c (aarch64_simd_vect_par_cnst_half): Vary
30519         the generated mask based on BYTES_BIG_ENDIAN.
30520         (aarch64_simd_check_vect_par_cnst_half): New.
30521         * config/aarch64/aarch64-protos.h
30522         (aarch64_simd_check_vect_par_cnst_half): New.
30523         * config/aarch64/predicates.md (vect_par_cnst_hi_half): Refactor
30524         the check out to aarch64_simd_check_vect_par_cnst_half.
30525         (vect_par_cnst_lo_half): Likewise.
30526         * config/aarch64/aarch64-simd.md
30527         (aarch64_simd_move_hi_quad_<mode>): Always use vec_par_cnst_lo_half.
30528         (move_hi_quad_<mode>): Always generate a low mask.
30529
30530 2014-07-30  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
30531
30532         * doc/invoke.texi (AVR Options): Add documentation about
30533         __AVR_DEVICE_NAME__ built-in macro.
30534
30535 2014-07-31  Charles Baylis  <charles.baylis@linaro.org>
30536
30537         PR target/61948
30538         * config/arm/neon.md (ashldi3_neon): Don't emit arm_ashldi3_1bit unless
30539         constraints are satisfied.
30540         (<shift>di3_neon): Likewise.
30541
30542 2014-07-31  Richard Biener  <rguenther@suse.de>
30543
30544         PR tree-optimization/61964
30545         * tree-ssa-tail-merge.c (gimple_equal_p): Handle non-SSA LHS solely
30546         by structural equality.
30547
30548 2014-07-31  Yury Gribov  <y.gribov@samsung.com>
30549
30550         * doc/cpp.texi (__SANITIZE_ADDRESS__): Updated description.
30551         * doc/invoke.texi (-fsanitize=kernel-address): Describe new option.
30552         * flag-types.h (SANITIZE_USER_ADDRESS, SANITIZE_KERNEL_ADDRESS):
30553         New enums.
30554         * gcc.c (sanitize_spec_function): Support new option.
30555         (SANITIZER_SPEC): Remove now redundant check.
30556         * opts.c (common_handle_option): Support new option.
30557         (finish_options): Check for incompatibilities.
30558         * toplev.c (process_options): Split userspace-specific checks.
30559
30560 2014-07-31  Richard Biener  <rguenther@suse.de>
30561
30562         * lto-streamer.h (struct output_block): Remove global.
30563         (struct data_in): Remove labels, num_named_labels and
30564         num_unnamed_labels.
30565         * lto-streamer-in.c (lto_data_in_delete): Do not free labels.
30566         * lto-streamer-out.c (produce_asm_for_decls): Do not set global.
30567
30568 2014-07-31  Marc Glisse  <marc.glisse@inria.fr>
30569
30570         PR c++/60517
30571         * common.opt (-Wreturn-local-addr): Moved from c.opt.
30572         * gimple-ssa-isolate-paths.c: Include diagnostic-core.h and intl.h.
30573         (isolate_path): New argument to avoid inserting a trap.
30574         (find_implicit_erroneous_behaviour): Handle returning the address
30575         of a local variable.
30576         (find_explicit_erroneous_behaviour): Likewise.
30577
30578 2014-07-31  Bingfeng Mei <bmei@broadcom.com>
30579
30580         PR lto/61868
30581         * toplev.c (init_random_seed): Move piece of code never called to
30582         set_random_seed.
30583         (set_random_seed): see above.
30584
30585 2014-07-31  Tom de Vries  <tom@codesourcery.com>
30586
30587         * tree-ssa-loop.c (pass_tree_loop_init::execute): Remove dead code.
30588
30589 2014-07-31  Richard Sandiford  <rdsandiford@googlemail.com>
30590
30591         * ira.c (insn_contains_asm_1, insn_contains_asm): Delete.
30592         (compute_regs_asm_clobbered): Use extract_asm_operands instead.
30593
30594 2014-07-31  Richard Biener  <rguenther@suse.de>
30595
30596         * data-streamer.h (streamer_write_data_stream): Declare here,
30597         renamed from ...
30598         * lto-streamer.h (lto_output_data_stream): ... this.  Remove.
30599         * lto-cgraph.c (lto_output_node): Adjust.
30600         (lto_output_varpool_node): Likewise.
30601         * data-streamer-out.c (streamer_string_index): Likewise.
30602         (streamer_write_data_stream, lto_append_block): Move from ...
30603         * lto-section-out.c (lto_output_data_stream,
30604         lto_append_block): ... here.
30605
30606 2014-07-30  Mike Stump  <mikestump@comcast.net>
30607
30608         * configure.ac: Also check for popen.
30609         * tree-loop-distribution.c (dot_rdg): Autoconfize popen use.
30610         * configure: Regenerate.
30611         * config.in:  Regenerate.
30612
30613 2014-07-30  Martin Jambor  <mjambor@suse.cz>
30614
30615         * tree-sra.c (sra_ipa_modify_assign): Change type of the first
30616         parameter to gimple.
30617
30618 2014-07-30  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
30619
30620         * config/s390/s390.c (s390_emit_tpf_eh_return): Pass original return
30621         address as second parameter to __tpf_eh_return routine.
30622
30623 2014-07-30  Jiong Wang  <jiong.wang@arm.com>
30624
30625         * config/arm/arm.c (arm_get_frame_offsets): Adjust condition for
30626         Thumb2.
30627
30628 2014-07-30  Tom Tromey  <tromey@redhat.com>
30629
30630         PR c/59855
30631         * doc/invoke.texi (Warning Options): Document -Wdesignated-init.
30632         * doc/extend.texi (Type Attributes): Document designated_init
30633         attribute.
30634
30635 2014-07-30  Roman Gareev  <gareevroman@gmail.com>
30636
30637         * graphite-isl-ast-to-gimple.c:
30638         (gcc_expression_from_isl_ast_expr_id): Add calling of fold_convert.
30639         (gcc_expression_from_isl_expression): Pass type to
30640         gcc_expression_from_isl_ast_expr_id.
30641
30642 2014-07-30  Richard Biener  <rguenther@suse.de>
30643
30644         * lto-streamer.h (lto_write_data): New function.
30645         * langhooks.c (lhd_append_data): Do not free block.
30646         * lto-section-out.c (lto_write_data): New function writing
30647         raw data to the current section.
30648         (lto_write_stream): Adjust for langhook semantic change.
30649         (lto_destroy_simple_output_block): Write header directly.
30650         * lto-opts.c (lto_write_options): Write options directly.
30651         * lto-streamer-out.c (produce_asm): Write heaeder directly.
30652         (lto_output_toplevel_asms): Likewise.
30653         (copy_function_or_variable): Copy data directly.
30654         (write_global_references): Output index table directly.
30655         (lto_output_decl_state_refs): Likewise.
30656         (write_symbol): Write data directly.
30657         (produce_symtab): Adjust.
30658         (produce_asm_for_decls): Output header and refs directly.
30659
30660 2014-07-29  Jan Hubicka  <hubicka@ucw.cz>
30661
30662         * ipa-devirt.c (polymorphic_call_target_d): Rename
30663         nonconstruction_targets to speculative_targets
30664         (get_class_context): Fix handling of contextes without outer type;
30665         avoid matching non-polymorphic types in LTO.
30666         (possible_polymorphic_call_targets): Trun nonconstruction_targetsp
30667         parameter to speculative_targetsp; handle speculation.
30668         (dump_possible_polymorphic_call_targets): Update dumping.
30669
30670 2014-07-29  Jan Hubicka  <hubicka@ucw.cz>
30671
30672         * common.opt (Wodr): Enable by default.
30673
30674 2014-07-29  Olivier Hainque  <hainque@adacore.com>
30675
30676         * config/vxworksae.h (VXWORKS_OVERRIDE_OPTIONS): Define.
30677
30678 2014-07-29  H.J. Lu  <hongjiu.lu@intel.com>
30679
30680         PR bootstrap/61914
30681         * gengtype.c (strtoken): New function.
30682         (create_user_defined_type): Replace strtok with strtoken.
30683
30684 2014-07-29  Nathan Sidwell  <nathan@acm.org>
30685
30686         * gcov-io.c (gcov_var): Make hidden.
30687         * gcov-tool.c (gcov_list, gcov_exit): Remove declarations.
30688         (gcov_do_dump): Declare.
30689         (gcov_output_files): Call gcov_do_dump, not gcov_exit).
30690
30691 2014-07-29  Martin Jambor  <mjambor@suse.cz>
30692
30693         * tree-sra.c (sra_modify_constructor_assign): Change type of stmt
30694         parameter to gimple.
30695         (sra_modify_assign): Likewise.
30696
30697 2014-07-29  Richard Biener  <rguenther@suse.de>
30698
30699         PR middle-end/52478
30700         * expr.c (expand_expr_real_2): Revert last change.
30701
30702 2014-07-28  Jan Hubicka  <hubicka@ucw.cz>
30703
30704         * cgraph.c (cgraph_node::create_indirect_edge): Copy speculative data.
30705         * cgraph.h (cgraph_indirect_call_info): Add speculative data.
30706         * gimple-fold.c (fold_gimple_assign): Fix check for virtual
30707         call.
30708         * ipa-devirt.c (ipa_dummy_polymorphic_call_context): Update
30709         (contains_type_p): Forward declare.
30710         (polymorphic_call_target_hasher::hash): Hash speculative info.
30711         (polymorphic_call_target_hasher::equal): Compare speculative info.
30712         (get_class_context): Handle speuclation.
30713         (contains_type_p): Update.
30714         (get_polymorphic_call_info_for_decl): Update.
30715         (walk_ssa_copies): Break out from ...
30716         (get_polymorphic_call_info): ... here; set speculative context
30717         before giving up.
30718         * ipa-prop.c (ipa_write_indirect_edge_info,
30719         ipa_read_indirect_edge_info): Stream speculative context.
30720         * ipa-utils.h (ipa_polymorphic_call_context): Add speculative info
30721         (SPECULATIVE_OFFSET, SPECULATIVE_OUTER_TYPE,
30722         SPECULATIVE_MAYBE_DERIVED_TYPE).
30723         (possible_polymorphic_call_targets overriders): Update.
30724         (dump_possible_polymorphic_call_targets overriders): Update.
30725         (dump_possible_polymorphic_call_target_p overriders): Update.
30726
30727 2014-07-28  Jan Hubicka  <hubicka@ucw.cz>
30728
30729         * gimple-fold.c (fold_gimple_assign): Fix condition guarding
30730         ipa-devirt path; fix thinko there.
30731
30732 2014-07-28  Trevor Saunders  <tsaunders@mozilla.com>
30733
30734         * config/i386/i386.c (ix86_return_in_memory): Replace one
30735         ATTRIBUTE_UNUSED where the attribute can actually sometimes be unused.
30736
30737 2014-07-28  Marek Polacek  <polacek@redhat.com>
30738
30739         * doc/invoke.texi (-Wno-odr): Fix @item entry.  Tweak wording.
30740
30741 2014-07-28  Peter Bergner  <bergner@vnet.ibm.com>
30742
30743         * config.gcc (powerpc*-*-linux*): Include gnu-user.h in tm_file.
30744         * config/rs6000/sysv4.h (CC1_SPEC): Undefine it before defining it.
30745         * config/rs6000/linux.h (CPLUSPLUS_CPP_SPEC): Delete define.
30746         (LINK_GCC_C_SEQUENCE_SPEC): Likewise.
30747         (USE_LD_AS_NEEDED): Likewise.
30748         (ASM_APP_ON): Likewise.
30749         (ASM_APP_OFF): Likewise.
30750         (TARGET_POSIX_IO): Likewise.
30751         * config/rs6000/linux64.h (CPLUSPLUS_CPP_SPEC): Likewise.
30752         (LINK_GCC_C_SEQUENCE_SPEC): Likewise.
30753         (USE_LD_AS_NEEDED): Likewise.
30754         (ASM_APP_ON): Likewise.
30755         (ASM_APP_OFF): Likewise.
30756         (TARGET_POSIX_IO): Likewise.
30757
30758 2014-07-28  Eric Botcazou  <ebotcazou@adacore.com>
30759
30760         PR middle-end/61734
30761         * fold-const.c (fold_comparison): Disable X - Y CMP 0 to X CMP Y for
30762         operators other than the equality operators.
30763
30764 2014-07-28  Richard Biener  <rguenther@suse.de>
30765
30766         PR middle-end/52478
30767         * optabs.c (gen_int_libfunc): For -ftrapv libfuncs make
30768         sure to register SImode ones, not only >= word_mode ones.
30769         * expr.c (expand_expr_real_2): When expanding -ftrapv
30770         binops do not use OPTAB_LIB_WIDEN.
30771
30772 2014-07-28  Richard Sandiford  <rdsandiford@googlemail.com>
30773
30774         PR middle-end/61919
30775         * tree-outof-ssa.c (insert_partition_copy_on_edge)
30776         (insert_value_copy_on_edge, insert_rtx_to_part_on_edge)
30777         (insert_part_to_rtx_on_edge): Copy partition_to_pseudo rtxes before
30778         inserting them in the insn stream.
30779
30780 2014-07-28  Marek Polacek  <polacek@redhat.com>
30781
30782         PR middle-end/61913
30783         * common.opt (Wodr): Add Var.
30784
30785 2014-07-28  Richard Biener  <rguenther@suse.de>
30786
30787         PR tree-optimization/61921
30788         * tree-ssa-structalias.c (create_variable_info_for_1): Check
30789         if there is a varpool node before dereferencing it.
30790
30791 2014-07-28  Roman Gareev  <gareevroman@gmail.com>
30792
30793         * graphite-sese-to-poly.c:
30794         (new_pbb_from_pbb): Set a new id of pbb1->domain (instead of using the
30795         id of the pbb), which contains pointer to the pbb1.
30796
30797         * gcc.dg/graphite/isl-ast-gen-if-2.c: New testcase.
30798
30799 2014-07-28  Roman Gareev  <gareevroman@gmail.com>
30800
30801         * graphite-isl-ast-to-gimple.c:
30802         (graphite_create_new_guard): New function.
30803         (translate_isl_ast_node_if): New function.
30804         (translate_isl_ast): Add calling of translate_isl_ast_node_if.
30805
30806         * gcc.dg/graphite/isl-ast-gen-if-1.c: New testcase.
30807
30808 2014-07-27  Anthony Green  <green@moxielogic.com>
30809
30810         * config.gcc: Add moxie-*-moxiebox* configuration.
30811         * config/moxie/moxiebox.h: New file.
30812
30813 2014-07-26  Andrew Pinski  <apinski@cavium.com>
30814
30815         * config/aarch64/aarch64.md (*extr_insv_lower_reg<mode>): Remove +
30816         from the read only register.
30817
30818 2014-07-26  Richard Sandiford  <rdsandiford@googlemail.com>
30819
30820         * ira-costs.c (find_costs_and_classes): For -O0, use the best class
30821         as the allocation class if it isn't likely to be spilled.
30822
30823 2014-07-26  Richard Sandiford  <rdsandiford@googlemail.com>
30824
30825         * rtl.h (tls_referenced_p): Declare.
30826         * rtlanal.c (tls_referenced_p_1, tls_referenced_p): New functions.
30827         * config/mips/mips.c (mips_tls_symbol_ref_1): Delete.
30828         (mips_cannot_force_const_mem): Use tls_referenced_p.
30829         * config/pa/pa-protos.h (pa_tls_referenced_p): Delete.
30830         * config/pa/pa.h (CONSTANT_ADDRESS_P): Use tls_referenced_p
30831         instead of pa_tls_referenced_p.
30832         * config/pa/pa.c (hppa_legitimize_address, pa_cannot_force_const_mem)
30833         (pa_emit_move_sequence, pa_emit_move_sequence): Likewise.
30834         (pa_legitimate_constant_p): Likewise.
30835         (pa_tls_symbol_ref_1, pa_tls_referenced_p): Delete.
30836         * config/rs6000/rs6000.c (rs6000_tls_referenced_p): Delete.
30837         (rs6000_cannot_force_const_mem, rs6000_emit_move)
30838         (rs6000_address_for_altivec): Use tls_referenced_p instead of
30839         rs6000_tls_referenced_p.
30840         (rs6000_tls_symbol_ref_1): Delete.
30841
30842 2014-07-26  Marc Glisse  <marc.glisse@inria.fr>
30843
30844         PR target/44551
30845         * simplify-rtx.c (simplify_binary_operation_1) <VEC_SELECT>:
30846         Optimize inverse of a VEC_CONCAT.
30847
30848 2014-07-25  Xinliang David Li  <davidxl@google.com>
30849
30850         * params.def: New parameter.
30851         * coverage.c (get_coverage_counts): Check new flag.
30852         (coverage_compute_profile_id): Check new flag.
30853         (coverage_begin_function): Check new flag.
30854         (coverage_end_function): Check new flag.
30855         * value-prof.c (coverage_node_map_initialized_p): New function.
30856         (init_node_map): Populate map with all functions.
30857         * doc/invoke.texi: Document new parameter.
30858
30859 2014-07-25  Jan Hubicka  <hubicka@ucw.cz>
30860             Richard Biener <rguenther@suse.de>
30861
30862         * lto-streamer-out.c (struct sccs): Turn to ...
30863         (class DFS): ... this one; refactor the DFS walk so it can
30864         be re-done on per-SCC basis.
30865         (DFS::DFS): New constructor.
30866         (DFS::~DFS): New destructor.
30867         (hash_tree): Add new MAP argument holding in-SCC hash values;
30868         remove POINTER_TYPE hashing hack.
30869         (scc_entry_compare): Rename to ...
30870         (DFS::scc_entry_compare): ... this one.
30871         (hash_scc): Rename to ...
30872         (DFS::hash_scc): ... this one; pass output_block instead
30873         of streamer_cache; work harder to get unique and stable SCC
30874         hashes.
30875         (DFS_write_tree): Rename to ...
30876         (DFS::DFS_write_tree): ... this one; add SINGLE_P parameter.
30877         (lto_output_tree): Update.
30878
30879 2014-07-25  Andi Kleen  <ak@linux.intel.com>
30880
30881         * lto-streamer-out.c (hash_tree): Convert to inchash.
30882
30883 2014-07-25  Andi Kleen  <ak@linux.intel.com>
30884
30885         * tree.c (build_type_attribute_qual_variant): Use inchash.
30886         (type_hash_list): Dito.
30887         (attribute_hash_list): Dito
30888         (iterative_hstate_expr): Dito.
30889         (iterative_hash_expr): Dito.
30890         (build_range_type_1): Dito.
30891         (build_array_type_1): Dito.
30892         (build_function_type): Dito.
30893         (build_method_type_directly): Dito.
30894         (build_offset_type): Dito.
30895         (build_complex_type): Dito.
30896         (make_vector_type): Dito.
30897         * tree.h (iterative_hash_expr): Add compat wrapper.
30898         (iterative_hstate_expr): Add.
30899
30900 2014-07-25  Andi Kleen  <ak@linux.intel.com>
30901
30902         * Makefile.in (OBJS): Add inchash.o.
30903         (PLUGIN_HEADERS): Add inchash.h.
30904         * ipa-devirt.c: Include inchash.h.
30905         * lto-streamer-out.c: Dito.
30906         * tree-ssa-dom.c: Dito.
30907         * tree-ssa-pre.c: Dito.
30908         * tree-ssa-sccvn.c: Dito.
30909         * tree-ssa-tail-merge.c: Dito.
30910         * asan.c: Dito.
30911         * tree.c (iterative_hash_hashval_t): Move to ...
30912         (iterative_hash_host_wide_int): Move to ...
30913         * inchash.c: Here. New file.
30914         * tree.h (iterative_hash_hashval_t): Move to ...
30915         (iterative_hash_host_wide_int): Move to ...
30916         * inchash.h: Here. New file.
30917
30918 2014-07-25  Richard Biener  <rguenther@suse.de>
30919
30920         PR middle-end/61762
30921         PR middle-end/61894
30922         * fold-const.c (native_encode_int): Add and handle offset
30923         parameter to do partial encodings of expr.
30924         (native_encode_fixed): Likewise.
30925         (native_encode_real): Likewise.
30926         (native_encode_complex): Likewise.
30927         (native_encode_vector): Likewise.
30928         (native_encode_string): Likewise.
30929         (native_encode_expr): Likewise.
30930         * fold-const.c (native_encode_expr): Add offset parameter
30931         defaulting to -1.
30932         * gimple-fold.c (fold_string_cst_ctor_reference): Remove.
30933         (fold_ctor_reference): Handle all reads from tcc_constant
30934         ctors.
30935
30936 2014-07-25  Richard Biener  <rguenther@suse.de>
30937
30938         * tree-inline.c (estimate_move_cost): Mark speed_p argument
30939         as possibly unused.
30940
30941 2014-07-23  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
30942
30943         * config/avr/avr-c.c (avr_cpu_cpp_builtins): Add __AVR_DEVICE_NAME__.
30944
30945 2014-07-24  Kyle McMartin  <kyle@redhat.com>
30946
30947         * config/aarch64/aarch64-linux.h (TARGET_ASM_FILE_END): Define.
30948
30949 2014-07-24  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
30950
30951         * config/rs6000/rs6000-protos.h (rs6000_special_adjust_field_align_p):
30952         Add prototype.
30953         * config/rs6000/rs6000.c (rs6000_special_adjust_field_align_p): New
30954         function.
30955         * config/rs6000/sysv4.h (ADJUST_FIELD_ALIGN): Call it.
30956         * config/rs6000/linux64.h (ADJUST_FIELD_ALIGN): Likewise.
30957         * config/rs6000/freebsd64.h (ADJUST_FIELD_ALIGN): Likewise.
30958
30959 2014-07-24  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
30960
30961         * config/rs6000/rs6000.c (rs6000_function_arg_boundary): In the AIX
30962         and ELFv2 ABI, do not use the "mode == BLKmode" check to test for
30963         aggregate types.  Instead, *all* aggregate types, except for single-
30964         element or homogeneous float/vector aggregates, are quadword-aligned
30965         if required by their type alignment.  Issue -Wpsabi note when a type
30966         is now treated differently than before.
30967
30968 2014-07-24  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
30969
30970         * config/rs6000/rs6000.c (rs6000_function_arg): If a float argument
30971         does not fit fully into floating-point registers, and there is still
30972         space in the register parameter area, use GPRs to pass those parts
30973         of the argument.  Issue -Wpsabi note if any parameter is now treated
30974         differently than before.
30975         (rs6000_arg_partial_bytes): Update.
30976
30977 2014-07-24  Uros Bizjak  <ubizjak@gmail.com>
30978
30979         * config/alpha/elf.h: Define TARGET_UNWIND_TABLES_DEFAULT.
30980
30981 2014-07-24  Richard Sandiford  <rdsandiford@googlemail.com>
30982
30983         * rtl.h (target_rtl): Remove lang_dependent_initialized.
30984         * toplev.c (initialize_rtl): Don't use it.  Move previously
30985         "language-dependent" calls to...
30986         (backend_init): ...here.
30987         (lang_dependent_init_target): Don't set lang_dependent_initialized.
30988         Assert that RTL initialization hasn't happend yet.
30989
30990 2014-07-24  Richard Sandiford  <rdsandiford@googlemail.com>
30991
30992         PR rtl-optimization/61629
30993         * reginfo.c (reinit_regs): Only call ira_init and recog_init if
30994         they have already been initialized.
30995
30996 2014-07-24  Richard Sandiford  <rdsandiford@googlemail.com>
30997
30998         PR middle-end/61268
30999         * function.c (assign_parm_setup_reg): Prevent invalid sharing of
31000         DECL_INCOMING_RTL and entry_parm.
31001         (get_arg_pointer_save_area): Likewise arg_pointer_save_area.
31002         * calls.c (load_register_parameters): Likewise argument values.
31003         (emit_library_call_value_1, store_one_arg): Likewise argument
31004         save areas.
31005         * config/i386/i386.c (assign_386_stack_local): Likewise the local
31006         stack slot.
31007         * explow.c (validize_mem): Modify the argument in-place.
31008
31009 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
31010
31011         * config/aarch64/aarch64.c (aarch64_popwb_single_reg): New function.
31012         (aarch64_expand_epilogue): Optimize epilogue when !frame_pointer_needed.
31013
31014 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
31015
31016         * config/aarch64/aarch64.c (aarch64_pushwb_single_reg): New function.
31017         (aarch64_expand_prologue): Optimize prologue when !frame_pointer_needed.
31018
31019 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
31020
31021         * config/aarch64/aarch64.c (aarch64_restore_callee_saves)
31022         (aarch64_save_callee_saves): New parameter "skip_wb".
31023         (aarch64_expand_prologue, aarch64_expand_epilogue): Update call site.
31024
31025 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
31026
31027         * config/aarch64/aarch64.h (frame): New fields "wb_candidate1" and
31028         "wb_candidate2".
31029         * config/aarch64/aarch64.c (aarch64_layout_frame): Initialize above.
31030
31031 2014-07-24  Roman Gareev  <gareevroman@gmail.com>
31032
31033         * graphite-isl-ast-to-gimple.c:
31034         (graphite_create_new_loop): Add calling of isl_id_free to properly
31035         decrement reference counts.
31036
31037         * gcc.dg/graphite/isl-ast-gen-blocks-4.c: New testcase.
31038
31039 2014-07-24  Martin Liska  <mliska@suse.cz>
31040         * config/mips/mips.c (mips_start_unique_function): Correct cgraph_node
31041         function used.
31042         * config/rs6000/rs6000.c (call_ABI_of_interest): Likewise.
31043         (rs6000_code_end): Likewise.
31044
31045 2014-07-24  Martin Liska  <mliska@suse.cz>
31046
31047         * config/rs6000/rs6000.c (rs6000_xcoff_declare_function_name): Correct
31048         symtab_node funtion used.
31049         (rs6000_xcoff_declare_object_name): Likewise.
31050
31051 2014-07-24  Martin Liska  <mliska@suse.cz>
31052
31053         * cgraphunit.c (compile): Correct function used.
31054
31055 2014-07-24  Jan Hubicka  <hubicka@ucw.cz>
31056
31057         * lto-streamer-out.c (tree_is_indexable): Consider IMPORTED_DECL
31058         as non-indexable.
31059
31060 2014-07-24  Jan Hubicka  <hubicka@ucw.cz>
31061
31062         PR lto/61802
31063         * varasm.c (bss_initializer_p): Handle offlined ctors.
31064         (align_variable, get_variable_align): Likewise.
31065         (make_decl_one_only): Likewise.
31066         (default_binds_local_p_1): Likewise.
31067         (decl_binds_to_current_def_p): Likewise.
31068         (get_variable_section): Get constructor if it is offlined.
31069         (assemble_variable_contents): Sanity check that the caller
31070         streamed in the ctor in LTO.
31071
31072 2014-07-24  Roman Gareev  <gareevroman@gmail.com>
31073
31074         * graphite-isl-ast-to-gimple.c:
31075         (binary_op_to_tree): Add calling of translate_isl_ast_node_block.
31076         (gcc_expression_from_isl_expr_op): Move isl_ast_op_pdiv_q,
31077         isl_ast_op_pdiv_r to the different case.
31078
31079         * gcc.dg/graphite/isl-ast-gen-blocks-3.c: New testcase.
31080
31081 2014-07-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31082
31083         PR middle-end/61876
31084         * convert.c (convert_to_integer): Do not convert BUILT_IN_ROUND and cast
31085         when flag_errno_math is on.
31086
31087 2014-07-24  Martin Liska  <mliska@suse.cz>
31088
31089         * cgraph.h (varpool_node):
31090         (availability get_availability (void)):
31091         created from cgraph_variable_initializer_availability
31092         (inline varpool_node *ultimate_alias_target (availability *availability = NULL)
31093         created from: cgraph_variable_initializer_availability
31094         (inline varpool_node *get_alias_target (void)): created from varpool_alias_target
31095         (void finalize_named_section_flags (void)):
31096         created from varpool_finalize_named_section_flags
31097         (bool assemble_decl (void)): created from varpool_assemble_decl
31098         (void analyze (void)): created from varpool_analyze_node
31099         (bool call_for_node_and_aliases (bool (*callback) (varpool_node *, void *),
31100         void *data, bool include_overwritable)): created fromvarpool_for_node_and_aliases
31101         (void remove_initializer (void)): created from varpool_remove_initializer
31102         (tree get_constructor (void)): created from varpool_get_constructor
31103         (bool externally_visible_p (void)): created from varpool_externally_visible_p
31104         (bool ctor_useable_for_folding_p (void)): created from varpool_ctor_useable_for_folding_p
31105         (inline bool all_refs_explicit_p ()): created from varpool_all_refs_explicit_p
31106         (inline bool can_remove_if_no_refs_p (void)): created from varpool_can_remove_if_no_refs
31107         (static inline varpool_node *get (const_tree decl)): created from varpool_get_node
31108         (static void finalize_decl (tree decl)): created from varpool_finalize_decl
31109         (static bool output_variables (void)): created from varpool_output_variables
31110         (static varpool_node * create_extra_name_alias (tree alias, tree decl)):
31111         created from varpool_extra_name_alias
31112         (static varpool_node * create_alias (tree, tree)): created from varpool_create_variable_alias
31113         (static void dump_varpool (FILE *f)): created from dump_varpool
31114         (static void DEBUG_FUNCTION debug_varpool (void)): created from debug_varpool
31115         (static varpool_node *create_empty (void)): created from varpool_create_empty_node
31116         (static varpool_node *get_create (tree decl)): created from varpool_node_for_decl
31117         (static varpool_node *get_for_asmname (tree asmname)): created from varpool_node_for_asm
31118         (void assemble_aliases (void)): created from assemble_aliases
31119
31120 2014-07-24  Martin Liska  <mliska@suse.cz>
31121
31122         * cgraph.h (symtab_node):
31123         (void register_symbol (void)): created from symtab_register_node
31124         (void remove (void)): created from symtab_remove_node
31125         (void dump (FILE *f)): created from dump_symtab_node
31126         (void DEBUG_FUNCTION debug (void)): created from debug_symtab_node
31127         (void DEBUG_FUNCTION verify (void)): created from verify_symtab_node
31128         (struct ipa_ref *add_reference (symtab_node *referred_node,
31129         enum ipa_ref_use use_type)): created from add_reference
31130         (struct ipa_ref *add_reference (symtab_node *referred_node,
31131         enum ipa_ref_use use_type, gimple stmt)): created from add_reference
31132         (struct ipa_ref *maybe_add_reference (tree val, enum ipa_ref_use use_type,
31133         gimple stmt)): created from maybe_add_reference
31134         (bool semantically_equivalent_p (symtab_node *target)): created from
31135         symtab_semantically_equivalent_p
31136         (void remove_from_same_comdat_group (void)): created from
31137         remove_from_same_comdat_group
31138         (void add_to_same_comdat_group (symtab_node *old_node)): created from
31139         symtab_add_to_same_comdat_group
31140         (void dissolve_same_comdat_group_list (void)): created from
31141         symtab_dissolve_same_comdat_group_list
31142         (bool used_from_object_file_p (void)): created from symtab_used_from_object_file_p
31143         (symtab_node *ultimate_alias_target (enum availability *avail = NULL)):
31144         created from symtab_alias_ultimate_target
31145         (inline symtab_node *next_defined_symbol (void)): created from
31146         symtab_next_defined_symbol
31147         (bool resolve_alias (symtab_node *target)): created from
31148         symtab_resolve_alias
31149         (bool call_for_symbol_and_aliases (bool (*callback) (symtab_node *, void *),
31150         void *data, bool include_overwrite)): created from symtab_for_node_and_aliases
31151         (symtab_node *noninterposable_alias (void)): created from symtab_nonoverwritable_alias
31152         (inline symtab_node *get_alias_target (void)): created from symtab_alias_target
31153         (void set_section (const char *section)): created from set_section_1
31154         (enum availability get_availability (void)): created from symtab_node_availability
31155         (void make_decl_local (void)): created from symtab_make_decl_local
31156         (bool real_symbol_p (void)): created from symtab_read_node
31157         (can_be_discarded_p (void)): created from symtab_can_be_discarded
31158         (inline bool comdat_local_p (void)): created from symtab_comdat_local_p
31159         (inline bool in_same_comdat_group_p (symtab_node *target)): created from
31160         symtab_in_same_comdat_p;
31161         (bool address_taken_from_non_vtable_p (void)): created from
31162         address_taken_from_non_vtable_p
31163         (static inline symtab_node *get (const_tree decl)): created from symtab_get_node
31164         (static void dump_table (FILE *)): created from dump_symtab
31165         (static inline DEBUG_FUNCTION void debug_symtab (void)): created from debug_symtab
31166         (static DEBUG_FUNCTION void verify_symtab_nodes (void)): created from verify_symtab
31167         (static bool used_from_object_file_p_worker (symtab_node *node)): created from
31168         symtab_used_from_object_file_p
31169         (void dump_base (FILE *)): created from dump_symtab_base
31170         (bool DEBUG_FUNCTION verify_base (void)): created from verify_symtab_base
31171         (void unregister (void)): created from symtab_unregister_node
31172         (struct symbol_priority_map *priority_info (void)): created from symtab_priority_info
31173         (static bool set_implicit_section (symtab_node *n, void *)): created from set_implicit_section
31174         (static bool noninterposable_alias (symtab_node *node, void *data)): created from
31175         symtab_nonoverwritable_alias_1
31176         * cgraph.h (cgraph_node):
31177         (bool remove_symbol_and_inline_clones (cgraph_node *forbidden_node = NULL)):
31178         created from cgraph_remove_node_and_inline_clones
31179         (void record_stmt_references (gimple stmt)): created from ipa_record_stmt_references
31180         (void set_call_stmt_including_clones (gimple old_stmt, gimple new_stmt,
31181         bool update_speculative = true)): created from cgraph_set_call_stmt_including_clones
31182         (cgraph_node *function_symbol (enum availability *avail = NULL)):
31183         created from cgraph_function_node
31184         (cgraph_node *create_clone (tree decl, gcov_type count, int freq, bool update_original,
31185         vec<cgraph_edge *> redirect_callers, bool call_duplication_hook,
31186         struct cgraph_node *new_inlined_to, bitmap args_to_skip)):
31187         created from cgraph_create_clone
31188         (cgraph_node *create_virtual_clone (vec<cgraph_edge *> redirect_callers,
31189         vec<ipa_replace_map *, va_gc> *tree_map, bitmap args_to_skip, const char * suffix)):
31190         created from cgraph_create_virtual_clone
31191         (cgraph_node *find_replacement (void)): created from cgraph_find_replacement_node
31192         (cgraph_node *create_version_clone (tree new_decl, vec<cgraph_edge *> redirect_callers,
31193         bitmap bbs_to_copy)): created from cgraph_copy_node_for_versioning
31194         (cgraph_node *create_version_clone_with_body (vec<cgraph_edge *> redirect_callers,
31195         vec<ipa_replace_map *, va_gc> *tree_map, bitmap args_to_skip, bool skip_return,
31196         bitmap bbs_to_copy, basic_block new_entry_block, const char *clone_name)):
31197         created from cgraph_function_version_info
31198         (struct cgraph_function_version_info *insert_new_function_version (void)):
31199         created from insert_new_cgraph_node_version
31200         (struct cgraph_function_version_info *function_version (void)): created from
31201         get_cgraph_node_version
31202         (void analyze (void)): created from analyze_function
31203         (cgraph_node * create_thunk (tree alias, tree, bool this_adjusting,
31204         HOST_WIDE_INT fixed_offset, HOST_WIDE_INT virtual_value, tree virtual_offset,
31205         tree real_alias) cgraph_add_thunk
31206         (inline cgraph_node *get_alias_target (void)): created from cgraph_alias_target
31207         (cgraph_node *ultimate_alias_target (availability *availability = NULL)):
31208         created from cgraph_function_or_thunk_node
31209         (bool expand_thunk (bool output_asm_thunks, bool force_gimple_thunk)):
31210         created from expand_thunk
31211         (void reset (void)): created from cgraph_reset_node
31212         (void create_wrapper (cgraph_node *target)): created from cgraph_make_wrapper
31213         (void DEBUG_FUNCTION verify_node (void)): created from verify_cgraph_node
31214         (void remove (void)): created from cgraph_remove_node
31215         (void dump (FILE *f)): created from dump_cgraph_node
31216         (void DEBUG_FUNCTION debug (void)): created from debug_cgraph_node
31217         (bool get_body (void)): created from cgraph_get_body
31218         (void release_body (void)): created from cgraph_release_function_body
31219         (void unnest (void)): created from cgraph_unnest_node
31220         (void make_local (void)): created from cgraph_make_node_local
31221         (void mark_address_taken (void)): created from cgraph_mark_address_taken_node
31222         (struct cgraph_edge *create_edge (cgraph_node *callee, gimple call_stmt,
31223         gcov_type count, int freq)): created from cgraph_create_edge
31224         (struct cgraph_edge *create_indirect_edge (gimple call_stmt, int ecf_flags,
31225         gcov_type count, int freq)): created from cgraph_create_indirect_edge
31226         (void create_edge_including_clones (struct cgraph_node *callee, gimple old_stmt,
31227         gimple stmt, gcov_type count, int freq, cgraph_inline_failed_t reason)):
31228         created from cgraph_create_edge_including_clones
31229         (cgraph_edge *get_edge (gimple call_stmt)): created from cgraph_edge
31230         (vec<cgraph_edge *> collect_callers (void)): created from collect_callers_of_node
31231         (void remove_callers (void)): created from cgraph_node_remove_callers
31232         (void remove_callees (void)): created from cgraph_node_remove_callees
31233         (enum availability get_availability (void)): created from cgraph_function_body_availability
31234         (void set_nothrow_flag (bool nothrow)): created from cgraph_set_nothrow_flag
31235         (void set_const_flag (bool readonly, bool looping)): created from cgraph_set_const_flag
31236         (void set_pure_flag (bool pure, bool looping)): created from cgraph_set_pure_flag
31237         (void call_duplication_hooks (cgraph_node *node2)): created from
31238         cgraph_call_node_duplication_hooks
31239         (bool call_for_symbol_and_aliases (bool (*callback) (cgraph_node *, void *),
31240         void *data, bool include_overwritable)): created from cgraph_for_node_and_aliases
31241         (bool call_for_symbol_thunks_and_aliases (bool (*callback) (cgraph_node *node, void *data),
31242         void *data, bool include_overwritable)): created from cgraph_for_node_thunks_and_aliases
31243         (void call_function_insertion_hooks (void)):
31244         created from cgraph_call_function_insertion_hooks
31245         (inline void mark_force_output (void)): created from cgraph_mark_force_output_node
31246         (bool local_p (void)): created from cgraph_local_node
31247         (bool can_be_local_p (void)): created from cgraph_node_can_be_local_p
31248         (bool cannot_return_p (void)): created from cgraph_node_cannot_return
31249         (bool only_called_directly_p (void)): created from cgraph_only_called_directly_p
31250         (inline bool only_called_directly_or_aliased_p (void)):
31251         created from cgraph_only_called_directly_or_aliased_p
31252         (bool will_be_removed_from_program_if_no_direct_calls_p (void)):
31253         created from cgraph_will_be_removed_from_program_if_no_direct_calls
31254         (bool can_remove_if_no_direct_calls_and_refs_p (void)):
31255         created from cgraph_can_remove_if_no_direct_calls_and_refs_p
31256         (bool can_remove_if_no_direct_calls_p (void)):
31257         created from cgraph_can_remove_if_no_direct_calls_p
31258         (inline bool has_gimple_body_p (void)):
31259         created from cgraph_function_with_gimple_body_p
31260         (bool optimize_for_size_p (void)): created from cgraph_optimize_for_size_p
31261         (static void dump_cgraph (FILE *f)): created from dump_cgraph
31262         (static inline void debug_cgraph (void)): created from debug_cgraph
31263         (static void record_function_versions (tree decl1, tree decl2)):
31264         created from record_function_versions
31265         (static void delete_function_version (tree decl)):
31266         created from delete_function_version
31267         (static void add_new_function (tree fndecl, bool lowered)):
31268         created from cgraph_add_new_function
31269         (static inline cgraph_node *get (const_tree decl)): created from cgraph_get_node
31270         (static cgraph_node * create (tree decl)): created from cgraph_create_node
31271         (static cgraph_node * create_empty (void)): created from cgraph_create_empty_node
31272         (static cgraph_node * get_create (tree)): created from cgraph_get_create_node
31273         (static cgraph_node *get_for_asmname (tree asmname)):
31274         created from cgraph_node_for_asm
31275         (static cgraph_node * create_same_body_alias (tree alias, tree decl)):
31276         created from cgraph_same_body_alias
31277         (static bool used_from_object_file_p_worker (cgraph_node *node,
31278         void *): new function
31279         (static bool non_local_p (cgraph_node *node, void *)):
31280         created from cgraph_non_local_node_p_1
31281         (static void DEBUG_FUNCTION verify_cgraph_nodes (void)):
31282         created from verify_cgraph
31283         (static bool make_local (cgraph_node *node, void *)):
31284         created from cgraph_make_node_local
31285         (static cgraph_node *create_alias (tree alias, tree target)):
31286         created from cgraph_create_function_alias
31287         (static cgraph_edge * create_edge (cgraph_node *caller, cgraph_node *callee,
31288         gimple call_stmt, gcov_type count, int freq, bool indir_unknown_callee)):
31289         created from cgraph_create_edge_1
31290         * cgraph.h (varpool_node):
31291         (void remove (void)): created from varpool_remove_node
31292         (void dump (FILE *f)): created from dump_varpool_node
31293
31294 2014-07-24  Richard Biener  <rguenther@suse.de>
31295
31296         PR ipa/61823
31297         * tree-ssa-structalias.c (create_variable_info_for_1):
31298         Use varpool_get_constructor.
31299         (create_variable_info_for): Likewise.
31300
31301 2014-07-24  Jiong Wang  <jiong.wang@arm.com>
31302
31303         * config/aarch64/aarch64.c (aarch64_expand_epilogue): Don't
31304         subtract outgoing area size when restoring stack_pointer_rtx.
31305
31306 2014-07-24  Nick Clifton  <nickc@redhat.com>
31307
31308         * config/rx/rx.md (stack_push): Adjust RTL to account for the fact
31309         that operations are taking place in parallel.
31310         * config/rx.h (FRAME_POINTER_CFA_OFFSET): Delete.
31311
31312 2014-07-24  Thomas Schwinge  <thomas@codesourcery.com>
31313
31314         * omp-low.c (extract_omp_for_data): Add missing break statement.
31315
31316 2014-07-24  Richard Biener  <rguenther@suse.de>
31317
31318         * tree-inline.h (estimate_move_cost): Add speed_p parameter.
31319         * tree-inline.c (estimate_move_cost): Add speed_p parameter
31320         and adjust MOVE_RATIO query accordingly.
31321         (estimate_num_insns): Adjust callers.
31322         * ipa-prop.c (ipa_populate_param_decls): Likewise.
31323         * ipa-cp.c (gather_context_independent_values,
31324         estimate_local_effects): Likewise.
31325         * ipa-split.c (consider_split): Likewise.
31326
31327 2014-07-24  Trevor Saunders  <tsaunders@mozilla.com>
31328
31329         * config/i386/driver-i386.c: Remove names of unused arguments and
31330         unnecessary unused attributes.
31331         * config/i386/host-mingw32.c: Likewise.
31332         * config/i386/i386.c: Likewise.
31333         * config/i386/winnt-stubs.c: Likewise.
31334         * config/i386/winnt.c: Likewise.
31335
31336 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31337
31338         * config/aarch64/aarch64.c (aarch64_popwb_pair_reg)
31339         (aarch64_gen_loadwb_pair): New helper function.
31340         (aarch64_expand_epilogue): Simplify code using new helper functions.
31341         * config/aarch64/aarch64.md (loadwb_pair<GPF:mode>_<P:mode>): Define.
31342
31343 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31344
31345         * config/aarch64/aarch64.c (aarch64_pushwb_pair_reg)
31346         (aarch64_gen_storewb_pair): New helper function.
31347         (aarch64_expand_prologue): Simplify code using new helper functions.
31348         * config/aarch64/aarch64.md (storewb_pair<GPF:mode>_<P:mode>): Define.
31349
31350 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31351
31352         * config/aarch64/aarch64.md: (aarch64_save_or_restore_callee_saves):
31353         Rename to aarch64_save_callee_saves, remove restore code.
31354         (aarch64_restore_callee_saves): New function.
31355
31356 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31357
31358         * config/aarch64/aarch64.c (aarch64_save_or_restore_fprs): Deleted.
31359         (aarch64_save_callee_saves): New function to handle reg save
31360         for both core and vectore regs.
31361
31362 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31363
31364         * config/aarch64/aarch64.c (aarch64_gen_load_pair)
31365         (aarch64_gen_store_pair): New helper function.
31366         (aarch64_save_or_restore_callee_save_registers)
31367         (aarch64_save_or_restore_fprs): Use new helper functions.
31368
31369 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31370
31371         * config/aarch64/aarch64.c (aarch64_next_callee_save): New function.
31372         (aarch64_save_or_restore_callee_save_registers)
31373         (aarch64_save_or_restore_fprs): Use aarch64_next_callee_save.
31374
31375 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31376
31377         * config/aarch64/aarch64.c
31378         (aarch64_save_or_restore_callee_save_registers)
31379         (aarch64_save_or_restore_fprs): Hoist calculation of register rtx.
31380
31381 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31382
31383         * config/aarch64/aarch64.c
31384         (aarch64_save_or_restore_callee_save_registers)
31385         (aarch64_save_or_restore_fprs): Remove 'increment'.
31386
31387 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31388
31389         * config/aarch64/aarch64.c
31390         (aarch64_save_or_restore_callee_save_registers)
31391         (aarch64_save_or_restore_fprs): Use register offset in
31392         cfun->machine->frame.reg_offset.
31393
31394 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31395
31396         * config/aarch64/aarch64.c
31397         (aarch64_save_or_restore_callee_save_registers)
31398         (aarch64_save_or_restore_fprs): Remove base_rtx.
31399
31400 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31401
31402         * config/aarch64/aarch64.c
31403         (aarch64_save_or_restore_callee_save_registers): Rename 'offset'
31404         to 'start_offset'.  Remove local variable 'start_offset'.
31405
31406 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31407
31408         * config/aarch64/aarch64.c (aarch64_save_or_restore_fprs): Change
31409         type to HOST_WIDE_INT.
31410
31411 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31412
31413         * config/aarch64/aarch64.c (aarch64_expand_prologue)
31414         (aarch64_save_or_restore_fprs)
31415         (aarch64_save_or_restore_callee_save_registers): GNU-Stylize code.
31416
31417 2014-07-23  Sebastian Huber  <sebastian.huber@embedded-brains.de>
31418
31419         * config/arm/t-rtems-eabi: Add
31420         mthumb/march=armv7-r/mfpu=vfpv3-d16/mfloat-abi=hard,
31421         mthumb/march=armv7-m/mfpu=fpv4-sp-d16/mfloat-abi=hard,
31422         mbig-endian/mthumb/march=armv7-r, and
31423         mbig-endian/mthumb/march=armv7-r/mfpu=vfpv3-d16/mfloat-abi=hard
31424         multilibs.
31425
31426 2014-07-23  Sebastian Huber  <sebastian.huber@embedded-brains.de>
31427             Chris Johns <chrisj@rtems.org>
31428             Joel Sherrill <joel.sherrill@oarcorp.com>
31429
31430         * config.gcc: Add nios2-*-rtems*.
31431         * config/nios2/rtems.h: New file.
31432         * gcc/config/nios2/t-rtems: New file.
31433
31434 2014-07-23  Segher Boessenkool  <segher@kernel.crashing.org>
31435
31436         PR target/61396
31437         * config/rs6000/rs6000.c (paired_expand_vector_init): Only allow
31438         constant numbers, not general constants.
31439         (rs6000_expand_vector_init): Ditto.
31440
31441 2014-07-23  Nathan Sidwell  <nathan@acm.org>
31442
31443         * gcov-tool.c (gcov_list): Declare here.
31444         (set_gcov_list): Remove.
31445         (gcov_output_files): Set gcov_list directly.
31446
31447 2014-07-23  Host Schirmeier  <horst@schirmeier.com>
31448
31449         * doc/invoke.texi: -O3 enables -ftree-loop-distribute-patterns.
31450
31451 2014-07-23  Jiong Wang  <jiong.wang@arm.com>
31452
31453         * config/arm/arm.c (arm_get_frame_offsets): If both r3 and other
31454         callee-saved registers are available for padding purpose
31455         and r3 is not mandatory, then prefer use those callee-saved
31456         instead of r3.
31457
31458 2014-07-23  Richard Biener  <rguenther@suse.de>
31459
31460         * params.def (PARAM_MAX_COMBINE_INSNS): New.
31461         * combine.c: Include statistics.h and params.h.
31462         (combine_instructions): Guard three and four insn combines
31463         with max-combine-insns value.  Record statistics for combines
31464         performed.
31465         * doc/invoke.texi (max-combine-insns): Document new param.
31466
31467 2014-07-23  Roman Gareev  <gareevroman@gmail.com>
31468
31469         * graphite-isl-ast-to-gimple.c:
31470         (translate_isl_ast_node_block): New function.
31471         (translate_isl_ast): Add calling of translate_isl_ast_node_block.
31472
31473         * gcc.dg/graphite/isl-ast-gen-blocks-1.c: New testcase.
31474         * gcc.dg/graphite/isl-ast-gen-blocks-2.c: New testcase.
31475
31476 2014-07-23  Roman Gareev  <gareevroman@gmail.com>
31477
31478         * graphite-isl-ast-to-gimple.c:
31479         (get_max_schedule_dimensions): New function.
31480         (extend_schedule): Likewise.
31481         (generate_isl_schedule): Add calling of extend_schedule and
31482         get_max_schedule_dimensions.
31483
31484 2014-07-22  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31485
31486         * config/aarch64/aarch64.c (aarch64_rtx_costs): Handle CLRSB, CLZ.
31487         (case UNSPEC): Handle UNSPEC_RBIT.
31488
31489 2014-07-22  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31490
31491         * config/aarch64/aarch64.md: Delete UNSPEC_CLS.
31492         (clrsb<mode>2): Use clrsb RTL code instead of UNSPEC_CLS.
31493
31494 2014-07-22  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31495
31496         * config/aarch64/arm_neon.h (vbsl_f64): New intrinsic.
31497
31498 2014-07-22  Roman Gareev  <gareevroman@gmail.com>
31499
31500         * graphite-isl-ast-to-gimple.c:
31501         Add inclusion of gimple-ssa.h, tree-into-ssa.h.
31502         (ivs_params_clear):
31503         (build_iv_mapping): New function.
31504         (translate_isl_ast_node_user): Likewise.
31505         (translate_isl_ast): Add calling of translate_isl_ast_node_user.
31506
31507         * gcc.dg/graphite/isl-ast-gen-single-loop-1.c: New testcase.
31508         * gcc.dg/graphite/isl-ast-gen-single-loop-2.c: New testcase.
31509         * gcc.dg/graphite/isl-ast-gen-single-loop-3.c: New testcase.
31510
31511 2014-07-21  Bin Cheng  <bin.cheng@arm.com>
31512
31513         PR target/55701
31514         * config/arm/arm.md (setmem): New pattern.
31515         * config/arm/arm-protos.h (struct tune_params): New fields.
31516         (arm_gen_setmem): New prototype.
31517         * config/arm/arm.c (arm_slowmul_tune): Initialize new fields.
31518         (arm_fastmul_tune, arm_strongarm_tune, arm_xscale_tune): Ditto.
31519         (arm_9e_tune, arm_v6t2_tune, arm_cortex_tune): Ditto.
31520         (arm_cortex_a8_tune, arm_cortex_a7_tune): Ditto.
31521         (arm_cortex_a15_tune, arm_cortex_a53_tune): Ditto.
31522         (arm_cortex_a57_tune, arm_cortex_a5_tune): Ditto.
31523         (arm_cortex_a9_tune, arm_cortex_a12_tune): Ditto.
31524         (arm_v7m_tune, arm_v6m_tune, arm_fa726te_tune): Ditto.
31525         (arm_const_inline_cost): New function.
31526         (arm_block_set_max_insns): New function.
31527         (arm_block_set_non_vect_profit_p): New function.
31528         (arm_block_set_vect_profit_p): New function.
31529         (arm_block_set_unaligned_vect): New function.
31530         (arm_block_set_aligned_vect): New function.
31531         (arm_block_set_unaligned_non_vect): New function.
31532         (arm_block_set_aligned_non_vect): New function.
31533         (arm_block_set_vect, arm_gen_setmem): New functions.
31534
31535 2014-07-21  Bin Cheng  <bin.cheng@arm.com>
31536
31537         * config/arm/arm.c (output_move_neon): Handle REG explicitly.
31538
31539 2014-07-21  Uros Bizjak  <ubizjak@gmail.com>
31540
31541         PR target/61855
31542         * config/i386/avx512fintrin.h: Move constants for mantissa extraction
31543         out of #ifdef __OPTIMIZE__.
31544
31545 2014-07-20  Eric Botcazou  <ebotcazou@adacore.com>
31546
31547         * cse.c (exp_equiv_p) <MEM>: For GCSE, return 0 for expressions with
31548         different trapping status if -fnon-call-exceptions is enabled.
31549
31550 2014-07-20  Eric Botcazou  <ebotcazou@adacore.com>
31551
31552         * expr.c (store_field): Handle VOIDmode for calls that return values
31553         in multiple locations.
31554
31555 2014-07-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
31556
31557         * config/rs6000/altivec.md (unspec enum):  Fix typo in UNSPEC_VSLDOI.
31558         (altivec_vsldoi_<mode>): Likewise.
31559
31560 2014-07-20  Roman Gareev  <gareevroman@gmail.com>
31561
31562         * graphite-isl-ast-to-gimple.c: Fixes a formatting issue related
31563         to the number of characters in the line.
31564
31565 2014-07-20  Roman Gareev  <gareevroman@gmail.com>
31566
31567         * graphite-isl-ast-to-gimple.c: Add using of
31568         build_nonstandard_integer_type instead of int128_integer_type_node.
31569
31570 2014-07-19  Eric Botcazou  <ebotcazou@adacore.com>
31571
31572         * toplev.c (output_stack_usage): Adjust the location of the warning.
31573
31574 2014-07-19  Daniel Cederman  <cederman@gaisler.com>
31575
31576         * config/sparc/sync.md (*membar_storeload_leon3): New insn.
31577         (*membar_storeload): Disable for LEON3.
31578
31579 2014-07-18  Bernd Edlinger  <bernd.edlinger@hotmail.de>
31580
31581         PR rtl-optimization/61461
31582         * sched-vis.c (print_pattern) <ADDR_VEC, ADDR_DIFF_VEC>: Fixed.
31583
31584 2014-07-18  Uros Bizjak  <ubizjak@gmail.com>
31585
31586         PR target/61794
31587         * config/i386/sse.md (avx512f_vextract<shuffletype>32x4_1_maskm):
31588         Fix instruction constraint.
31589         (<mask_codefor>avx512f_vextract<shuffletype>32x4_1<mask_name>): Ditto.
31590
31591 2014-07-18  Jonathan Wakely  <jwakely@redhat.com>
31592
31593         * doc/extend.texi (Template Instantiation): Remove stray parenthesis.
31594
31595 2014-07-18  Chung-Ju Wu  <jasonwucj@gmail.com>
31596
31597         * config/nds32/nds32.c (nds32_can_eliminate): Follow the
31598         GNU coding standards.
31599         (nds32_register_move_cost): Likewise.
31600         (nds32_memory_move_cost): Likewise.
31601         (nds32_address_cost): Likewise.
31602
31603 2014-07-18  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
31604
31605         * config/mmix/mmix.c (mmix_intval): Drop unused automatic variable.
31606
31607 2014-07-17  John David Anglin  <danglin@gcc.gnu.org>
31608
31609         * config/pa/pa-linux.h (TARGET_OS_CPP_BUILTINS): Remove defines for
31610         __GCC_HAVE_SYNC_COMPARE_AND_SWAP_1, __GCC_HAVE_SYNC_COMPARE_AND_SWAP_2
31611         and __GCC_HAVE_SYNC_COMPARE_AND_SWAP_4.
31612         (HAVE_sync_compare_and_swapqi): Define.
31613         (HAVE_sync_compare_and_swaphi): Likewise.
31614         (HAVE_sync_compare_and_swapsi): Likewise.
31615
31616 2014-07-17  Richard Sandiford  <rdsandiford@googlemail.com>
31617
31618         * config/mips/p5600.md: Add missing cpu tests.
31619
31620 2014-07-17  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31621
31622         * config/aarch64/arm_neon.h (vfma_f64): New intrinsic.
31623         (vmla_f64): Likewise.
31624         (vfms_f64): Likewise.
31625         (vmls_f64): Likewise.
31626
31627 2014-07-17  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31628
31629         * config/aarch64/aarch64.c (aarch64_frint_unspec_p): New function.
31630         (aarch64_rtx_costs): Handle FIX, UNSIGNED_FIX, UNSPEC.
31631
31632 2014-07-17  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31633
31634         * config/aarch64/arm_neon.h (vmlal_high_lane_s16): Fix type.
31635         (vmlal_high_lane_s32): Likewise.
31636         (vmlal_high_lane_u16): Likewise.
31637         (vmlal_high_lane_u32): Likewise.
31638         (vmlsl_high_lane_s16): Likewise.
31639         (vmlsl_high_lane_s32): Likewise.
31640         (vmlsl_high_lane_u16): Likewise.
31641         (vmlsl_high_lane_u32): Likewise.
31642
31643 2014-07-17  Terry Guo  <terry.guo@arm.com>
31644
31645         * config/arm/types.md (alu_reg): Replaced by alu_sreg and alu_dsp_reg.
31646         (alus_reg): Renamed to alus_sreg.
31647         * config/arm/arm-fixed.md: Change type of non-dsp instructions
31648         from alu_reg to alu_sreg.  Change type of dsp instructions from
31649         alu_reg to alu_dsp_reg.
31650         * config/arm/thumb1.md: Likewise.
31651         * config/arm/thumb2.md: Likewise.
31652         * config/arm/arm.c (cortexa7_older_only): Use new ALU type names.
31653         * config/arm/arm1020e.md (1020alu_op): Replace alu_reg and alus_reg
31654         with alu_sreg and alus_sreg.
31655         * config/arm/arm1026ejs.md (alu_op): Likewise.
31656         * config/arm/arm1136jfs.md (11_alu_op): Likewise.
31657         * config/arm/arm926ejs.md (9_alu_op): Likewise.
31658         * config/arm/fa526.md (526_alu_op): Likewise.
31659         * config/arm/fa606te.md (606te_alu_op): Likewise.
31660         * config/arm/fa626te.md (626te_alu_op): Likewise.
31661         * config/arm/fa726te.md (726te_alu_op): Likewise.
31662         * config/arm/fmp626.md (mp626_alu_op): Likewise.
31663         * config/arm/arm.md (core_cycles): Replace alu_reg and alus_reg with
31664         alu_sreg, alu_dsp_reg and alus_sreg.
31665         * config/arm/cortex-a15.md (cortex_a15_alu): Likewise.
31666         * config/arm/cortex-a5.md (cortex_a5_alu): Likewise.
31667         * config/arm/cortex-a53.md (cortex_a53_alu): Likewise.
31668         * config/arm/cortex-a7.md (cortex_a7_alu_sreg): Likewise.
31669         * config/arm/cortex-a8.md (cortex_a8_alu): Likewise.
31670         * config/arm/cortex-a9.md (cortex_a9_dp): Likewise.
31671         * config/arm/cortex-m4.md (cortex_m4_alu): Likewise.
31672         * config/arm/cortex-r4.md (cortex_r4_alu): Likewise.
31673         * config/arm/marvell-pj4.md (pj4_alu, pj4_alu_conds): Likewise.
31674         * config/aarch64/aarch64.md (*addsi3_aarch64, *addsi3_aarch64_uxtw,
31675         subsi3, *adddi3_aarch64, *subsi3_uxtw, subdi3, absdi2, neg<mode>2,
31676         *negsi2_uxtw, tlsle_small_<mode>): Rename type alu_reg to alu_sreg.
31677         (add<mode>3_compare0, *addsi3_compare0_uxtw, *add<mode>3nr_compare0,
31678         sub<mode>3_compare0, *compare_neg<mode>, *neg<mode>2_compare0,
31679         subsi3_compare0_uxtw, *negsi2_compare0_uxtw, *cmp<mode>): Rename type
31680         alus_reg to alus_sreg.
31681
31682 2014-07-17  Andreas Schwab  <schwab@linux-m68k.org>
31683
31684         * real.c (encode_ieee_extended_motorola): Clear integer bit in the
31685         infinity format.
31686
31687 2014-07-17  Richard Biener  <rguenther@suse.de>
31688
31689         PR rtl-optimization/61801
31690         * sched-deps.c (sched_analyze_2): For ASM_OPERANDS and ASM_INPUT
31691         don't set reg_pending_barrier if it appears in a debug-insn.
31692
31693 2014-07-16  DJ Delorie  <dj@redhat.com>
31694
31695         * config/rx/rx.c (rx_option_override): Fix alignment values.
31696         (rx_align_for_label): Likewise.
31697
31698 2014-07-17  Hans-Peter Nilsson  <hp@axis.com>
31699
31700         PR target/61737.
31701         * config/cris/cris.c (TARGET_LEGITIMATE_CONSTANT_P)
31702         (TARGET_CANNOT_FORCE_CONST_MEM): Define.
31703         (cris_cannot_force_const_mem, cris_legitimate_constant_p): New
31704         functions.
31705         (cris_print_index, cris_print_operand, cris_constant_index_p)
31706         (cris_side_effect_mode_ok): Replace CONSTANT_P with CRIS_CONSTANT_P.
31707         (cris_address_cost): Ditto last CONSTANT_P.
31708         (cris_symbol_type_of): Rename from cris_pic_symbol_type_of.  All
31709         callers changed.  Yield cris_offsettable_symbol for non-PIC
31710         constant symbolic expressions including labels.  Yield cris_unspec
31711         for all unspecs.
31712         (cris_expand_pic_call_address): New parameter MARKERP.  Set its
31713         target to pic_offset_table_rtx for calls that will likely go
31714         through PLT, const0_rtx when they can't.  All callers changed.
31715         Assert flag_pic.  Use CONSTANT_P, not CONSTANT_ADDRESS_P, for
31716         symbolic expressions to be PICified.  Remove second, redundant,
31717         assert on can_create_pseudo_p returning non-zero.  Use
31718         replace_equiv_address_nv, not replace_equiv_address, for final
31719         operand update.
31720         * config/cris/cris.md ("movsi"): Move variable t to pattern
31721         toplevel. Adjust assert for new cris_symbol_type member.  Use
31722         CONSTANT_P instead of CONSTANT_ADDRESS_P.
31723         ("*movsi_internal") <case 9>: Make check for valid unspec operands
31724         for lapc stricter.
31725         <case CRIS_UNSPEC_PCREL, CRIS_UNSPEC_PLT_PCREL>: Clear condition codes.
31726         ("call", "call_value"): Use second incoming operand as a marker
31727         for pic-offset-table-register being used.
31728         ("*expanded_call_non_v32", "*expanded_call_v32")
31729         ("*expanded_call_value_non_v32", "*expanded_call_value_v32"): For
31730         second incoming operand to CALL, match cris_call_type_marker.
31731         ("*expanded_call_value_side"): Ditto.  Disable before reload_completed.
31732         ("*expanded_call_side"): Ditto.  Fix typo in comment.
31733         (moverside, movemside peepholes): Check for CRIS_CONSTANT_P, not
31734         CONSTANT_P.
31735         * config/cris/predicates.md ("cris_call_type_marker"): New predicate.
31736         * config/cris/cris.h (CRIS_CONSTANT_P): New macro.
31737         (enum cris_symbol_type): Rename from cris_pic_symbol_type.  All
31738         users changed.  Add members cris_offsettable_symbol and cris_unspec.
31739         (cris_symbol_type): Rename from cris_pic_symbol_type.
31740         * config/cris/constraints.md ("T"): Use CRIS_CONSTANT_P, not
31741         just CONSTANT_P.
31742         * config/cris/cris-protos.h (cris_symbol_type_of,
31743         cris_expand_pic_call_address): Adjust prototypes.
31744         (cris_legitimate_constant_p): New prototype.
31745
31746         * config.gcc (crisv32-*-linux* | cris-*-linux*): Do not override
31747         an existing tmake_file.  Don't add t-slibgcc and t-linux.
31748
31749 2014-07-17  Jason Merrill  <jason@redhat.com>
31750
31751         PR c++/61623
31752         * symtab.c (symtab_remove_from_same_comdat_group): Also
31753         set_comdat_group to NULL_TREE.
31754         (verify_symtab): Fix diagnostic.
31755
31756 2014-07-16  David Wohlferd  <dw@LimeGreenSocks.com>
31757
31758         PR target/61662
31759         * config/i386/ia32intrin.h: Use __LP64__ to determine size of long.
31760
31761 2014-07-16  Dodji Seketeli  <dodji@redhat.com>
31762
31763         Support location tracking for built-in macro tokens
31764         * input.h (is_location_from_builtin_token): New function declaration.
31765         * input.c (is_location_from_builtin_token): New function definition.
31766         * toplev.c (general_init): Tell libcpp what the pre-defined
31767         spelling location for built-in tokens is.
31768
31769 2014-07-16  Jakub Jelinek  <jakub@redhat.com>
31770
31771         * omp-low.c (create_omp_child_function): Don't set DECL_NAMELESS
31772         on the FUNCTION_DECL.
31773
31774 2014-07-16  Richard Biener  <rguenther@suse.de>
31775
31776         PR other/61782
31777         * doc/extend.texi (always_inline): Clarify.
31778
31779 2014-07-15  Eric Christopher  <echristo@gmail.com>
31780
31781         * doc/invoke.texi (Link Options): Document -z option.
31782
31783 2014-07-15  Uros Bizjak  <ubizjak@gmail.com>
31784
31785         * config/alpha/alpha.c (alpha_atomic_assign_expand_fenv): New.
31786         (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): New define.
31787
31788 2014-07-15  Jan Hubicka  <hubicka@ucw.cz>
31789
31790         * fold-const.c (fold_checksum_tree): Fix typo in previous patch.
31791
31792 2014-07-15  Bernd Schmidt  <bernds@codesourcery.com>
31793
31794         * asan.c (asan_finish_file): Use varpool_finalize_decl instead of
31795         varpool_assemble_decl.
31796         * varpool.c (varpool_assemble_decl): Assert that node->definition is
31797         true.
31798
31799 2014-07-15  Michael Matz  <matz@suse.de>
31800
31801         PR rtl-optimization/61772
31802         * ifcvt.c (dead_or_predicable): Check jump to be free of side effects.
31803
31804 2014-07-15  Richard Biener  <rguenther@suse.de>
31805
31806         * opts.c (default_options_table): Disable bit-ccp at -Og.
31807
31808 2014-07-14  Jan Hubicka  <hubicka@ucw.cz>
31809
31810         * fold-const.c (fold_checksum_tree): Move checking of DECL_RESULT.
31811
31812 2014-07-14  Jan Hubicka  <hubicka@ucw.cz>
31813
31814         * tree.c (tree_code_size): Add TRANSLATION_UNIT_DECL,
31815         NAMESPACE_DECL, IMPORTED_DECL and NAMELIST_DECL;
31816         call langhook for unknown declaration.
31817         (find_decls_types_r): Do not walk DECL_ARGUMENT_FLD.
31818         * tree.h (DECL_ARGUMENTS): Update.
31819         * print-tree.c (print_node): Update.
31820         * tree-core.h (tree_decl_non_common): Remove arguments.
31821         (tree_function_decl): Add arguments.
31822
31823 2014-07-14  Richard Earnshaw  <rearnsha@arm.com>
31824
31825         * aarch64.md (add_losym_<mode>): Set type to alu_imm.
31826
31827 2014-07-14  Richard Biener  <rguenther@suse.de>
31828
31829         PR tree-optimization/61779
31830         * tree-ssa-copy.c (copy_prop_visit_cond_stmt): Always try
31831         simplifying a condition.
31832
31833 2014-07-14  Richard Biener  <rguenther@suse.de>
31834
31835         * builtins.c (c_strlen): Make only_value == 2 really only
31836         affect warning generation.
31837
31838 2014-07-14  Richard Biener  <rguenther@suse.de>
31839
31840         PR tree-optimization/61757
31841         PR tree-optimization/61783
31842         PR tree-optimization/61787
31843         * tree-ssa-dom.c (record_equality): Revert canonicalization
31844         change and add comment.
31845         (propagate_rhs_into_lhs): Revert previous fix, removing
31846         loop depth restriction again.
31847
31848 2014-07-14  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
31849
31850         * config/arm/cortex-a15.md (cortex_a15_alu): Handle clz, rbit.
31851         * config/arm/cortex-a5.md (cortex_a5_alu): Likewise.
31852         * config/arm/cortex-a53.md (cortex_a53_alu): Likewise.
31853         * config/arm/cortex-a7.md (cortex_a7_alu_reg): Likewise.
31854         * config/arm/cortex-a9.md (cortex_a9_dp): Likewise.
31855         * config/arm/cortex-m4.md (cortex_m4_alu): Likewise.
31856         * config/arm/cortex-r4.md (cortex_r4_alu): Likewise.
31857
31858 2014-07-14  Richard Biener  <rguenther@suse.de>
31859
31860         * cgraph.h (decl_in_symtab_p): Make inline.
31861
31862 2014-07-14  Jakub Jelinek  <jakub@redhat.com>
31863
31864         PR middle-end/61294
31865         * doc/invoke.texi (-Wmemset-transposed-args): Document.
31866
31867         PR target/61656
31868         * config/i386/i386.c (classify_argument): Don't merge classes above
31869         number of words.
31870
31871 2014-07-13  Jan Hubicka  <hubicka@ucw.cz>
31872
31873         * cgraph.h (symtab_node): Add nonzero_address.
31874         (decl_in_symtab_p): Break out from ...
31875         (symtab_get_node): ... here.
31876         * fold-const.c: Include cgraph.h
31877         (tree_single_nonzero_warnv_p): Use symtab to determine
31878         if symbol is non-zero.
31879         * symtab.c (symtab_node::nonzero_address): New method.
31880
31881 2014-07-12  Jan Hubicka  <hubicka@ucw.cz>
31882
31883         * ipa-devirt.c (odr_subtypes_equivalent_p): Disable temporary hack
31884         forgotten in previous commit.
31885
31886 2014-07-12  Jan Hubicka  <hubicka@ucw.cz>
31887
31888         * tree.c (type_in_anonymous_namespace_p): Ignore TREE_PUBLIC
31889         on builtin types.
31890         * ipa-devirt.c: Include stor-layout.h and intl.h
31891         (odr_subtypes_equivalent_p): New function.
31892         (warn_odr): New function.
31893         (warn_type_mismatch): New function.
31894         (odr_types_equivalent_p): New function.
31895         (add_type_duplicate): Use it.
31896         * common.opt (Wodr): New flag.
31897         * doc/invoke.texi (Wodr): Document new warning.
31898
31899 2014-07-12  Jan Hubicka  <hubicka@ucw.cz>
31900
31901         * timevar.def (TV_IPA_LTO_DECL_INIT_IO): Remove.
31902         (TV_IPA_LTO_CTORS_IN, TV_IPA_LTO_CTORS_OUT): New timevar.
31903         * cgraph.c (cgraph_get_body): Push GIMPLE_IN timevar.
31904         (varpool_get_constructor): Push CTORS_IN timevar.
31905         * lto-streamer-out.c (lto_output): Push TV_IPA_LTO_CTORS_OUT timevar.
31906
31907 2014-07-12  Uros Bizjak  <ubizjak@gmail.com>
31908
31909         * config/i386/i386-builtin-types.def: Add USHORT_FTYPE_VOID.
31910         Remove VOID_FTYPE_PUSHORT.
31911         * config/i386/i386.c (bdesc_special_args) <__builtin_ia32_fnstsw>:
31912         Change code to USHORT_FTYPE_VOID.
31913         (ix86_expand_special_args_builtin): Handle USHORT_FTYPE_VOID.
31914         (ix86_expand_builtin): Remove IX86_BUILTIN_FNSTSW handling.
31915         (ix86_atomic_assign_expand_fenv): Update for
31916         __builtin_ia32_fnstsw changes.
31917         * config/i386/i386.md (x86_fnstsw_1): Set length unconditionally to 2.
31918         (fnstsw): Change operand 0 to nonimmediate operand.
31919
31920 2014-07-11  Jan Hubicka  <hubicka@ucw.cz>
31921
31922         * vapool.c: Include tree-ssa-alias.h, gimple.h and lto-streamer.h
31923         (varpool_get_constructor): New function.
31924         (varpool_ctor_useable_for_folding_p): Break out from ...
31925         (ctor_for_folding): ... here; use varpool_get_constructor.
31926         (varpool_assemble_decl): Likewise.
31927         * lto-streamer.h (struct output_block): Turn cgraph_node
31928         to symbol filed.
31929         (lto_input_variable_constructor): Declare.
31930         * ipa-visibility.c (function_and_variable_visibility): Use
31931         varpool_get_constructor.
31932         * cgraph.h (varpool_get_constructor): Declare.
31933         (varpool_ctor_useable_for_folding_p): New function.
31934         * lto-streamer-out.c (get_symbol_initial_value): Take encoder
31935         parameter; return error_mark_node for non-trivial constructors.
31936         (lto_write_tree_1, DFS_write_tree): Update use of
31937         get_symbol_initial_value.
31938         (output_function): Update initialization of symbol.
31939         (output_constructor): New function.
31940         (copy_function): Rename to ..
31941         (copy_function_or_variable): ... this one; handle vars too.
31942         (lto_output): Output variable sections.
31943         * lto-streamer-in.c (input_constructor): New function.
31944         (lto_read_body): Rename from ...
31945         (lto_read_body_or_constructor): ... this one; handle vars too.
31946         (lto_input_variable_constructor): New function.
31947         * ipa-prop.c (ipa_prop_write_jump_functions,
31948         ipa_prop_write_all_agg_replacement): Update.
31949         * lto-cgraph.c (compute_ltrans_boundary): Use it.
31950         (output_cgraph_opt_summary): Set symbol to NULL.
31951
31952 2014-07-11  Jan Hubicka  <hubicka@ucw.cz>
31953
31954         * ipa-prop.c (ipa_binfo_from_known_type_jfunc): In LTO do not walk
31955         non-polymorphic types.
31956         * ipa-cp.c (ipa_get_jf_ancestor_result): Likewise.
31957         * ipa-devirt.c (types_same_for_odr): Do not explode when one
31958         of types is not polymorphic.
31959
31960 2014-07-11  Vladimir Makarov  <vmakarov@redhat.com>
31961
31962         * lra-constraints.c (remove_inheritance_pseudos): Process
31963         destination pseudo too.
31964
31965 2014-07-11  Rong Xu  <xur@google.com>
31966
31967         * gcov-tool.c (gcov_output_files): Fix build error introduced in
31968         commit r212448.
31969
31970 2014-07-11  Pitchumani Sivanupandi  <pitchumani.s@atmel.com>
31971
31972         * config/avr/avr-arch.h (avr_mcu_t): Add text section start attribute.
31973         * config/avr/avr-devices.c (AVR_MCU): Same.
31974         (avr_mcu_types): add text start value to end of device list.
31975         * config/avr/avr-mcus.def: Add text section start for all devices.
31976         (ata5782): Add new avr5 device.
31977         (ata5831): Same.
31978         * config/avr/avr-tables.opt: Regenerate.
31979         * config/avr/avr.h: Add declaration for text section start handler.
31980         (EXTRA_SPEC_FUNCTIONS): Add text section start handler to
31981         SPEC functions.
31982         (LINK_SPEC): Include text section start handler to linker spec.
31983         * config/avr/driver-avr.c (avr_device_to_text_start): New function to
31984         pass -Ttext option to linker if the text section start for the device
31985         is not zero.
31986         * config/avr/t-multilib: Regenerate.
31987         * doc/avr-mmcu.texi: Regenerate.
31988
31989 2014-07-11  David Edelsohn  <dje.gcc@gmail.com>
31990
31991         * config/rs6000/aix51.h (LINK_SPEC): Remove -bnodelcsect.
31992         * config/rs6000/aix52.h (LINK_SPEC): Same.
31993         * config/rs6000/aix53.h (LINK_SPEC): Same.
31994         * config/rs6000/aix61.h (LINK_SPEC): Same.
31995         * config/rs6000/xcoff.h (MAKE_DECL_ONE_ONLY): Define.
31996
31997 2014-07-11  Roman Gareev  <gareevroman@gmail.com>
31998
31999         * graphite-isl-ast-to-gimple.c (gmp_cst_to_tree): New function.
32000         (graphite_verify): New function.
32001         (ivs_params_clear): New function.
32002         (gcc_expression_from_isl_ast_expr_id): New function.
32003         (gcc_expression_from_isl_expr_int): New function.
32004         (binary_op_to_tree): New function.
32005         (ternary_op_to_tree): New function.
32006         (unary_op_to_tree): New function.
32007         (nary_op_to_tree): New function.
32008         (gcc_expression_from_isl_expr_op): New function.
32009         (gcc_expression_from_isl_expression): New function.
32010         (graphite_create_new_loop): New function.
32011         (translate_isl_ast_for_loop): New function.
32012         (get_upper_bound): New function.
32013         (graphite_create_new_loop_guard): New function.
32014         (translate_isl_ast_node_for): New function.
32015         (translate_isl_ast): New function.
32016         (add_parameters_to_ivs_params): New function.
32017         (scop_to_isl_ast): New parameter ip.
32018         (graphite_regenerate_ast_isl): Add generation of GIMPLE code.
32019
32020 2014-07-11  Jan Hubicka  <hubicka@ucw.cz>
32021
32022         * config/xtensa/predicates.md (call expander): Update for
32023         DECL_SECTION_NAME being string.
32024
32025 2014-07-11  Richard Biener  <rguenther@suse.de>
32026
32027         PR middle-end/61473
32028         * builtins.c (fold_builtin_memory_op): Inline memory moves that
32029         can be implemented with a single load followed by a single store.
32030         (c_strlen): Only warn when only_value is not 2.
32031
32032 2014-07-11  Evgeny Stupachenko  <evstupac@gmail.com>
32033
32034         * config/i386/i386.c (expand_vec_perm_pblendv): Disable for AVX.
32035
32036 2014-07-11  Marat Zakirov  <m.zakirov@samsung.com>
32037
32038         PR target/61561
32039         * config/arm/arm.md (*movhi_insn_arch4): Handle stack pointer.
32040         (*movhi_bytes): Likewise.
32041         (*arm_movqi_insn): Likewise.
32042
32043 2014-07-11  Uros Bizjak  <ubizjak@gmail.com>
32044
32045         PR target/56858
32046         * config/alpha/alpha.c: Include tree-pass.h, context.h
32047         and pass_manager.h.
32048         (pass_data_handle_trap_shadows): New pass.
32049         (pass_handle_trap_shadows::gate): New pass gate function.
32050         (make_pass_handle_trap_shadows): New function.
32051         (rest_of_handle_trap_shadows): Ditto.
32052
32053         (alpha_align_insns_1): Rename from alpha_align_insns.
32054         (pass_data_align_insns): New pass.
32055         (pass_align_insns::gate): New pass gate function.
32056         (make_pass_aling_insns): New function.
32057         (rest_of_align_insns): Ditto.
32058         (alpha_align_insns): Ditto.
32059
32060         (alpha_option_override): Declare handle_trap_shadows info
32061         and align_insns_info.  Register handle_trap_shadows and align_insns
32062         passes here.
32063         (alpha_reorg): Do not call alpha_trap_shadows and
32064         alpha_align_insn from here.
32065
32066         (alpha_pad_function_end): Do not skip BARRIERs.
32067
32068 2014-07-10  Rong Xu  <xur@google.com>
32069
32070         Add gcov-tool: an offline gcda profile processing tool support.
32071         * gcov-io.c (gcov_position): Make avaialble to gcov-tool.
32072         (gcov_is_error): Ditto.
32073         (gcov_read_string): Ditto.
32074         (gcov_read_sync): Ditto.
32075         * gcov-io.h: Move counter defines to gcov-counter.def.
32076         * gcov-dump.c (tag_counters): Use gcov-counter.def.
32077         * coverage.c: Ditto.
32078         * gcov-tool.c: Offline gcda profile processing tool.
32079         (unlink_gcda_file): Remove one gcda file.
32080         (unlink_profile_dir): Remove gcda files from the profile path.
32081         (gcov_output_files): Output gcda files to an output dir.
32082         (profile_merge): Merge two profiles in directory.
32083         (print_merge_usage_message): Print merge usage.
32084         (merge_usage): Print merge usage and exit.
32085         (do_merge): Driver for profile merge sub-command.
32086         (profile_rewrite): Rewrite profile.
32087         (print_rewrite_usage_message): Print rewrite usage.
32088         (rewrite_usage): Print rewrite usage and exit.
32089         (do_rewrite): Driver for profile rewrite sub-command.
32090         (print_usage): Print gcov-info usage and exit.
32091         (print_version): Print gcov-info version.
32092         (process_args): Process arguments.
32093         (main): Main routine for gcov-tool.
32094         * Makefile.in: Build and install gcov-tool.
32095         * gcov-counter.def: New file split from gcov-io.h.
32096         * doc/gcc.texi: Include gcov-tool.texi.
32097         * doc/gcov-tool.texi: Document for gcov-tool.
32098
32099 2014-07-10  Richard Biener  <rguenther@suse.de>
32100
32101         PR tree-optimization/61757
32102         * tree-ssa-dom.c (loop_depth_of_name): Restore.
32103         (propagate_rhs_into_lhs): Revert part of last change.
32104
32105 2014-07-10  Thomas Schwinge  <thomas@codesourcery.com>
32106
32107         * fold-const.c (fold_checksum_tree): Look at DECL_VINDEX only for
32108         FUNCTION_DECLs.
32109
32110 2014-07-10  Eric Botcazou  <ebotcazou@adacore.com>
32111
32112         PR middle-end/53590
32113         * function.c (allocate_struct_function): Revert r188667 change.
32114
32115         * gimple-low.c (lower_builtin_setjmp): Use properly-typed constant.
32116
32117 2014-07-10  Tom G. Christensen  <tgc@jupiterrise.com>
32118
32119         * doc/install.texi: Remove links to defunct package providers for
32120         Solaris.
32121
32122 2014-07-09  Tom de Vries  <tom@codesourcery.com>
32123
32124         * final.c (get_call_fndecl): Declare.
32125         (self_recursive_call_p): New function.
32126         (collect_fn_hard_reg_usage): Handle self-recursive function calls.
32127
32128 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32129
32130         * ipa-devirt.c (record_node): Walk through aliases.
32131
32132 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32133
32134         * lto-streamer-out.c (hash_scc): Avoid quadratic hashing loop.
32135
32136 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32137
32138         Revert:
32139         * stor-layout.c (finish_builtin_struct): Copy fields into the variants.
32140
32141 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32142
32143         * ipa-visibility.c (function_and_variable_visibility): Remove
32144         temporary hack disabling local aliases on AIX.
32145
32146 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32147
32148         * ipa-cp.c (devirtualization_time_bonus): Walk through aliases.
32149         * ipa-inline-analysis.c (estimate_edge_devirt_benefit): Likewise.
32150
32151 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32152
32153         * rs6000/rs6000-protos.h (rs6000_xcoff_declare_object_name): Declare.
32154         * rs6000/rs6000.c: Inline output of .set instruction.
32155         (declare_alias_data): New struct.
32156         (rs6000_declare_alias): New function.
32157         (rs6000_xcoff_declare_function_name): Use it.
32158         (rs6000_xcoff_declare_object_name): New function.
32159         * config/rs6000/xcoff.h: Define ASM_DECLARE_OBJECT_NAME.
32160         (ASM_OUTPUT_DEF): Turn to empty definition.
32161
32162 2014-07-08  Trevor Saunders  <tsaunders@mozilla.com>
32163
32164         PR bootstrap/61679
32165         * hash-table.h: use hash_table::value_type instead of
32166         Descriptor::value_type in the return types of several methods.
32167
32168 2014-07-08  Trevor Saunders  <tsaunders@mozilla.com>
32169
32170         * tree-pass.h (pass_data): Remove has_execute member.
32171         * passes.c (execute_one_pass): Don't check pass->has_execute.
32172         * asan.c, auto-inc-dec.c, bb-reorder.c, bt-load.c, cfgcleanup.c,
32173         cfgexpand.c, cfgrtl.c, cgraphbuild.c, combine-stack-adj.c, combine.c,
32174         compare-elim.c, config/arc/arc.c, config/epiphany/mode-switch-use.c,
32175         config/epiphany/resolve-sw-modes.c, config/i386/i386.c,
32176         config/mips/mips.c, config/rl78/rl78.c, config/s390/s390.c,
32177         config/sh/sh_optimize_sett_clrt.cc, config/sh/sh_treg_combine.cc,
32178         config/sparc/sparc.c, cprop.c, cse.c, dce.c, df-core.c, dse.c,
32179         dwarf2cfi.c, except.c, final.c, function.c, fwprop.c, gcse.c,
32180         gimple-low.c, gimple-ssa-isolate-paths.c,
32181         gimple-ssa-strength-reduction.c, graphite.c, ifcvt.c, init-regs.c,
32182         ipa-comdats.c, ipa-cp.c, ipa-devirt.c, ipa-inline-analysis.c,
32183         ipa-inline.c, ipa-profile.c, ipa-pure-const.c, ipa-reference.c,
32184         ipa-split.c, ipa-visibility.c, ipa.c, ira.c, jump.c, loop-init.c,
32185         lower-subreg.c, mode-switching.c, modulo-sched.c, omp-low.c, passes.c,
32186         postreload-gcse.c, postreload.c, predict.c, recog.c, ree.c,
32187         reg-stack.c, regcprop.c, reginfo.c, regrename.c, reorg.c, sched-rgn.c,
32188         stack-ptr-mod.c, store-motion.c, tracer.c, trans-mem.c,
32189         tree-call-cdce.c, tree-cfg.c, tree-cfgcleanup.c, tree-complex.c,
32190         tree-eh.c, tree-emutls.c, tree-if-conv.c, tree-into-ssa.c,
32191         tree-loop-distribution.c, tree-nrv.c, tree-object-size.c,
32192         tree-parloops.c, tree-pass.h, tree-predcom.c, tree-profile.c,
32193         tree-sra.c, tree-ssa-ccp.c, tree-ssa-copy.c, tree-ssa-copyrename.c,
32194         tree-ssa-dce.c, tree-ssa-dom.c, tree-ssa-dse.c, tree-ssa-forwprop.c,
32195         tree-ssa-ifcombine.c, tree-ssa-loop-ch.c, tree-ssa-loop-im.c,
32196         tree-ssa-loop-ivcanon.c, tree-ssa-loop-prefetch.c,
32197         tree-ssa-loop-unswitch.c, tree-ssa-loop.c, tree-ssa-math-opts.c,
32198         tree-ssa-phiopt.c, tree-ssa-phiprop.c, tree-ssa-pre.c,
32199         tree-ssa-reassoc.c, tree-ssa-sink.c, tree-ssa-strlen.c,
32200         tree-ssa-structalias.c, tree-ssa-uncprop.c, tree-ssa-uninit.c,
32201         tree-ssa.c, tree-ssanames.c, tree-stdarg.c, tree-switch-conversion.c,
32202         tree-tailcall.c, tree-vect-generic.c, tree-vectorizer.c, tree-vrp.c,
32203         tree.c, tsan.c, ubsan.c, var-tracking.c, vtable-verify.c,
32204         web.c: Remove initializer for pass_data::has_execute.
32205
32206 2014-07-08  Trevor Saunders  <tsaunders@mozilla.com>
32207
32208         * graphite-htab.h: Use hash_map instead of hash_table.
32209         * graphite-clast-to-gimple.c: Adjust.
32210         * passes.c: Use hash_map instead of hash_table.
32211         * sese.c: Likewise.
32212         * sese.h: Remove now unused code.
32213
32214 2014-07-08  Sriraman Tallam  <tmsriram@google.com>
32215
32216         PR target/61599
32217         * config/i386/i386.c (ix86_in_large_data_p): Check for size less
32218         than zero.
32219
32220 2014-07-08  Jakub Jelinek  <jakub@redhat.com>
32221
32222         PR rtl-optimization/61673
32223         * combine.c (simplify_comparison): Test just mode's sign bit
32224         in tmode rather than the sign bit and any bits above it.
32225
32226 2014-07-08  Roman Gareev  <gareevroman@gmail.com>
32227
32228         * graphite-isl-ast-to-gimple.c (generate_isl_context):
32229         Add __isl_give to the declaration.
32230         (generate_isl_schedule): Likewise.
32231         (scop_to_isl_ast): Likewise.
32232
32233 2014-07-08  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
32234
32235         * config/arm/arm.c (cortexa5_extra_costs): New table.
32236         (arm_cortex_a5_tune): Use cortexa5_extra_costs.
32237
32238 2014-07-08  Jakub Jelinek  <jakub@redhat.com>
32239
32240         PR tree-optimization/61725
32241         * tree-vrp.c (extract_range_basic): Don't assume vr0 is unsigned
32242         range, use range_includes_zerop_p instead of integer_zerop on
32243         vr0->min, only use log2 of max if min is not negative.
32244
32245 2014-07-08  Richard Biener  <rguenther@suse.de>
32246
32247         * tree-ssa-dom.h (loop_depth_of_name): Remove.
32248         * tree-ssa-dom.c (record_equivalences_from_phis): Remove
32249         restriction on loop depth difference.
32250         (record_equality): Likewise.
32251         (propagate_rhs_into_lhs): Likewise.  Simplify condition.
32252         (loop_depth_of_name): Remove.
32253         * tree-ssa-copy.c (copy_prop_visit_phi_node): Remove
32254         restriction on loop depth difference.
32255         (init_copy_prop): Likewise.
32256
32257 2014-07-08  Jan Hubicka  <hubicka@ucw.cz>
32258
32259         * tree-ssa-alias.c (walk_aliased_vdefs_1): Add FUNCTION_ENTRY_REACHED
32260         parameter.
32261         (walk_aliased_vdefs): Likewise.
32262         * tree-ssa-alias.h (walk_aliased_vdefs): Likewise.
32263         * ipa-prop.c (stmt_may_be_vtbl_ptr_store): Skip clobbers
32264         (detect_type_change_from_memory_writes): Check if entry was reached.
32265
32266 2014-07-08  Richard Biener  <rguenther@suse.de>
32267
32268         PR tree-optimization/61681
32269         * tree-ssa-structalias.c (find_what_var_points_to): Expand
32270         NONLOCAL inside ESCAPED.
32271
32272 2014-07-08  Richard Biener  <rguenther@suse.de>
32273
32274         PR tree-optimization/61680
32275         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence):
32276         Handle properly all read-write dependences with group accesses.
32277
32278 2014-07-08  Yuri Rumyantsev  <ysrumyan@gmail.com>
32279
32280         PR tree-optimization/61576
32281         * tree-if-conv.c (is_cond_scalar_reduction): Add check that basic
32282         block containing reduction statement is predecessor of phi basi block.
32283
32284 2014-07-08  Marek Polacek  <polacek@redhat.com>
32285
32286         PR c/60226
32287         * fold-const.c (round_up_loc): Change the parameter type.
32288         Remove assert.
32289         * fold-const.h (round_up_loc): Adjust declaration.
32290         * stor-layout.c (finalize_record_size): Check for too large types.
32291
32292 2014-07-07  Jan Hubicka  <hubicka@ucw.cz>
32293
32294         * symtab.c: Include calls.h.
32295         (symtab_nonoverwritable_alias_1): Check sanity of the local alias.
32296
32297 2014-07-07  Maciej W. Rozycki  <macro@codesourcery.com>
32298
32299         * config/rs6000/rs6000.c (output_vec_const_move): Handle
32300         little-endian code generation.
32301         * config/rs6000/spe.md (spe_evmergehi): Rename to...
32302         (vec_perm00_v2si): ... this.  Handle little-endian code generation.
32303         (spe_evmergehilo): Rename to...
32304         (vec_perm01_v2si): ... this.  Handle little-endian code generation.
32305         (spe_evmergelo): Rename to...
32306         (vec_perm11_v2si): ... this.  Handle little-endian code generation.
32307         (spe_evmergelohi): Rename to...
32308         (vec_perm10_v2si): ... this.  Handle little-endian code generation.
32309         (spe_evmergehi, spe_evmergehilo): New expanders.
32310         (spe_evmergelo, spe_evmergelohi): Likewise.
32311         (*frob_<SPE64:mode>_<DITI:mode>): Handle little-endian code generation.
32312         (*frob_tf_ti): Likewise.
32313         (*frob_<mode>_di_2): Likewise.
32314         (*frob_tf_di_8_2): Likewise.
32315         (*frob_di_<mode>): Likewise.
32316         (*frob_ti_tf): Likewise.
32317         (*frob_<DITI:mode>_<SPE64:mode>_2): Likewise.
32318         (*frob_ti_<mode>_8_2): Likewise.
32319         (*frob_ti_tf_2): Likewise.
32320         (mov_si<mode>_e500_subreg0): Rename to...
32321         (mov_si<mode>_e500_subreg0_be): ... this.  Restrict to the big
32322         endianness only.
32323         (*mov_si<mode>_e500_subreg0_le): New instruction pattern.
32324         (*mov_si<mode>_e500_subreg0_elf_low): Rename to...
32325         (*mov_si<mode>_e500_subreg0_elf_low_be): ... this.  Restrict to
32326         the big endianness only.
32327         (*mov_si<mode>_e500_subreg0_elf_low_le): New instruction pattern.
32328         (*mov_si<mode>_e500_subreg0_2): Rename to...
32329         (*mov_si<mode>_e500_subreg0_2_be): ... this.  Restrict to the
32330         big big endianness only.
32331         (*mov_si<mode>_e500_subreg0_2_le): New instruction pattern.
32332         (*mov_si<mode>_e500_subreg4): Rename to...
32333         (*mov_si<mode>_e500_subreg4_be): ... this.  Restrict to the big
32334         endianness only.
32335         (mov_si<mode>_e500_subreg4_le): New instruction pattern.
32336         (*mov_si<mode>_e500_subreg4_elf_low): Rename to...
32337         (*mov_si<mode>_e500_subreg4_elf_low_be): ... this.  Restrict to
32338         the big endianness only.
32339         (*mov_si<mode>_e500_subreg4_elf_low_le): New instruction/splitter
32340         pattern.
32341         (*mov_si<mode>_e500_subreg4_2): Rename to...
32342         (*mov_si<mode>_e500_subreg4_2_be): ... this.  Restrict to the big
32343         endianness only.
32344         (*mov_si<mode>_e500_subreg4_2_le): New instruction pattern.
32345         (*mov_sitf_e500_subreg8): Rename to...
32346         (*mov_sitf_e500_subreg8_be): ... this.  Restrict to the big
32347         endianness only.
32348         (*mov_sitf_e500_subreg8_le): New instruction pattern.
32349         (*mov_sitf_e500_subreg8_2): Rename to...
32350         (*mov_sitf_e500_subreg8_2_be): ... this.  Restrict to the big
32351         endianness only.
32352         (*mov_sitf_e500_subreg8_2_le): New instruction pattern.
32353         (*mov_sitf_e500_subreg12): Rename to...
32354         (*mov_sitf_e500_subreg12_be): ... this.  Restrict to the big
32355         endianness only.
32356         (*mov_sitf_e500_subreg12_le): New instruction pattern.
32357         (*mov_sitf_e500_subreg12_2): Rename to...
32358         (*mov_sitf_e500_subreg12_2_be): ... this.  Restrict to the big
32359         endianness only.
32360         (*mov_sitf_e500_subreg12_2_le): New instruction pattern.
32361
32362 2014-07-07  Max Ostapenko  <m.ostapenko@partner.samsung.com>
32363
32364         * asan.c (instrument_strlen_call): Do not instrument first byte
32365         in strlen if already instrumented.
32366
32367 2014-07-07  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
32368
32369         * config/arm/arm.opt (mwords-little-endian): Delete.
32370         * config/arm/arm.h (TARGET_CPU_CPP_BUILTINS): Remove handling
32371         of TARGET_LITTLE_WORDS.
32372         (WORDS_BIG_ENDIAN): Define to BYTES_BIG_ENDIAN.
32373         * config/arm/arm.c (arm_option_override): Remove TARGET_LITTLE_WORDS
32374         warning.
32375         * doc/invoke.texi: Remove references to -mwords-little-endian.
32376
32377 2014-07-07  Jakub Jelinek  <jakub@redhat.com>
32378
32379         * expmed.c (struct init_expmed_rtl): Change all fields but
32380         pow2 and cint from struct rtx_def to rtx.
32381         (init_expmed_one_conv, init_expmed_one_mode): Adjust for that change.
32382         (init_expmed): Likewise.  Allocate all the 18 rtxes and ggc_free them
32383         at the end again.
32384
32385 2014-07-06  Marek Polacek  <polacek@redhat.com>
32386
32387         PR c/6940
32388         * doc/invoke.texi: Document -Wsizeof-array-argument.
32389
32390 2014-07-05  Gerald Pfeifer  <gerald@pfeifer.com>
32391
32392         * wide-int.h (wide_int_storage): Change declaration from struct
32393         to class.
32394
32395 2014-07-05  Jan Hubicka  <hubicka@ucw.cz>
32396
32397         * cgraph.c (cgraph_create_indirect_edge): Update call of
32398         get_polymorphic_call_info.
32399         * ipa-utils.h (get_polymorphic_call_info): Add parameter CALL.
32400         (possible_polymorphic_call_targets): Add parameter call.
32401         (decl_maybe_in_construction_p): New predicate.
32402         (get_polymorphic_call_info): Add parameter call;
32403         use decl_maybe_in_construction_p.
32404         * gimple-fold.c (fold_gimple_assign): Update use of
32405         possible_polymorphic_call_targets.
32406         (gimple_fold_call): Likewise.
32407         * ipa-prop.c: Inlcude calls.h
32408         (ipa_binfo_from_known_type_jfunc): Check that known type is record.
32409         (param_type_may_change_p): New predicate.
32410         (detect_type_change_from_memory_writes): Break out from ...
32411         (detect_type_change): ... this one; use param_type_may_change_p.
32412         (detect_type_change_ssa): Use param_type_may_change_p.
32413         (compute_known_type_jump_func): Use decl_maybe_in_construction_p.
32414
32415 2014-07-05  Charles Baylis  <charles.baylis@linaro.org>
32416
32417         PR target/49423
32418         * config/arm/arm-protos.h (arm_legitimate_address_p,
32419         arm_is_constant_pool_ref): Add prototypes.
32420         * config/arm/arm.c (arm_legitimate_address_p): Remove static.
32421         (arm_is_constant_pool_ref) New function.
32422         * config/arm/arm.md (unaligned_loadhis, arm_zero_extendhisi2_v6,
32423         arm_zero_extendqisi2_v6): Use Uh constraint for memory operand.
32424         (arm_extendhisi2, arm_extendhisi2_v6): Use Uh constraint for memory
32425         operand. Remove pool_range and neg_pool_range attributes.
32426         (arm_extendqihi_insn, arm_extendqisi, arm_extendqisi_v6): Remove
32427         pool_range and neg_pool_range attributes.
32428         * config/arm/constraints.md (Uh): New constraint.
32429         (Uq): Don't allow constant pool references.
32430
32431 2014-07-04  James Greenhalgh  <james.greenhalgh@arm.com>
32432
32433         * config/aarch64/aarch64-simd.md (move_lo_quad_internal_<mode>): New.
32434         (move_lo_quad_internal_be_<mode>): Likewise.
32435         (move_lo_quad_<mode>): Convert to define_expand.
32436         (aarch64_simd_move_hi_quad_<mode>): Gate on BYTES_BIG_ENDIAN.
32437         (aarch64_simd_move_hi_quad_be_<mode>): New.
32438         (move_hi_quad_<mode>): Use appropriate insn for BYTES_BIG_ENDIAN.
32439         (aarch64_combinez<mode>): Gate on BYTES_BIG_ENDIAN.
32440         (aarch64_combinez_be<mode>): New.
32441         (aarch64_combine<mode>): Convert to define_expand.
32442         (aarch64_combine_internal<mode>): New.
32443         (aarch64_simd_combine<mode>): Remove bogus RTL description.
32444
32445 2014-07-04  Tom de Vries  <tom@codesourcery.com>
32446
32447         * doc/md.texi (@subsection Constraint Modifier Characters): Clarify
32448         combination of earlyclobber and read/write modifiers.
32449
32450 2014-07-04  Tom de Vries  <tom@codesourcery.com>
32451
32452         * config/aarch64/aarch64-simd.md
32453         (define_insn "vec_unpack_trunc_<mode>"): Fix constraint.
32454
32455 2014-07-04  Richard Earnshaw  <rearnsha@arm.com>
32456
32457         PR target/61714
32458         * config/aarch64/aarch64.h (OPTION_DEFAULT_SPECS): Define.
32459
32460 2014-07-04  Jakub Jelinek  <jakub@redhat.com>
32461
32462         PR middle-end/61654
32463         * cgraphunit.c (expand_thunk): Call free_dominance_info.
32464
32465         PR tree-optimization/61684
32466         * tree-ssa-ifcombine.c (recognize_single_bit_test): Make sure
32467         rhs1 of conversion is a SSA_NAME before using SSA_NAME_DEF_STMT on it.
32468
32469 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32470             Kito Cheng  <kito@0xlab.org>
32471             Monk Chiang  <sh.chiang04@gmail.com>
32472
32473         * config/nds32/nds32.c (nds32_have_prologue_p): Move to ...
32474         (nds32_symbol_load_store_p): Move to ...
32475         (nds32_fp_as_gp_check_available): Move to ...
32476         * config/nds32/nds32-fp-as-gp.c: ... here.
32477         * config/nds32/nds32-protos.h (nds32_symbol_load_store_p): Remove
32478         extern declaration.
32479
32480 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32481             Kito Cheng  <kito@0xlab.org>
32482             Monk Chiang  <sh.chiang04@gmail.com>
32483
32484         * config/nds32/nds32.c (nds32_expand_load_multiple): Move to ...
32485         (nds32_expand_store_multiple): Move to ...
32486         (nds32_expand_movmemqi): Move to ...
32487         * config/nds32/nds32-memory-manipulation.c: ... here.
32488
32489 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32490             Kito Cheng  <kito@0xlab.org>
32491             Monk Chiang  <sh.chiang04@gmail.com>
32492
32493         * config/nds32/nds32.c (nds32_byte_to_size): Move to ...
32494         (nds32_output_casesi_pc_relative): Move to ...
32495         (nds32_output_casesi): Move to ...
32496         (nds32_mem_format): Move to ...
32497         (nds32_output_16bit_store): Move to ...
32498         (nds32_output_16bit_load): Move to ...
32499         (nds32_output_32bit_store): Move to ...
32500         (nds32_output_32bit_load): Move to ...
32501         (nds32_output_32bit_load_s): Move to ...
32502         (nds32_output_stack_push): Move to ...
32503         (nds32_output_stack_pop): Move to ...
32504         * config/nds32/nds32-md-auxiliary.c: ... here.
32505
32506 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32507             Ling-Hua Tseng  <uranus@tinlans.org>
32508
32509         * config/nds32/nds32-pipelines-auxiliary.c: Add comment to describe
32510         the purpose of this file.
32511
32512 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32513             Kito Cheng  <kito@0xlab.org>
32514             Monk Chiang  <sh.chiang04@gmail.com>
32515
32516         * config/nds32/nds32.c (nds32_rtx_costs): Move implementation to ...
32517         (nds32_address_cost): Move implementation to ...
32518         * config/nds32/nds32-cost.c: ... here.
32519         * config/nds32/nds32-protos.h (nds32_rtx_costs_impl): Declare.
32520         (nds32_address_cost_impl): Declare.
32521
32522 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32523             Kito Cheng  <kito@0xlab.org>
32524             Monk Chiang  <sh.chiang04@gmail.com>
32525
32526         * config/nds32/nds32.c
32527         (nds32_consecutive_registers_load_store_p): Move to ...
32528         (nds32_valid_multiple_load_store): Move to ...
32529         (nds32_valid_stack_push_pop): Move to ...
32530         (nds32_can_use_bclr_p): Move to ...
32531         (nds32_can_use_bset_p): Move to ...
32532         (nds32_can_use_btgl_p): Move to ...
32533         (nds32_can_use_bitci_p): Move to ...
32534         * config/nds32/nds32-predicates.c: ... here.
32535
32536 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32537             Kito Cheng  <kito@0xlab.org>
32538             Monk Chiang  <sh.chiang04@gmail.com>
32539
32540         * config/nds32/nds32.c
32541         (nds32_expand_builtin_null_ftype_reg): Move to ...
32542         (nds32_expand_builtin_reg_ftype_imm): Move to ...
32543         (nds32_expand_builtin_null_ftype_reg_imm): Move to ...
32544         (nds32_init_builtins): Move implementation to ...
32545         (nds32_expand_builtin): Move implementation to ...
32546         * config/nds32/nds32-intrinsic.c: ... here.
32547         * config/nds32/nds32-protos.h (nds32_init_builtins_impl): Declare.
32548         (nds32_expand_builtin_impl): Declare.
32549
32550 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32551             Kito Cheng  <kito@0xlab.org>
32552             Monk Chiang  <sh.chiang04@gmail.com>
32553
32554         * config/nds32/nds32.c (nds32_emit_section_head_template): Move to ...
32555         (nds32_emit_section_tail_template): Move to ...
32556         (nds32_emit_isr_jmptbl_section): Move to ...
32557         (nds32_emit_isr_vector_section): Move to ...
32558         (nds32_emit_isr_reset_conten): Move to ...
32559         (nds32_check_isr_attrs_conflict): Move to ...
32560         (nds32_construct_isr_vectors_information): Move to ...
32561         (nds32_asm_file_start): Move implementation to ...
32562         (nds32_asm_file_end): Move implementation to ...
32563         * config/nds32/nds32-isr.c: ... here.
32564         * config/nds32/nds32-protos.h
32565         (nds32_check_isr_attrs_conflict): Declare.
32566         (nds32_construct_isr_vectors_information): Declare.
32567         (nds32_asm_file_start_for_isr): Declare.
32568         (nds32_asm_file_end_for_isr): Declare.
32569
32570 2014-07-04  Chung-Ju Wu  <jasonwucj@gmail.com>
32571             Kito Cheng  <kito@0xlab.org>
32572             Monk Chiang  <sh.chiang04@gmail.com>
32573
32574         * config.gcc (nds32*): Add new modules to extra_objs.
32575         (nds32le-*-*): Use t-nds32 makefile fragment for new modules.
32576         (nds32be-*-*): Likewise.
32577         * config/nds32/nds32-cost.c: New file.
32578         * config/nds32/nds32-fp-as-gp.c: New file.
32579         * config/nds32/nds32-intrinsic.c: New file.
32580         * config/nds32/nds32-isr.c: New file.
32581         * config/nds32/nds32-md-auxiliary.c: New file.
32582         * config/nds32/nds32-memory-manipulation.c: New file.
32583         * config/nds32/nds32-pipelines-auxiliary.c: New file.
32584         * config/nds32/nds32-predicates.c: New file.
32585         * config/nds32/t-nds32: New file.
32586
32587 2014-07-03  Jakub Jelinek  <jakub@redhat.com>
32588
32589         PR tree-optimization/61682
32590         * wide-int.cc (wi::mul_internal): Handle high correctly for umul_ppmm
32591         using cases and when one of the operands is equal to 1.
32592
32593 2014-07-03  Segher Boessenkool  <segher@kernel.crashing.org>
32594
32595         * config/rs6000/rs6000.md (rotl<mode>3, ashl<mode>3, lshr<mode>3,
32596         ashr<mode>3): Correct mode of operands[2].
32597         (rotl<mode>3_dot, rotl<mode>3_dot2, ashl<mode>3_dot, ashl<mode>3_dot2,
32598         lshr<mode>3_dot, lshr<mode>3_dot2, ashr<mode>3_dot, ashr<mode>3_dot2):
32599         Correct mode of operands[2].  Fix split condition.
32600
32601 2014-07-03  Richard Earnshaw  <rearnsha@arm.com>
32602
32603         * arm.md (arch): Add armv6_or_vfpv3.
32604         (arch_enabled): Add test for the above.
32605         * vfp.md (divsf_vfp, divdf_vfp): Add earlyclobber when code can run
32606         on VFP9.
32607         (sqrtsf_vfp, sqrtdf_vfp): Likewise.
32608
32609 2014-07-03  Jakub Jelinek  <jakub@redhat.com>
32610
32611         * gcov-io.c (gcov_read_words): Don't call memmove if excess is 0.
32612         * data-streamer-in.c (streamer_read_hwi): Shift UHWI 1 instead of
32613         HWI 1 and negate the unsigned value.
32614         * expmed.c (expand_sdiv_pow2): For modes wider than word always
32615         use AND instead of shift.
32616         * wide-int-print.cc (print_decs): Negate UHWI instead of HWI.
32617
32618 2014-07-03  Marek Polacek  <polacek@redhat.com>
32619
32620         * doc/invoke.texi (-fsanitize=bounds): Tweak wording.
32621         (-fsanitize=float-divide-by-zero): Move to the table with
32622         -fsanitize=undefined suboptions.
32623         (-fsanitize=float-cast-overflow): Likewise.
32624
32625 2014-07-03  Maciej W. Rozycki  <macro@codesourcery.com>
32626
32627         * config/rs6000/rs6000.c (rs6000_adjust_atomic_subword): Use
32628         BYTES_BIG_ENDIAN rather than WORDS_BIG_ENDIAN to check for byte
32629         endianness.
32630
32631 2014-07-03  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
32632
32633         * loop-invariant.c (struct invariant): Add a new member: eqno;
32634         (find_identical_invariants): Update eqno;
32635         (create_new_invariant): Init eqno;
32636         (get_inv_cost): Compute comp_cost with eqno;
32637
32638 2014-07-02  Segher Boessenkool  <segher@kernel.crashing.org>
32639
32640         * genconfig.c (have_rotate_flag, have_rotatert_flag): New variables.
32641         (walk_insn_part) <ROTATE, ROTATERT>: New cases.
32642         (main): Conditionally write HAVE_rotate resp. HAVE_rotatert.
32643         * simplify-rtx.c (simplify_binary_operation_1) <ROTATE, ROTATERT>:
32644         Only do the transformation if both HAVE_rotate and HAVE_rotatert.
32645
32646 2014-07-02  Christian Bruel  <christian.bruel@st.com>
32647
32648         PR target/29349
32649         PR target/53513
32650         * mode-switching.c (struct bb_info): Add mode_out, mode_in caches.
32651         (make_preds_opaque): Delete.
32652         (clear_mode_bit, mode_bit_p, set_mode_bit): New macros.
32653         (commit_mode_sets): New function.
32654         (optimize_mode_switching): Handle current_mode to mode_switching_emit.
32655         Process all modes at once.
32656         * basic-block.h (pre_edge_lcm_avs): Declare.
32657         * lcm.c (pre_edge_lcm_avs): Renamed from pre_edge_lcm.
32658         Call clear_aux_for_edges. Fix comments.
32659         (pre_edge_lcm): New wrapper function to call pre_edge_lcm_avs.
32660         (pre_edge_rev_lcm): Idem.
32661         * config/epiphany/epiphany.c (emit_set_fp_mode): Add prev_mode
32662         parameter.
32663         * config/epiphany/epiphany-protos.h (emit_set_fp_mode): Idem.
32664         * config/epiphany/resolve-sw-modes.c (pass_resolve_sw_modes::execute):
32665         Idem.
32666         * config/i386/i386.c (x96_emit_mode_set): Idem.
32667         * config/sh/sh.c (sh_emit_mode_set): Likewise. Handle PR toggle.
32668         * config/sh/sh.md (toggle_pr):  Defined if TARGET_FPU_SINGLE.
32669         (fpscr_toggle) Disallow from delay slot.
32670         * target.def (emit_mode_set): Add prev_mode parameter.
32671         * doc/tm.texi: Regenerate.
32672
32673 2014-07-02  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
32674
32675         * config/aarch64/aarch64.c (aarch64_expand_vec_perm): Delete unused
32676         variable i.
32677
32678 2014-07-01  Jan Hubicka  <hubicka@ucw.cz>
32679
32680         * ipa-utils.h (method_class_type, vtable_pointer_value_to_binfo,
32681         vtable_pointer_value_to_vtable): Constify.
32682         (contains_polymorphic_type_p): Declare.
32683         * ipa-devirt.c (method_class_type, vtable_pointer_value_to_binfo,
32684         vtable_pointer_value_to_vtable): Constify.
32685         (contains_polymorphic_type_p): New predicate.
32686         * ipa-prop.c (ipa_set_jf_known_type): Allow types containing
32687         polymorphic types.
32688         (ipa_set_ancestor_jf): Likewise.
32689         (detect_type_change): Return false in easy cases.
32690         (compute_complex_assign_jump_func): Require type to contain
32691         polymorphic type.
32692         (compute_known_type_jump_func): Likewise.
32693
32694 2014-07-01  Jan Hubicka  <hubicka@ucw.cz>
32695
32696         * tree.c (decls_same_for_odr, decls_same_for_odr, types_same_for_odr):
32697         Remove.
32698         (type_in_anonymous_namespace_p): Constify argument.
32699         * tree.h (types_same_for_odr, type_in_anonymous_namespace_p): Constify.
32700         * ipa-devirt.c (odr_type_d): Add ODR_VIOLATED field.
32701         (main_odr_variant): New function.
32702         (hash_type_name): Make static; update assert; do not ICE on
32703         non-records.
32704         (types_same_for_odr): Bring here from tree.c; simplify and remove
32705         old structural comparing code that doesn't work for templates.
32706         (odr_hasher::equal): Update assert.
32707         (add_type_duplicate): Return true when bases should be computed;
32708         replace incomplete loader by complete; do not output duplicated
32709         warnings; do not ICE on non-records; set odr_violated flag.
32710         (get_odr_type): Be ready to replace incomplete type by complete
32711         one; work on ODR variants instead of main variants; reorder item
32712         in array so bases have still smaller indexes.
32713         (dump_type_inheritance_graph): Be ready for holdes in odr_types array.
32714         (possible_polymorphic_call_targets): Do not ICE when BINFO is NULL.
32715
32716 2014-07-01  Cary Coutant  <ccoutant@google.com>
32717
32718         * dwarf2out.c (remove_addr_table_entry): Remove unnecessary hash table
32719         lookup.
32720         (resolve_addr_in_expr): When replacing the rtx in a location list
32721         entry, get a new address table entry.
32722         (dwarf2out_finish): Call index_location_lists even if there are no
32723         addr_index_table entries yet.
32724
32725 2014-07-01  Trevor Saunders  <tsaunders@mozilla.com>
32726
32727         * config/i386/winnt.c (i386_pe_section_type_flags): Revert previous
32728         change for not being obvious.
32729
32730 2014-07-01  Trevor Saunders  <tsaunders@mozilla.com>
32731
32732         * config/i386/winnt.c (i386_pe_section_type_flags): Remove name of
32733         unused argument.
32734
32735 2014-07-01  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
32736
32737         * config/aarch64/arm_neon.h (vcage_f64): New intrinsic.
32738         (vcagt_f64): Likewise.
32739         (vcale_f64): Likewise.
32740         (vcaled_f64): Likewise.
32741         (vcales_f32): Likewise.
32742         (vcalt_f64): Likewise.
32743         (vcaltd_f64): Likewise.
32744         (vcalts_f32): Likewise.
32745
32746 2014-07-01  Marek Polacek  <polacek@redhat.com>
32747
32748         * doc/invoke.texi: Document -Wint-conversion.
32749
32750 2014-07-01  Marek Polacek  <polacek@redhat.com>
32751
32752         PR c/58286
32753         * doc/invoke.texi: Document -Wincompatible-pointer-types.
32754
32755 2014-07-01  Martin Liska  <mliska@suse.cz>
32756
32757         IPA REF alias refactoring
32758         * cgraph.h (iterate_direct_aliases): New function.
32759         (FOR_EACH_ALIAS): New macro iterates all direct aliases for a node.
32760         * cgraph.c (cgraph_for_node_thunks_and_aliases): Usage of
32761         FOR_EACH_ALIAS added.
32762         (cgraph_for_node_and_aliases): Likewise.
32763         * cgraphunit.c (assemble_thunks_and_aliases): Likewise.
32764         * ipa-inline.c (reset_edge_caches): Likewise.
32765         (update_caller_keys): Likewise.
32766         * trans-mem.c (ipa_tm_execute): Likewise.
32767         *varpool.c (varpool_analyze_node): Likewise.
32768         (varpool_for_node_and_aliases): Likewise.
32769         * ipa-ref.h (first_alias): New function.
32770         (last_alias): Likewise.
32771         (has_aliases_p): Likewise.
32772         * ipa-ref.c (ipa_ref::remove_reference): Removal function
32773         is sensitive to IPA_REF_ALIASes.
32774         * symtab.c (symtab_node::add_reference): Node of IPA_REF_ALIAS type
32775         are put at the beginning of the list.
32776         (symtab_node::iterate_direct_aliases): New function.
32777
32778 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32779
32780         Revert:
32781         * tree-streamer-out.c (pack_ts_type_common_value_fields): Stream if
32782         type is complete.
32783         (write_ts_type_common_tree_pointers): Do not stream fields not set
32784         for incomplete types; do not stream duplicated fields for variants;
32785         sanity check that variant and type match.
32786         (write_ts_type_non_common_tree_pointers): Likewise.
32787         * tree-streamer-in.c (unpack_ts_type_common_value_fields): Mark in
32788         TYPE_SIZE whether type is complete.
32789         (lto_input_ts_type_common_tree_pointers): Do same changes as in
32790         write_ts_type_common_tree_pointers
32791         (lto_input_ts_type_non_common_tree_pointers): Likewise.
32792
32793 2014-06-30  Joseph Myers  <joseph@codesourcery.com>
32794
32795         * var-tracking.c (add_stores): Return instead of asserting if old
32796         and new values for conditional store are the same.
32797
32798 2014-06-30  Richard Henderson  <rth@redhat.com>
32799
32800         PR rtl-opt/61608
32801         PR target/39284
32802         * bb-reorder.c (pass_duplicate_computed_gotos::execute): Cleanup
32803         the cfg if there were any changes.
32804         * passes.def: Revert move of peephole2 after reorder_blocks;
32805         move duplicate_computed_gotos before peephole2.
32806
32807 2014-06-30  Uros Bizjak  <ubizjak@gmail.com>
32808
32809         * except.c (emit_note_eh_region_end): New helper function.
32810         (convert_to_eh_region_ranges): Use emit_note_eh_region_end to
32811         emit EH_REGION_END note.
32812         * jump.c (cleanup_barriers): Do not split a call and its
32813         corresponding CALL_ARG_LOCATION note.
32814
32815 2014-06-30  Jeff Law  <law@redhat.com>
32816
32817         PR tree-optimization/61607
32818         * tree-ssa-threadedge.c (simplify_control_stmt_condition): Look
32819         deeper into the SSA_NAME_VALUE chain.
32820
32821 2014-06-30  Marek Polacek  <polacek@redhat.com>
32822
32823         * convert.c (convert_to_integer): Don't instrument conversions if the
32824         function has no_sanitize_undefined attribute.
32825         * ubsan.c: Don't run the ubsan pass if the function has
32826         no_sanitize_undefined attribute.
32827
32828 2014-06-30  Jakub Jelinek  <jakub@redhat.com>
32829
32830         * doc/invoke.texi (-fsanitize=bounds): Move to the table with
32831         -fsanitize=undefined suboptions.
32832
32833 2014-06-30  Alan Lawrence  <alan.lawrence@arm.com>
32834
32835         * config/aarch64/aarch64-simd.md (vec_perm): Enable for bigendian.
32836         * config/aarch64/aarch64.c (aarch64_expand_vec_perm): Remove assert
32837         against bigendian and adjust indices.
32838
32839 2014-06-30  Gerald Pfeifer  <gerald@pfeifer.com>
32840
32841         * doc/install.texi (Specific, aarch64*-*-*): Fix markup.  Reword a bit.
32842
32843 2014-06-30  Marcus Shawcroft  <marcus.shawcroft@arm.com>
32844
32845         PR target/61633
32846         * config/aarch64/aarch64.md (*aarch64_ashr_sisd_or_int_<mode>3):
32847         Add alternative; make early clobber.  Adjust both split patterns
32848         to use operand 0 as the working register.
32849
32850 2014-06-30  Jakub Jelinek  <jakub@redhat.com>
32851
32852         * ira-build.c (sort_conflict_id_map): Don't call qsort if num is 0,
32853         as ira_object_id_map might be NULL, or 1.
32854
32855 2014-06-30  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
32856
32857         * loop-invariant.c (get_inv_cost): Handle register class.
32858         (gain_for_invariant): Check the register pressure of the inv
32859         and its overlapped register class, other than all.
32860
32861 2014-06-30  Gerald Pfeifer  <gerald@pfeifer.com>
32862
32863         * doc/invoke.texi (Optimize Options): Fix descriptions of
32864         ipa-cp-loop-hint-bonus and ipa-cp-array-index-hint-bonus.
32865
32866 2014-06-29  David Wohlferd <dw@LimeGreenSocks.com>
32867
32868         * doc/extend.texi (Function Attributes): Update 'naked' attribute
32869         documentation.
32870
32871 2014-06-29  Tobias Grosser <tobias@grosser.es>
32872
32873         PR bootstrap/61650
32874         * graphite-isl-ast-to-gimple.c: Add missing guards.
32875
32876 2014-06-29  Roman Gareev  <gareevroman@gmail.com>
32877
32878         * Makefile.in: Add the compilation of graphite-isl-ast-to-gimple.o.
32879         * common.opt: Add new switch fgraphite-code-generator=[isl|cloog].
32880         * flag-types.h: Add new enum fgraphite_generator.
32881         * graphite-isl-ast-to-gimple.c: New.
32882         * graphite-isl-ast-to-gimple.h: New.
32883         * graphite.c (graphite_transform_loops): Add choice of Graphite
32884         code generator, which depends on flag_graphite_code_gen.
32885
32886 2014-06-29  Roman Gareev  <gareevroman@gmail.com>
32887
32888         * graphite-dependences.c (subtract_commutative_associative_deps):
32889         Add NULL checking of the following variables: must_raw_no_source,
32890         may_raw_no_source, must_war_no_source, may_war_no_source,
32891         must_waw_no_source, may_waw_no_source, must_raw, may_raw,
32892         must_war, may_war, must_waw, may_waw.
32893
32894 2014-06-29  Roman Gareev  <gareevroman@gmail.com>
32895
32896         * graphite-clast-to-gimple.c: gloog is renamed to
32897         graphite_regenerate_ast_cloog.  gloog_error is renamed to
32898         graphite_regenerate_error.
32899         * graphite-clast-to-gimple.h: The definition of the struct
32900         bb_pbb_def is moved to graphite-htab.h.
32901         Add inclusion of the hash-table.h.
32902         * graphite-htab.h: The declaration of the function gloog is moved
32903         to graphite-clast-to-gimple.h and renamed to
32904         graphite_regenerate_ast_cloog.
32905         * graphite.c (graphite_transform_loops): gloog is renamed
32906         to graphite_regenerate_ast_cloog.
32907
32908 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32909
32910         * tree-streamer-out.c (pack_ts_type_common_value_fields): Stream if
32911         type is complete.
32912         (write_ts_type_common_tree_pointers): Do not stream fields not set
32913         for incomplete types; do not stream duplicated fields for variants;
32914         sanity check that variant and type match.
32915         (write_ts_type_non_common_tree_pointers): Likewise.
32916         * tree-streamer-in.c (unpack_ts_type_common_value_fields): Mark in
32917         TYPE_SIZE whether type is complete.
32918         (lto_input_ts_type_common_tree_pointers): Do same changes as in
32919         write_ts_type_common_tree_pointers
32920         (lto_input_ts_type_non_common_tree_pointers): Likewise.
32921
32922 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32923
32924         * cgraph.c (dump_cgraph_node): Dump init&fini priorities.
32925
32926 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32927
32928         * tree-inline.c (remap_type_1): Do not duplicate fields
32929         that are shared in between type and its main variant.
32930
32931 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32932
32933         * ipa-prop.c (ipa_set_jf_known_type): Record always the main variant
32934         of the type.
32935         (ipa_set_ancestor_jf) Likewise.
32936         (check_stmt_for_type_change): Check that we work on main variant.
32937         (detect_type_change): Look into main variant.
32938         (compute_known_type_jump_func): Check that main variant has BINFO.
32939
32940 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32941
32942         * ipa-devirt.c (set_type_binfo): New function.
32943         (add_type_duplicate): Use it.
32944         (get_odr_type): Sanity check that binfos points to main variants.
32945         (get_class_context): Be sure the context's outer_type is main variant.
32946         (contains_type_p): Walk main variant.
32947         (get_polymorphic_call_info_for_decl): Set outer_type to be
32948         main variant.
32949         (get_polymorphic_call_info): Likewise.
32950         (possible_polymorphic_call_targets): Sanity check that we operate
32951         on main variant.
32952
32953 2014-06-28  Jan Hubicka  <hubicka@ucw.cz>
32954
32955         * stor-layout.c (finish_builtin_struct): Copy fields into the variants.
32956
32957 2014-06-28  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
32958
32959         * config/rs6000/rs6000.c (rs6000_aggregate_candidate): Revert
32960         accidental change due to wide-int branch merge.
32961
32962 2014-06-27  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
32963
32964         * configure.ac (gcc_cv_as_compress_debug): Check for assembler
32965         compressed debug support.
32966         (gcc_cv_ld_compress_debug): Check for linker compressed debug support.
32967         * configure: Regenerate.
32968         * config.in: Regenerate.
32969         * common.opt (compressed_debug_sections): New enum.
32970         (gz, gz=): New options.
32971         * gcc.c (LINK_COMPRESS_DEBUG_SPEC, ASM_COMPRESS_DEBUG_SPEC): Define.
32972         (LINK_COMMAND_SPEC): Invoke LINK_COMPRESS_DEBUG_SPEC.
32973         (asm_options): Invoke ASM_COMPRESS_DEBUG_SPEC.
32974         * config/darwin.h (LINK_COMMAND_SPEC_A): Invoke
32975         LINK_COMPRESS_DEBUG_SPEC.
32976         * config/i386/djgpp.h (LINK_COMMAND_SPEC): Likewise.
32977         * opts.c (common_handle_option): Handle OPT_gz, OPT_gz_.
32978         * doc/invoke.texi (Option Summary, Debugging Options): Add -gz[=type].
32979         (Debugging Options): Document -gz[=type].
32980
32981 2014-06-27  Martin Jambor  <mjambor@suse.cz>
32982
32983         PR ipa/61160
32984         * cgraphclones.c (duplicate_thunk_for_node): Removed parameter
32985         args_to_skip, use those from node instead.  Copy args_to_skip and
32986         combined_args_to_skip from node to the new thunk.
32987         (redirect_edge_duplicating_thunks): Removed parameter args_to_skip.
32988         (cgraph_create_virtual_clone): Moved computation of
32989         combined_args_to_skip...
32990         (cgraph_clone_node): ...here, simplify it to bitmap_ior..
32991
32992 2014-06-27  trevor Saunders  <tsaunders@mozilla.com>
32993
32994         * config/i386/winnt.c (i386_pe_section_type_flags): Remove
32995         redundant diagnostic machinary.
32996
32997 2014-06-27  Richard Biener  <rguenther@suse.de>
32998
32999         * tree-ssa-math-opts.c (bswap_replace): Fix
33000         SLOW_UNALIGNED_ACCESS test to only apply to unaligned object.
33001
33002 2014-06-27  Martin Liska  <mliska@suse.cz>
33003
33004         * gimple.h (gimple_location_safe): New function introduced.
33005         * cgraphunit.c (walk_polymorphic_call_targets): Usage
33006         of gimple_location_safe replaces gimple_location.
33007         (gimple_fold_call): Likewise.
33008         * ipa-devirt.c (ipa_devirt): Likewise.
33009         * ipa-prop.c (ipa_make_edge_direct_to_target): Likewise.
33010         * ipa.c (walk_polymorphic_call_targets): Likewise.
33011         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children): Likewise.
33012
33013 2014-06-27  Jakub Jelinek  <jakub@redhat.com>
33014
33015         PR tree-optimization/57233
33016         PR tree-optimization/61299
33017         * tree-vect-generic.c (get_compute_type, count_type_subparts): New
33018         functions.
33019         (expand_vector_operations_1): Use them.  If {L,R}ROTATE_EXPR
33020         would be lowered to scalar shifts, check if corresponding
33021         shifts and vector BIT_IOR_EXPR are supported and don't lower
33022         or lower just to narrower vector type in that case.
33023         * expmed.c (expand_shift_1): Fix up handling of vector
33024         shifts and rotates.
33025
33026 2014-06-26  Uros Bizjak  <ubizjak@gmail.com>
33027
33028         PR target/61586
33029         * config/alpha/alpha.c (alpha_handle_trap_shadows): Handle BARRIER RTX.
33030
33031 2014-06-26  Jan Hubicka  <hubicka@ucw.cz>
33032
33033         * doc/invoke.texi (-fsemantic-interposition): Document.
33034         * common.opt (fsemantic-interposition): New flag.
33035         * varasm.c (decl_replaceable_p): Use it.
33036
33037 2014-06-26  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
33038
33039         PR target/61542
33040         * config/rs6000/vsx.md (vsx_extract_v4sf): Fix bug with element
33041         extraction other than index 3.
33042
33043 2014-06-26  Teresa Johnson  <tejohnson@google.com>
33044
33045         * doc/invoke.texi: Fix typo.
33046         * dumpfile.c: Add support for documented -fdump-* options
33047         optimized/missed/note/optall.
33048
33049 2014-06-26  Martin Jambor  <mjambor@suse.cz>
33050
33051         * params.def (PARAM_ALLOW_LOAD_DATA_RACES)
33052         (PARAM_ALLOW_PACKED_LOAD_DATA_RACES)
33053         (PARAM_ALLOW_PACKED_STORE_DATA_RACES): Removed.
33054         (PARAM_ALLOW_STORE_DATA_RACES): Set default to zero.
33055         * opts.c (default_options_optimization): Set
33056         PARAM_ALLOW_STORE_DATA_RACES to one at -Ofast.
33057         * doc/invoke.texi (allow-load-data-races)
33058         (allow-packed-load-data-races, allow-packed-store-data-races): Removed.
33059         (allow-store-data-races): Document the new default.
33060
33061 2014-06-26  Martin Jambor  <mjambor@suse.cz>
33062
33063         * ipa-prop.c (ipa_impossible_devirt_target): No longer static,
33064         renamed to ipa_impossible_devirt_target.  Fix typo.
33065         * ipa-prop.h (ipa_impossible_devirt_target): Declare.
33066         * ipa-cp.c (ipa_get_indirect_edge_target_1): Use
33067         ipa_impossible_devirt_target.
33068
33069 2014-06-26  Richard Biener  <rguenther@suse.de>
33070
33071         PR tree-optimization/61607
33072         * tree-ssa-copy.c (copy_prop_visit_phi_node): Adjust comment
33073         explaining why we restrict copies on loop depth.
33074         * tree-ssa-dom.c (cprop_operand): Remove restriction on
33075         on loop depth.
33076         (record_equivalences_from_phis): Instead add it here.
33077
33078 2014-06-26  Bernd Schmidt  <bernds@codesourcery.com>
33079
33080         * Makefile.in (COLLECT2_OBJS): Add collect-utils.o.
33081         (LTO_WRAPPER_OBJS): New variable.
33082         (lto-wrapper$(exeext)): Use it.
33083         * collect2.c: Include "collect-utils.h".
33084         (verbose, debug): Remove variables.
33085         (at_file_supplied): No longer static.
33086         (tool_name): New variable.
33087         (do_wait, fork_execute, maybe_unlink): Don't declare.
33088         (tool_cleanup): No longer static.
33089         (notice): Remove function.
33090         (maybe_run_lto_and_relink, main, do_dsymutil): Add new arg to
33091         fork_execute calls.
33092         (collect_wait, do_wait, collect_execute): Remove functions.
33093         (maybe_unlink): No longer static.
33094         * collect2.h (verbose, debug): Don't declare.
33095         (at_file_supplied): Declare.
33096         * collect-utils.c (utils_cleanup): New arg from_signal.  All callers
33097         changed.
33098         (collect_execute): Replace with implementation from collect2, plus a
33099         new arg use_atfile.  All callers changed.
33100         (collect_wait): Replace with implementation from collect2.
33101         (maybe_unlink_file): Remove function.
33102         (fork_execute): Replace with implementation from collect2, plus a
33103         new arg use_atfile.  All callers changed.
33104         (do_wait): Add call to utils_cleanup to the error path.
33105         * collect-utils.h (collect_execute, fork_execute, utils_cleanup)
33106         (tool_cleanup): Adjust declarations.
33107         * lto-wrapper.c (tool_cleanup): Add unused bool argument.
33108         * tlink.c: Include "collect-utils.h".
33109         (tlink_execute): New arg use_atfile.  All callers changed.
33110         (tlink_init, tlink_execute): Remove declarations.
33111
33112         * collect-utils.c (save_temps): New variable.
33113         (do_wait): Use it instead of debug.  Use fatal_error.
33114         * collect-utils.h (save_temps): Declare.
33115         * collect2.c (verbose): Rename from vflag.  All uses changed.
33116         (tool_cleanup): New function, copied from collect_atexit.
33117         (collect_atexit, handler): Just call it.
33118         * collect2.h (verbose): Declaration renamed from vflag.
33119         * lto-wrapper.c (maybe_unlink, run_gcc): Use save_temps instead of
33120         debug.
33121
33122         * Makefile.in (ALL_HOST_BACKEND_OBJS): Add collect-utils.o.
33123         (lto-wrapper$(exeext)): Link with collect-utils.o.
33124         * collect-utils.c: New file.
33125         * collect-utils.h: New file.
33126         * lto-wrapper.c: Include "collect-utils.h".
33127         (args_name): Delete variable.
33128         (tool_name): New variable.
33129         (tool_cleanup): New function.
33130         (maybe_unlink): Renamed from maybe_unlink_file.  All callers changed.
33131         (lto_wrapper_cleanup, fatal_signal, collect_execute, collect_wait)
33132         (fork_execute): Remove functions.
33133
33134 2014-06-26  Nick Clifton  <nickc@redhat.com>
33135
33136         * config/frv/frv.c (frv_in_small_data_p): Remove redundant assert.
33137
33138         * doc/extend.texi (Function Attributes): Fix typo in description
33139         of RX vector attribute.
33140
33141 2014-06-26  James Greenhalgh  <james.greenhalgh@arm.com>
33142
33143         * config.gcc (supported_defaults): Error when passing either
33144         --with-tune or --with-arch in conjunction with --with-cpu for ARM.
33145
33146 2014-06-26  Richard Biener  <rguenther@suse.de>
33147
33148         * tree-ssa-dom.c (cprop_operand): Remove restriction on
33149         propagating volatile pointers.
33150
33151 2014-06-26  Richard Biener  <rguenther@suse.de>
33152
33153         PR tree-optimization/61607
33154         * tree-ssa-threadupdate.c (ssa_redirect_edges): Cancel the
33155         loop if we redirected its latch edge.
33156         (thread_block_1): Do not cancel loops prematurely.
33157
33158 2014-06-25  Jan Hubicka  <hubicka@ucw.cz>
33159
33160         * toplev.c (backend_init_target): Move init_emit_regs and
33161         init_regs to...
33162         (backend_init) ... here; skip ira_init_once and backend_init_target.
33163         (target_reinit) ... and here; clear
33164         this_target_rtl->lang_dependent_initialized.
33165         (lang_dependent_init_target): Clear
33166         this_target_rtl->lang_dependent_initialized;
33167         break out rtl initialization to ...
33168         (initialize_rtl): ... here; call also backend_init_target
33169         and ira_init_once.
33170         * toplev.h (initialize_rtl): New function.
33171         * function.c: Include toplev.h
33172         (init_function_start): Call initialize_rtl.
33173         * rtl.h (target_rtl): Add target_specific_initialized,
33174         lang_dependent_initialized.
33175
33176 2014-06-25  Paul Gortmaker  <paul.gortmaker@windriver.com>
33177             Jakub Jelinek  <jakub@redhat.com>
33178
33179         * gcc.c (set_multilib_dir): Malloc "." pointer as well.
33180
33181 2014-06-25  Tom de Vries  <tom@codesourcery.com>
33182
33183         * config/arm/arm.c (arm_emit_call_insn): Remove clobber of CC_REGNUM.
33184
33185 2014-06-25  Bernd Edlinger  <bernd.edlinger@hotmail.de>
33186
33187         * tree-ssa-forwprop.c (associate_plusminus): For widening conversions
33188         check for undefined overflow in (T)(P + A) - (T)P -> (T)A.
33189         Issue a strict overflow warning if appropriate.
33190
33191 2014-06-25  Martin Liska  <mliska@suse.cz>
33192
33193         IPA REF refactoring
33194         * Makefile.in: Removed header file (ipa-ref-inline.h).
33195         * cgraph.c (cgraph_turn_edge_to_speculative): New IPA REF function
33196         called.
33197         (cgraph_speculative_call_info): Likewise.
33198         (cgraph_for_node_thunks_and_aliases): Likewise.
33199         (cgraph_for_node_and_aliases): Likewise.
33200         (verify_cgraph_node): Likewise.
33201         * cgraph.h: Batch of IPA REF functions become member functions of
33202         symtab_node: add_reference, maybe_add_reference, clone_references,
33203         clone_referring, clone_reference, find_reference,
33204         remove_stmt_references, remove_all_references,
33205         remove_all_referring, dump_references, dump_referring,
33206         has_alias_p, iterate_reference, iterate_referring.
33207         * cgraphbuild.c (record_reference): New IPA REF function used.
33208         (record_type_list): Likewise.
33209         (record_eh_tables): Likewise.
33210         (mark_address): Likewise.
33211         (mark_load): Likewise.
33212         (mark_store): Likewise.
33213         (pass_build_cgraph_edges): Likewise.
33214         (rebuild_cgraph_edge): Likewise.
33215         (cgraph_rebuild_references): Likewise.
33216         (pass_remove_cgraph_callee_edges): Likewise.
33217         * cgraphclones.c (cgraph_clone_node): Likewise.
33218         (cgraph_create_virtual_clone): Likewise.
33219         (cgraph_materialize_clone): Likewise.
33220         (cgraph_materialize_all_clones): Likewise.
33221         * cgraphunit.c (cgraph_reset_node): Likewise.
33222         (cgraph_reset_node): Likewise.
33223         (analyze_function): Likewise.
33224         (assemble_thunks_and_aliases): Likewise.
33225         (expand_function): Likewise.
33226         * ipa-comdats.c (propagate_comdat_group): Likewise.
33227         (enqueue_references): Likewise.
33228         * ipa-cp.c (ipcp_discover_new_direct_edges): Likewise.
33229         (create_specialized_node): Likewise.
33230         * ipa-devirt.c (referenced_from_vtable_p): Likewise.
33231         * ipa-inline-transform.c (can_remove_node_now_p_1): Likewise.
33232         * ipa-inline.c (reset_edge_caches): Likewise.
33233         (update_caller_keys): Likewise.
33234         (execute): Likewise.
33235         * ipa-prop.c (remove_described_reference): Likewise.
33236         (propagate_controlled_uses): Likewise.
33237         (ipa_edge_duplication_hook): Likewise.
33238         (ipa_modify_call_arguments): Likewise.
33239         * ipa-pure-const.c (propagate_pure_const): Likewise.
33240         * ipa-ref-inline.h: Header file removed, functions moved
33241         to symtab_node class.
33242         * ipa-ref.c (remove_reference): New class member function.
33243         (cannot_lead_to_return): New class member function.
33244         (referring_ref_list): Likewise.
33245         (referred_ref_list): Likewise.
33246         Rest of functions moved to symtab_node class.
33247         * ipa-ref.h: New member functions remove_reference,
33248         cannot_lead_to_return, referring_ref_list, referred_ref_list added
33249         to ipa_ref class.
33250         ipa_ref_list class has new member functions: first_reference,
33251         first_referring, clear, nreferences.
33252         * ipa-reference.c (analyze_function): New IPA REF function used.
33253         (write_node_summary_p): Likewise.
33254         (ipa_reference_write_optimization_summary): Likewise.
33255         * ipa-split.c (split_function): Likewise.
33256         * ipa-utils.c (ipa_reverse_postorder): Likewise.
33257         * ipa-visibility.c (cgraph_non_local_node_p_1): Likewise.
33258         (function_and_variable_visibility): Likewise.
33259         * ipa.c (has_addr_references_p): Likewise.
33260         (process_references): Argument type changed.
33261         (symtab_remove_unreachable_nodes): New IPA REF function used.
33262         (process_references): Likewise.
33263         (set_writeonly_bit): Likewise.
33264         * lto-cgraph.c: Implementation of new symtab_node member functions
33265         that uses new IPA REF functions.
33266         * lto-streamer-in.c (fixup_call_stmt_edges_1): New IPA REF
33267         function used.
33268         * lto-streamer-out.c (output_symbol_p): Likewise.
33269         * lto-streamer.h (referenced_from_this_partition_p): Argument type
33270         changed.
33271         * symtab.c: Implementation of new IPA REF API.
33272         * trans-mem.c (ipa_tm_create_version_alias): New IPA REF function used.
33273         (ipa_tm_create_version): Likewise.
33274         (ipa_tm_execute): Likewise.
33275         * tree-emutls.c (gen_emutls_addr): Likewise.
33276         * tree-inline.c (copy_bb): Likewise.
33277         (delete_unreachable_blocks_update_callgraph): Likewise.
33278         * varpool.c (varpool_remove_unreferenced_decls): Likewise.
33279         (varpool_for_node_and_aliases): Likewise.
33280
33281 2014-06-25  Trevor Saunders  <tsaunders@mozilla.com>
33282
33283         * config/i386/winnt.c (i386_find_on_wrapper_list): Fix typo.
33284
33285 2014-06-25  Trevor Saunders  <tsaunders@mozilla.com>
33286
33287         PR bootstrap/61598
33288         * fold-const.c (fold_checksum_tree): Use a hash_table of const
33289         tree_node * instead of tree_node *.
33290         (fold): Adjust.
33291         (print_fold_checksum): Likewise.
33292         (fold_check_failed): Likewise.
33293         (debug_fold_checksum): Likewise.
33294         (fold_build1_stat_loc): Likewise.
33295         (fold_build2_stat_loc): Likewise.
33296         (fold_build3_stat_loc): Likewise.
33297         (fold_build_call_array_loc): Likewise.
33298
33299 2014-06-25  David Edelsohn  <dje.gcc@gmail.com>
33300
33301         * config/rs6000/xcoff.h (ASM_DECLARE_FUNCTION_NAME): Replace
33302         implementation with call to...
33303         * config/rs6000/rs6000.c (rs6000_xcoff_declare_function_name): New
33304         function.
33305         * config/rs6000/rs6000-protos.h (rs6000_xcoff_declare_function_name):
33306         Declare.
33307
33308 2014-06-25  Marc Glisse  <marc.glisse@inria.fr>
33309
33310         PR tree-optimization/57742
33311         * tree-ssa-strlen.c (handle_builtin_memset): Update strinfo
33312         after replacing the statement.
33313
33314 2014-06-25  Nick Clifton  <nickc@redhat.com>
33315
33316         * config/v850/v850.c (GHS_default_section_names): Change to const
33317         char * type.
33318         (GHS_current_section_names): Likewise.
33319         (v850_insert_attributes): Do not build strings, just assign the
33320         names directly.  Change the type of 'chosen_section' to const
33321         char*.
33322         * config/v850/v850-c.c (ghs_pragma_section): Assign the alias
33323         directly to the array entry.
33324         * config/v850/v850.h (GHS_default_section_names): Change to const
33325         char * type.
33326         (GHS_current_section_names): Likewise.
33327
33328 2014-06-25  Jakub Jelinek  <jakub@redhat.com>
33329
33330         * langhooks-def.h (LANG_HOOKS_OMP_CLAUSE_LINEAR_CTOR): Define.
33331         (LANG_HOOKS_DECLS): Add it.
33332         * gimplify.c (gimplify_omp_for): Make sure OMP_CLAUSE_LINEAR_STEP
33333         has correct type.
33334         * tree.h (OMP_CLAUSE_LINEAR_ARRAY): Define.
33335         * langhooks.h (struct lang_hooks_for_decls): Add
33336         omp_clause_linear_ctor hook.
33337         * omp-low.c (lower_rec_input_clauses): Set max_vf even if
33338         OMP_CLAUSE_LINEAR_ARRAY is set.  Don't fold_convert
33339         OMP_CLAUSE_LINEAR_STEP.  For OMP_CLAUSE_LINEAR_ARRAY in
33340         combined simd loop use omp_clause_linear_ctor hook.
33341
33342 2014-06-24  Cong Hou  <congh@google.com>
33343
33344         * tree-vect-patterns.c (vect_recog_sad_pattern): New function for SAD
33345         pattern recognition.
33346         (type_conversion_p): PROMOTION is true if it's a type promotion
33347         conversion, and false otherwise.  Return true if the given expression
33348         is a type conversion one.
33349         * tree-vectorizer.h: Adjust the number of patterns.
33350         * tree.def: Add SAD_EXPR.
33351         * optabs.def: Add sad_optab.
33352         * cfgexpand.c (expand_debug_expr): Add SAD_EXPR case.
33353         * expr.c (expand_expr_real_2): Likewise.
33354         * gimple-pretty-print.c (dump_ternary_rhs): Likewise.
33355         * gimple.c (get_gimple_rhs_num_ops): Likewise.
33356         * optabs.c (optab_for_tree_code): Likewise.
33357         * tree-cfg.c (estimate_operator_cost): Likewise.
33358         * tree-ssa-operands.c (get_expr_operands): Likewise.
33359         * tree-vect-loop.c (get_initial_def_for_reduction): Likewise.
33360         * config/i386/sse.md: Add SSE2 and AVX2 expand for SAD.
33361         * doc/generic.texi: Add document for SAD_EXPR.
33362         * doc/md.texi: Add document for ssad and usad.
33363
33364 2014-06-24  Trevor Saunders  <tsaunders@mozilla.com>
33365
33366         * config/i386/winnt.c (i386_pe_section_type_flags): Fix const
33367         qualification in cast.
33368
33369 2014-06-24  Jan Hubicka  <hubicka@ucw.cz>
33370
33371         * tree.c (find_decls_types_r): Do not check DECL_VINDEX for TYPE_DECL.
33372         * tree.h (DECL_VINDEX, DECL_SAVED_TREE): Restrict to DECL_FUNCTION.
33373         * tree-core.h (tree_decl_non_common): Move saved_tree and vindex...
33374         (tree_function_decl): ... here.
33375         * tree-streamer-out.c (write_ts_decl_non_common_tree_pointers): Move
33376         streaming of vindex to ...
33377         (write_ts_function_decl_tree_pointers): ... here.
33378         * tree-streamer-in.c (lto_input_ts_decl_non_common_tree_pointers):
33379         Do not stream DECL_VINDEX.
33380         (lto_input_ts_function_decl_tree_pointers): Stream it here.
33381
33382 2014-06-24  Catherine Moore  <clm@codesourcery.com>
33383             Sandra Loosemore  <sandra@codesourcery.com>
33384
33385         * config/mips/mips.c (mips_order_regs_for_local_alloc): Delete.
33386         * config/mips/mips.h (ADJUST_REG_ALLOC_ORDER): Delete.
33387         * config/mips/mips-protos.h (mips_order_regs_for_local_alloc): Delete.
33388
33389 2014-06-24  Marc Glisse  <marc.glisse@inria.fr>
33390
33391         * doc/invoke.texi (Warning Options): Remove duplicated
33392         -Wmaybe-uninitialized.
33393
33394 2014-06-24  Marc Glisse  <marc.glisse@inria.fr>
33395
33396         PR tree-optimization/57742
33397         * tree-ssa-strlen.c (get_string_length): Ignore malloc.
33398         (handle_builtin_malloc, handle_builtin_memset): New functions.
33399         (strlen_optimize_stmt): Call them.
33400         * passes.def: Move strlen after loop+dom but before vrp.
33401
33402 2014-06-24  Jakub Jelinek  <jakub@redhat.com>
33403
33404         PR target/61570
33405         * config/i386/driver-i386.c (host_detect_local_cpu): For unknown
33406         model family 6 CPU with has_longmode never use a CPU without
33407         64-bit support.
33408
33409 2014-06-24  H.J. Lu  <hongjiu.lu@intel.com>
33410
33411         PR target/61570
33412         * config/i386/driver-i386.c (host_detect_local_cpu): Revert
33413         the last change.
33414
33415 2014-06-24  Trevor Saunders  <tsaunders@mozilla.com>
33416
33417         * alloc-pool.c (alloc_pool_hash): Use hash_map instead of hash_table.
33418         * dominance.c (iterate_fix_dominators): Use hash_map instead of
33419         pointer_map.
33420         * hash-map.h: New file.
33421         * ipa-comdats.c: Use hash_map instead of pointer_map.
33422         * ipa.c: Likewise.
33423         * lto-section-out.c: Adjust.
33424         * lto-streamer.h: Replace pointer_map with hash_map.
33425         * symtab.c (verify_symtab): Likewise.
33426         * tree-ssa-strlen.c (decl_to_stridxlist_htab): Likewise.
33427         * tree-ssa-uncprop.c (val_ssa_equiv): Likewise.
33428         * tree-streamer.h: Likewise.
33429         * tree-streamer.c: Adjust.
33430         * pointer-set.h: Remove pointer_map.
33431
33432 2014-06-24  Trevor Saunders  <tsaunders@mozilla.com>
33433
33434         * hash-table.h: Add a template arg to choose between storing values
33435         and storing pointers to values, and then provide partial
33436         specializations for both.
33437         * tree-browser.c (tree_upper_hasher): Provide the type the hash table
33438         should store, not the type values should point to.
33439         * tree-into-ssa.c (var_info_hasher): Likewise.
33440         * tree-ssa-dom.c (expr_elt_hasher): Likewise.
33441         * tree-complex.c: Adjust.
33442         * tree-hasher.h (int_tree_hasher): store int_tree_map in the hash
33443         table instead of int_tree_map *.
33444         * tree-parloops.c: Adjust.
33445         * tree-ssa-reassoc.c (ocount_hasher): Don't lie to hash_map about what
33446         type is being stored.
33447         * tree-vectorizer.c: Adjust.
33448
33449 2014-06-24  Trevor Saunders  <tsaunders@mozilla.com>
33450
33451         * hash-table.h: Remove a layer of indirection from hash_table so that
33452         it contains the hash table's data instead of a pointer to the data.
33453         * alloc-pool.c, asan.c, attribs.c, bitmap.c, cfg.c,
33454         config/arm/arm.c, config/i386/winnt.c, config/ia64/ia64.c,
33455         config/mips/mips.c, config/sol2.c, coverage.c, cselib.c,
33456         data-streamer-out.c, dse.c, dwarf2cfi.c, dwarf2out.c, except.c,
33457         fold-const.c, gcse.c, ggc-common.c,
33458         gimple-ssa-strength-reduction.c, gimplify.c,
33459         graphite-clast-to-gimple.c, graphite-dependences.c,
33460         graphite-htab.h, graphite.c, haifa-sched.c, ipa-devirt.c,
33461         ipa-profile.c, ira-color.c, ira-costs.c, loop-invariant.c,
33462         loop-iv.c, loop-unroll.c, lto-streamer-in.c, lto-streamer-out.c,
33463         lto-streamer.c, lto-streamer.h, passes.c, plugin.c,
33464         postreload-gcse.c, sese.c, statistics.c, store-motion.c,
33465         trans-mem.c, tree-browser.c, tree-cfg.c, tree-complex.c,
33466         tree-eh.c, tree-into-ssa.c, tree-parloops.c, tree-sra.c,
33467         tree-ssa-ccp.c, tree-ssa-coalesce.c, tree-ssa-dom.c,
33468         tree-ssa-live.c, tree-ssa-loop-im.c,
33469         tree-ssa-loop-ivopts.c, tree-ssa-phiopt.c, tree-ssa-pre.c,
33470         tree-ssa-reassoc.c, tree-ssa-sccvn.c, tree-ssa-strlen.c,
33471         tree-ssa-structalias.c, tree-ssa-tail-merge.c,
33472         tree-ssa-threadupdate.c, tree-ssa-uncprop.c,
33473         tree-vect-data-refs.c, tree-vect-loop.c, tree-vectorizer.c,
33474         tree-vectorizer.h, valtrack.c, valtrack.h, var-tracking.c,
33475         vtable-verify.c, vtable-verify.h: Adjust.
33476
33477 2014-06-24  Richard Biener  <rguenther@suse.de>
33478
33479         PR tree-optimization/61572
33480         * tree-ssa-sink.c (statement_sink_location): Do not sink
33481         loads from hard registers.
33482
33483 2014-06-24  Jakub Jelinek  <jakub@redhat.com>
33484
33485         * gimplify.c (gimplify_omp_for): For #pragma omp for simd iterator
33486         not mentioned in clauses use private clause if the iterator is
33487         declared in #pragma omp for simd, and when adding lastprivate
33488         instead, add it to the outer #pragma omp for too.  Diagnose
33489         if the variable is private in outer context.  For simd collapse > 1
33490         loops, replace all iterators with temporaries.
33491         * omp-low.c (lower_rec_input_clauses): Handle LINEAR clause the
33492         same even in collapse > 1 loops.
33493
33494         * gimplify.c (gimplify_scan_omp_clauses) <case OMP_CLAUSE_MAP,
33495         OMP_CLAUSE_TO, OMP_CLAUSE_FROM): Make sure OMP_CLAUSE_SIZE is
33496         non-NULL.
33497         <case OMP_CLAUSE_ALIGNED>: Gimplify OMP_CLAUSE_ALIGNED_ALIGNMENT.
33498         (gimplify_adjust_omp_clauses_1): Make sure OMP_CLAUSE_SIZE is
33499         non-NULL.
33500         (gimplify_adjust_omp_clauses): Likewise.
33501         * omp-low.c (lower_rec_simd_input_clauses,
33502         lower_rec_input_clauses, expand_omp_simd): Handle non-constant
33503         safelen the same as safelen(1).
33504         * tree-nested.c (convert_nonlocal_omp_clauses,
33505         convert_local_omp_clauses): Handle OMP_CLAUSE_ALIGNED.  For
33506         OMP_CLAUSE_{MAP,TO,FROM} if not decl use walk_tree.
33507         (convert_nonlocal_reference_stmt, convert_local_reference_stmt):
33508         Fixup handling of GIMPLE_OMP_TARGET.
33509         (convert_tramp_reference_stmt, convert_gimple_call): Handle
33510         GIMPLE_OMP_TARGET.
33511
33512 2014-06-24  Chung-Lin Tang  <cltang@codesourcery.com>
33513
33514         PR tree-optimization/61554
33515         * tree-ssa-propagate.c: Include "bitmap.h".
33516         (substitute_and_fold_dom_walker): Add 'bitmap need_eh_cleanup' member,
33517         properly update constructor/destructor.
33518         (substitute_and_fold_dom_walker::before_dom_children):
33519         Remove call to gimple_purge_dead_eh_edges, add bb->index to
33520         need_eh_cleaup instead.
33521         (substitute_and_fold): Call gimple_purge_all_dead_eh_edges on
33522         need_eh_cleanup.
33523
33524 2014-06-23  Jan Hubicka  <hubicka@ucw.cz>
33525
33526         * varpool.c (dump_varpool_node): Dump used_by_single_function.
33527         * tree-pass.h (make_pass_ipa_single_use): New pass.
33528         * cgraph.h (used_by_single_function): New flag.
33529         * lto-cgraph.c (lto_output_varpool_node, input_varpool_node):
33530         Stream it.
33531         * passes.def (pass_ipa_single_use): Scedule.
33532         * ipa.c (BOTTOM): New macro.
33533         (meet): New function
33534         (propagate_single_user): New function.
33535         (ipa_single_use): New function.
33536         (pass_data_ipa_single_use): New pass.
33537         (pass_ipa_single_use): New pass.
33538         (pass_ipa_single_use::gate): New gate.
33539         (make_pass_ipa_single_use): New function.
33540
33541 2014-06-23  Kai Tietz  <ktietz@redhat.com>
33542
33543         PR target/39284
33544         * passes.def (peephole2): Move peephole2 pass before sched2 pass.
33545         * config/i386/i386.md (peehole2): Combine memories and indirect jumps.
33546
33547 2014-06-23  Richard Biener  <rguenther@suse.de>
33548
33549         * tree-ssa-loop.c (gate_loop): New function.
33550         (pass_tree_loop::gate): Call it.
33551         (pass_data_tree_no_loop, pass_tree_no_loop,
33552         make_pass_tree_no_loop): New.
33553         * tree-vectorizer.c: Include tree-scalar-evolution.c
33554         (pass_slp_vectorize::execute): Initialize loops and SCEV if
33555         required.
33556         (pass_slp_vectorize::clone): New method.
33557         * timevar.def (TV_TREE_NOLOOP): New.
33558         * tree-pass.h (make_pass_tree_no_loop): Declare.
33559         * passes.def (pass_tree_no_loop): New pass group with
33560         SLP vectorizer.
33561
33562 2014-06-23  H.J. Lu  <hongjiu.lu@intel.com>
33563
33564         PR target/61570
33565         * config/i386/driver-i386.c (host_detect_local_cpu): Set arch
33566         to x86-64 if a 32-bit processor supports SSE2 and 64-bit.
33567
33568 2014-06-23  James Greenhalgh  <james.greenhalgh@arm.com>
33569
33570         * config/aarch64/aarch64.md (addsi3_aarch64): Set "simd" attr to
33571         "yes" where needed.
33572
33573 2014-06-23  Alan Modra  <amodra@gmail.com>
33574
33575         PR bootstrap/61583
33576         * tree-vrp.c (remove_range_assertions): Do not set is_unreachable
33577         to zero on debug statements.
33578
33579 2014-06-23  Alan Lawrence  <alan.lawrence@arm.com>
33580
33581         PR target/60825
33582         * config/aarch64/aarch64-builtins.c (aarch64_types_unop_qualifiers):
33583         Ignore third operand if present by marking qualifier_internal.
33584
33585         * config/aarch64/aarch64-simd-builtins.def (abs): Comment.
33586
33587         * config/aarch64/arm_neon.h (int64x1_t, uint64x1_t): Typedef to GCC
33588         vector extension.
33589         (aarch64_vget_lane_s64, aarch64_vdup_lane_s64,
33590         arch64_vdupq_lane_s64, aarch64_vdupq_lane_u64): Remove macro.
33591         (vqadd_s64, vqadd_u64, vqsub_s64, vqsub_u64, vqneg_s64, vqabs_s64,
33592         vcreate_s64, vcreate_u64, vreinterpret_s64_f64, vreinterpret_u64_f64,
33593         vcombine_u64, vbsl_s64, vbsl_u64, vceq_s64, vceq_u64, vceqz_s64,
33594         vceqz_u64, vcge_s64, vcge_u64, vcgez_s64, vcgt_s64, vcgt_u64,
33595         vcgtz_s64, vcle_s64, vcle_u64, vclez_s64, vclt_s64, vclt_u64,
33596         vcltz_s64, vdup_n_s64, vdup_n_u64, vld1_s64, vld1_u64, vmov_n_s64,
33597         vmov_n_u64, vqdmlals_lane_s32, vqdmlsls_lane_s32,
33598         vqdmulls_lane_s32, vqrshl_s64, vqrshl_u64, vqrshl_u64, vqshl_s64,
33599         vqshl_u64, vqshl_n_s64, vqshl_n_u64, vqshl_n_s64, vqshl_n_u64,
33600         vqshlu_n_s64, vrshl_s64, vrshl_u64, vrshr_n_s64, vrshr_n_u64,
33601         vrsra_n_s64, vrsra_n_u64, vshl_n_s64, vshl_n_u64, vshl_s64,
33602         vshl_u64, vshr_n_s64, vshr_n_u64, vsli_n_s64, vsli_n_u64,
33603         vsqadd_u64, vsra_n_s64, vsra_n_u64, vsri_n_s64, vsri_n_u64,
33604         vst1_s64, vst1_u64, vtst_s64, vtst_u64, vuqadd_s64): Wrap existing
33605         logic in GCC vector extensions
33606
33607         (vpaddd_s64, vaddd_s64, vaddd_u64, vceqd_s64, vceqd_u64, vceqzd_s64
33608         vceqzd_u64, vcged_s64, vcged_u64, vcgezd_s64, vcgtd_s64, vcgtd_u64,
33609         vcgtzd_s64, vcled_s64, vcled_u64, vclezd_s64, vcltd_s64, vcltd_u64,
33610         vcltzd_s64, vqdmlals_s32, vqdmlsls_s32, vqmovnd_s64, vqmovnd_u64
33611         vqmovund_s64, vqrshld_s64, vqrshld_u64, vqrshrnd_n_s64,
33612         vqrshrnd_n_u64, vqrshrund_n_s64, vqshld_s64, vqshld_u64,
33613         vqshld_n_u64, vqshrnd_n_s64, vqshrnd_n_u64, vqshrund_n_s64,
33614         vrshld_u64, vrshrd_n_u64, vrsrad_n_u64, vshld_n_u64, vshld_s64,
33615         vshld_u64, vslid_n_u64, vsqaddd_u64, vsrad_n_u64, vsrid_n_u64,
33616         vsubd_s64, vsubd_u64, vtstd_s64, vtstd_u64): Fix type signature.
33617
33618         (vabs_s64): Use GCC vector extensions; call __builtin_aarch64_absdi.
33619
33620         (vget_high_s64, vget_high_u64): Reimplement with GCC vector
33621         extensions.
33622
33623         (__GET_LOW, vget_low_u64): Wrap result using vcreate_u64.
33624         (vget_low_s64): Use __GET_LOW macro.
33625         (vget_lane_s64, vget_lane_u64, vdupq_lane_s64, vdupq_lane_u64): Use
33626         gcc vector extensions, add call to __builtin_aarch64_lane_boundsi.
33627         (vdup_lane_s64, vdup_lane_u64,): Add __builtin_aarch64_lane_bound_si.
33628         (vdupd_lane_s64, vdupd_lane_u64): Fix type signature, add
33629         __builtin_aarch64_lane_boundsi, use GCC vector extensions.
33630
33631         (vcombine_s64): Use GCC vector extensions; remove cast.
33632         (vqaddd_s64, vqaddd_u64, vqdmulls_s32, vqshld_n_s64, vqshlud_n_s64,
33633         vqsubd_s64, vqsubd_u64, vrshld_s64, vrshrd_n_s64, vrsrad_n_s64,
33634         vshld_n_s64, vshrd_n_s64, vslid_n_s64, vsrad_n_s64, vsrid_n_s64):
33635         Fix type signature; remove cast.
33636
33637 2014-06-23  Alan Lawrence  <alan.lawrence@arm.com>
33638
33639         PR target/60825
33640         * config/aarch64/aarch64.c (aarch64_simd_mangle_map): Add entry for
33641         V1DFmode.
33642         * config/aarch64/aarch64-builtins.c (aarch64_simd_builtin_type_mode):
33643         add V1DFmode
33644         (BUILTIN_VD1): New.
33645         (BUILTIN_VD_RE): Remove.
33646         (aarch64_init_simd_builtins): Add V1DF to modes/modenames.
33647         (aarch64_fold_builtin): Update reinterpret patterns, df becomes v1df.
33648         * config/aarch64/aarch64-simd-builtins.def (create): Make a v1df
33649         variant but not df.
33650         (vreinterpretv1df*, vreinterpret*v1df): New.
33651         (vreinterpretdf*, vreinterpret*df): Remove.
33652         * config/aarch64/aarch64-simd.md (aarch64_create,
33653         aarch64_reinterpret*): Generate V1DFmode pattern not DFmode.
33654         * config/aarch64/iterators.md (VD_RE): Include V1DF, remove DF.
33655         (VD1): New.
33656         * config/aarch64/arm_neon.h (float64x1_t): typedef with gcc extensions.
33657         (vcreate_f64): Remove cast, use v1df builtin.
33658         (vcombine_f64): Remove cast, get elements with gcc vector extensions.
33659         (vget_low_f64, vabs_f64, vceq_f64, vceqz_f64, vcge_f64, vgfez_f64,
33660         vcgt_f64, vcgtz_f64, vcle_f64, vclez_f64, vclt_f64, vcltz_f64,
33661         vdup_n_f64, vdupq_lane_f64, vld1_f64, vld2_f64, vld3_f64, vld4_f64,
33662         vmov_n_f64, vst1_f64): Use gcc vector extensions.
33663         (vget_lane_f64, vdupd_lane_f64, vmulq_lane_f64, ): Use gcc extensions,
33664         add range check using __builtin_aarch64_im_lane_boundsi.
33665         (vfma_lane_f64, vfmad_lane_f64, vfma_laneq_f64, vfmaq_lane_f64,
33666         vfms_lane_f64, vfmsd_lane_f64, vfms_laneq_f64, vfmsq_lane_f64): Fix
33667         type signature, use gcc vector extensions.
33668         (vreinterpret_p8_f64, vreinterpret_p16_f64, vreinterpret_f32_f64,
33669         vreinterpret_f64_f32, vreinterpret_f64_p8, vreinterpret_f64_p16,
33670         vreinterpret_f64_s8, vreinterpret_f64_s16, vreinterpret_f64_s32,
33671         vreinterpret_f64_s64, vreinterpret_f64_u8, vreinterpret_f64_u16,
33672         vreinterpret_f64_u32, vreinterpret_f64_u64, vreinterpret_s8_f64,
33673         vreinterpret_s16_f64, vreinterpret_s32_f64, vreinterpret_s64_f64,
33674         vreinterpret_u8_f64, vreinterpret_u16_f64, vreinterpret_u32_f64,
33675         vreinterpret_u64_f64): Use v1df builtin not df.
33676
33677 2014-06-23  James Greenhalgh  <james.greenhalgh@arm.com>
33678
33679         * config/aarch64/aarch64.md (*addsi3_aarch64): Add alternative in
33680         vector registers.
33681
33682 2014-06-23  Jan Hubicka  <hubicka@ucw.cz>
33683
33684         * lto-cgraph.c (lto_output_node, input_node): Set/get init/fini
33685         priority directly.
33686
33687 2014-06-23  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
33688
33689         * loop-invariant.c (pre_check_invariant_p): New function.
33690         (find_invariant_insn): Call pre_check_invariant_p.
33691
33692 2014-06-22  Richard Henderson  <rth@redhat.com>
33693
33694         PR target/61565
33695         * compare-elim.c (struct comparison): Add eh_note.
33696         (find_comparison_dom_walker::before_dom_children): Don't eliminate
33697         a redundant comparison in a different EH region.  Purge EH edges if
33698         necessary.
33699
33700 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33701
33702         * config/rs6000/rs6000.md (maybe_var_shift): New define_attr.
33703         (var_shift): Use it.
33704         (rotl<mode>3, *rotlsi3_64, *rotl<mode>3_dot, *rotl<mode>3_dot2,
33705         *rotlsi3_internal4, *rotlsi3_internal5, *rotlsi3_internal6,
33706         *rotlsi3_internal8le, *rotlsi3_internal8be, *rotlsi3_internal9le,
33707         *rotlsi3_internal9be, *rotlsi3_internal10le, *rotlsi3_internal10be,
33708         *rotlsi3_internal11le, *rotlsi3_internal11be, *rotlsi3_internal12le,
33709         *rotlsi3_internal12be, ashl<mode>3, *ashlsi3_64, *ashl<mode>3_dot,
33710         *ashl<mode>3_dot2, lshr<mode>3, *lshrsi3_64, *lshr<mode>3_dot,
33711         *lshr<mode>3_dot2, *ashr<mode>3, *ashrsi3_64, *ashr<mode>3_dot,
33712         *ashr<mode>3_dot2, *rotldi3_internal4, *rotldi3_internal5,
33713         *rotldi3_internal6, *rotldi3_internal7le, *rotldi3_internal7be,
33714         *rotldi3_internal8le, *rotldi3_internal8be, *rotldi3_internal9le,
33715         *rotldi3_internal9be, *rotldi3_internal10le, *rotldi3_internal10be,
33716         *rotldi3_internal11le, *rotldi3_internal11be, *rotldi3_internal12le,
33717         *rotldi3_internal12be, *rotldi3_internal13le, *rotldi3_internal13be,
33718         *rotldi3_internal14le, *rotldi3_internal14be, *rotldi3_internal15le,
33719         *rotldi3_internal15be): Use the new attribute.  Merge register and
33720         integer alternatives.
33721
33722 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33723
33724         * config/rs6000/rs6000.md (ashrsi3, two anonymous define_insns and
33725         define_splits, ashrdi3, *ashrdi3_internal1, *ashrdi3_internal2 and
33726         split, *ashrdi3_internal3 and split): Delete, merge into...
33727         (ashr<mode>3): New expander.
33728         (*ashr<mode>3, ashr<mode>3_dot, ashr<mode>3_dot2): New.
33729         (*ashrsi3_64): Fix formatting.  Replace "i" by "n".
33730
33731 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33732
33733         * config/rs6000/rs6000.md (rotlsi3, *rotlsi3_internal2 and split,
33734         *rotlsi3_internal3 and split, rotldi3, *rotldi3_internal2 and split,
33735         *rotldi3_internal3 and split): Delete, merge into...
33736         (rotl<mode>3, rotl<mode>3_dot, rotl<mode>3_dot2): New.
33737         (*rotlsi3_64): Fix formatting.  Fix condition.  Replace "i" by "n".
33738         Use "rotlw" extended mnemonic.
33739
33740 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33741
33742         * config/rs6000/rs6000.md (ashlsi3, two anonymous define_insns
33743         and define_splits, ashldi3, *ashldi3_internal1, *ashldi3_internal2
33744         and split, *ashldi3_internal3 and split): Delete, merge into...
33745         (ashl<mode>3, ashl<mode>3_dot, ashl<mode>3_dot2): New.
33746         (*ashlsi3_64): Fix formatting.  Replace "i" by "n".
33747
33748 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33749
33750         * config/rs6000/rs6000.md ("hH"): New define_mode_attr.
33751         (lshrsi3, two anonymous define_insns and define_splits,
33752         lshrdi3, *lshrdi3_internal1, *lshrdi3_internal2 and split,
33753         *lshrdi3_internal3 and split): Delete, merge into...
33754         (lshr<mode>3, lshr<mode>3_dot, lshr<mode>3_dot2): New.
33755         (*lshrsi3_64): Fix formatting.  Replace "i" by "n".
33756
33757 2014-06-22  Segher Boessenkool  <segher@kernel.crashing.org>
33758
33759         * config/rs6000/rs6000.md (lshrsi3, and its two dot patterns):
33760         Remove "O" alternative.
33761
33762 2014-06-22  Richard Sandiford  <rdsandiford@googlemail.com>
33763
33764         * config/mips/mips.c (mips_move_to_gpr_cost): Remove mode argument.
33765         (mips_move_from_gpr_cost): Likewise.
33766         (mips_register_move_cost): Update accordingly.
33767         (mips_secondary_reload_class): Remove name of in_p.
33768
33769 2014-06-22  Marc Glisse  <marc.glisse@inria.fr>
33770
33771         PR target/61503
33772         * config/i386/i386.md (x86_64_shrd, x86_shrd,
33773         ix86_rotr<dwi>3_doubleword): Replace ashiftrt with lshiftrt.
33774
33775 2014-06-21  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
33776
33777         * config/nios2/nios2.c: Include "builtins.h".
33778
33779 2014-06-20  Jan Hubicka  <hubicka@ucw.cz>
33780
33781         * cgraph.h (tls_model_names): New variable.
33782         * print-tree.c (print_node): Simplify.
33783         * varpool.c (tls_model_names): New variable.
33784         (dump_varpool_node): Output tls model.
33785
33786 2014-06-20  Jan Hubicka  <hubicka@ucw.cz>
33787
33788         * ipa-visibility.c (function_and_variable_visibility): Disable
33789         temporarily local aliases for some targets.
33790
33791 2014-06-20  Marek Polacek  <polacek@redhat.com>
33792
33793         * asan.c (pass_sanopt::execute): Handle IFN_UBSAN_BOUNDS.
33794         * flag-types.h (enum sanitize_code): Add SANITIZE_BOUNDS and or it
33795         into SANITIZE_UNDEFINED.
33796         * doc/invoke.texi: Describe -fsanitize=bounds.
33797         * gimplify.c (gimplify_call_expr): Add gimplification of internal
33798         functions created in the FEs.
33799         * internal-fn.c: Move "internal-fn.h" after "tree.h".
33800         (expand_UBSAN_BOUNDS): New function.
33801         * internal-fn.def (UBSAN_BOUNDS): New internal function.
33802         * internal-fn.h: Don't define internal functions here.
33803         * opts.c (common_handle_option): Add -fsanitize=bounds.
33804         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_OUT_OF_BOUNDS,
33805         BUILT_IN_UBSAN_HANDLE_OUT_OF_BOUNDS_ABORT): Add.
33806         * tree-core.h: Define internal functions here.
33807         (struct tree_base): Add ifn field.
33808         * tree-pretty-print.c: Include "internal-fn.h".
33809         (dump_generic_node): Handle functions without CALL_EXPR_FN.
33810         * tree.c (get_callee_fndecl): Likewise.
33811         (build_call_expr_internal_loc): New function.
33812         * tree.def (CALL_EXPR): Update description.
33813         * tree.h (CALL_EXPR_IFN): Define.
33814         (build_call_expr_internal_loc): Declare.
33815         * ubsan.c (get_ubsan_type_info_for_type): Return 0 for non-arithmetic
33816         types.
33817         (ubsan_type_descriptor): Change bool parameter to enum
33818         ubsan_print_style.  Adjust the code.  Add handling of
33819         UBSAN_PRINT_ARRAY.
33820         (ubsan_expand_bounds_ifn): New function.
33821         (ubsan_expand_null_ifn): Adjust ubsan_type_descriptor call.
33822         (ubsan_build_overflow_builtin): Likewise.
33823         (instrument_bool_enum_load): Likewise.
33824         (ubsan_instrument_float_cast): Likewise.
33825         * ubsan.h (enum ubsan_print_style): New enum.
33826         (ubsan_expand_bounds_ifn): Declare.
33827         (ubsan_type_descriptor): Adjust declaration.  Use a default parameter.
33828
33829 2014-06-20  Maciej W. Rozycki  <macro@codesourcery.com>
33830
33831         * config/rs6000/rs6000.md: Append `DONE' to preparation
33832         statements of `bswap' pattern splitters.
33833
33834 2014-06-20  Tom de Vries  <tom@codesourcery.com>
33835
33836         * target.def (call_fusage_contains_non_callee_clobbers): Update
33837         definition.
33838         * doc/tm.texi: Regenerate.
33839
33840 2014-06-20  Yury Gribov  <y.gribov@samsung.com>
33841             Max Ostapenko  <m.ostapenko@partner.samsung.com>
33842
33843         PR sanitizer/61547
33844         * asan.c (instrument_strlen_call): Fixed instrumentation of
33845         trailing byte.
33846
33847 2014-06-20  Martin Jambor  <mjambor@suse.cz>
33848
33849         PR ipa/61540
33850         * ipa-prop.c (impossible_devirt_target): New function.
33851         (try_make_edge_direct_virtual_call): Use it, also instead of
33852         asserting.
33853
33854 2014-06-20  Yury Gribov  <y.gribov@samsung.com>
33855             Max Ostapenko  <m.ostapenko@partner.samsung.com>
33856
33857         PR sanitizer/61530
33858         * asan.c (build_check_stmt): Add condition.
33859
33860 2014-06-20  Martin Jambor  <mjambor@suse.cz>
33861
33862         PR ipa/61211
33863         * cgraph.c (clone_of_p): Allow skipped_branch to deal with
33864         expanded clones.
33865
33866 2014-06-20  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
33867
33868         * config/aarch64/iterators.md (VCOND): Handle SI and HI modes.
33869         Update comments.
33870         (VCONQ): Make comment more helpful.
33871         (VCON): Delete.
33872         * config/aarch64/aarch64-simd.md
33873         (aarch64_sqdmulh_lane<mode>):
33874         Use VCOND for operands 2.  Update lane checking and flipping logic.
33875         (aarch64_sqrdmulh_lane<mode>): Likewise.
33876         (aarch64_sq<r>dmulh_lane<mode>_internal): Likewise.
33877         (aarch64_sqdmull2<mode>): Remove VCON, use VQ_HSI mode iterator.
33878         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal, VD_HSI): Change mode
33879         attribute of operand 3 to VCOND.
33880         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal, SD_HSI): Likewise.
33881         (aarch64_sqdml<SBINQOPS:as>l2_lane<mode>_internal): Likewise.
33882         (aarch64_sqdmull_lane<mode>_internal, VD_HSI): Likewise.
33883         (aarch64_sqdmull_lane<mode>_internal, SD_HSI): Likewise.
33884         (aarch64_sqdmull2_lane<mode>_internal): Likewise.
33885         (aarch64_sqdml<SBINQOPS:as>l_laneq<mode>_internal, VD_HSI: New
33886         define_insn.
33887         (aarch64_sqdml<SBINQOPS:as>l_laneq<mode>_internal, SD_HSI): Likewise.
33888         (aarch64_sqdml<SBINQOPS:as>l2_laneq<mode>_internal): Likewise.
33889         (aarch64_sqdmull_laneq<mode>_internal, VD_HSI): Likewise.
33890         (aarch64_sqdmull_laneq<mode>_internal, SD_HSI): Likewise.
33891         (aarch64_sqdmull2_laneq<mode>_internal): Likewise.
33892         (aarch64_sqdmlal_lane<mode>): Change mode attribute of penultimate
33893         operand to VCOND.  Update lane flipping and bounds checking logic.
33894         (aarch64_sqdmlal2_lane<mode>): Likewise.
33895         (aarch64_sqdmlsl_lane<mode>): Likewise.
33896         (aarch64_sqdmull_lane<mode>): Likewise.
33897         (aarch64_sqdmull2_lane<mode>): Likewise.
33898         (aarch64_sqdmlal_laneq<mode>):
33899         Replace VCON usage with VCONQ.
33900         Emit aarch64_sqdmlal_laneq<mode>_internal insn.
33901         (aarch64_sqdmlal2_laneq<mode>): Emit
33902         aarch64_sqdmlal2_laneq<mode>_internal insn.
33903         Replace VCON with VCONQ.
33904         (aarch64_sqdmlsl2_lane<mode>): Replace VCON with VCONQ.
33905         (aarch64_sqdmlsl2_laneq<mode>): Likewise.
33906         (aarch64_sqdmull_laneq<mode>): Emit
33907         aarch64_sqdmull_laneq<mode>_internal insn.
33908         Replace VCON with VCONQ.
33909         (aarch64_sqdmull2_laneq<mode>): Emit
33910         aarch64_sqdmull2_laneq<mode>_internal insn.
33911         (aarch64_sqdmlsl_laneq<mode>): Replace VCON usage with VCONQ.
33912         * config/aarch64/arm_neon.h (vqdmlal_high_lane_s16): Change type
33913         of 3rd argument to int16x4_t.
33914         (vqdmlalh_lane_s16): Likewise.
33915         (vqdmlslh_lane_s16): Likewise.
33916         (vqdmull_high_lane_s16): Likewise.
33917         (vqdmullh_lane_s16): Change type of 2nd argument to int16x4_t.
33918         (vqdmlal_lane_s16): Don't create temporary int16x8_t value.
33919         (vqdmlsl_lane_s16): Likewise.
33920         (vqdmull_lane_s16): Don't create temporary int16x8_t value.
33921         (vqdmlal_high_lane_s32): Change type 3rd argument to int32x2_t.
33922         (vqdmlals_lane_s32): Likewise.
33923         (vqdmlsls_lane_s32): Likewise.
33924         (vqdmull_high_lane_s32): Change type 2nd argument to int32x2_t.
33925         (vqdmulls_lane_s32): Likewise.
33926         (vqdmlal_lane_s32): Don't create temporary int32x4_t value.
33927         (vqdmlsl_lane_s32): Likewise.
33928         (vqdmull_lane_s32): Don't create temporary int32x4_t value.
33929         (vqdmulhh_lane_s16): Change type of second argument to int16x4_t.
33930         (vqrdmulhh_lane_s16): Likewise.
33931         (vqdmlsl_high_lane_s16): Likewise.
33932         (vqdmulhs_lane_s32): Change type of second argument to int32x2_t.
33933         (vqdmlsl_high_lane_s32): Likewise.
33934         (vqrdmulhs_lane_s32): Likewise.
33935
33936 2014-06-20  Tom de Vries  <tom@codesourcery.com>
33937
33938         * final.c (collect_fn_hard_reg_usage): Add separate IOR_HARD_REG_SET for
33939         get_call_reg_set_usage.
33940
33941 2014-06-20  Tom de Vries  <tom@codesourcery.com>
33942
33943         * final.c (collect_fn_hard_reg_usage): Don't save function_used_regs if
33944         it contains all call_used_regs.
33945
33946 2014-06-20  Tom de Vries  <tom@codesourcery.com>
33947
33948         * final.c (collect_fn_hard_reg_usage): Add and use variable
33949         function_used_regs.
33950
33951 2014-06-20  Jan Hubicka  <hubicka@ucw.cz>
33952
33953         * cgraph.h (struct symtab_node): Add field in_init_priority_hash
33954         (set_init_priority, get_init_priority, set_fini_priority,
33955         get_fini_priority): New methods.
33956         * tree.c (init_priority_for_decl): Remove.
33957         (init_ttree): Do not initialize init priority.
33958         (decl_init_priority_lookup, decl_fini_priority_lookup): Rewrite.
33959         (decl_priority_info): Remove.
33960         (decl_init_priority_insert): Rewrite.
33961         (decl_fini_priority_insert): Rewrite.
33962         * tree.h (tree_priority_map_eq, tree_priority_map_hash,
33963         tree_priority_map_marked_p): Remove.
33964         * lto-cgraph.c (lto_output_node, input_node): Stream init priorities.
33965         * lto-streamer-out.c (hash_tree): Do not hash priorities.
33966         * tree-streamer-out.c (pack_ts_decl_with_vis_value_fields): Do
33967         not output priorities.
33968         (pack_ts_function_decl_value_fields): Likewise.
33969         * tree-streamer-in.c (unpack_ts_decl_with_vis_value_fields): Do
33970         not input priorities.
33971         (unpack_ts_function_decl_value_fields): Likewise.
33972         * symtab.c (symbol_priority_map): Declare.
33973         (init_priority_hash): Declare.
33974         (symtab_unregister_node): Unregister from priority hash, too.
33975         (symtab_node::get_init_priority, cgraph_node::get_fini_priority):
33976         New methods.
33977         (symbol_priority_map_eq, symbol_priority_map_hash): New functions.
33978         (symbol_priority_info): New function.
33979         (symtab_node::set_init_priority, cgraph_node::set_fini_priority):
33980         New methods.
33981         * tree-core.h (tree_priority_map): Remove.
33982
33983 2014-06-20  Jakub Jelinek  <jakub@redhat.com>
33984
33985         * tree-ssa-math-opts.c (do_shift_rotate, find_bswap_or_nop_1): Cast
33986         0xff to uint64_t before shifting it up.
33987
33988 2014-06-20  Julian Brown  <julian@codesourcery.com>
33989             Chung-Lin Tang  <cltang@codesourcery.com>
33990
33991         * config/arm/arm.c (arm_output_mi_thunk): Fix offset for
33992         TARGET_THUMB1_ONLY. Add comments.
33993
33994 2014-06-19  Tom de Vries  <tom@codesourcery.com>
33995
33996         * config/aarch64/aarch64-protos.h (aarch64_emit_call_insn): Change
33997         return type to void.
33998         * config/aarch64/aarch64.c (aarch64_emit_call_insn): Same.
33999
34000 2014-06-19  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
34001
34002         * loop-invariant.c (get_inv_cost): Skip invariants, which are marked
34003         as "move", from depends_on.
34004
34005 2014-06-19  Terry Guo  <terry.guo@arm.com>
34006
34007         * config/arm/thumb1.md (define_split): Split 64bit constant in earlier
34008         stage.
34009
34010 2014-06-18  Segher Boessenkool  <segher@kernel.crashing.org>
34011
34012         * config/rs6000/rs6000.h (FIXED_REGISTERS): Update comment.
34013         Remove cr5.
34014         (REG_ALLOC_ORDER): Update comment.  Move cr5 earlier.
34015
34016 2014-06-18  Kaz Kojima  <kkojima@gcc.gnu.org>
34017
34018         PR target/61550
34019         * config/sh/sh.c (prepare_move_operands): Don't process TLS
34020         addresses here if reload in progress or completed.
34021
34022 2014-06-18  Robert Suchanek  <robert.suchanek@imgtec.com>
34023
34024         * config/mips/constraints.md ("d"): BASE_REG_CLASS replaced by
34025         "TARGET_MIPS16 ? M16_REGS : GR_REGS".
34026         * config/mips/mips.c (mips_regno_to_class): Update for M16_SP_REGS.
34027         (mips_regno_mode_ok_for_base_p): Remove use of !strict_p for MIPS16.
34028         (mips_register_priority): New function that implements the target
34029         hook TARGET_REGISTER_PRIORITY.
34030         (mips_spill_class): Likewise for TARGET_SPILL_CLASS.
34031         (mips_lra_p): Likewise for TARGET_LRA_P.
34032         (TARGET_REGISTER_PRIORITY): Define macro.
34033         (TARGET_SPILL_CLASS): Likewise.
34034         (TARGET_LRA_P): Likewise.
34035         * config/mips/mips.h (reg_class): Add M16_SP_REGS and SPILL_REGS
34036         classes.
34037         (REG_CLASS_NAMES): Likewise.
34038         (REG_CLASS_CONTENTS): Likewise.
34039         (BASE_REG_CLASS): Use M16_SP_REGS.
34040         * config/mips/mips.md (*mul_acc_si): Add alternative tuned for LRA.
34041         New set attribute to enable alternatives depending on the register
34042         allocator used.
34043         (*mul_acc_si_r3900, *mul_sub_si): Likewise.
34044         (*lea64): Disable pattern for MIPS16.
34045         * config/mips/mips.opt (mlra): New option.
34046
34047 2014-06-18  Robert Suchanek  <robert.suchanek@imgtec.com>
34048
34049         * lra-constraints.c (base_to_reg): New function.
34050         (process_address): Use new function.
34051
34052 2014-06-18  Tom de Vries  <tom@codesourcery.com>
34053
34054         * config/aarch64/aarch64-protos.h (aarch64_emit_call_insn): Declare.
34055         * config/aarch64/aarch64.c
34056         (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS): Redefine as true.
34057         (aarch64_emit_call_insn): New function.
34058         (aarch64_load_symref_appropriately): Use aarch64_emit_call_insn instead
34059         of emit_call_insn.
34060         * config/aarch64/aarch64.md (define_expand "call_internal")
34061         (define_expand "call_value_internal", define_expand "sibcall_internal")
34062         (define_expand "sibcall_value_internal"): New.
34063         (define_expand "call", define_expand "call_value")
34064         (define_expand "sibcall", define_expand "sibcall_value"): Use internal
34065         expand variant and aarch64_emit_call_insn.
34066
34067 2014-06-18  Radovan Obradovic  <robradovic@mips.com>
34068             Tom de Vries  <tom@codesourcery.com>
34069
34070         * config/arm/arm-protos.h (arm_emit_call_insn): Add bool parameter.
34071         * config/arm/arm.c (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS):
34072         Redefine to true.
34073         (arm_emit_call_insn): Add and use sibcall parameter.  Add IP and CC
34074         clobbers to CALL_INSN_FUNCTION_USAGE.
34075         (define_expand "sibcall_internal")
34076         (define_expand "sibcall_value_internal"): New.
34077         (define_expand "call", define_expand "call_value"): Add argument to
34078         arm_emit_call_insn.
34079         (define_expand "sibcall"): Use sibcall_internal and arm_emit_call_insn.
34080         (define_expand "sibcall_value"): Use sibcall_value_internal and
34081         arm_emit_call_insn.
34082
34083 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34084
34085         * config/arm/bpabi.c (__gnu_uldivmod_helper): Remove.
34086
34087 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34088
34089         * config/arm/bpabi-v6m.S (__aeabi_uldivmod): Perform division using
34090         __udivmoddi4.
34091
34092 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34093
34094         * config/arm/bpabi.S (__aeabi_ldivmod, __aeabi_uldivmod,
34095         push_for_divide, pop_for_divide): Use .cfi_* directives for DWARF
34096         annotations. Fix DWARF information.
34097
34098 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34099
34100         * config/arm/bpabi.S (__aeabi_ldivmod): Perform division using
34101         __udivmoddi4, and fixups for negative operands.
34102
34103 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34104
34105         * config/arm/bpabi.S (__aeabi_ldivmod): Optimise stack manipulation.
34106
34107 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34108
34109         * config/arm/bpabi.S (__aeabi_uldivmod): Perform division using call
34110         to __udivmoddi4.
34111
34112 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34113
34114         * config/arm/bpabi.S (__aeabi_uldivmod): Optimise stack pointer
34115         manipulation.
34116
34117 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34118
34119         * config/arm/bpabi.S (__aeabi_uldivmod, __aeabi_ldivmod): Add comment
34120         describing register usage on function entry and exit.
34121
34122 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34123
34124         * config/arm/bpabi.S (__aeabi_uldivmod): Fix whitespace.
34125         (__aeabi_ldivmod): Fix whitespace.
34126
34127 2014-06-18  Andreas Schwab  <schwab@suse.de>
34128
34129         * doc/md.texi (Standard Names): Use @itemx for grouped items.
34130         Remove blank line after @item.
34131
34132 2014-06-18  Richard Henderson  <rth@redhat.com>
34133
34134         PR target/61545
34135         * config/aarch64/aarch64.md (tlsdesc_small_<PTR>): Clobber CC_REGNUM.
34136
34137 2014-06-18  Charles Baylis  <charles.baylis@linaro.org>
34138
34139         * config/arm/arm.c (neon_vector_mem_operand): Allow register
34140         POST_MODIFY for neon loads and stores.
34141         (arm_print_operand): Output post-index register for neon loads and
34142         stores.
34143
34144 2014-06-18  Richard Biener  <rguenther@suse.de>
34145
34146         * tree-ssa-dce.c (perform_tree_ssa_dce): Fixup bogus commit.
34147
34148 2014-06-18  Richard Biener  <rguenther@suse.de>
34149
34150         * tree-pass.h (make_pass_dce_loop): Remove.
34151         * passes.def: Replace pass_dce_loop with pass_dce.
34152         * tree-ssa-dce.c (perform_tree_ssa_dce): If something
34153         changed free niter estimates and reset the scev cache.
34154         (tree_ssa_dce_loop, pass_data_dce_loop, pass_dce_loop,
34155         make_pass_dce_loop): Remove.
34156         * tree-ssa-copy.c: Include tree-ssa-loop-niter.h.
34157         (fini_copy_prop): Return whether something changed.  Always
34158         let substitute_and_fold perform DCE and free niter estimates
34159         and reset the scev cache if so.
34160         (execute_copy_prop): If sth changed schedule cleanup-cfg.
34161         (pass_data_copy_prop): Do not unconditionally schedule
34162         cleanup-cfg or update-ssa.
34163
34164 2014-06-18  Yuri Rumyantsev  <ysrumyan@gmail.com>
34165
34166         PR tree-optimization/61518
34167         * tree-if-conv.c (is_cond_scalar_reduction): Add missed check that
34168         reduction var is used in reduction stmt or phi-function only.
34169
34170 2014-06-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
34171
34172         * config/arm/arm_neon.h (vadd_f32): Change #ifdef to __FAST_MATH.
34173
34174 2014-06-18  Thomas Preud'homme  <thomas.preudhomme@arm.com>
34175
34176         PR tree-optimization/61517
34177         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Adapt to return a stmt
34178         whose rhs's first tree is the source expression instead of the
34179         expression itself.
34180         (find_bswap_or_nop): Likewise.
34181         (bsap_replace): Rename stmt in cur_stmt. Pass gsi by value and src as a
34182         gimple stmt whose rhs's first tree is the source. In the memory source
34183         case, move the stmt to be replaced close to one of the original load to
34184         avoid the problem of a store between the load and the stmt's original
34185         location.
34186         (pass_optimize_bswap::execute): Adapt to change in bswap_replace's
34187         signature.
34188
34189 2014-06-18  Andreas Schwab  <schwab@suse.de>
34190
34191         PR rtl-optimization/54555
34192         * postreload.c (move2add_use_add2_insn): Substitute
34193         STRICT_LOW_PART only if it is cheaper.
34194
34195 2014-06-18  Uros Bizjak  <ubizjak@gmail.com>
34196
34197         * config/i386/i386.md (*sibcall_memory): Rename from *sibcall_intern.
34198         Do not use unspec as call operand.  Use memory_operand instead of
34199         memory_nox32_operand and add "m" operand constraint.  Disable
34200         pattern for TARGET_X32.
34201         (*sibcall_pop_memory): Ditto.
34202         (*sibcall_value_memory): Ditto.
34203         (*sibcall_value_pop_memory): Ditto.
34204         (sibcall peepholes): Merge SImode and DImode patterns using
34205         W mode iterator.  Use memory_operand instead of memory_nox32_operand.
34206         Disable pattern for TARGET_X32.  Check if eliminated register is
34207         really dead after call insn.  Generate call RTX without unspec operand.
34208         (sibcall_value peepholes): Ditto.
34209         (sibcall_pop peepholes): Fix call insn RTXes.  Use memory_operand
34210         instead of memory_nox32_operand.  Check if eliminated register is
34211         really dead after call insn. Generate call RTX without unspec operand.
34212         (sibcall_value_pop peepholes): Ditto.
34213         * config/i386/predicates.md (memory_nox32_operand): Remove predicate.
34214
34215 2014-06-18  Terry Guo  <terry.guo@arm.com>
34216
34217         PR target/61544
34218         * config/arm/arm.c (thumb1_reorg): Move to next basic block if we
34219         reach the head.
34220
34221 2014-06-18  Olivier Hainque  <hainque@adacore.com>
34222
34223         * tree-core.h (tree_block): Add an "end_locus" field, allowing
34224         memorization of the end of block source location.
34225         * tree.h (BLOCK_SOURCE_END_LOCATION): New accessor.
34226         * gimplify.c (gimplify_bind_expr): Propagate the block start and
34227         end source location info we have on the block entry/exit code we
34228         generate.
34229
34230 2014-06-18  Richard Biener  <rguenther@suse.de>
34231
34232         * common.opt (fssa-phiopt): New option.
34233         * opts.c (default_options_table): Enable -fssa-phiopt with -O1+
34234         but not with -Og.
34235         * tree-ssa-phiopt.c (pass_phiopt): Add gate method.
34236         * doc/invoke.texi (-fssa-phiopt): Document.
34237
34238 2014-06-18  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
34239
34240         * genattrtab.c (n_bypassed): New variable.
34241         (process_bypasses): Initialise n_bypassed.
34242         Count number of bypassed reservations.
34243         (make_automaton_attrs): Allocate space for bypassed reservations
34244         rather than number of bypasses.
34245
34246 2014-06-18  Richard Biener  <rguenther@suse.de>
34247
34248         * tree-ssa-propagate.c (replace_phi_args_in): Return whether
34249         we propagated anything.
34250         (substitute_and_fold_dom_walker::before_dom_children): Something
34251         changed if we propagated into PHI arguments.
34252         * tree-ssa-pre.c (eliminate): Always schedule cfg-cleanup if
34253         we removed a stmt.
34254
34255 2014-06-18  Evgeny Stupachenko  <evstupac@gmail.com>
34256
34257         * config/i386/i386.c (ix86_reassociation_width): Add alternative for
34258         vector case.
34259         * config/i386/i386.h (TARGET_VECTOR_PARALLEL_EXECUTION): New.
34260         * config/i386/x86-tune.def (X86_TUNE_VECTOR_PARALLEL_EXECUTION): New.
34261         * tree-vect-data-refs.c (vect_shift_permute_load_chain): New.
34262         Introduces alternative way of loads group permutaions.
34263         (vect_transform_grouped_load): Try alternative way of permutations.
34264
34265 2014-06-18  Jakub Jelinek  <jakub@redhat.com>
34266
34267         * gimplify.c (omp_notice_variable): If n is non-NULL and no flags
34268         changed in ORT_TARGET region, don't jump to do_outer.
34269         (struct gimplify_adjust_omp_clauses_data): New type.
34270         (gimplify_adjust_omp_clauses_1): Adjust for data being
34271         a struct gimplify_adjust_omp_clauses_data pointer instead
34272         of tree *.  Pass pre_p as a new argument to
34273         lang_hooks.decls.omp_finish_clause hook.
34274         (gimplify_adjust_omp_clauses): Add pre_p argument, adjust
34275         splay_tree_foreach to pass both list_p and pre_p.
34276         (gimplify_omp_parallel, gimplify_omp_task, gimplify_omp_for,
34277         gimplify_omp_workshare, gimplify_omp_target_update): Adjust
34278         gimplify_adjust_omp_clauses callers.
34279         * langhooks.c (lhd_omp_finish_clause): New function.
34280         * langhooks-def.h (lhd_omp_finish_clause): New prototype.
34281         (LANG_HOOKS_OMP_FINISH_CLAUSE): Define to lhd_omp_finish_clause.
34282         * langhooks.h (struct lang_hooks_for_decls): Add a new
34283         gimple_seq * argument to omp_finish_clause hook.
34284         * omp-low.c (scan_sharing_clauses): Call scan_omp_op on
34285         non-DECL_P OMP_CLAUSE_DECL if ctx->outer.
34286         (scan_omp_parallel, lower_omp_for): When adding
34287         _LOOPTEMP_ clause var, add it to outer ctx's decl_map as identity.
34288         * tree-core.h (OMP_CLAUSE_MAP_TO_PSET): New map kind.
34289         * tree-nested.c (convert_nonlocal_omp_clauses,
34290         convert_local_omp_clauses): Handle various OpenMP 4.0 clauses.
34291         * tree-pretty-print.c (dump_omp_clause): Handle OMP_CLAUSE_MAP_TO_PSET.
34292
34293 2014-06-17  Andrew MacLeod  <amacleod@redhat.com>
34294
34295         * tree-dfa.h (get_addr_base_and_unit_offset_1): Move from here.
34296         * tree-dfa.c (get_addr_base_and_unit_offset_1): To here.
34297
34298 2014-06-17  Xinliang David Li  <davidxl@google.com>
34299
34300         * tree-pretty-print.c (dump_function_header): Print cgraph uid.
34301         * passes.c (pass_init_dump_file): Do not set initialize
34302         flag to false unconditionally.
34303
34304 2014-06-17  Richard Biener  <rguenther@suse.de>
34305
34306         * genopinit.c (main): Use vec<>::qsort method.
34307         * tree-ssa-loop-niter.c (discover_iteration_bound_by_body_walk):
34308         Likewise.
34309         * tree-vect-data-refs.c (vect_analyze_data_ref_accesses): Likewise.
34310
34311 2014-06-17  Matthew Fortune  <matthew.fortune@imgtec.com>
34312
34313         * config/mips/mips-protos.h (mips_expand_fcc_reload): Remove.
34314         * config/mips/mips.c (mips_expand_fcc_reload): Remove.
34315         (mips_move_to_gpr_cost): Remove ST_REGS case.
34316         (mips_move_from_gpr_cost): Likewise.
34317         (mips_register_move_cost): Likewise.
34318         (mips_secondary_reload_class): Likewise.
34319
34320 2014-06-17  Richard Biener  <rguenther@suse.de>
34321
34322         * passes.def (pass_all_early_optimizations): Remove copy-prop pass.
34323         (pass_all_optimizations): Move 3rd copy-prop pass from after
34324         fre to before ifcombine/phiopt.
34325
34326 2014-06-17  Richard Biener  <rguenther@suse.de>
34327
34328         * tree-switch-conversion.c (collect_switch_conv_info): Simplify
34329         and allow all blocks to be forwarders.
34330
34331 2014-06-17  Yufeng Zhang  <yufeng.zhang@arm.com>
34332
34333         PR target/61483
34334         * config/aarch64/aarch64.c (aarch64_layout_arg): Add new local
34335         variable 'size'; calculate 'size' right in the front; use
34336         'size' to compute 'nregs' (when 'allocate_ncrn != 0') and
34337         pcum->aapcs_stack_words.
34338
34339 2014-06-17  Nick Clifton  <nickc@redhat.com>
34340
34341         * config/msp430/msp430.md (mulhisi3): Add a NOP after the DINT.
34342         (umulhi3, mulsidi3, umulsidi3): Likewise.
34343
34344 2014-06-17  Thomas Schwinge  <thomas@codesourcery.com>
34345
34346         PR middle-end/61508
34347         * fold-const.c (fold_checksum_tree) <TS_DECL_WITH_VIS>: Remove
34348         check for section name.
34349
34350 2014-06-17  Richard Biener  <rguenther@suse.de>
34351
34352         * tree-ssa-propagate.c: Include domwalk.h.
34353         (substitute_and_fold): Outline main worker into a domwalker ...
34354         (substitute_and_fold_dom_walker::before_dom_children): ... here.
34355         Schedule stmts we can fully propagate for removal.  Remove
34356         poor-mans DCE.
34357         (substitute_and_fold): Apply a dominator walk to perform
34358         substitution.  Process stmts scheduled for removal here.
34359
34360 2014-06-17  Richard Biener  <rguenther@suse.de>
34361
34362         * tree-ssa-loop-im.c (determine_max_movement): Adjust cost
34363         of PHI node moving.
34364
34365 2014-06-17  Kugan Vivekanandarajah  <kuganv@linaro.org>
34366
34367         * config/arm/arm.c (arm_atomic_assign_expand_fenv): call
34368         default_atomic_assign_expand_fenv for !TARGET_HARD_FLOAT.
34369         (arm_init_builtins) : Initialize builtins __builtins_arm_set_fpscr and
34370         __builtins_arm_get_fpscr only when TARGET_HARD_FLOAT.
34371         * config/arm/vfp.md (set_fpscr): Make pattern conditional on
34372         TARGET_HARD_FLOAT.
34373         (get_fpscr) : Likewise.
34374
34375 2014-06-16  Vladimir Makarov  <vmakarov@redhat.com>
34376
34377         PR rtl-optimization/61325
34378         * lra-constraints.c (valid_address_p): Add forward declaration.
34379         (simplify_operand_subreg): Check address validity before and after
34380         alter_reg of memory subreg.
34381
34382 2014-06-16  Uros Bizjak  <ubizjak@gmail.com>
34383
34384         * config/i386/i386.c (decide_alg): Correctly handle
34385         maximum size of stringop algorithm.
34386
34387 2014-06-16  Yury Gribov  <y.gribov@samsung.com>
34388
34389         * asan.c (build_check_stmt): Fix maybe-uninitialized warning.
34390
34391 2014-06-16  Vladimir Makarov  <vmakarov@redhat.com>
34392
34393         PR rtl-optimization/61522
34394         * lra-assigns.c (assign_by_spills): Check null targetm.spill_class.
34395
34396 2014-06-16  Jan Hubicka  <hubicka@ucw.cz>
34397
34398         Revert:
34399         * symtab.c (symtab_node::reset_section): New method.
34400         * cgraph.c (cgraph_node_cannot_be_local_p_1): Accept non-local
34401         for localization.
34402         * cgraph.h (reset_section): Declare.
34403         * ipa-inline-analysis.c (do_estimate_growth): Check for comdat groups;
34404         do not consider comdat locals.
34405         * cgraphclones.c (set_new_clone_decl_and_node_flags): Get section
34406         for new symbol.
34407         * ipa-visiblity.c (cgraph_externally_visible_p): Cleanup.
34408         (update_visibility_by_resolution_info): Consider UNDEF; fix checking;
34409         reset sections of symbols dragged out of the comdats.
34410         (function_and_variable_visibility): Reset sections of
34411         localized symbols.
34412
34413 2014-06-16  Richard Biener  <rguenther@suse.de>
34414
34415         PR tree-optimization/61482
34416         * tree-vrp.c (adjust_range_with_scev): Avoid setting of
34417         [-INF(OVF), +INF(OVF)] range.
34418
34419 2014-06-16  Ganesh Gopalasubramanian <Ganesh.Gopalasubramanian@amd.com>
34420
34421         * config/i386/i386.c (ix86_expand_sse2_mulvxdi3): Issue
34422         instructions "vpmuludq" and "vpaddq" instead of "vpmacsdql" for
34423         handling 32-bit multiplication.
34424
34425 2014-06-16  Chung-Lin Tang  <cltang@codesourcery.com>
34426
34427         PR middle-end/61430
34428         * lra-lives.c (process_bb_lives): Skip creating copy during
34429         insn scan when src/dest has constrained to same regno.
34430
34431 2014-06-15  Jan Hubicka  <hubicka@ucw.cz>
34432
34433         * tree-vect-data-refs.c (vect_can_force_dr_alignment_p): Check again
34434         DECL_IN_CONSTANT_POOL and TREE_ASM_WRITTEN.
34435
34436 2014-06-16  Yury Gribov  <y.gribov@samsung.com>
34437
34438         * asan.c (check_func): New function.
34439         (maybe_create_ssa_name): Likewise.
34440         (build_check_stmt_with_calls): Likewise.
34441         (use_calls_p): Likewise.
34442         (report_error_func): Change interface.
34443         (build_check_stmt): Allow non-integer lengths; add support
34444         for new parameter.
34445         (asan_instrument): Likewise.
34446         (instrument_mem_region_access): Moved code to build_check_stmt.
34447         (instrument_derefs): Likewise.
34448         (instrument_strlen_call): Likewise.
34449         * cfgcleanup.c (old_insns_match_p): Add support for new functions.
34450         * doc/invoke.texi: Describe new parameter.
34451         * params.def: Define new parameter.
34452         * params.h: Likewise.
34453         * sanitizer.def: Describe new builtins.
34454
34455 2014-06-16  Richard Biener  <rguenther@suse.de>
34456
34457         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children):
34458         Make all defs available at the end.
34459         (eliminate): If we remove a PHI node schedule cfg-cleanup.
34460
34461 2014-06-18  Jakub Jelinek  <jakub@redhat.com>
34462
34463         PR plugins/45078
34464         * config.gcc (arm*-*-linux-*): Include vxworks-dummy.h in tm_file.
34465
34466 2014-06-16  Richard Sandiford  <rdsandiford@googlemail.com>
34467
34468         PR bootstrap/61516
34469         * auto-inc-dec.c (merge_in_block): Fix location of insn_info
34470         initialization.  Replace remaining use of uid.
34471
34472 2014-06-15  Jan Hubicka  <hubicka@ucw.cz>
34473
34474         * c-family/c-common.c (handle_tls_model_attribute): Use
34475         set_decl_tls_model.
34476         * c-family/c-common.c (handle_tls_model_attribute): Use
34477         set_decl_tls_model.
34478         * cgraph.h (struct varpool_node): Add tls_model.
34479         * tree.c (decl_tls_model, set_decl_tls_model): New functions.
34480         * tree.h (DECL_TLS_MODEL): Update.
34481         (DECL_THREAD_LOCAL_P): Check that variable is static.
34482         (decl_tls_model): Declare.
34483         (set_decl_tls_model): Declare.
34484         * tree-emutls.c (get_emutls_init_templ_addr): First build decl and then
34485         set symbol prorperties.
34486         (get_emutls_init_templ_addr): Cleanup.
34487         (new_emutls_decl): Update.
34488         * lto-cgraph.c (lto_output_varpool_node): Stream TLS model
34489         (lto_input_varpool_node): Likewise.
34490         * lto-streamer-out.c (hash_tree): Likewise.
34491         * tree-streamer-in.c (unpack_ts_decl_with_vis_value_fields): Do
34492         not stream DECL_TLS_MODEL.
34493         * tree-profile.c (init_ic_make_global_vars): Use set_decl_tls_model.
34494         * tree-core.h (tree_decl_with_vis): Remove tls_model; update comments.
34495
34496 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34497
34498         * df.h (DF_REF_REG_USE_P, DF_MWS_REG_USE_P): Remove null checks.
34499
34500 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34501
34502         * df.h (df_mw_hardreg, df_base_ref): Add a link pointer.
34503         (df_insn_info): Turn defs, uses, eq_uses and mw_hardregs into linked
34504         lists.
34505         (df_scan_bb_info): Likewise artificial_defs and artificial_uses.
34506         (DF_REF_NEXT_LOC, DF_MWS_NEXT): New macros.
34507         (FOR_EACH_INSN_INFO_DEF, FOR_EACH_INSN_INFO_USE)
34508         (FOR_EACH_INSN_INFO_EQ_USE, FOR_EACH_INSN_INFO_MW)
34509         (FOR_EACH_ARTIFICIAL_USE, FOR_EACH_ARTIFICIAL_DEF)
34510         (df_get_artificial_defs, df_get_artificial_uses)
34511         (df_single_def, df_single_use): Update accordingly.
34512         (df_refs_chain_dump): Take the first element in a linked list as
34513         parameter, rather than a pointer to an array of pointers.
34514         * df-core.c (df_refs_chain_dump, df_mws_dump): Likewise.
34515         * df-problems.c (df_rd_bb_local_compute_process_def): Likewise.
34516         (df_chain_create_bb_process_use): Likewise.
34517         (df_md_bb_local_compute_process_def): Likewise.
34518         * fwprop.c (process_defs, process_uses): Likewise.
34519         (register_active_defs, update_uses): Likewise.
34520         (forward_propagate_asm): Update for new df_ref linking.
34521         * df-scan.c (df_scan_free_ref_vec, df_scan_free_mws_vec): Delete.
34522         (df_null_ref_rec, df_null_mw_rec): Likewise.
34523         (df_scan_free_internal): Don't free df_ref and df_mw_hardreg lists
34524         explicitly.
34525         (df_scan_free_bb_info): Remove check for null artificial_defs.
34526         (df_install_ref_incremental): Adjust for new df_ref linking.
34527         Use a single-element insertion rather than a full sort.
34528         (df_ref_chain_delete_du_chain): Take the first element
34529         in a linked list as parameter, rather than a pointer to an array of
34530         pointers.
34531         (df_ref_chain_delete, df_mw_hardreg_chain_delete): Likewise.
34532         (df_add_refs_to_table, df_refs_verify, df_mws_verify): Likewise.
34533         (df_insn_info_delete): Remove check for null defs and call to
34534         df_scan_free_mws_vec.
34535         (df_insn_rescan): Initialize df_ref and df_mw_hardreg lists to
34536         null rather than df_null_*_rec.
34537         (df_insn_rescan_debug_internal): Likewise, and update null
34538         checks in the same way.  Remove check for null defs.
34539         (df_ref_change_reg_with_loc_1): Fix choice of list for defs.
34540         Move a single element rather doing a full sort.
34541         (df_mw_hardreg_chain_delete_eq_uses): Adjust for new df_mw_hardreg
34542         linking.
34543         (df_notes_rescan): Likewise.  Use a merge rather than a full sort.
34544         Initialize df_ref and df_mw_hardreg lists to null rather than
34545         df_null_*_rec.
34546         (df_ref_compare): Take df_refs as parameter, transferring the
34547         old interface to...
34548         (df_ref_ptr_compare): ...this new function.
34549         (df_sort_and_compress_refs): Update accordingly.
34550         (df_mw_compare): Take df_mw_hardregs as parameter, transferring the
34551         old interface to...
34552         (df_mw_ptr_compare): ...this new function.
34553         (df_sort_and_compress_mws): Update accordingly.
34554         (df_install_refs, df_install_mws): Return a linked list rather than
34555         an array of pointers.
34556         (df_refs_add_to_chains): Assert that old lists are empty rather
34557         than freeing them.
34558         (df_insn_refs_verify): Don't handle null defs speciailly.
34559         * web.c (union_match_dups): Update for new df_ref linking.
34560
34561 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34562
34563         * df.h (df_ref_create, df_ref_remove): Delete.
34564         * df-scan.c (df_ref_create, df_ref_compress_rec): Likewise.
34565         (df_ref_remove): Likewise.
34566
34567 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34568
34569         * df.h (df_single_def, df_single_use): New functions.
34570         * ira.c (find_moveable_pseudos): Use them.
34571
34572 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34573
34574         * df.h (FOR_EACH_INSN_INFO_MW): New macro.
34575         * df-problems.c (df_note_bb_compute): Use it.
34576         * regstat.c (regstat_bb_compute_ri): Likewise.
34577
34578 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34579
34580         * df.h (FOR_EACH_ARTIFICIAL_USE, FOR_EACH_ARTIFICIAL_DEF): New macros.
34581         * cse.c (cse_extended_basic_block): Use them.
34582         * dce.c (mark_artificial_use): Likewise.
34583         * df-problems.c (df_rd_simulate_artificial_defs_at_top): Likewise.
34584         (df_lr_bb_local_compute, df_live_bb_local_compute): Likewise.
34585         (df_chain_remove_problem, df_chain_bb_dump): Likewise.
34586         (df_word_lr_bb_local_compute, df_note_bb_compute): Likewise.
34587         (df_simulate_initialize_backwards): Likewise.
34588         (df_simulate_finalize_backwards): Likewise.
34589         (df_simulate_initialize_forwards): Likewise.
34590         (df_md_simulate_artificial_defs_at_top): Likewise.
34591         * df-scan.c (df_reorganize_refs_by_reg_by_insn): Likewise.
34592         * regrename.c (init_rename_info): Likewise.
34593         * regstat.c (regstat_bb_compute_ri): Likewise.
34594         (regstat_bb_compute_calls_crossed): Likewise.
34595
34596 2014-06-15  Richard Sandiford  <rdsandiford@googlemail.com>
34597
34598         * df.h (DF_INSN_INFO_MWS, FOR_EACH_INSN_INFO_DEF): New macros.
34599         (FOR_EACH_INSN_INFO_USE, FOR_EACH_INSN_INFO_EQ_USE): Likewise.
34600         (FOR_EACH_INSN_DEF, FOR_EACH_INSN_USE, FOR_EACH_INSN_EQ_USE): Likewise.
34601         * auto-inc-dec.c (find_inc, merge_in_block): Use them.
34602         * combine.c (create_log_links): Likewise.
34603         * compare-elim.c (find_flags_uses_in_insn): Likewise.
34604         (try_eliminate_compare): Likewise.
34605         * cprop.c (make_set_regs_unavailable, mark_oprs_set): Likewise.
34606         * dce.c (deletable_insn_p, find_call_stack_args): Likewise.
34607         (remove_reg_equal_equiv_notes_for_defs): Likewise.
34608         (reset_unmarked_insns_debug_uses, mark_reg_dependencies): Likewise.
34609         (word_dce_process_block, dce_process_block): Likewise.
34610         * ddg.c (def_has_ccmode_p): Likewise.
34611         * df-core.c (df_bb_regno_first_def_find): Likewise.
34612         (df_bb_regno_last_def_find, df_find_def, df_find_use): Likewise.
34613         * df-problems.c (df_rd_simulate_one_insn): Likewise.
34614         (df_lr_bb_local_compute, df_live_bb_local_compute): Likewise.
34615         (df_chain_remove_problem, df_chain_insn_top_dump): Likewise.
34616         (df_chain_insn_bottom_dump, df_word_lr_bb_local_compute): Likewise.
34617         (df_word_lr_simulate_defs, df_word_lr_simulate_uses): Likewise.
34618         (df_remove_dead_eq_notes, df_note_bb_compute): Likewise.
34619         (df_simulate_find_defs, df_simulate_find_uses): Likewise.
34620         (df_simulate_find_noclobber_defs, df_simulate_defs): Likewise.
34621         (df_simulate_uses, df_md_simulate_one_insn): Likewise.
34622         * df-scan.c (df_reorganize_refs_by_reg_by_insn): Likewise.
34623         * fwprop.c (local_ref_killed_between_p): Likewise.
34624         (all_uses_available_at, free_load_extend): Likewise.
34625         * gcse.c (update_bb_reg_pressure, calculate_bb_reg_pressure): Likewise.
34626         * hw-doloop.c (scan_loop): Likewise.
34627         * ifcvt.c (dead_or_predicable): Likewise.
34628         * init-regs.c (initialize_uninitialized_regs): Likewise.
34629         * ira-lives.c (mark_hard_reg_early_clobbers): Likewise.
34630         (process_bb_node_lives): Likewise.
34631         * ira.c (compute_regs_asm_clobbered, build_insn_chain): Likewise.
34632         (find_moveable_pseudos): Likewise.
34633         * loop-invariant.c (check_dependencies, record_uses): Likewise.
34634         * recog.c (peep2_find_free_register): Likewise.
34635         * ree.c (get_defs): Likewise.
34636         * regstat.c (regstat_bb_compute_ri): Likewise.
34637         (regstat_bb_compute_calls_crossed): Likewise.
34638         * sched-deps.c (find_inc, find_mem): Likewise.
34639         * sel-sched-ir.c (maybe_downgrade_id_to_use): Likewise.
34640         (maybe_downgrade_id_to_use, setup_id_reg_sets): Likewise.
34641         * shrink-wrap.c (requires_stack_frame_p): Likewise.
34642         (prepare_shrink_wrap): Likewise.
34643         * store-motion.c (compute_store_table, build_store_vectors): Likewise.
34644         * web.c (union_defs, pass_web::execute): Likewise.
34645         * config/i386/i386.c (increase_distance, insn_defines_reg): Likewise.
34646         (insn_uses_reg_mem, ix86_ok_to_clobber_flags): Likewise.
34647
34648 2014-06-13  Vladimir Makarov  <vmakarov@redhat.com>
34649
34650         * lra-assign.c (assign_by_spills): Add code to assign vector regs
34651         to inheritance pseudos.
34652         * config/i386/i386.c (ix86_spill_class): Add check on NO_REGS.
34653
34654 2014-06-13  Peter Bergner  <bergner@vnet.ibm.com>
34655
34656         PR target/61415
34657         * config/rs6000/rs6000-builtin.def (BU_MISC_1): Delete.
34658         (BU_MISC_2): Rename to ...
34659         (BU_LDBL128_2): ... this.
34660         * config/rs6000/rs6000.h (RS6000_BTM_LDBL128): New define.
34661         (RS6000_BTM_COMMON): Add RS6000_BTM_LDBL128.
34662         * config/rs6000/rs6000.c (rs6000_builtin_mask_calculate): Handle
34663         RS6000_BTM_LDBL128.
34664         (rs6000_invalid_builtin): Add long double 128-bit builtin support.
34665         (rs6000_builtin_mask_names): Add RS6000_BTM_LDBL128.
34666         * config/rs6000/rs6000.md (unpacktf_0): Remove define)expand.
34667         (unpacktf_1): Likewise.
34668         * doc/extend.texi (__builtin_longdouble_dw0): Remove documentation.
34669         (__builtin_longdouble_dw1): Likewise.
34670         * doc/sourcebuild.texi (longdouble128): Document.
34671
34672 2014-06-13  Jeff Law  <law@redhat.com>
34673
34674         PR rtl-optimization/61094
34675         PR rtl-optimization/61446
34676         * ree.c (combine_reaching_defs): Get the mode for the copy from
34677         the extension insn rather than the defining insn.
34678
34679 2014-06-13  Dehao Chen  <dehao@google.com>
34680
34681         * dwarf2out.c (add_linkage_name): Emit more linkage name.
34682
34683 2014-06-13  Thomas Schwinge  <thomas@codesourcery.com>
34684
34685         * doc/install.texi (--enable-linker-plugin-configure-flags)
34686         (--enable-linker-plugin-flags): Document new flags.
34687
34688 2014-06-13  Martin Jambor  <mjambor@suse.cz>
34689
34690         PR ipa/61186
34691         * ipa-devirt.c (possible_polymorphic_call_targets): Store NULL to
34692         cache_token if returning early.
34693
34694 2014-06-13  Nick Clifton  <nickc@redhat.com>
34695
34696         * config/rx/rx.h (JUMP_ALIGN): Return the log value if user
34697         requested alignment is active.
34698         (LABEL_ALIGN): Likewise.
34699         (LOOP_ALIGN): Likewise.
34700
34701 2014-06-13  Richard Biener  <rguenther@suse.de>
34702
34703         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children):
34704         Rewrite to propagate the VN result into all uses where
34705         possible and to remove stmts becoming dead because of that.
34706         (eliminate): Generalize stmt removal handling, remove in
34707         reverse dominator order to support proper debug stmt
34708         generation.  Update stmts before removing stmts.
34709         * tree-ssa-propagate.c (propagate_tree_value): Remove bogus assert.
34710
34711 2014-06-13  Thomas Preud'homme  <thomas.preudhomme@arm.com>
34712
34713         PR tree-optimization/61375
34714         * tree-ssa-math-opts.c (init_symbolic_number): Cancel optimization if
34715         symbolic number cannot be represented in an uint64_t.
34716         (find_bswap_or_nop_1): Likewise.
34717
34718 2014-06-12  Jan Hubicka  <hubicka@ucw.cz>
34719
34720         * symtab.c (symtab_node::reset_section): New method.
34721         * cgraph.c (cgraph_node_cannot_be_local_p_1): Accept non-local
34722         for localization.
34723         * cgraph.h (reset_section): Declare.
34724         * ipa-inline-analysis.c (do_estimate_growth): Check for comdat groups;
34725         do not consider comdat locals.
34726         * cgraphclones.c (set_new_clone_decl_and_node_flags): Get section
34727         for new symbol.
34728         * ipa-visiblity.c (cgraph_externally_visible_p): Cleanup.
34729         (update_visibility_by_resolution_info): Consider UNDEF; fix checking;
34730         reset sections of symbols dragged out of the comdats.
34731         (function_and_variable_visibility): Reset sections of
34732         localized symbols.
34733
34734 2014-06-12  Jan Hubicka  <hubicka@ucw.cz>
34735
34736         * tree-vect-data-refs.c (vect_can_force_dr_alignment_p): Reorg
34737         to use symtab and decl_binds_to_current_def_p
34738         * tree-vectorizer.c (increase_alignment): Increase alignment
34739         of alias target, too.
34740
34741 2014-06-12  Jakub Jelinek  <jakub@redhat.com>
34742
34743         PR middle-end/61486
34744         * gimplify.c (struct gimplify_omp_ctx): Add distribute field.
34745         (gimplify_adjust_omp_clauses): Don't or in GOVD_LASTPRIVATE
34746         if outer combined construct is distribute.
34747         (gimplify_omp_for): For OMP_DISTRIBUTE set
34748         gimplify_omp_ctxp->distribute.
34749         * omp-low.c (scan_sharing_clauses) <case OMP_CLAUSE_SHARED>: For
34750         GIMPLE_OMP_TEAMS, if decl isn't global in outer context, record
34751         mapping into decl map.
34752
34753 2014-06-12  Jason Merrill  <jason@redhat.com>
34754
34755         * common.opt (fabi-version): Change default to 0.
34756
34757 2014-06-12  Jason Merrill  <jason@redhat.com>
34758
34759         * toplev.c (process_options): Reject -fabi-version=1.
34760
34761 2014-06-12  Jeff Law  <law@redhat.com>
34762
34763         PR tree-optimization/61009
34764         * tree-ssa-threadedge.c (thread_through_normal_block): Correct return
34765         value when we stop processing a block due to problematic PHIs.
34766
34767 2014-06-12  Alan Lawrence  <alan.lawrence@arm.com>
34768
34769         * config/aarch64/arm_neon.h (vmlaq_n_f64, vmlsq_n_f64, vrsrtsq_f64,
34770         vcge_p8, vcgeq_p8, vcgez_p8, vcgez_u8, vcgez_u16, vcgez_u32, vcgez_u64,
34771         vcgezq_p8, vcgezq_u8, vcgezq_u16, vcgezq_u32, vcgezq_u64, vcgezd_u64,
34772         vcgt_p8, vcgtq_p8, vcgtz_p8, vcgtz_u8, vcgtz_u16, vcgtz_u32, vcgtz_u64,
34773         vcgtzq_p8, vcgtzq_u8, vcgtzq_u16, vcgtzq_u32, vcgtzq_u64, vcgtzd_u64,
34774         vcle_p8, vcleq_p8, vclez_p8, vclez_u64, vclezq_p8, vclezd_u64, vclt_p8,
34775         vcltq_p8, vcltz_p8, vcltzq_p8, vcltzd_u64): Remove functions as they
34776         are not in the spec.
34777
34778 2014-06-10  Alan Lawrence  <alan.lawrence@arm.com>
34779
34780         PR target/59843
34781         * config/aarch64/aarch64-modes.def: Add V1DFmode.
34782         * config/aarch64/aarch64.c (aarch64_vector_mode_supported_p):
34783         Support V1DFmode.
34784
34785 2014-06-12  Eric Botcazou  <ebotcazou@adacore.com>
34786
34787         * tree-core.h (DECL_NONALIASED): Use proper spelling in comment.
34788
34789 2014-06-12  Georg-Johann Lay  <avr@gjlay.de>
34790
34791         PR target/61443
34792         * config/avr/avr.md (push<mode>1): Avoid (subreg(mem)) when
34793         loading from address spaces.
34794
34795 2014-06-12  Martin Liska  <mliska@suse.cz>
34796
34797         PR ipa/61462
34798         * ipa-prop.c (ipa_make_edge_direct_to_target): Check that gimple call
34799         statement is reachable.
34800
34801 2014-06-11  Jan Hubicka  <hubicka@ucw.cz>
34802
34803         * symtab.c (section_hash): New hash.
34804         (symtab_unregister_node): Clear section before freeing.
34805         (hash_section_hash_entry): New haser.
34806         (eq_sections): New function.
34807         (symtab_node::set_section_for_node): New method.
34808         (set_section_1): Update.
34809         (symtab_node::set_section): Take string instead of tree as parameter.
34810         (symtab_resolve_alias): Update.
34811         * cgraph.h (section_hash_entry_d): New structure.
34812         (section_hash_entry): New typedef.
34813         (cgraph_node): Change comdat_group_ to x_comdat_group,
34814         change section_ to x_section and turn into section_hash_entry;
34815         update accestors; put set_section_for_node offline.
34816         * tree.c (decl_section_name): Turn into string.
34817         (set_decl_section_name): Change parameter to be string.
34818         * tree.h (decl_section_name, set_decl_section_name): Update prototypes.
34819         * sdbout.c (sdbout_one_type): Update.
34820         * tree-vect-data-refs.c (vect_can_force_dr_alignment_p): Update.
34821         * varasm.c (IN_NAMED_SECTION, get_named_section,
34822         resolve_unique_section, hot_function_section, get_named_text_section,
34823         USE_SELECT_SECTION_FOR_FUNCTIONS, default_function_rodata_section,
34824         make_decl_rtl, default_unique_section): Update.
34825         * config/c6x/c6x.c (c6x_in_small_data_p): Update.
34826         (c6x_elf_unique_section): Update.
34827         * config/nios2/nios2.c (nios2_in_small_data_p): Update.
34828         * config/pa/pa.c (pa_function_section): Update.
34829         * config/pa/pa.h (IN_NAMED_SECTION_P): Update.
34830         * config/ia64/ia64.c (ia64_in_small_data_p): Update.
34831         * config/arc/arc.c (arc_in_small_data_p): Update.
34832         * config/arm/unknown-elf.h (IN_NAMED_SECTION_P): Update.
34833         * config/mcore/mcore.c (mcore_unique_section): Update.
34834         * config/mips/mips.c (mips16_build_function_stub): Update.
34835         (mips16_build_call_stub): Update.
34836         (mips_function_rodata_section): Update.
34837         (mips_in_small_data_p): Update.
34838         * config/score/score.c (score_in_small_data_p): Update.
34839         * config/rx/rx.c (rx_in_small_data): Update.
34840         * config/rs6000/rs6000.c (rs6000_elf_in_small_data_p): Update.
34841         (rs6000_xcoff_asm_named_section): Update.
34842         (rs6000_xcoff_unique_section): Update.
34843         * config/frv/frv.c (frv_string_begins_with): Update.
34844         (frv_in_small_data_p): Update.
34845         * config/v850/v850.c (v850_encode_data_area): Update.
34846         * config/bfin/bfin.c (DECL_SECTION_NAME): Update.
34847         (bfin_handle_l1_data_attribute): Update.
34848         (bfin_handle_l2_attribute): Update.
34849         * config/mep/mep.c (mep_unique_section): Update.
34850         * config/microblaze/microblaze.c (microblaze_elf_in_small_data_p):
34851         Update.
34852         * config/h8300/h8300.c (h8300_handle_eightbit_data_attribute): Update.
34853         (h8300_handle_tiny_data_attribute): Update.
34854         * config/m32r/m32r.c (m32r_in_small_data_p): Update.
34855         (m32r_in_small_data_p): Update.
34856         * config/alpha/alpha.c (alpha_in_small_data_p): Update.
34857         * config/i386/i386.c (ix86_in_large_data_p): Update.
34858         * config/i386/winnt.c (i386_pe_unique_section): Update.
34859         * config/darwin.c (darwin_function_section): Update.
34860         * config/lm32/lm32.c (lm32_in_small_data_p): Update.
34861         * tree-emutls.c (get_emutls_init_templ_addr): Update.
34862         (new_emutls_decl): Update.
34863         * lto-cgraph.c (lto_output_node, input_node, input_varpool_node,
34864         input_varpool_node): Update.
34865         (ead_string_cst): Turn to ...
34866         (read_string): ... this one.
34867         * dwarf2out.c (secname_for_decl): Update.
34868         * asan.c (asan_protect_global): Update.
34869
34870 2014-06-11  DJ Delorie  <dj@redhat.com>
34871
34872         * config/rx/rx.h (FUNCTION_BOUNDARY): Adjust for RX100/200 4-byte
34873         cache lines.
34874         * config/rx/rx.c (rx_option_override): Likewise.
34875         (rx_align_for_label): Likewise.
34876
34877         * config/rx/rx.c (rx_max_skip_for_label): Don't skip anything if -Os.
34878
34879 2014-06-11  Maciej W. Rozycki  <macro@codesourcery.com>
34880
34881         * config/mmix/mmix-protos.h (mmix_asm_output_source_line): Remove
34882         prototype.
34883
34884 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34885
34886         * common.md: New file.
34887         * doc/md.texi: Update description of generic, machine-independent
34888         constraints.
34889         * config/s390/constraints.md (e): Delete.
34890         * Makefile.in (md_file): Include common.md.
34891         * config/m32c/t-m32c (md_file): Likewise.
34892         * genpreds.c (general_mem): New array.
34893         (generic_constraint_letters): Remove constraints now defined by
34894         common.md.
34895         (add_constraint): Map TARGET_MEM_CONSTRAINT to general_mem.
34896         Allow the first character to be '<' or '>' as well.
34897         * genoutput.c (general_mem): New array.
34898         (indep_constraints): Remove constraints now defined by common.md.
34899         (note_constraint): Map TARGET_MEM_CONSTRAINT to general_mem.
34900         Remove special handling of 'm'.
34901         * ira-costs.c (record_reg_classes): Remove special handling of
34902         constraints now defined by common.md.
34903         * ira.c (ira_setup_alts, ira_get_dup_out_num): Likewise.
34904         * ira-lives.c (single_reg_class): Likewise.
34905         (ira_implicitly_set_insn_hard_regs): Likewise.
34906         * lra-constraints.c (reg_class_from_constraints): Likewise.
34907         (process_alt_operands, process_address, curr_insn_transform): Likewise.
34908         * postreload.c (reload_cse_simplify_operands): Likewise.
34909         * reload.c (push_secondary_reload, scratch_reload_class)
34910         (find_reloads, alternative_allows_const_pool_ref): Likewise.
34911         * reload1.c (maybe_fix_stack_asms): Likewise.
34912         * targhooks.c (default_secondary_reload): Likewise.
34913         * stmt.c (parse_output_constraint): Likewise.
34914         * recog.c (preprocess_constraints): Likewise.
34915         (constrain_operands, peep2_find_free_register): Likewise.
34916         (asm_operand_ok): Likewise, but add a comment saying why 'o'
34917         must be handled specially.
34918
34919 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34920
34921         * system.h (CONST_DOUBLE_OK_FOR_CONSTRAINT_P): Poison.
34922         * genpreds.c (have_const_dbl_constraints): Delete.
34923         (add_constraint): Don't set it.
34924         (write_tm_preds_h): Don't call CONST_DOUBLE_OK_FOR_CONSTRAINT_P.
34925         * ira-costs.c (record_reg_classes): Handle CONST_INT and CONST_DOUBLE
34926         constraints using the lookup_constraint logic.
34927         * ira-lives.c (single_reg_class): Likewise.
34928         * ira.c (ira_setup_alts): Likewise.
34929         * lra-constraints.c (process_alt_operands): Likewise.
34930         * recog.c (asm_operand_ok, constrain_operands): Likewise.
34931         * reload.c (find_reloads): Likewise.
34932
34933 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34934
34935         * genpreds.c (const_int_start, const_int_end): New variables.
34936         (choose_enum_order): Output CONST_INT constraints before memory
34937         constraints.
34938         (write_tm_preds_h): Always define insn_const_int_ok_for_constraint.
34939         Add CT_CONST_INT.
34940         * ira-costs.c (record_reg_classes): Handle CT_CONST_INT.
34941         * ira.c (ira_setup_alts): Likewise.
34942         * lra-constraints.c (process_alt_operands): Likewise.
34943         * recog.c (asm_operand_ok, preprocess_constraints): Likewise.
34944         * reload.c (find_reloads): Likewise.
34945
34946 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34947
34948         * recog.h (operand_alternative): Remove offmem_ok, nonffmem_ok,
34949         decmem_ok and incmem_ok.  Reformat other bitfields for consistency.
34950         * recog.c (preprocess_constraints): Update accordingly.
34951
34952 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34953
34954         * system.h (REG_CLASS_FROM_CONSTRAINT): Poison.
34955         (REG_CLASS_FOR_CONSTRAINT, EXTRA_CONSTRAINT_STR): Likewise.
34956         (EXTRA_MEMORY_CONSTRAINT, EXTRA_ADDRESS_CONSTRAINT): Likewise.
34957         * genpreds.c (print_type_tree): New function.
34958         (write_tm_preds_h): Remove REG_CLASS_FROM_CONSTRAINT,
34959         REG_CLASS_FOR_CONSTRAINT, EXTRA_MEMORY_CONSTRAINT,
34960         EXTRA_ADDRESS_CONSTRAINT and EXTRA_CONSTRAINT_STR.
34961         Write out enum constraint_type and get_constraint_type.
34962         * lra-constraints.c (satisfies_memory_constraint_p): Take a
34963         constraint_num rather than a constraint string.
34964         (satisfies_address_constraint_p): Likewise.
34965         (reg_class_from_constraints): Avoid old constraint macros.
34966         (process_alt_operands, process_address_1): Likewise.
34967         (curr_insn_transform): Likewise.
34968         * ira-costs.c (record_reg_classes): Likewise.
34969         (record_operand_costs): Likewise.
34970         * ira-lives.c (single_reg_class): Likewise.
34971         (ira_implicitly_set_insn_hard_regs): Likewise.
34972         * ira.c (ira_setup_alts, ira_get_dup_out_num): Likewise.
34973         * postreload.c (reload_cse_simplify_operands): Likewise.
34974         * recog.c (asm_operand_ok, preprocess_constraints): Likewise.
34975         (constrain_operands, peep2_find_free_register): Likewise.
34976         * reload.c (push_secondary_reload, scratch_reload_class): Likewise.
34977         (find_reloads, alternative_allows_const_pool_ref): Likewise.
34978         * reload1.c (maybe_fix_stack_asms): Likewise.
34979         * stmt.c (parse_output_constraint, parse_input_constraint): Likewise.
34980         * targhooks.c (default_secondary_reload): Likewise.
34981         * config/m32c/m32c.c (m32c_matches_constraint_p): Avoid reference
34982         to EXTRA_CONSTRAINT_STR.
34983         * config/sparc/constraints.md (U): Likewise REG_CLASS_FROM_CONSTRAINT.
34984
34985 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34986
34987         * genpreds.c (write_constraint_satisfied_p_1): Replace with...
34988         (write_constraint_satisfied_p_array): ...this new function.
34989         (write_tm_preds_h): Replace write_constraint_satisfied_p_1 with
34990         an array.
34991         (write_insn_preds_c): Update accordingly.
34992
34993 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
34994
34995         * genpreds.c (write_lookup_constraint): Rename to...
34996         (write_lookup_constraint_1): ...this.
34997         (write_lookup_constraint_array): New function.
34998         (write_tm_preds_h): Define lookup_constraint as an inline function
34999         that uses write_lookup_constraint_array where possible.
35000         (write_insn_preds_c): Update for the changes above.
35001
35002 2014-06-11  Richard Sandiford  <rdsandiford@googlemail.com>
35003
35004         * doc/md.texi (regclass_for_constraint): Rename to...
35005         (reg_class_for_constraint): ...this.
35006         * genpreds.c (num_constraints, enum_order, register_start)
35007         (register_end, satisfied_start, memory_start, memory_end)
35008         (address_start, address_end): New variables.
35009         (add_constraint): Count the number of constraints.
35010         (choose_enum_order): New function.
35011         (write_enum_constraint_num): Iterate over enum_order.
35012         (write_regclass_for_constraint): Rename to...
35013         (write_reg_class_for_constraint_1): ...this and update output
35014         accordingly.
35015         (write_constraint_satisfied_p): Rename to...
35016         (write_constraint_satisfied_p_1): ...this and update output
35017         accordingly.  Do nothing if all extra constraints are register
35018         constraints.
35019         (write_insn_extra_memory_constraint): Delete.
35020         (write_insn_extra_address_constraint): Delete.
35021         (write_range_function): New function.
35022         (write_tm_preds_h): Define constraint_satisfied_p and
35023         reg_class_for_constraint as inline functions that do a range check
35024         before calling the out-of-line function.  Use write_range_function
35025         to implement insn_extra_{register,memory,address}_constraint,
35026         the first of which is new.
35027         (write_insn_preds_c): Update after above changes to write_* functions.
35028         (main): Call choose_enum_order.
35029
35030 2014-06-11  Thomas Preud'homme  <thomas.preudhomme@arm.com>
35031
35032         PR tree-optimization/61306
35033         * tree-ssa-math-opts.c (struct symbolic_number): Store type of
35034         expression instead of its size.
35035         (do_shift_rotate): Adapt to change in struct symbolic_number. Return
35036         false to prevent optimization when the result is unpredictable due to
35037         arithmetic right shift of signed type with highest byte is set.
35038         (verify_symbolic_number_p): Adapt to change in struct symbolic_number.
35039         (init_symbolic_number): Likewise.
35040         (find_bswap_or_nop_1): Likewise. Return NULL to prevent optimization
35041         when the result is unpredictable due to sign extension.
35042
35043 2014-06-11  Terry Guo  <terry.guo@arm.com>
35044
35045         * config/arm/arm.md (*thumb1_adddi3): Move into new file thumb1.md.
35046         (*thumb1_addsi3): Ditto.
35047         (*thumb_subdi3): Ditto.
35048         (thumb1_subsi3_insn): Ditto.
35049         (*thumb_mulsi3): Ditto.
35050         (*thumb_mulsi3_v6): Ditto.
35051         (*thumb1_andsi3_insn): Ditto.
35052         (thumb1_bicsi3): Ditto.
35053         (*thumb1_iorsi3_insn): Ditto.
35054         (*thumb1_xorsi3_insn): Ditto.
35055         (*thumb1_ashlsi3): Ditto.
35056         (*thumb1_ashrsi3): Ditto.
35057         (*thumb1_lshrsi3): Ditto.
35058         (*thumb1_rotrsi3): Ditto.
35059         (*thumb1_negdi2): Ditto.
35060         (*thumb1_negsi2): Ditto.
35061         (*thumb1_abssi2): Ditto.
35062         (*thumb1_neg_abssi2): Ditto.
35063         (*thumb1_one_cmplsi2): Ditto.
35064         (*thumb1_zero_extendhisi2): Ditto.
35065         (*thumb1_zero_extendqisi2): Ditto.
35066         (*thumb1_zero_extendqisi2_v6): Ditto.
35067         (thumb1_extendhisi2): Ditto.
35068         (thumb1_extendqisi2): Ditto.
35069         (*thumb1_movdi_insn): Ditto.
35070         (*thumb1_movsi_insn): Ditto.
35071         (*thumb1_movhi_insn): Ditto.
35072         (thumb_movhi_clobber): Ditto.
35073         (*thumb1_movqi_insn): Ditto.
35074         (*thumb1_movhf): Ditto.
35075         (*thumb1_movsf_insn): Ditto.
35076         (*thumb_movdf_insn): Ditto.
35077         (movmem12b): Ditto.
35078         (movmem8b): Ditto.
35079         (cbranchqi4): Ditto.
35080         (cbranchsi4_insn): Ditto.
35081         (cbranchsi4_scratch): Ditto.
35082         (*negated_cbranchsi4): Ditto.
35083         (*tbit_cbranch): Ditto.
35084         (*tlobits_cbranch): Ditto.
35085         (*tstsi3_cbranch): Ditto.
35086         (*cbranchne_decr1): Ditto.
35087         (*addsi3_cbranch): Ditto.
35088         (*addsi3_cbranch_scratch): Ditto.
35089         (*thumb_cmpdi_zero): Ditto.
35090         (cstoresi_eq0_thumb1): Ditto.
35091         (cstoresi_ne0_thumb1): Ditto.
35092         (*cstoresi_eq0_thumb1_insn): Ditto.
35093         (*cstoresi_ne0_thumb1_insn): Ditto.
35094         (cstoresi_nltu_thumb1): Ditto.
35095         (cstoresi_ltu_thumb1): Ditto.
35096         (thumb1_addsi3_addgeu): Ditto.
35097         (*thumb_jump): Ditto.
35098         (*call_reg_thumb1_v5): Ditto.
35099         (*call_reg_thumb1): Ditto.
35100         (*call_value_reg_thumb1_v5): Ditto.
35101         (*call_value_reg_thumb1): Ditto.
35102         (*call_insn): Ditto.
35103         (*call_value_insn): Ditto.
35104         (thumb1_casesi_internal_pic): Ditto.
35105         (thumb1_casesi_dispatch): Ditto.
35106         (*thumb1_indirect_jump): Ditto.
35107         (prologue_thumb1_interwork): Ditto.
35108         (*epilogue_insns): Ditto.
35109         (consttable_1): Ditto.
35110         (consttable_2): Ditto.
35111         (tablejump): Ditto.
35112         (*thumb1_tablejump): Ditto.
35113         (thumb_eh_return): Ditto.
35114         (define_peephole2): Two of them are thumb1 only and got moved into
35115         new file thumb1.md.
35116         (define_split): Six of them are thumb1 only and got moved into new
35117         file thumb1.md.
35118         * config/arm/thumb1.md: New file comprised of above thumb1 only
35119         patterns.
35120
35121 2014-06-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
35122
35123         * config.gcc (aarch64*-*-*): Add arm_acle.h to extra headers.
35124         * Makefile.in (TEXI_GCC_FILES): Add aarch64-acle-intrinsics.texi to
35125         dependencies.
35126         * config/aarch64/aarch64-builtins.c (AARCH64_CRC32_BUILTINS): Define.
35127         (aarch64_crc_builtin_datum): New struct.
35128         (aarch64_crc_builtin_data): New.
35129         (aarch64_init_crc32_builtins): New function.
35130         (aarch64_init_builtins): Initialise CRC32 builtins when appropriate.
35131         (aarch64_crc32_expand_builtin): New.
35132         (aarch64_expand_builtin): Add CRC32 builtin expansion case.
35133         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Define
35134         __ARM_FEATURE_CRC32 when appropriate.
35135         (TARGET_CRC32): Define.
35136         * config/aarch64/aarch64.md (UNSPEC_CRC32B, UNSPEC_CRC32H,
35137         UNSPEC_CRC32W, UNSPEC_CRC32X, UNSPEC_CRC32CB, UNSPEC_CRC32CH,
35138         UNSPEC_CRC32CW, UNSPEC_CRC32CX): New unspec values.
35139         (aarch64_<crc_variant>): New pattern.
35140         * config/aarch64/arm_acle.h: New file.
35141         * config/aarch64/iterators.md (CRC): New int iterator.
35142         (crc_variant, crc_mode): New int attributes.
35143         * doc/aarch64-acle-intrinsics.texi: New file.
35144         * doc/extend.texi (aarch64): Document aarch64 ACLE intrinsics.
35145         Include aarch64-acle-intrinsics.texi.
35146
35147 2014-06-11  Evgeny Stupachenko  <evstupac@gmail.com>
35148
35149         * tree-vect-data-refs.c (vect_grouped_store_supported): New
35150         check for stores group of length 3.
35151         (vect_permute_store_chain): New permutations for stores group of
35152         length 3.
35153         * tree-vect-stmts.c (vect_model_store_cost): Change cost
35154         of vec_perm_shuffle for the new permutations.
35155
35156 2014-06-11  Jan Hubicka  <hubicka@ucw.cz>
35157
35158         * ipa-visibility.c (function_and_variable_visibility): Disable virtual
35159         table rewriting temporarily on targets not supporting ONE_ONLY.
35160
35161 2014-06-11  Richard Biener  <rguenther@suse.de>
35162
35163         PR middle-end/61437
35164         Revert
35165         2014-06-04  Richard Biener  <rguenther@suse.de>
35166
35167         * tree.h (may_be_aliased): Trust TREE_ADDRESSABLE from
35168         TREE_PUBLIC and DECL_EXTERNAL decls.
35169
35170 2014-06-10  Jan Hubicka  <hubicka@ucw.cz>
35171
35172         * varasm.c (set_implicit_section): New function.
35173         (resolve_unique_section): Use it to set implicit section
35174         for aliases, too.
35175         (get_named_text_section): Use symtab_get_node (decl)->implicit_section
35176         (default_function_section): Likewise.
35177         (decl_binds_to_current_def_p): Constify argument.
35178         * varasm.h (decl_binds_to_current_def_p): Update prototype.
35179         * asan.c (asan_protect_global): Use
35180         symtab_get_node (decl)->implicit_section.
35181         * symtab.c (dump_symtab_base): Dump implicit sections.
35182         (verify_symtab_base): Verify sanity of sectoins and comdats.
35183         (symtab_resolve_alias): Alias share the section of its target.
35184         (set_section_1): New function.
35185         (symtab_node::set_section): Move here, recurse to aliases.
35186         (verify_symtab): Check for duplicated symtab lists.
35187         * tree-core.h (implicit_section_name_p): Remove.
35188         * tree-vect-data-refs.c: Include varasm.h.
35189         (vect_can_force_dr_alignment_p): Fix conditional on when
35190         decl bints to current definition; use
35191         symtab_get_node (decl)->implicit_section.
35192         * cgraph.c (cgraph_make_node_local_1): Fix section set.
35193         * cgraph.h (struct symtab_node): Add implicit_section.
35194         (set_section): Rename to ...
35195         (set_section_for_node): ... this one.
35196         (set_section): Declare.
35197         * tree.h (DECL_HAS_IMPLICIT_SECTION_NAME_P): Remove.
35198         * lto-cgraph.c (lto_output_node, lto_output_varpool_node,
35199         input_overwrite_node, input_varpool_node): Stream implicit_section.
35200         * ipa.c (symtab_remove_unreachable_nodes): Do not check symtab before
35201         removal; it will fail in LTO.
35202
35203 2014-06-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
35204
35205         * config/aarch64/aarch64-simd.md (move_lo_quad_<mode>):
35206         Change second alternative type to f_mcr.
35207         * config/aarch64/aarch64.md (*movsi_aarch64): Change 11th
35208         and 12th alternatives' types to f_mcr and f_mrc.
35209         (*movdi_aarch64): Same for 12th and 13th alternatives.
35210         (*movsf_aarch64): Change 9th alternatives' type to mov_reg.
35211         (aarch64_movtilow_tilow): Change type to fmov.
35212
35213 2014-06-10  Jiong Wang  <jiong.wang@arm.com>
35214
35215         * config/aarch64/aarch64.c (aarch64_save_or_restore_fprs)
35216         (aarch64_save_or_restore_callee_save_registers): Fix layout.
35217
35218 2014-06-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
35219
35220         * config/aarch64/aarch64-simd.md (aarch64_sqdmulh_lane<mode>):
35221         New expander.
35222         (aarch64_sqrdmulh_lane<mode>): Likewise.
35223         (aarch64_sq<r>dmulh_lane<mode>): Rename to...
35224         (aarch64_sq<r>dmulh_lane<mode>_internal): ...this.
35225         (aarch64_sqdmulh_laneq<mode>): New expander.
35226         (aarch64_sqrdmulh_laneq<mode>): Likewise.
35227         (aarch64_sq<r>dmulh_laneq<mode>): Rename to...
35228         (aarch64_sq<r>dmulh_laneq<mode>_internal): ...this.
35229         (aarch64_sqdmulh_lane<mode>): New expander.
35230         (aarch64_sqrdmulh_lane<mode>): Likewise.
35231         (aarch64_sq<r>dmulh_lane<mode>): Rename to...
35232         (aarch64_sq<r>dmulh_lane<mode>_internal): ...this.
35233         (aarch64_sqdmlal_lane<mode>): Add lane flip for big-endian.
35234         (aarch64_sqdmlal_laneq<mode>): Likewise.
35235         (aarch64_sqdmlsl_lane<mode>): Likewise.
35236         (aarch64_sqdmlsl_laneq<mode>): Likewise.
35237         (aarch64_sqdmlal2_lane<mode>): Likewise.
35238         (aarch64_sqdmlal2_laneq<mode>): Likewise.
35239         (aarch64_sqdmlsl2_lane<mode>): Likewise.
35240         (aarch64_sqdmlsl2_laneq<mode>): Likewise.
35241         (aarch64_sqdmull_lane<mode>): Likewise.
35242         (aarch64_sqdmull_laneq<mode>): Likewise.
35243         (aarch64_sqdmull2_lane<mode>): Likewise.
35244         (aarch64_sqdmull2_laneq<mode>): Likewise.
35245
35246 2014-06-10  Richard Biener  <rguenther@suse.de>
35247
35248         PR tree-optimization/61438
35249         * tree-ssa-pre.c (eliminate_dom_walker): Add do_pre member.
35250         (eliminate_dom_walker::before_dom_children): Only try to inhibit
35251         insertion of IVs if running PRE.
35252         (eliminate): Adjust.
35253         (pass_pre::execute): Likewise.
35254         (pass_fre::execute): Likewise.
35255
35256 2014-06-10  Richard Biener  <rguenther@suse.de>
35257
35258         PR middle-end/61456
35259         * tree-ssa-alias.c (nonoverlapping_component_refs_of_decl_p):
35260         Do not use the main variant for the type comparison.
35261         (ncr_compar): Likewise.
35262         (nonoverlapping_component_refs_p): Likewise.
35263
35264 2014-06-10  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35265
35266         * config/aarch64/aarch64.c (aarch64_save_or_restore_fprs): Fix
35267         REG_CFA_RESTORE mode.
35268
35269 2014-06-10  Evgeny Stupachenko  <evstupac@gmail.com>
35270
35271         * config/i386/i386.c (expand_vec_perm_pblendv): New.
35272         * config/i386/i386.c (ix86_expand_vec_perm_const_1): Use
35273         expand_vec_perm_pblendv.
35274
35275 2014-06-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
35276
35277         * doc/arm-acle-intrinsics.texi: Specify when CRC32 intrinsics are
35278         available.
35279         Simplify description of __crc32d and __crc32cd intrinsics.
35280         * doc/extend.texi (ARM ACLE Intrinsics): Remove comment about CRC32
35281         availability.
35282
35283 2014-06-10  Thomas Schwinge  <thomas@codesourcery.com>
35284
35285         PR lto/61334
35286         * configure.ac: Use gcc_AC_CHECK_DECLS to check for strnlen prototype.
35287         * config.in: Regenerate.
35288         * configure: Likewise.
35289
35290 2014-06-10  Jan Hubicka  <hubicka@ucw.cz>
35291
35292         * ipa-reference.c (is_proper_for_analysis): Exclude addressable
35293         and public vars.
35294         (intersect_static_var_sets): Remove.
35295         (propagate): Do not prune local statics.
35296
35297 2014-06-10  Jakub Jelinek  <jakub@redhat.com>
35298
35299         PR fortran/60928
35300         * omp-low.c (lower_rec_input_clauses) <case OMP_CLAUSE_LASTPRIVATE>:
35301         Set lastprivate_firstprivate even if omp_private_outer_ref
35302         langhook returns true.
35303         <case OMP_CLAUSE_REDUCTION>: When calling omp_clause_default_ctor
35304         langhook, call unshare_expr on new_var and call
35305         build_outer_var_ref to get the last argument.
35306
35307 2014-06-10  Marek Polacek  <polacek@redhat.com>
35308
35309         PR c/60988
35310         * doc/extend.texi: Add cindex for transparent_union.
35311
35312 2014-06-09  Thomas Preud'homme  <thomas.preudhomme@arm.com>
35313
35314         * tree-ssa-math-opts.c (find_bswap_or_nop_load): Check return value of
35315         init_symbolic_number ().
35316
35317 2014-05-18  John David Anglin  <danglin@gcc.gnu.org>
35318
35319         PR middle-end/61141
35320         * emit-rtl.c (reset_all_used_flags): In a sequence, check that
35321         XVECEXP (pat, 0, i) is an INSN before calling reset_insn_used_flags.
35322         (verify_rtl_sharing): Likewise.
35323
35324 2014-06-09  Marc Glisse  <marc.glisse@inria.fr>
35325
35326         PR c++/54442
35327         * tree.c (build_qualified_type): Use a canonical type for
35328         TYPE_CANONICAL.
35329
35330 2014-06-09  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
35331
35332         * config/arm/arm-modes.def: Remove XFmode.
35333
35334 2014-06-09  Alan Lawrence  <alan.lawrence@arm.com>
35335
35336         PR target/61062
35337         * config/arm/arm_neon.h (vtrn_s8, vtrn_s16, vtrn_u8, vtrn_u16, vtrn_p8,
35338         vtrn_p16, vtrn_s32, vtrn_f32, vtrn_u32, vtrnq_s8, vtrnq_s16, vtrnq_s32,
35339         vtrnq_f32, vtrnq_u8, vtrnq_u16, vtrnq_u32, vtrnq_p8, vtrnq_p16,
35340         vzip_s8, vzip_s16, vzip_u8, vzip_u16, vzip_p8, vzip_p16, vzip_s32,
35341         vzip_f32, vzip_u32, vzipq_s8, vzipq_s16, vzipq_s32, vzipq_f32,
35342         vzipq_u8, vzipq_u16, vzipq_u32, vzipq_p8, vzipq_p16, vuzp_s8, vuzp_s16,
35343         vuzp_s32, vuzp_f32, vuzp_u8, vuzp_u16, vuzp_u32, vuzp_p8, vuzp_p16,
35344         vuzpq_s8, vuzpq_s16, vuzpq_s32, vuzpq_f32, vuzpq_u8, vuzpq_u16,
35345         vuzpq_u32, vuzpq_p8, vuzpq_p16): Correct mask for bigendian.
35346
35347 2014-06-09  Jan Hubicka  <hubicka@ucw.cz>
35348
35349         * tree-core.h (tree_decl_with_vis): Remove section_name.
35350
35351 2014-06-09  Kito Cheng  <kito@0xlab.org>
35352
35353         * ira.c (ira): Don't call init_caller_save if LRA enabled
35354         since LRA use its own infrastructure to handle that.
35355
35356 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35357
35358         * symtab.c (dump_symtab_base): Update dumping.
35359         (symtab_make_decl_local): Clear only DECL_COMDAT.
35360         * tree-vect-data-refs.c (Check that variable is static before
35361         tampering with sections.
35362         * cgraphclones.c (duplicate_thunk_for_node): Do not clear section name.
35363         (cgraph_create_virtual_clone): Likewise.
35364         * tree.c (decl_comdat_group, decl_comdat_group_id): Constify argument.
35365         (decl_section_name, set_decl_section_name): New accessors.
35366         (find_decls_types_r): Do not walk section name
35367         * tree.h (DECL_SECTION_NAME): Implement using decl_section_name.
35368         (decl_comdat_group, decl_comdat_group_id): Constify.
35369         (decl_section_name, set_decl_section_name): Update.
35370         * varpool.c (varpool_finalize_named_section_flags): Use get_section.
35371         * cgraph.c (cgraph_add_thunk): Reset node instead of rebuilding.
35372         (cgraph_make_node_local_1): Clear section and comdat group.
35373         * cgraph.h (set_comdat_group): Sanity check.
35374         (get_section, set_section): New.
35375         * ipa-comdats.c (ipa_comdats): Use get_section.
35376         * ipa.c (ipa_discover_readonly_nonaddressable_var): Likewise.
35377         * lto-streamer-out.c: Do not follow section names.
35378         * c-family/c-common.c (handle_section_attribute): Update.
35379         * lto-cgraph.c (lto_output_node): Output section.
35380         (lto_output_varpool_node): Likewise.
35381         (read_comdat_group): Rename to ...
35382         (read_identifier): ... this one.
35383         (read_string_cst): New function.
35384         (input_node, input_varpool_node): Input section names.
35385         * tree-emutls.c (get_emutls_init_templ_addr): Update.
35386         (new_emutls_decl): Update.
35387         (secname_for_decl): Check section names only of static vars.
35388         * config/mep/mep.c (mep_unique_section): Use set_decl_section_name.
35389         * config/i386/winnt.c (i386_pe_unique_section): Likewise.
35390         * config/i386/i386.c (x86_64_elf_unique_section): Likewise.
35391         * config/c6x/c6x.c (c6x_elf_unique_section): Likewise.
35392         * config/rs6000/rs6000.c (rs6000_xcoff_unique_section): Likewise.
35393         * config/mcore/mcore.c (mcore_unique_section): Likewise.
35394         * config/mips/mips.c (mips16_build_function_stub): Likewise.
35395         * config/v850/v850.c (v850_insert_attributes): Likewise.
35396         * config/h8300/h8300.c (h8300_handle_eightbit_data_attribute):
35397         Likewise.
35398         (h8300_handle_tiny_data_attribute): Likewise.
35399         * config/bfin/bfin.c (bfin_handle_l1_text_attribute): Likewise.
35400         (bfin_handle_l2_attribute): Likewise.
35401
35402 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35403
35404         * symtab.c (symtab_nonoverwritable_alias): Copy VIRTUAL flag;
35405         remove static initializer.
35406
35407 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35408
35409         * varasm.c (use_blocks_for_decl_p): Check symbol table
35410         instead of alias attribute.
35411         (place_block_symbol): Recurse on aliases.
35412
35413 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35414
35415         * ipa-visibility.c: Include varasm.h
35416         (can_replace_by_local_alias): Ceck decl_binds_to_current_def_p.
35417
35418 2014-06-07  Jan Hubicka  <hubicka@ucw.cz>
35419
35420         * cgraphunit.c (assemble_thunks_and_aliases): Expand thunks before
35421         outputting aliases.
35422
35423 2014-06-07  Steven Bosscher  <steven@gcc.gnu.org>
35424
35425         * gcse.c (can_assign_to_reg_without_clobbers_p): Do not let pointers
35426         from test_insn into GGC space escape via SET_SRC.
35427
35428 2014-06-07  Eric Botcazou  <ebotcazou@adacore.com>
35429
35430         * tree-ssa-tail-merge.c (same_succ_hash): Hash the static chain of a
35431         call statement, if any.
35432         (gimple_equal_p) <GIMPLE_CALL>: Compare the static chain of the call
35433         statements, if any.  Tidy up.
35434
35435 2014-06-06  Michael Meissner  <meissner@linux.vnet.ibm.com>
35436
35437         PR target/61431
35438         * config/rs6000/vsx.md (VSX_LE): Split VSX_D into 2 separate
35439         iterators, VSX_D that handles 64-bit types, and VSX_LE that
35440         handles swapping the two 64-bit double words on little endian
35441         systems.  Include V1TImode and optionally TImode in VSX_LE so that
35442         these types are properly swapped.  Change all of the insns and
35443         splits that do the 64-bit swaps to use VSX_LE.
35444         (vsx_le_perm_load_<mode>): Likewise.
35445         (vsx_le_perm_store_<mode>): Likewise.
35446         (splitters for little endian memory operations): Likewise.
35447         (vsx_xxpermdi2_le_<mode>): Likewise.
35448         (vsx_lxvd2x2_le_<mode>): Likewise.
35449         (vsx_stxvd2x2_le_<mode>): Likewise.
35450
35451 2014-06-06  Uros Bizjak  <ubizjak@gmail.com>
35452
35453         PR target/61423
35454         * config/i386/i386.md (*floatunssi<mode>2_i387_with_xmm): New
35455         define_insn_and_split pattern, merged from *floatunssi<mode>2_1
35456         and corresponding splitters.  Zero extend general register
35457         or memory input operand to XMM temporary.  Enable for
35458         TARGET_SSE2 and TARGET_INTER_UNIT_MOVES_TO_VEC only.
35459         (floatunssi<mode>2): Update expander predicate.
35460
35461 2014-06-06  Vladimir Makarov  <vmakarov@redhat.com>
35462
35463         PR rtl-optimization/61325
35464         * lra-constraints.c (process_address_1): Check scale equal to one
35465         to prevent transformation: base + scale * index => base + new_reg.
35466
35467 2014-06-06  Richard Biener  <rguenther@suse.de>
35468
35469         PR tree-optimization/59299
35470         * tree-ssa-sink.c (all_immediate_uses_same_place): Work on
35471         a def operand.
35472         (nearest_common_dominator_of_uses): Likewise.
35473         (statement_sink_location): Adjust.  Support sinking loads.
35474
35475 2014-06-06  Martin Jambor  <mjambor@suse.cz>
35476
35477         * ipa-prop.c (get_place_in_agg_contents_list): New function.
35478         (build_agg_jump_func_from_list): Likewise.
35479         (determine_known_aggregate_parts): Renamed to
35480         determine_locally_known_aggregate_parts.  Moved some functionality
35481         to the two functions above, removed bound checks.
35482
35483 2014-06-06  James Greenhalgh  <james.greenhalgh@arm.com>
35484
35485         * config/aarch64/aarch64-protos.h (aarch64_expand_movmem): New.
35486         * config/aarch64/aarch64.c (aarch64_move_pointer): New.
35487         (aarch64_progress_pointer): Likewise.
35488         (aarch64_copy_one_part_and_move_pointers): Likewise.
35489         (aarch64_expand_movmen): Likewise.
35490         * config/aarch64/aarch64.h (MOVE_RATIO): Set low.
35491         * config/aarch64/aarch64.md (movmem<mode>): New.
35492
35493 2014-06-06  Bingfeng Mei  <bmei@broadcom.com>
35494
35495         * targhooks.c (default_add_stmt_cost): Call target specific
35496         hook instead of default one.
35497
35498 2014-06-06  Thomas Preud'homme  <thomas.preudhomme@arm.com>
35499
35500         * ChangeLog (2014-05-23): Fix ChangeLog entry to refer to target
35501         endianness instead of host endianness.
35502         * tree-ssa-math-opts.c (find_bswap_or_nop_1): Likewise in dumps and
35503         comments.
35504
35505 2014-06-06  Eric Botcazou  <ebotcazou@adacore.com>
35506
35507         PR debug/53927
35508         * function.c (instantiate_decls): Process the saved static chain.
35509         (expand_function_start): If not optimizing, save the static chain
35510         onto the stack.
35511         * tree-nested.c (convert_all_function_calls): Always create the static
35512         chain for nested functions if not optimizing.
35513
35514 2014-06-06  Eric Botcazou  <ebotcazou@adacore.com>
35515
35516         * tree-cfg.c (make_edges) <GIMPLE_RETURN>: Put a location on the edge.
35517
35518 2014-06-06  Richard Biener  <rguenther@suse.de>
35519
35520         * cfgexpand.c (expand_gimple_cond): Remove check for current_loops.
35521         (construct_init_block): Likewise.
35522         (construct_exit_block): Likewise.
35523         (pass_expand::execute): Likewise.
35524         * graphite.c (graphite_transforms): Replace check for current_loops
35525         with a check for > 1 loops.
35526         (pass_graphite_transforms::execute): Adjust.
35527         * ipa-split.c (split_function): Remove check for current_loops.
35528         * omp-low.c (expand_parallel_call): Likewise.
35529         (expand_omp_for_init_counts): Likewise.
35530         (extract_omp_for_update_vars): Likewise.
35531         (expand_omp_for_generic): Likewise.
35532         (expand_omp_sections): Likewise.
35533         (expand_omp_target): Likewise.
35534         * tracer.c (tail_duplicate): Likewise.
35535         (pass_tracer::execute): Likewise.
35536         * trans-mem.c (expand_transaction): Likewise.
35537         * tree-complex.c (expand_complex_div_wide): Likewise.
35538         * tree-eh.c (lower_resx): Likewise.
35539         (cleanup_empty_eh_merge_phis): Likewise.
35540         * tree-predcom.c (run_tree_predictive_commoning): Replace check for
35541         current_loops with a check for > 1 loops.
35542         (pass_predcom::execute): Adjust.
35543         * tree-scalar-evolution.c (scev_reset): Remove check for current_loops.
35544         * tree-ssa-copy.c (copy_prop_visit_phi_node): Likewise.
35545         * tree-ssa-dom.c (pass_phi_only_cprop::execute): Likewise.
35546         * tree-ssa-tail-merge.c (tail_merge_optimize): Likewise.
35547         * tree-ssa-threadupdate.c (thread_through_all_blocks): Likewise.
35548         * tree-switch-conversion.c (process_switch): Likewise.
35549         * tree-tailcall.c (tree_optimize_tail_calls_1): Likewise.
35550         * tree-vrp.c (vrp_visit_phi_node): Likewise.
35551         (execute_vrp): Likewise.
35552         * ubsan.c (ubsan_expand_null_ifn): Likewise.
35553
35554 2014-06-06  Eric Botcazou  <ebotcazou@adacore.com>
35555
35556         * rtl.h (insn_location): Declare.
35557         * cfgcleanup.c (try_forward_edges): Compare the locus of locations
35558         with UNKNOWN_LOCATION.
35559         * emit-rtl.c (insn_location): New function.
35560         * final.c (notice_source_line): Check that the instruction has a
35561         location before retrieving it and use insn_location.
35562         * modulo-sched.c (loop_single_full_bb_p): Likewise.
35563         * print-rtl.c (print_rtx): Likewise.
35564
35565 2014-06-06  Richard Biener  <rguenther@suse.de>
35566
35567         * passes.def: Move 2nd VRP pass before phi-only-cprop.
35568
35569 2014-06-06  Christian Bruel  <christian.bruel@st.com>
35570
35571         PR tree-optimization/43934
35572         * tree-ssa-loop-im.c (determine_max_movement): Add PHI def constant
35573         cost.
35574
35575 2014-06-06  Richard Sandiford  <rdsandiford@googlemail.com>
35576
35577         * ira-lives.c (single_reg_class): Add missing break.  Explicitly
35578         return NO_REGS for extra address and memory constraints.  Handle
35579         operands that match (or are equivalent to something that matches)
35580         extra constant constraints.  Ignore other non-register operands.
35581
35582 2014-06-06  Alan Modra  <amodra@gmail.com>
35583
35584         PR target/61300
35585         * doc/tm.texi.in (INCOMING_REG_PARM_STACK_SPACE): Document.
35586         * doc/tm.texi: Regenerate.
35587         * function.c (INCOMING_REG_PARM_STACK_SPACE): Provide default.
35588         Use throughout in place of REG_PARM_STACK_SPACE.
35589         * config/rs6000/rs6000.c (rs6000_reg_parm_stack_space): Add
35590         "incoming" param.  Pass to rs6000_function_parms_need_stack.
35591         (rs6000_function_parms_need_stack): Add "incoming" param, ignore
35592         prototype_p when incoming.  Use function decl when incoming
35593         to handle K&R style functions.
35594         * config/rs6000/rs6000.h (REG_PARM_STACK_SPACE): Adjust.
35595         (INCOMING_REG_PARM_STACK_SPACE): Define.
35596
35597 2014-06-05  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
35598
35599         PR target/52472
35600         * cfgexpand.c (expand_debug_expr): Use address space of nested
35601         TREE_TYPE for ADDR_EXPR and MEM_REF.
35602
35603 2014-06-05  Jeff Law  <law@redhat.com>
35604
35605         PR tree-optimization/61289
35606         * tree-ssa-threadedge.c (invalidate_equivalences): Remove SRC_MAP and
35607         DST_MAP parameters.   Invalidate by walking all the SSA_NAME_VALUES
35608         looking for those which match LHS.  All callers changed.
35609         (record_temporary_equivalences_from_phis): Remove SRC_MAP and DST_MAP
35610         parameters and code which manipulated them.  All callers changed.
35611         (record_temporary_equivalences_from_stmts_at_dest): Remove SRC_MAP
35612         and DST_MAP parameters.  Simplify invalidation code by just calling
35613         invalidate_equivalences.  All callers changed.
35614         (thread_across_edge): Simplify now that we don't need to maintain
35615         the map of equivalences to invalidate.
35616
35617 2014-06-05  Kai Tietz  <ktietz@redhat.com>
35618             Richard Henderson  <rth@redhat.com>
35619
35620         PR target/46219
35621         * config/i386/predicates.md (memory_nox32_operand): Add memory_operand
35622         checking for !TARGET_X32.
35623         * config/i386/i386.md (UNSPEC_PEEPSIB): New unspec constant.
35624         (sibcall_intern): New define_insn, plus required peepholes.
35625         (sibcall_pop_intern): Likewise.
35626         (sibcall_value_intern): Likewise.
35627         (sibcall_value_pop_intern): Likewise.
35628
35629 2014-06-05  Ilya Enkovich  <ilya.enkovich@intel.com>
35630
35631         * tree-inline.c (tree_function_versioning): Check DF info existence
35632         before accessing it.
35633
35634 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35635
35636         * config/aarch64/aarch64.h (aarch64_frame): Add hard_fp_offset and
35637         frame_size.
35638         * config/aarch64/aarch64.c (aarch64_layout_frame): Initialize
35639         aarch64_frame hard_fp_offset and frame_size.
35640         (aarch64_expand_prologue): Use aarch64_frame hard_fp_offset and
35641         frame_size; remove original_frame_size.
35642         (aarch64_expand_epilogue, aarch64_final_eh_return_addr): Likewise.
35643         (aarch64_initial_elimination_offset): Remove frame_size and
35644         offset.  Use aarch64_frame frame_size.
35645
35646 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35647             Jiong Wang  <jiong.wang@arm.com>
35648             Renlin  <renlin.li@arm.com>
35649
35650         * config/aarch64/aarch64.c (aarch64_layout_frame): Correct
35651         initialization of R30 offset.  Update offset.  Iterate core
35652         regisers upto X30.  Remove X29, X30 specific code.
35653
35654 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35655             Jiong Wang  <jiong.wang@arm.com>
35656
35657         * config/aarch64/aarch64.c (SLOT_NOT_REQUIRED, SLOT_REQUIRED): Define.
35658         (aarch64_layout_frame): Use SLOT_NOT_REQUIRED and SLOT_REQUIRED.
35659         (aarch64_register_saved_on_entry): Adjust test.
35660
35661 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35662
35663         * config/aarch64/aarch64.h (machine_function): Move
35664         saved_varargs_size from here...
35665         (aarch64_frame): ... to here.
35666
35667         * config/aarch64/aarch64.c (aarch64_expand_prologue)
35668         (aarch64_expand_epilogue, aarch64_final_eh_return_addr)
35669         (aarch64_initial_elimination_offset)
35670         (aarch64_setup_incoming_varargs): Adjust location of
35671         saved_varargs_size.
35672
35673 2014-06-05  Marcus Shawcroft  <marcus.shawcroft@arm.com>
35674
35675         * config/aarch64/aarch64.c (aarch64_expand_prologue): Update stack
35676         layout comment.
35677
35678 2014-06-05  Jaydeep Patil  <Jaydeep.Patil@imgtec.com>
35679             Prachi Godbole  <Prachi.Godbole@imgtec.com>
35680
35681         * config/mips/mips-cpus.def: Add definition for p5600.  Updated
35682         mips32r5 entry to use PROCESSOR_P5600.
35683         * config/mips/mips-tables.opt: Regenerate.
35684         * config/mips/mips-protos.h (mips_fmadd_bypass): Add prototype.
35685         * config/mips/mips.c (mips_fmadd_bypass): New function.
35686         (mips_rtx_cost_data): Add costs for p5600.
35687         (mips_issue_rate): Add support for p5600.
35688         (mips_multipass_dfa_lookahead): Likewise.
35689         * config/mips/mips.h (TUNE_P5600): New define.
35690         (TUNE_MACC_CHAINS): Add TUNE_P5600.
35691         (MIPS_ISA_LEVEL_SPEC): Map -march=p5600 to -mips32r5.
35692         * config/mips/mips.md: Include p5600.md.
35693         (processor): Add p5600.
35694         * config/mips/p5600.md: New file.
35695
35696 2014-06-05  Evgeny Stupachenko  <evstupac@gmail.com>
35697
35698         * config/i386/sse.md (*ssse3_palignr<mode>_perm): New.
35699         * config/i386/predicates.md (palignr_operand): New.
35700         Indicates if permutation is suitable for palignr instruction.
35701
35702 2014-06-05  Yuri Rumyantsev  <ysrumyan@gmail.com>
35703
35704         PR tree-optimization/61319
35705         * tree-if-conv.c (is_cond_scalar_reduction): Add missed check that
35706         stmt belongs to loop.
35707
35708 2014-06-05  Richard Biener  <rguenther@suse.de>
35709
35710         * gimplify.c (create_tmp_from_val): Remove is_formal parameter
35711         and set DECL_GIMPLE_REG_P unconditionally if appropriate.
35712         (lookup_tmp_var): Adjust.
35713         (prepare_gimple_addressable): Unset DECL_GIMPLE_REG_P here.
35714
35715 2014-06-05  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
35716
35717         * config/arm/arm.md (enabled): Disable opt_enabled attribute.
35718
35719 2014-06-05  Marek Polacek  <polacek@redhat.com>
35720
35721         PR c/49706
35722         * doc/invoke.texi: Document -Wlogical-not-parentheses.
35723
35724 2014-06-04  Tom de Vries  <tom@codesourcery.com>
35725
35726         * config/s390/s390.md ("addptrdi3", "addptrsi3"): Use INTVAL only on
35727         CONST_INT.
35728
35729 2014-06-04  Marc Glisse  <marc.glisse@inria.fr>
35730
35731         PR tree-optimization/61385
35732         * tree-ssa-phiopt.c (value_replacement): Punt if there are PHI nodes.
35733
35734 2014-06-04  Bernd Schmidt  <bernds@codesourcery.com>
35735
35736         * lto-wrapper.c (fatal, fatal_perror): Remove functions.  All callers
35737         changed to use fatal_error.
35738         (main): Ensure lto_wrapper_cleanup is run atexit.
35739
35740 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35741
35742         * lra-constraints.c (valid_address_p): Move earlier in file.
35743         (address_eliminator): New structure.
35744         (satisfies_memory_constraint_p): New function.
35745         (satisfies_address_constraint_p): Likewise.
35746         (process_alt_operands, process_address, curr_insn_transform): Use them.
35747
35748 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35749
35750         * lra-int.h (lra_static_insn_data): Make operand_alternative a
35751         const pointer.
35752         (target_lra_int, default_target_lra_int, this_target_lra_int)
35753         (op_alt_data): Delete.
35754         * lra.h (lra_init): Delete.
35755         * lra.c (default_target_lra_int, this_target_lra_int): Delete.
35756         (init_insn_code_data_once): Remove op_alt_data handling.
35757         (finish_insn_code_data_once): Likewise.
35758         (init_op_alt_data): Delete.
35759         (get_static_insn_data): Initialize operand_alternative to null.
35760         (free_insn_recog_data): Cast operand_alternative before freeing it.
35761         (setup_operand_alternative): Take the operand_alternative as
35762         parameter and assume it isn't already cached in the static
35763         insn data.
35764         (lra_set_insn_recog_data): Update accordingly.
35765         (lra_init): Delete.
35766         * ira.c (ira_init): Don't call lra_init.
35767         * target-globals.h (this_target_lra_int): Declare.
35768         (target_globals): Remove lra_int.
35769         (restore_target_globals): Update accordingly.
35770         * target-globals.c: Don't include lra-int.h.
35771         (default_target_globals, save_target_globals): Remove lra_int.
35772
35773 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35774
35775         * recog.h (operand_alternative): Convert reg_class, reject,
35776         matched and matches into bitfields.
35777         (preprocess_constraints): New overload.
35778         (preprocess_insn_constraints): New function.
35779         (preprocess_constraints): Take the insn as parameter.
35780         (recog_op_alt): Change into a pointer.
35781         (target_recog): Add x_op_alt.
35782         * recog.c (asm_op_alt): New variable.
35783         (recog_op_alt): Change into a pointer.
35784         (preprocess_constraints): New overload, replacing the old function
35785         definition with one that doesn't use global state.
35786         (preprocess_insn_constraints): New function.
35787         (preprocess_constraints): Use them.  Take the insn as parameter.
35788         Use asm_op_alt for asms.
35789         (recog_init): Free existing x_op_alt entries.
35790         * ira-lives.c (check_and_make_def_conflict): Make operand_alternative
35791         pointer const.
35792         (make_early_clobber_and_input_conflicts): Likewise.
35793         (process_bb_node_lives): Pass the insn to process_constraints.
35794         * reg-stack.c (check_asm_stack_operands): Likewise.
35795         (subst_asm_stack_regs): Likewise.
35796         * regcprop.c (copyprop_hardreg_forward_1): Likewise.
35797         * regrename.c (build_def_use): Likewise.
35798         * sched-deps.c (sched_analyze_insn): Likewise.
35799         * sel-sched.c (get_reg_class, implicit_clobber_conflict_p): Likewise.
35800         * config/arm/arm.c (xscale_sched_adjust_cost): Likewise.
35801         (note_invalid_constants): Likewise.
35802         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
35803         (ix86_legitimate_combined_insn): Make operand_alternative pointer
35804         const.
35805
35806 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35807
35808         * recog.c (preprocess_constraints): Don't skip disabled alternatives.
35809         * ira-lives.c (check_and_make_def_conflict): Check for disabled
35810         alternatives.
35811         (make_early_clobber_and_input_conflicts): Likewise.
35812         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
35813
35814 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35815
35816         * recog.h (alternative_class): New function.
35817         (which_op_alt): Return a const recog_op_alt.
35818         * reg-stack.c (check_asm_stack_operands): Update type accordingly.
35819         (subst_asm_stack_regs): Likewise.
35820         * config/arm/arm.c (note_invalid_constants): Likewise.
35821         * regcprop.c (copyprop_hardreg_forward_1): Likewise.  Don't modify
35822         the operand_alternative; use alternative class instead.
35823         * sel-sched.c (get_reg_class): Likewise.
35824         * regrename.c (build_def_use): Likewise.
35825         (hide_operands, restore_operands, record_out_operands): Update type
35826         accordingly.
35827
35828 2014-06-04  Richard Sandiford  <rdsandiford@googlemail.com>
35829
35830         * recog.h (recog_op_alt): Convert to a flat array.
35831         (which_op_alt): New function.
35832         * recog.c (recog_op_alt): Convert to a flat array.
35833         (preprocess_constraints): Update accordingly, grouping all
35834         operands of the same alternative together, rather than the
35835         other way around.
35836         * ira-lives.c (check_and_make_def_conflict): Likewise.
35837         (make_early_clobber_and_input_conflicts): Likewise.
35838         * config/i386/i386.c (ix86_legitimate_combined_insn): Likewise.
35839         * reg-stack.c (check_asm_stack_operands): Use which_op_alt.
35840         (subst_asm_stack_regs): Likewise.
35841         * regcprop.c (copyprop_hardreg_forward_1): Likewise.
35842         * regrename.c (hide_operands, record_out_operands): Likewise.
35843         (build_def_use): Likewise.
35844         * sel-sched.c (get_reg_class): Likewise.
35845         * config/arm/arm.c (note_invalid_constants): Likewise.
35846
35847 2014-06-04  Jason Merrill  <jason@redhat.com>
35848
35849         PR c++/51253
35850         PR c++/61382
35851         * gimplify.c (gimplify_arg): Non-static.
35852         * gimplify.h: Declare it.
35853
35854 2014-06-04  Richard Biener  <rguenther@suse.de>
35855
35856         * tree.h (may_be_aliased): Trust TREE_ADDRESSABLE from
35857         TREE_PUBLIC and DECL_EXTERNAL decls.
35858
35859 2014-06-04  Matthew Fortune  <matthew.fortune@imgtec.com>
35860
35861         * regcprop.c (copyprop_hardreg_forward_1): Account for
35862         HARD_REGNO_CALL_PART_CLOBBERED.
35863
35864 2014-06-04  Richard Biener  <rguenther@suse.de>
35865
35866         * configure.ac: Check whether the underlying type of int64_t
35867         is long or long long.
35868         * configure: Regenerate.
35869         * config.in: Likewise.
35870         * hwint.h (HOST_WIDE_INT): Match the underlying type of int64_t.
35871         (HOST_WIDE_INT_PRINT_*): Define in terms of PRI*64.
35872
35873 2014-06-04  Richard Biener  <rguenther@suse.de>
35874
35875         PR tree-optimization/60098
35876         * tree-ssa-dse.c (dse_possible_dead_store_p): Walk until
35877         we hit a kill.
35878         (dse_optimize_stmt): Simplify, now that we found a kill
35879         earlier.
35880
35881 2014-06-04  Richard Biener  <rguenther@suse.de>
35882
35883         * tree-ssa-alias.c (stmt_may_clobber_ref_p): Improve handling
35884         of accesses with non-invariant address.
35885
35886 2014-06-04  Martin Liska  <mliska@suse.cz>
35887
35888         * cgraph.h (cgraph_make_wrapper): New function introduced.
35889         * cgraphunit.c (cgraph_make_wrapper): The function implementation.
35890         * ipa-inline.h (inline_analyze_function): The function is global.
35891         * ipa-inline-analysis.c (inline_analyze_function): Likewise.
35892
35893 2014-06-04  Martin Liska  <mliska@suse.cz>
35894
35895         * tree.h (private_lookup_attribute_starting): New function.
35896         (lookup_attribute_starting): Likewise.
35897         * tree.c (private_lookup_attribute_starting): Likewise.
35898
35899 2014-06-04  Martin Liska  <mliska@suse.cz>
35900
35901         * cgraph.h (expand_thunk): New argument added.
35902         (address_taken_from_non_vtable_p): New global function.
35903         * ipa-visibility.c (address_taken_from_non_vtable_p): Likewise.
35904         * cgraphclones.c (duplicate_thunk_for_node): Argument added to call.
35905         * cgraphunit.c (analyze_function): Likewise.
35906         (assemble_thunks_and_aliases): Argument added to call.
35907         (expand_thunk): New argument forces to produce GIMPLE thunk.
35908
35909 2014-06-04  Martin Liska  <mliska@suse.cz>
35910
35911         * coverage.h (coverage_compute_cfg_checksum): Argument added.
35912         * coverage.c (coverage_compute_cfg_checksum): Likewise.
35913         * profile.c (branch_prob): Likewise.
35914
35915 2014-06-04  Martin Jambor  <mjambor@suse.cz>
35916
35917         PR ipa/61340
35918         * ipa-pure-const.c (propagate_pure_const): Add unreachable default
35919         handler for switch on an ipa_ref_use enum.
35920         * ipa-reference.c (analyze_function): Likewise.
35921
35922 2014-06-04  Kai Tietz  <ktietz@redhat.com>
35923
35924         * recog.c (peep2_attempt): Copy SIBLING_CALL_P flag
35925         from old call-instruction.
35926
35927 2014-06-04  Bin Cheng  <bin.cheng@arm.com>
35928
35929         * config/aarch64/aarch64.c (aarch64_classify_address)
35930         (aarch64_legitimize_reload_address): Support full addressing modes
35931         for vector modes.
35932         * config/aarch64/aarch64.md (mov<mode>, movmisalign<mode>)
35933         (*aarch64_simd_mov<mode>, *aarch64_simd_mov<mode>): Relax predicates.
35934
35935 2014-06-03  Andrew Pinski  <apinski@cavium.com>
35936
35937         * config/aarch64/aarch64.c (aarch64_if_then_else_costs): Allow non comparisons
35938         for OP0.
35939
35940 2014-06-03  Andrew Pinski  <apinski@cavium.com>
35941
35942         * config/aarch64/aarch64.c (aarch64_if_then_else_costs): New function.
35943         (aarch64_rtx_costs): Use aarch64_if_then_else_costs.
35944
35945 2014-06-03  Kai Tietz  <ktietz@redhat.com>
35946
35947         * config/i386/i386.c (ix86_function_value_regno_p): Disallow DX_REG
35948         for 64-bit ms-abi.
35949
35950 2014-06-03  Dehao Chen  <dehao@google.com>
35951
35952         * tree-cfg.c (gimple_merge_blocks): Only reset count when BBs are in
35953         the same loop.
35954
35955 2014-06-03  Marek Polacek  <polacek@redhat.com>
35956
35957         PR c/60439
35958         * doc/invoke.texi: Document -Wswitch-bool.
35959         * function.c (stack_protect_epilogue): Cast controlling expression of
35960         the switch to int.
35961         * gengtype.c (walk_type): Generate switch expression with its
35962         controlling expression cast to int.
35963
35964 2014-06-03  Vishnu K S  <Vishnu.k_s@atmel.com>
35965
35966         * config/avr/avr-mcus.def: Add new avr25 devices attiny441, attiny828
35967         and attiny841.
35968         * config/avr/avr-tables.opt: Regenerate.
35969         * config/avr/t-multilib: Regenerate.
35970         * doc/avr-mmcu.texi: Regenerate.
35971
35972 2014-06-03  Vishnu K S  <vishnu.k_s@atmel.com>
35973             Pitchumani Sivanupandi  <pitchumani.s@atmel.com>
35974
35975         * config/avr/avr-mcus.def (ata6616c): Add new avr25 device.
35976         (ata6617c, ata664251): Add new avr35 devices.
35977         (ata6612c): Add new avr4 device.
35978         (ata6613c, ata6614q): Add new avr5 devices.
35979         * config/avr/avr-tables.opt: Regenerate.
35980         * config/avr/t-multilib: Regenerate.
35981         * doc/avr-mmcu.texi: Regenerate.
35982
35983 2014-06-03  Alan Lawrence  <alan.lawrence@arm.com>
35984
35985         * gcc/config/aarch64/aarch64-builtins.c
35986         (aarch64_types_binop_ssu_qualifiers): New static data.
35987         (TYPES_BINOP_SSU): Define.
35988         * gcc/config/aarch64/aarch64-simd-builtins.def (suqadd, ushl, urshl,
35989         urshr_n, ushll_n): Use appropriate unsigned qualifiers.
35990         * gcc/config/aarch64/arm_neon.h (vrshl_u8, vrshl_u16, vrshl_u32,
35991         vrshl_u64, vrshlq_u8, vrshlq_u16, vrshlq_u32, vrshlq_u64, vrshld_u64,
35992         vrshr_n_u8, vrshr_n_u16, vrshr_n_u32, vrshr_n_u64, vrshrq_n_u8,
35993         vrshrq_n_u16, vrshrq_n_u32, vrshrq_n_u64, vrshrd_n_u64, vshll_n_u8,
35994         vshll_n_u16, vshll_n_u32, vuqadd_s8, vuqadd_s16, vuqadd_s32,
35995         vuqadd_s64, vuqaddq_s8, vuqaddq_s16, vuqaddq_s32, vuqaddq_s64,
35996         vuqaddb_s8, vuqaddh_s16, vuqadds_s32, vuqaddd_s64): Add signedness
35997         suffix to builtin function name, remove cast.
35998         (vshl_s8, vshl_s16, vshl_s32, vshl_s64, vshl_u8, vshl_u16, vshl_u32,
35999         vshl_u64, vshlq_s8, vshlq_s16, vshlq_s32, vshlq_s64, vshlq_u8,
36000         vshlq_u16, vshlq_u32, vshlq_u64, vshld_s64, vshld_u64): Remove cast.
36001
36002 2014-06-03  Alan Lawrence  <alan.lawrence@arm.com>
36003
36004         * gcc/config/aarch64/aarch64-builtins.c
36005         (aarch64_types_binop_uus_qualifiers,
36006         aarch64_types_shift_to_unsigned_qualifiers,
36007         aarch64_types_unsigned_shiftacc_qualifiers): Define.
36008         * gcc/config/aarch64/aarch64-simd-builtins.def (uqshl, uqrshl, uqadd,
36009         uqsub, usqadd, usra_n, ursra_n, uqshrn_n, uqrshrn_n, usri_n, usli_n,
36010         sqshlu_n, uqshl_n): Update qualifiers.
36011         * gcc/config/aarch64/arm_neon.h (vqadd_u8, vqadd_u16, vqadd_u32,
36012         vqadd_u64, vqaddq_u8, vqaddq_u16, vqaddq_u32, vqaddq_u64, vqsub_u8,
36013         vqsub_u16, vqsub_u32, vqsub_u64, vqsubq_u8, vqsubq_u16, vqsubq_u32,
36014         vqsubq_u64, vqaddb_u8, vqaddh_u16, vqadds_u32, vqaddd_u64, vqrshl_u8,
36015         vqrshl_u16, vqrshl_u32, vqrshl_u64, vqrshlq_u8, vqrshlq_u16,
36016         vqrshlq_u32, vqrshlq_u64, vqrshlb_u8, vqrshlh_u16, vqrshls_u32,
36017         vqrshld_u64, vqrshrn_n_u16, vqrshrn_n_u32, vqrshrn_n_u64,
36018         vqrshrnh_n_u16, vqrshrns_n_u32, vqrshrnd_n_u64, vqshl_u8, vqshl_u16,
36019         vqshl_u32, vqshl_u64, vqshlq_u8, vqshlq_u16, vqshlq_u32, vqshlq_u64,
36020         vqshlb_u8, vqshlh_u16, vqshls_u32, vqshld_u64, vqshl_n_u8, vqshl_n_u16,
36021         vqshl_n_u32, vqshl_n_u64, vqshlq_n_u8, vqshlq_n_u16, vqshlq_n_u32,
36022         vqshlq_n_u64, vqshlb_n_u8, vqshlh_n_u16, vqshls_n_u32, vqshld_n_u64,
36023         vqshlu_n_s8, vqshlu_n_s16, vqshlu_n_s32, vqshlu_n_s64, vqshluq_n_s8,
36024         vqshluq_n_s16, vqshluq_n_s32, vqshluq_n_s64, vqshlub_n_s8,
36025         vqshluh_n_s16, vqshlus_n_s32, vqshlud_n_s64, vqshrn_n_u16,
36026         vqshrn_n_u32, vqshrn_n_u64, vqshrnh_n_u16, vqshrns_n_u32,
36027         vqshrnd_n_u64, vqsubb_u8, vqsubh_u16, vqsubs_u32, vqsubd_u64,
36028         vrsra_n_u8, vrsra_n_u16, vrsra_n_u32, vrsra_n_u64, vrsraq_n_u8,
36029         vrsraq_n_u16, vrsraq_n_u32, vrsraq_n_u64, vrsrad_n_u64, vsli_n_u8,
36030         vsli_n_u16, vsli_n_u32,vsli_n_u64, vsliq_n_u8, vsliq_n_u16,
36031         vsliq_n_u32, vsliq_n_u64, vslid_n_u64, vsqadd_u8, vsqadd_u16,
36032         vsqadd_u32, vsqadd_u64, vsqaddq_u8, vsqaddq_u16, vsqaddq_u32,
36033         vsqaddq_u64, vsqaddb_u8, vsqaddh_u16, vsqadds_u32, vsqaddd_u64,
36034         vsra_n_u8, vsra_n_u16, vsra_n_u32, vsra_n_u64, vsraq_n_u8,
36035         vsraq_n_u16, vsraq_n_u32, vsraq_n_u64, vsrad_n_u64, vsri_n_u8,
36036         vsri_n_u16, vsri_n_u32, vsri_n_u64, vsriq_n_u8, vsriq_n_u16,
36037         vsriq_n_u32, vsriq_n_u64, vsrid_n_u64): Remove casts.
36038
36039 2014-06-03  Teresa Johnson  <tejohnson@google.com>
36040
36041         * tree-sra.c (modify_function): Record caller nodes after rebuild.
36042
36043 2014-06-02  Jason Merrill  <jason@redhat.com>
36044
36045         PR c++/61020
36046         * varpool.c (ctor_for_folding): Handle uninitialized vtables.
36047
36048 2014-06-03  Alan Lawrence  <alan.lawrence@arm.com>
36049
36050         * config/aarch64/aarch64.c (aarch64_evpc_ext): allow and handle
36051         location == 0.
36052
36053 2014-06-03  Alan Lawrence  <alan.lawrence@arm.com>
36054
36055         * config/aarch64/aarch64-simd.md (aarch64_rev<REVERSE:rev-op><mode>):
36056         New pattern.
36057         * config/aarch64/aarch64.c (aarch64_evpc_rev): New function.
36058         (aarch64_expand_vec_perm_const_1): Add call to aarch64_evpc_rev.
36059         * config/aarch64/iterators.md (REVERSE): New iterator.
36060         (UNSPEC_REV64, UNSPEC_REV32, UNSPEC_REV16): New enum elements.
36061         (rev_op): New int_attribute.
36062         * config/aarch64/arm_neon.h (vrev16_p8, vrev16_s8, vrev16_u8,
36063         vrev16q_p8, vrev16q_s8, vrev16q_u8, vrev32_p8, vrev32_p16, vrev32_s8,
36064         vrev32_s16, vrev32_u8, vrev32_u16, vrev32q_p8, vrev32q_p16, vrev32q_s8,
36065         vrev32q_s16, vrev32q_u8, vrev32q_u16, vrev64_f32, vrev64_p8,
36066         vrev64_p16, vrev64_s8, vrev64_s16, vrev64_s32, vrev64_u8, vrev64_u16,
36067         vrev64_u32, vrev64q_f32, vrev64q_p8, vrev64q_p16, vrev64q_s8,
36068         vrev64q_s16, vrev64q_s32, vrev64q_u8, vrev64q_u16, vrev64q_u32):
36069         Replace temporary __asm__ with __builtin_shuffle.
36070
36071 2014-06-03  Andrew Bennett  <andrew.bennett@imgtec.com>
36072
36073         * config/mips/mips-cpus.def: Add mips32r3, mips32r5, mips64r3 and
36074         mips64r5.
36075         * config/mips/mips-tables.opt: Regenerate.
36076         * config/mips/mips.c (mips_compute_frame_info): Changed if statement
36077         to use mips_isa_rev rather than ISA_MIPS32R2.
36078         * config/mips/mips.h (ISA_MIPS32R3): New define.
36079         (ISA_MIPS32R5): New define.
36080         (ISA_MIPS64R3): New define.
36081         (ISA_MIPS64R5): New define.
36082         (TARGET_CPU_CPP_BUILTINS): Added support for ISA_MIPS32R3,
36083         ISA_MIPS32R5, ISA_MIPS64R3 and ISA_MIPS64R5.
36084         (MIPS_ISA_LEVEL_SPEC): Added support for mips32r3, mips32r5, mips64r3
36085         and mips64r5.
36086         (MIPS_ISA_SYNCI_SPEC): Likewise.
36087         (ISA_HAS_64BIT_REGS): Added ISA_MIPS64R3 and ISA_MIPS64R5.
36088         (LINK_SPEC): Added mips32r3 and mips32r5.
36089         * config/mips/t-isa3264 (MULTILIB_MATCHES): Map mips32r3 and mips32r5
36090         to mips32r2; and mips64r3 and mips64r5 to mips64r2.
36091         * config/mips/t-mti-elf (MULTILIB_MATCHES): Likewise.
36092         * config/mips/t-mti-linux (MULTILIB_MATCHES): Likewise.
36093         * config/mips/t-sde (MULTILIB_MATCHES): Likewise.
36094         * config/mips/t-sdemtk (MULTILIB_MATCHES): New define.
36095         * doc/invoke.texi: Document mips32r3, mips32r5, mips64r3 and mips64r5.
36096
36097 2014-06-03  Andrew Bennett  <andrew.bennett@imgtec.com>
36098
36099         * doc/invoke.texi: Document -mxpa and -mno-xpa MIPS command line
36100         options.
36101         * config/mips/mips.opt (mxpa): New option.
36102         * config/mips/mips.h (ASM_SPEC): Pass mxpa and mno-xpa to the
36103         assembler.
36104
36105 2014-06-03  Martin Jambor  <mjambor@suse.cz>
36106
36107         PR ipa/61160
36108         * ipa-cp.c (cgraph_edge_brings_value_p): Handle edges leading to
36109         thunks.
36110
36111 2014-06-03  Thomas Preud'homme  <thomas.preudhomme@arm.com>
36112
36113         PR tree-optimization/61328
36114         * tree-ssa-math-opts.c (init_symbolic_number): Extract symbolic number
36115         initialization from find_bswap_or_nop_1.
36116         (find_bswap_or_nop_1): Test return value of find_bswap_or_nop_1 stored
36117         in source_expr2 before using the size value the function sets. Also
36118         make use of init_symbolic_number () in both the old place and
36119         find_bswap_or_nop_load () to avoid reading uninitialized memory when
36120         doing recursion in the GIMPLE_BINARY_RHS case.
36121
36122 2014-06-03  Richard Biener  <rguenther@suse.de>
36123
36124         PR tree-optimization/61383
36125         * tree-ssa-ifcombine.c (bb_no_side_effects_p): Make sure
36126         stmts can't trap.
36127
36128 2014-06-03  Richard Sandiford  <rdsandiford@googlemail.com>
36129
36130         * defaults.h (USE_MD_CONSTRAINTS, EXTRA_MEMORY_CONSTRAINT)
36131         (EXTRA_ADDRESS_CONSTRAINT, DEFAULT_CONSTRAINT_LEN, CONSTRAINT_LEN)
36132         (CONST_OK_FOR_CONSTRAINT_P, CONST_DOUBLE_OK_FOR_LETTER_P)
36133         (REG_CLASS_FROM_CONSTRAINT, EXTRA_CONSTRAINT_STR): Delete definitions
36134         in this file.
36135         (REG_CLASS_FROM_LETTER, CONST_OK_FOR_LETTER_P)
36136         (CONST_DOUBLE_OK_FOR_LETTER_P, EXTRA_CONSTRAINT): Move poising to...
36137         * system.h: ...here and make it unconditional.
36138         * target.def (conditional_register_usage): Mention
36139         define_register_constraint instead of old-style constraint macros.
36140         * doc/tm.texi.in: Remove documentation for old-style constraint macros.
36141         * doc/tm.texi: Regenerate.
36142         * genoutput.c: Remove USE_MD_CONSTRAINTS conditions and all code
36143         protected by !USE_MD_CONSTRAINTS.
36144         * config/frv/frv.md: Remove quote from old version of documentation.
36145         * config/frv/frv.c (frv_conditional_register_usage): Likewise.
36146         * config/m32r/m32r.c (easy_di_const, easy_df_const): Avoid mentioning
36147         CONST_DOUBLE_OK_FOR_LETTER.
36148         * config/sh/constraints.md: Likewise EXTRA_CONSTRAINT.
36149
36150 2014-06-02  Andrew Pinski  <apinski@cavium.com>
36151
36152         * config/aarch64/aarch64-linux.h (GLIBC_DYNAMIC_LINKER):
36153         /lib/ld-linux32-aarch64.so.1 is used for ILP32.
36154         (LINUX_TARGET_LINK_SPEC): Update linker script for ILP32.
36155         file whose name depends on -mabi= and -mbig-endian.
36156         * config/aarch64/t-aarch64-linux (MULTILIB_OSDIRNAMES):
36157         Handle LP64 better and handle ilp32 too.
36158         (MULTILIB_OPTIONS): Delete.
36159         (MULTILIB_DIRNAMES): Delete.
36160
36161 2014-06-02  Andrew MacLeod  <amacleod@redhat.com>
36162
36163         * expr.h: Remove prototypes of functions defined in builtins.c.
36164         * tree.h: (build_call_expr_*, build_string_literal): Add prototypes.
36165         Remove prototypes of functions defined in builtins.c.
36166         * builtins.h: Update prototype list to include all exported functions.
36167         * builtins.c: (default_libc_has_function, gnu_libc_has_function,
36168         no_c99_libc_has_function): Move to targhooks.c
36169         (build_string_literal, build_call_expr_loc_array,
36170         build_call_expr_loc_vec, build_call_expr_loc, build_call_expr): Move
36171         to tree.c.
36172         (expand_builtin_object_size, fold_builtin_object_size): Make static.
36173         * targhooks.c (default_libc_has_function, gnu_libc_has_function,
36174         no_c99_libc_has_function): Relocate from builtins.c.
36175         * tree.c: Include builtins.h.
36176         (build_call_expr_loc_array, build_call_expr_loc_vec,
36177         build_call_expr_loc, build_call_expr, build_string_literal): Relocate
36178         from builtins.c.
36179         * fold-const.h (fold_fma): Move prototype to builtins.h.
36180         * realmpfr.h (do_mpc_arg2): Move prototype to builtins.h.
36181         * asan.c: Include builtins.h.
36182         * cfgexpand.c: Likewise.
36183         * convert.c: Likewise.
36184         * emit-rtl.c: Likewise.
36185         * except.c: Likewise.
36186         * expr.c: Likewise.
36187         * fold-const.c: Likewise.
36188         * gimple-fold.c: Likewise.
36189         * gimple-ssa-strength-reduction.c: Likewise.
36190         * gimplify.c: Likewise.
36191         * ipa-inline.c: Likewise.
36192         * ipa-prop.c: Likewise.
36193         * lto-streamer-out.c: Likewise.
36194         * stmt.c: Likewise.
36195         * tree-inline.c: Likewise.
36196         * tree-object-size.c: Likewise.
36197         * tree-sra.c: Likewise.
36198         * tree-ssa-ccp.c: Likewise.
36199         * tree-ssa-forwprop.c: Likewise.
36200         * tree-ssa-loop-ivcanon.c: Likewise.
36201         * tree-ssa-loop-ivopts.c: Likewise.
36202         * tree-ssa-math-opts.c: Likewise.
36203         * tree-ssa-reassoc.c: Likewise.
36204         * tree-ssa-threadedge.c: Likewise.
36205         * tree-streamer-in.c: Likewise.
36206         * tree-vect-data-refs.c: Likewise.
36207         * tree-vect-patterns.c: Likewise.
36208         * tree-vect-stmts.c: Likewise.
36209         * config/aarch64/aarch64.c: Likewise.
36210         * config/alpha/alpha.c: Likewise.
36211         * config/arc/arc.c: Likewise.
36212         * config/arm/arm.c: Likewise.
36213         * config/avr/avr.c: Likewise.
36214         * config/bfin/bfin.c: Likewise.
36215         * config/c6x/c6x.c: Likewise.
36216         * config/cr16/cr16.c: Likewise.
36217         * config/cris/cris.c: Likewise.
36218         * config/epiphany/epiphany.c: Likewise.
36219         * config/fr30/fr30.c: Likewise.
36220         * config/frv/frv.c: Likewise.
36221         * config/h8300/h8300.c: Likewise.
36222         * config/i386/i386.c: Likewise.
36223         * config/i386/winnt.c: Likewise.
36224         * config/ia64/ia64.c: Likewise.
36225         * config/iq2000/iq2000.c: Likewise.
36226         * config/lm32/lm32.c: Likewise.
36227         * config/m32c/m32c.c: Likewise.
36228         * config/m32r/m32r.c: Likewise.
36229         * config/m68k/m68k.c: Likewise.
36230         * config/mcore/mcore.c: Likewise.
36231         * config/mep/mep.c: Likewise.
36232         * config/microblaze/microblaze.c: Likewise.
36233         * config/mips/mips.c: Likewise.
36234         * config/mmix/mmix.c: Likewise.
36235         * config/mn10300/mn10300.c: Likewise.
36236         * config/moxie/moxie.c: Likewise.
36237         * config/msp430/msp430.c: Likewise.
36238         * config/nds32/nds32.c: Likewise.
36239         * config/pa/pa.c: Likewise.
36240         * config/pdp11/pdp11.c: Likewise.
36241         * config/picochip/picochip.c: Likewise.
36242         * config/rl78/rl78.c: Likewise.
36243         * config/rs6000/rs6000.c: Likewise.
36244         * config/rx/rx.c: Likewise.
36245         * config/s390/s390.c: Likewise.
36246         * config/score/score.c: Likewise.
36247         * config/sh/sh.c: Likewise.
36248         * config/sparc/sparc.c: Likewise.
36249         * config/spu/spu.c: Likewise.
36250         * config/stormy16/stormy16.c: Likewise.
36251         * config/tilegx/tilegx.c: Likewise.
36252         * config/tilepro/tilepro.c: Likewise.
36253         * config/v850/v850.c: Likewise.
36254         * config/vax/vax.c: Likewise.
36255         * config/xtensa/xtensa.c: Likewise.
36256
36257 2014-06-02  Jeff Law  <law@redhat.com>
36258
36259         PR rtl-optimization/61094
36260         * ree.c (combine_reaching_defs): Do not reextend an insn if it
36261         was marked as do_no_reextend.  If a copy is needed to eliminate
36262         an extension, then mark it as do_not_reextend.
36263
36264 2014-06-02  Marcus Shawcroft  <marcus.shawcroft@arm.com>
36265
36266         * config/aarch64/aarch64.md (set_fpcr): Drop ISB after FPCR write.
36267
36268 2014-06-02  Richard Henderson  <rth@redhat.com>
36269
36270         PR target/61336
36271         * config/alpha/alpha.c (print_operand_address): Allow symbolic
36272         addresses inside asms.  Use output_operand_lossage instead of
36273         gcc_unreachable.
36274
36275 2014-06-02  Uros Bizjak  <ubizjak@gmail.com>
36276
36277         PR target/61239
36278         * config/i386/i386.c (ix86_expand_vec_perm) [case V32QImode]: Use
36279         GEN_INT (-128) instead of GEN_INT (128) to set MSB of QImode constant.
36280
36281 2014-06-02  Tom de Vries  <tom@codesourcery.com>
36282
36283         * config/aarch64/aarch64.c (aarch64_float_const_representable_p): Handle
36284         case that x has VOIDmode.
36285
36286 2014-06-02  Bernd Schmidt  <bernds@codesourcery.com>
36287
36288         * varasm.c (copy_constant): Delete function.
36289         (build_constant_desc): Don't call it.
36290
36291 2014-06-02  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
36292
36293         PR target/61154
36294         * config/arm/arm.h (TARGET_SUPPORTS_WIDE_INT): Define.
36295         * config/arm/arm.md (mov64 splitter): Replace const_double_operand
36296         with immediate_operand.
36297
36298 2014-06-02  Andreas Schwab  <schwab@suse.de>
36299
36300         * config/ia64/ia64.c
36301         (ia64_first_cycle_multipass_dfa_lookahead_guard): Check
36302         pending_data_specs first.
36303
36304 2014-06-02  Richard Biener  <rguenther@suse.de>
36305
36306         PR tree-optimization/61378
36307         * tree-ssa-sccvn.c (vn_reference_lookup_3): Initialize
36308         valueized_anything.
36309
36310 2014-06-01  Uros Bizjak  <ubizjak@gmail.com>
36311
36312         * config/i386/constraints.md (Bw): Rename from 'w'.
36313         (Bz): Rename from 'z'.
36314         * config/i386/i386.md: Change 'w' to 'Bw' and 'z' to 'Bz' globally.
36315
36316 2014-06-01  Kai Tietz  <ktietz@redhat.com>
36317
36318         PR target/61377
36319         * config/i386/constrains.md (define_constrain): New 'Bs' constraint.
36320         * config/i386/i386.md (sibcall_insn_operand): Use Bs
36321         instead of m constraint.
36322
36323 2014-05-31  Andreas Schwab  <schwab@linux-m68k.org>
36324
36325         * config/m68k/m68k.md (beq0_di, bne0_di): Make the "o" constraint
36326         a separate alternative where the scratch operand 2 is marked as
36327         early clobber.
36328
36329 2014-05-31  Kugan Vivekanandarajah  <kuganv@linaro.org>
36330
36331         * config/arm/arm.c (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): New define.
36332         (arm_builtins) : Add ARM_BUILTIN_GET_FPSCR and ARM_BUILTIN_SET_FPSCR.
36333         (bdesc_2arg) : Add description for builtins __builtins_arm_set_fpscr
36334         and __builtins_arm_get_fpscr.
36335         (arm_init_builtins) : Initialize builtins __builtins_arm_set_fpscr and
36336         __builtins_arm_get_fpscr.
36337         (arm_expand_builtin) : Expand builtins __builtins_arm_set_fpscr and
36338         __builtins_arm_ldfpscr.
36339         (arm_atomic_assign_expand_fenv): New function.
36340         * config/arm/vfp.md (set_fpscr): New pattern.
36341         (get_fpscr) : Likewise.
36342         * config/arm/unspecs.md (unspecv): Add VUNSPEC_GET_FPSCR and
36343         VUNSPEC_SET_FPSCR.
36344         * doc/extend.texi (AARCH64 Built-in Functions) : Document
36345         __builtins_arm_set_fpscr, __builtins_arm_get_fpscr.
36346
36347 2014-05-30  Jakub Jelinek  <jakub@redhat.com>
36348
36349         * asan.c (report_error_func): Add SLOW_P argument, use
36350         BUILT_IN_ASAN_*_N if set.
36351         (build_check_stmt): Likewise.
36352         (instrument_derefs): If T has insufficient alignment,
36353         force same handling as for odd sizes.
36354
36355         * sanitizer.def (BUILT_IN_ASAN_REPORT_LOAD_N,
36356         BUILT_IN_ASAN_REPORT_STORE_N): New.
36357         * asan.c (struct asan_mem_ref): Change access_size type to
36358         HOST_WIDE_INT.
36359         (asan_mem_ref_init, asan_mem_ref_new, get_mem_refs_of_builtin_call,
36360         update_mem_ref_hash_table): Likewise.
36361         (asan_mem_ref_hasher::hash): Hash in a HWI.
36362         (report_error_func): Change size_in_bytes argument to HWI.
36363         Use *_N builtins if size_in_bytes is larger than 16 or not power of
36364         two.
36365         (build_shadow_mem_access): New function.
36366         (build_check_stmt): Use it.  Change size_in_bytes argument to HWI.
36367         Handle size_in_bytes not power of two or larger than 16.
36368         (instrument_derefs): Don't give up if size_in_bytes is not
36369         power of two or is larger than 16.
36370
36371 2014-05-30  Kai Tietz  <ktietz@redhat.com>
36372
36373         PR target/60104
36374         * config/i386/i386.c (x86_output_mi_thunk): Add memory case
36375         for sibling-tail-calls.
36376         * config/i386/i386.md (sibcall_insn_operand): Add memory-constrain
36377         to its use.
36378         * config/i386/predicates.md (sibcall_memory_operand): New predicate.
36379         (sibcall_insn_operand): Add check for sibcall_memory_operand.
36380
36381 2014-05-30  Pitchumani Sivanupandi <pitchumani.s@atmel.com>
36382
36383         * config/avr/avr-mcus.def: Change ATA6289 ISA to AVR4
36384         * config/avr/avr-tables.opt: Regenerate.
36385         * config/avr/t-multilib: Regenerate.
36386         * doc/avr-mmcu.texi: Regenerate.
36387
36388 2014-05-30  Ian Lance Taylor  <iant@google.com>
36389
36390         * config/i386/xmmintrin.h (_mm_pause): Move out of scope of pragma
36391         target("sse").
36392
36393 2014-05-30  Tom de Vries  <tom@codesourcery.com>
36394
36395         * config/i386/i386.c (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS):
36396         Redefine as true.
36397
36398 2014-05-30  Tom de Vries  <tom@codesourcery.com>
36399
36400         * lra-int.h (struct lra_reg): Add field actual_call_used_reg_set.
36401         * lra.c (initialize_lra_reg_info_element): Add init of
36402         actual_call_used_reg_set field.
36403         (lra): Call lra_create_live_ranges before lra_inheritance for
36404         -fuse-caller-save.
36405         * lra-assigns.c (lra_assign): Allow call_used_regs to cross calls for
36406         -fuse-caller-save.
36407         * lra-constraints.c (need_for_call_save_p): Use actual_call_used_reg_set
36408         instead of call_used_reg_set for -fuse-caller-save.
36409         * lra-lives.c (process_bb_lives): Calculate actual_call_used_reg_set.
36410
36411 2014-05-30  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
36412
36413         * config/arm/thumb2.md (*thumb2_movhi_insn): Set type of movw
36414         to mov_imm.
36415         * config/arm/vfp.md (*thumb2_movsi_vfp): Likewise.
36416
36417 2014-05-30  Richard Sandiford  <rdsandiford@googlemail.com>
36418
36419         * ira.c (ira_get_dup_out_num): Check for output operands at
36420         the start of the loop.  Handle cases where an included alternative
36421         follows an excluded one.
36422
36423 2014-05-29  Mike Stump  <mikestump@comcast.net>
36424
36425         PR debug/61352
36426         * collect2.c (maybe_run_lto_and_relink): Be sure to always run
36427         post ld passes when lto is used.
36428
36429 2014-05-29  Vladimir Makarov  <vmakarov@redhat.com>
36430
36431         PR rtl-optimization/61325
36432         * lra-constraints.c (process_address): Rename to process_address_1.
36433         (process_address): New function.
36434
36435 2014-05-29  Alan Lawrence  <alan.lawrence@arm.com>
36436
36437         * config/aarch64/aarch64-builtins.c (aarch64_types_binopv_qualifiers,
36438         TYPES_BINOPV): New static data.
36439         * config/aarch64/aarch64-simd-builtins.def (im_lane_bound):
36440         New builtin.
36441         * config/aarch64/aarch64-simd.md (aarch64_ext,
36442         aarch64_im_lane_boundsi): New patterns.
36443         * config/aarch64/aarch64.c (aarch64_expand_vec_perm_const_1): Match
36444         patterns for EXT.
36445         (aarch64_evpc_ext): New function.
36446
36447         * config/aarch64/iterators.md (UNSPEC_EXT): New enum element.
36448
36449         * config/aarch64/arm_neon.h (vext_f32, vext_f64, vext_p8, vext_p16,
36450         vext_s8, vext_s16, vext_s32, vext_s64, vext_u8, vext_u16, vext_u32,
36451         vext_u64, vextq_f32, vextq_f64, vextq_p8, vextq_p16, vextq_s8,
36452         vextq_s16, vextq_s32, vextq_s64, vextq_u8, vextq_u16, vextq_u32,
36453         vextq_u64): Replace __asm with __builtin_shuffle and im_lane_boundsi.
36454
36455 2014-05-29  Tom de Vries  <tom@codesourcery.com>
36456
36457         * rtl.h (BLOCK_SYMBOL_CHECK): Use SYMBOL_REF_FLAGS.
36458
36459 2014-05-29  Richard Earnshaw <rearnsha@arm.com>
36460             Richard Sandiford  <rdsandiford@googlemail.com>
36461
36462         * arm/iterators.md (shiftable_ops): New code iterator.
36463         (t2_binop0, arith_shift_insn): New code attributes.
36464         * arm/predicates.md (shift_nomul_operator): New predicate.
36465         * arm/arm.md (insn_enabled): Delete.
36466         (enabled): Remove insn_enabled test.
36467         (*arith_shiftsi): Delete.  Replace with ...
36468         (*<arith_shift_insn>_multsi): ... new pattern.
36469         (*<arith_shift_insn>_shiftsi): ... new pattern.
36470         * config/arm/arm.c (arm_print_operand): Handle operand format 'b'.
36471
36472 2014-05-29  Radovan Obradovic  <robradovic@mips.com>
36473             Tom de Vries  <tom@codesourcery.com>
36474
36475         * config/mips/mips.h (POST_CALL_TMP_REG): Define.
36476         * config/mips/mips.c (mips_emit_call_insn): Add POST_CALL_TMP_REG
36477         clobber.
36478         (mips_split_call): Use POST_CALL_TMP_REG.
36479         (TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS): Redefine to true.
36480
36481 2014-05-29  Tom de Vries  <tom@codesourcery.com>
36482
36483         * final.c (collect_fn_hard_reg_usage): Guard variable declaration
36484         with #ifdef STACK_REGS.
36485
36486 2014-05-28  Jan Hubicka  <hubicka@ucw.cz>
36487
36488         * varasm.c (get_variable_section): Walk aliases.
36489         (place_block_symbol): Walk aliases.
36490
36491 2014-05-28  Tom de Vries  <tom@codesourcery.com>
36492
36493         Revert:
36494         2014-05-28  Tom de Vries  <tom@codesourcery.com>
36495
36496         * lra-int.h (struct lra_reg): Add field actual_call_used_reg_set.
36497         * lra.c (initialize_lra_reg_info_element): Add init of
36498         actual_call_used_reg_set field.
36499         (lra): Call lra_create_live_ranges before lra_inheritance for
36500         -fuse-caller-save.
36501         * lra-assigns.c (lra_assign): Allow call_used_regs to cross calls for
36502         -fuse-caller-save.
36503         * lra-constraints.c (need_for_call_save_p): Use
36504         actual_call_used_reg_set instead of call_used_reg_set for
36505         -fuse-caller-save.
36506         * lra-lives.c (process_bb_lives): Calculate actual_call_used_reg_set.
36507
36508 2014-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
36509
36510         * doc/md.texi: Document that the % constraint character must
36511         be at the beginning of the string.
36512         * genoutput.c (validate_insn_alternatives): Check that '=',
36513         '+' and '%' only appear at the beginning of a constraint.
36514         * ira.c (commutative_constraint_p): Delete.
36515         (ira_get_dup_out_num): Expect the '%' commutativity marker to be
36516         at the start of the string.
36517         * config/alpha/alpha.md (*movmemdi_1, *clrmemdi_1): Remove
36518         duplicate '='s.
36519         * config/arm/neon.md (bicdi3_neon): Likewise.
36520         * config/iq2000/iq2000.md (addsi3_internal, subsi3_internal, sgt_si)
36521         (slt_si, sltu_si): Likewise.
36522         * config/vax/vax.md (sbcdi3): Likewise.
36523         * config/h8300/h8300.md (*cmpstz): Remove duplicate '+'.
36524         * config/arc/arc.md (mulsi_600, mulsidi_600, umulsidi_600)
36525         (mul64): Move '%' to beginning of constraint.
36526         * config/arm/arm.md (*xordi3_insn): Likewise.
36527         * config/nds32/nds32.md (add<mode>3, mulsi3, andsi3, iorsi3)
36528         (xorsi3): Likewise.
36529
36530 2014-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
36531
36532         * doc/md.texi: Document the restrictions on the "enabled" attribute.
36533
36534 2014-05-28  Jason Merrill  <jason@redhat.com>
36535
36536         PR c++/47202
36537         * cgraph.h (symtab_node::get_comdat_group_id): New.
36538         * cgraphunit.c (analyze_functions): Call it.
36539         * symtab.c (dump_symtab_node): Likewise.
36540         * tree.c (decl_comdat_group_id): New.
36541         * tree.h: Declare it.
36542         * lto-streamer-out.c (write_symbol): Use it.
36543         * trans-mem.c (ipa_tm_create_version_alias): Likewise.
36544
36545 2014-05-28  Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org>
36546
36547         PR bootstrap/PR61146
36548         * wide-int.cc: Do not include longlong.h when compiling with clang.
36549
36550 2014-05-28  Richard Biener  <rguenther@suse.de>
36551
36552         * tree-ssa-propagate.c (add_control_edge): Print less vertical space.
36553         * tree-vrp.c (extract_range_from_ssa_name): Also copy VR_UNDEFINED.
36554         (vrp_visit_assignment_or_call): Print less vertical space.
36555         (vrp_visit_stmt): Likewise.
36556         (vrp_visit_phi_node): Likewise.  For a PHI argument with
36557         VR_VARYING range consider recording it as copy.
36558
36559 2014-05-28  Richard Biener  <rguenther@suse.de>
36560
36561         Revert
36562         2014-05-28  Richard Biener  <rguenther@suse.de>
36563
36564         * hwint.h (HOST_WIDE_INT_PRINT_*): Define in terms of PRI*64.
36565
36566 2014-05-28  Bernd Edlinger  <bernd.edlinger@hotmail.de>
36567
36568         * expr.c (expand_assignment): Fold the bitpos in the to_rtx if
36569         sufficiently aligned and an offset is used at the same time.
36570         (expand_expr_real_1): Likewise.
36571
36572 2014-05-28  Richard Biener  <rguenther@suse.de>
36573
36574         PR middle-end/61045
36575         * fold-const.c (fold_comparison): When folding
36576         X +- C1 CMP Y +- C2 to X CMP Y +- C2 +- C1 also ensure
36577         the sign of the remaining constant operand stays the same.
36578
36579 2014-05-28  Kaushik Phatak  <kaushik.phatak@kpit.com>
36580
36581         * config/rl78/rl78.h (TARGET_CPU_CPP_BUILTINS): Define
36582         __RL78_64BIT_DOUBLES__ or __RL78_32BIT_DOUBLES__.
36583         (ASM_SPEC): Pass -m64bit-doubles or -m32bit-doubles on
36584         to the assembler.
36585         (DOUBLE_TYPE_SIZE): Use 64 bit if TARGET_64BIT_DOUBLES is true.
36586         * gcc/config/rl78/rl78.opt (m64bit-doubles): New option.
36587         (m32bit-doubles) Likewise.
36588         * gcc/config/rl78/t-rl78: Add 64-bit-double multilib.
36589         * doc/invoke.texi: Document -m32bit-doubles and -m64bit-doubles
36590         option for RL78.
36591
36592 2014-05-28  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
36593
36594         * configure.ac ($gcc_cv_ld_clearcap): New test.
36595         * configure: Regenerate.
36596         * config.in: Regenerate.
36597         * config/sol2.opt (mclear-hwcap): New option.
36598         * config/sol2.h (LINK_CLEARCAP_SPEC): Define.
36599         * config/sol2-clearcap.map: Moved here from
36600         testsuite/gcc.target/i386/clearcap.map.
36601         * config/sol2-clearcapv2.map: Move here from
36602         gcc.target/i386/clearcapv2.map.
36603         * config/t-sol2 (install): Depend on install-clearcap-map.
36604         (install-clearcap-map): New target.
36605         * doc/invoke.texi (Option Summary, Solaris 2 Options): Document
36606         -mclear-hwcap.
36607
36608 2014-05-28  Richard Biener  <rguenther@suse.de>
36609
36610         * hwint.h (*_HALF_WIDE_INT*): Move to ...
36611         * wide-int.cc (HOST_BITS_PER_HALF_WIDE_INT, HOST_HALF_WIDE_INT):
36612         ... here and remove the rest.
36613         * hwint.h (HOST_WIDE_INT_PRINT_*): Define in terms of PRI*64.
36614
36615 2014-05-28  Richard Biener  <rguenther@suse.de>
36616
36617         PR tree-optimization/61335
36618         * tree-vrp.c (vrp_visit_phi_node): If the compare of old and
36619         new range fails, drop to varying.
36620
36621 2014-05-28  Olivier Hainque  <hainque@adacore.com>
36622
36623         * config/rs6000/vxworks.h (VXCPU_FOR_8548): New. Default to PPC85XX.
36624         (CPP_SPEC): Add entry for -mcpu=8548.
36625         * config/rs6000/vxworksae.h: Reinstate. Override VXCPU_FOR_8548.
36626         * config.gcc (powerpc-wrs-vxworksae, tm_file): Add back vxworksae.h.
36627
36628 2014-05-28  Tom de Vries  <tom@codesourcery.com>
36629
36630         * lra-int.h (struct lra_reg): Add field actual_call_used_reg_set.
36631         * lra.c (initialize_lra_reg_info_element): Add init of
36632         actual_call_used_reg_set field.
36633         (lra): Call lra_create_live_ranges before lra_inheritance for
36634         -fuse-caller-save.
36635         * lra-assigns.c (lra_assign): Allow call_used_regs to cross calls for
36636         -fuse-caller-save.
36637         * lra-constraints.c (need_for_call_save_p): Use
36638         actual_call_used_reg_set instead of call_used_reg_set for
36639         -fuse-caller-save.
36640         * lra-lives.c (process_bb_lives): Calculate actual_call_used_reg_set.
36641
36642 2014-05-28  Radovan Obradovic  <robradovic@mips.com>
36643             Tom de Vries  <tom@codesourcery.com>
36644
36645         * doc/invoke.texi (@item Optimization Options): Add -fuse-caller-save
36646         to gccoptlist.
36647         (@item -fuse-caller-save): New item.
36648
36649 2014-05-28  Radovan Obradovic  <robradovic@mips.com>
36650             Tom de Vries  <tom@codesourcery.com>
36651
36652         * opts.c (default_options_table): Add OPT_LEVELS_2_PLUS entry with
36653         OPT_fuse_caller_save.
36654
36655 2014-05-28  Radovan Obradovic  <robradovic@mips.com>
36656             Tom de Vries  <tom@codesourcery.com>
36657
36658         * df-scan.c (df_get_call_refs): Use get_call_reg_set_usage.
36659         * caller-save.c (setup_save_areas, save_call_clobbered_regs): Use
36660         get_call_reg_set_usage.
36661         * resource.c (mark_set_resources, mark_target_live_regs): Use
36662         get_call_reg_set_usage.
36663         * ira-int.h (struct ira_allocno): Add crossed_calls_clobbered_regs
36664         field.
36665         (ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS): Define.
36666         * ira-lives.c (process_bb_node_lives): Use get_call_reg_set_usage.
36667         Calculate ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS.
36668         * ira-build.c (ira_create_allocno): Init
36669         ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS.
36670         (create_cap_allocno, propagate_allocno_info)
36671         (propagate_some_info_from_allocno)
36672         (copy_info_to_removed_store_destinations): Handle
36673         ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS.
36674         * ira-costs.c (ira_tune_allocno_costs): Use
36675         ALLOCNO_CROSSED_CALLS_CLOBBERED_REGS to adjust costs.
36676
36677 2014-05-28  Radovan Obradovic  <robradovic@mips.com>
36678             Tom de Vries  <tom@codesourcery.com>
36679
36680         * cgraph.h (struct cgraph_rtl_info): Add function_used_regs
36681         and function_used_regs_valid fields.
36682         * final.c: Move include of hard-reg-set.h to before rtl.h to declare
36683         find_all_hard_reg_sets.
36684         (collect_fn_hard_reg_usage, get_call_fndecl, get_call_cgraph_rtl_info)
36685         (get_call_reg_set_usage): New function.
36686         (rest_of_handle_final): Use collect_fn_hard_reg_usage.
36687         * regs.h (get_call_reg_set_usage): Declare.
36688
36689 2014-05-28  Georg-Johann Lay  <avr@gjlay.de>
36690
36691         PR libgcc/61152
36692         * config/dbx.h (License): Add Runtime Library Exception.
36693         * config/newlib-stdint.h (License): Same.
36694         * config/rtems.h (License): Same
36695         * config/initfini-array.h (License): Same
36696         * config/v850/v850.h (License): Same.
36697         * config/v850/v850-opts.h (License): Same
36698         * config/v850/rtems.h (License): Same.
36699
36700 2014-05-28  Georg-Johann Lay  <avr@gjlay.de>
36701
36702         PR target/61044
36703         * doc/extend.texi (Local Labels): Note that label differences are
36704         not supported for AVR.
36705
36706 2014-05-28  Richard Sandiford  <rdsandiford@googlemail.com>
36707             Olivier Hainque  <hainque@adacore.com>
36708
36709         * rtl.h (set_for_reg_notes): Declare.
36710         * emit-rtl.c (set_for_reg_notes): New function.
36711         (set_unique_reg_note): Use it.
36712         * optabs.c (add_equal_note): Likewise
36713
36714 2014-05-27  Andrew Pinski  <apinski@cavium.com>
36715
36716         * config/aarch64/aarch64.md (stack_protect_set_<mode>):
36717         Use <w> for the register in assembly template.
36718         (stack_protect_test): Use the mode of operands[0] for the result.
36719         (stack_protect_test_<mode>): Use <w> for the register
36720         in assembly template.
36721
36722 2014-05-27  DJ Delorie  <dj@redhat.com>
36723
36724         * config/rx/rx.c (add_vector_labels): New.
36725         (rx_output_function_prologue): Call it.
36726         (rx_handle_func_attribute): Don't require empty arguments.
36727         (rx_handle_vector_attribute): New.
36728         (rx_attribute_table): Add "vector" attribute.
36729         * doc/extend.texi (interrupt, vector): Document new/changed
36730         RX-specific attributes.
36731
36732         * config/rx/rx.c (rx_adjust_insn_length): Skip for non-insns.
36733
36734 2014-05-27  Eric Botcazou  <ebotcazou@adacore.com>
36735
36736         * double-int.c (div_and_round_double) <ROUND_DIV_EXPR>: Use the proper
36737         predicate to detect a negative quotient.
36738
36739 2014-05-27  Eric Botcazou  <ebotcazou@adacore.com>
36740
36741         * fold-const.c (fold_comparison): Clean up and extend X +- C1 CMP C2
36742         to X CMP C2 -+ C1 transformation to EQ_EXPR/NE_EXPR.
36743         Add X - Y CMP 0 to X CMP Y transformation.
36744         (fold_binary_loc) <EQ_EXPR/NE_EXPR>: Remove same transformations.
36745
36746 2014-05-27  Segher Boessenkool  <segher@kernel.crashing.org>
36747
36748         * stmt.c (dump_case_nodes): Don't convert values to HOST_WIDE_INT
36749         before printing.
36750
36751 2014-05-27  Steve Ellcey  <sellcey@mips.com>
36752
36753         * config/mips/mips.c: Add include of cgraph.h.
36754
36755 2014-05-27  Richard Biener  <rguenther@suse.de>
36756
36757         * system.h (__STDC_FORMAT_MACROS): Define as very first thing.
36758
36759 2014-05-27  Georg-Johann Lay  <avr@gjlay.de>
36760
36761         PR libgcc/61152
36762         * config/arm/arm.h (License): Add note to COPYING.RUNTIME.
36763         * config/arm/arm-cores.def (License): Same.
36764         * config/arm/arm-opts.h (License): Same.
36765         * config/arm/aout.h (License): Same.
36766         * config/arm/bpabi.h (License): Same.
36767         * config/arm/elf.h (License): Same.
36768         * config/arm/linux-elf.h (License): Same.
36769         * config/arm/linux-gas.h (License): Same.
36770         * config/arm/netbsd-elf.h (License): Same.
36771         * config/arm/uclinux-eabi.h (License): Same.
36772         * config/arm/uclinux-elf.h (License): Same.
36773         * config/arm/vxworks.h (License): Same.
36774
36775 2014-05-27  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
36776
36777         * config/arm/neon.md (neon_bswap<mode>): New pattern.
36778         * config/arm/arm.c (neon_itype): Add NEON_BSWAP.
36779         (arm_init_neon_builtins): Handle NEON_BSWAP.
36780         Define required type nodes.
36781         (arm_expand_neon_builtin): Handle NEON_BSWAP.
36782         (arm_builtin_vectorized_function): Handle BUILTIN_BSWAP builtins.
36783         * config/arm/arm_neon_builtins.def (bswap): Define builtins.
36784         * config/arm/iterators.md (VDQHSD): New mode iterator.
36785
36786 2014-05-27  Richard Biener  <rguenther@suse.de>
36787
36788         * tree-vrp.c (vrp_evaluate_conditional_warnv_with_ops_using_ranges):
36789         Try using literal operands when comparing value-ranges failed.
36790
36791 2014-05-27  Richard Sandiford  <rdsandiford@googlemail.com>
36792
36793         * ira.c (commutative_operand): Adjust for change to recog_data.
36794         [Missing from previous commit.]
36795
36796 2014-05-27  Richard Sandiford  <rdsandiford@googlemail.com>
36797
36798         * system.h (TEST_BIT): New macro.
36799         * recog.h (alternative_mask): New type.
36800         (ALL_ALTERNATIVES, ALTERNATIVE_BIT): New macros.
36801         (recog_data_d): Replace alternative_enabled_p array with
36802         enabled_alternatives.
36803         (target_recog): New structure.
36804         (default_target_recog, this_target_recog): Declare.
36805         (get_enabled_alternatives, recog_init): Likewise.
36806         * recog.c (default_target_recog, this_target_recog): New variables.
36807         (get_enabled_alternatives): New function.
36808         (extract_insn): Use it.
36809         (recog_init): New function.
36810         (preprocess_constraints, constrain_operands): Adjust for change to
36811         recog_data.
36812         * postreload.c (reload_cse_simplify_operands): Likewise.
36813         * reload.c (find_reloads): Likewise.
36814         * ira-costs.c (record_reg_classes): Likewise.
36815         * ira-lives.c (single_reg_class): Likewise.  Fix bug in which
36816         all alternatives after a disabled one would be skipped.
36817         (ira_implicitly_set_insn_hard_regs): Likewise.
36818         * ira.c (ira_setup_alts): Adjust for change to recog_data.
36819         * lra-int.h (lra_insn_recog_data): Replace alternative_enabled_p
36820         with enabled_alternatives.
36821         * lra.c (free_insn_recog_data): Update accordingly.
36822         (lra_update_insn_recog_data): Likewise.
36823         (lra_set_insn_recog_data): Likewise.  Use get_enabled_alternatives.
36824         * lra-constraints.c (process_alt_operands): Likewise.  Handle
36825         only_alternative as part of the enabled mask.
36826         * target-globals.h (this_target_recog): Declare.
36827         (target_globals): Add a recog field.
36828         (restore_target_globals): Restore this_target_recog.
36829         * target-globals.c: Include recog.h.
36830         (default_target_globals): Initialize recog field.
36831         (save_target_globals): Likewise.
36832         * reginfo.c (reinit_regs): Call recog_init.
36833         * toplev.c (backend_init_target): Likewise.
36834
36835 2014-05-27  Richard Sandiford  <rdsandiford@googlemail.com>
36836
36837         * gencodes.c (main): Make LAST_INSN_CODE higher than any insn code,
36838         rather than any named insn's code.
36839
36840 2014-05-27  Georg-Johann Lay  <avr@gjlay.de>
36841
36842         PR libgcc/61152
36843         * config/arm/arm-opts.h (License): Add GCC Runtime Library Exception.
36844         * config/arm/arm-cores.def (License): Same.
36845
36846 2014-05-26  Jan Hubicka  <hubicka@ucw.cz>
36847
36848         * tree.h (decl_comdat_group): Declare.
36849         * cgraph.h (symtab_in_same_comdat_p): Move offline to ...
36850         * tree.c (decl_comdat_group): Here.
36851
36852 2014-05-26  Richard Sandiford  <r.sandiford@uk.ibm.com>
36853
36854         PR rtl-optimization/61222
36855         * combine.c (simplify_shift_const_1): When moving a PLUS outside
36856         the shift, truncate the PLUS operand to the result mode.
36857
36858 2014-05-26  Uros Bizjak  <ubizjak@gmail.com>
36859
36860         PR target/61271
36861         * config/i386/i386.c (ix86_rtx_costs)
36862         <case CONST_INT, case CONST, case LABEL_REF, case SYMBOL_REF>:
36863         Fix condition.
36864
36865 2014-05-26  Martin Jambor  <mjambor@suse.cz>
36866
36867         * ira.c (split_live_ranges_for_shrink_wrap): Remove bailout on
36868         subreg uses.
36869
36870 2014-05-26  Richard Biener  <rguenther@suse.de>
36871
36872         * wide-int.h (wi::int_traits <long>, wi::int_traits <unsigned long>,
36873         wi::int_traits <long long>, wi::int_traits <unsigned long long>):
36874         Provide specializations.
36875         (wi::int_traits <HOST_WIDE_INT>,
36876         wi::int_traits <unsigned HOST_WIDE_INT>): Remove specializations.
36877
36878 2014-05-26  Alan Modra  <amodra@gmail.com>
36879
36880         PR target/61098
36881         * config/rs6000/rs6000.c (rs6000_emit_set_const): Remove unneeded
36882         params and return a bool.  Remove dead code.  Update comment.
36883         Assert we have a const_int source.  Remove bogus code from
36884         32-bit HWI days.  Move !TARGET_POWERPC64 handling, and correct
36885         handling of constants > 2G and reg_equal note, from..
36886         (rs6000_emit_set_long_const): ..here.  Remove unneeded param and
36887         return value.  Update comment.  If we can, use a new pseudo
36888         for intermediate calculations.
36889         * config/rs6000/rs6000-protos.h (rs6000_emit_set_const): Update
36890         prototype.
36891         * config/rs6000/rs6000.md (movsi_internal1_single+1): Update
36892         call to rs6000_emit_set_const in splitter.
36893         (movdi_internal64+2, +3): Likewise.
36894
36895 2014-05-26  Richard Biener  <rguenther@suse.de>
36896
36897         * system.h: Define __STDC_FORMAT_MACROS before
36898         including inttypes.h.
36899         * hwint.h (HOST_WIDEST_INT, HOST_BITS_PER_WIDEST_INT,
36900         HOST_WIDEST_INT_PRINT, HOST_WIDEST_INT_PRINT_DEC,
36901         HOST_WIDEST_INT_PRINT_DEC_C, HOST_WIDEST_INT_PRINT_UNSIGNED,
36902         HOST_WIDEST_INT_PRINT_HEX, HOST_WIDEST_INT_PRINT_DOUBLE_HEX,
36903         HOST_WIDEST_INT_C): Remove.
36904         (PRId64, PRIi64, PRIo64, PRIu64, PRIx64, PRIX64): Define
36905         if C99 inttypes.h is not available.
36906         * coretypes.h (gcov_type, gcov_type_unsigned): Use [u]int64_t.
36907         * gcov-io.h (gcov_type, gcov_type_unsigned): Likewise.
36908         * gcov-io.c (gcov_histo_index): Drop non-64bit hwi case.
36909         * cfgloop.h (struct niter_desc): Use uint64_t for niter field.
36910         * bitmap.c (struct bitmap_descriptor_d): Use uint64_t for counters.
36911         (struct output_info): Likewise.
36912         (print_statistics): Adjust.
36913         (dump_bitmap_statistics): Likewise.
36914         * bt-load.c (migrate_btr_defs): Print with PRId64.
36915         * cfg.c (dump_edge_info, dump_bb_info): Likewise.
36916         (MAX_SAFE_MULTIPLIER): Adjust.
36917         * cfghooks.c (dump_bb_for_graph): Print with PRId64.
36918         * cgraph.c (cgraph_redirect_edge_call_stmt_to_callee,
36919         dump_cgraph_node): Likewise.
36920         * final.c (dump_basic_block_info): Likewise.
36921         * gcov-dump.c (tag_counters, tag_summary, dump_working_sets): Likewise.
36922         * gcov.c (format_gcov): Likewise.
36923         * ipa-cp.c (good_cloning_opportunity_p): Likewise.  Use int64_t
36924         for calculation.
36925         (get_clone_agg_value): Use HOST_WIDE_INT for offset.
36926         * ipa-inline.c (compute_max_insns): Use int64_t for calcuation.
36927         (inline_small_functions, dump_overall_stats, dump_inline_stats):
36928         Use PRId64 for dumping.
36929         * ipa-profile.c (dump_histogram, ipa_profile): Likewise.
36930         * ira-color.c (struct allocno_hard_regs): Use int64_t for cost.
36931         (add_allocno_hard_regs): Adjust.
36932         * loop-doloop.c (doloop_modify): Print using PRId64.
36933         * loop-iv.c (inverse): Compute in uint64_t.
36934         (determine_max_iter, iv_number_of_iterations): Likewise.
36935         * loop-unroll.c (decide_peel_completely, decide_peel_simple):
36936         Print using PRId64.
36937         * lto-streamer-out.c (write_symbol): Use uint64_t.
36938         * mcf.c (CAP_INFINITY): Use int64_t maximum.
36939         (dump_fixup_edge, create_fixup_graph, cancel_negative_cycle,
36940         find_max_flow, adjust_cfg_counts): Use int64_t and dump with PRId64.
36941         * modulo-sched.c (const_iteration_count): Use int64_t.
36942         (sms_schedule): Dump using PRId64.
36943         * predict.c (dump_prediction): Likewise.
36944         * pretty-print.h (pp_widest_integer): Remove.
36945         * profile.c (get_working_sets, is_edge_inconsistent,
36946         is_inconsistent, read_profile_edge_counts): Dump using PRId64.
36947         * tree-pretty-print.c (pp_double_int): Remove case handling
36948         HOST_BITS_PER_DOUBLE_INT == HOST_BITS_PER_WIDEST_INT.
36949         * tree-ssa-math-opts.c (struct symbolic_number): Use uint64_t
36950         and adjust users.
36951         (pass_optimize_bswap::execute): Remove restriction on hosts.
36952         * tree-streamer-in.c (streamer_alloc_tree): Use HOST_WIDE_INT.
36953         * tree-streamer-out.c (streamer_write_tree_header): Likewise.
36954         * tree.c (widest_int_cst_value): Remove.
36955         * tree.h (widest_int_cst_value): Likewise.
36956         * value-prof.c (dump_histogram_value): Print using PRId64.
36957         * gengtype.c (main): Also inject int64_t.
36958         * ggc-page.c (struct max_alignment): Use int64_t.
36959         * alloc-pool.c (struct allocation_object_def): Likewise.
36960         * ira-conflicts.c (build_conflict_bit_table): Use uint64_t
36961         for computation.
36962         * doc/tm.texi.in: Remove reference to HOST_WIDEST_INT.
36963         * doc/tm.texi: Regenerated.
36964         * gengtype-lex.l (IWORD): Handle [u]int64_t.
36965         * config/sh/sh.c (expand_cbranchdi4): Use gcov_type.
36966         * config/mmix/mmix-protos.h (mmix_intval, mmix_shiftable_wyde_value,
36967         mmix_output_register_setting): Use [u]int64_t in prototypes.
36968         * config/mmix/mmix.c (mmix_print_operand, mmix_output_register_setting,
36969         mmix_shiftable_wyde_value, mmix_output_shiftvalue_op_from_str,
36970         mmix_output_octa, mmix_output_shifted_value): Adjust.
36971         (mmix_intval): Adjust.  Remove unreachable case.
36972         * config/mmix/mmix.md (*nonlocal_goto_receiver_expanded): Use int64_t.
36973
36974 2014-05-26  Richard Biener  <rguenther@suse.de>
36975
36976         * configure.ac: Drop __int64 type check.  Insist that we
36977         found uint64_t and int64_t.
36978         * hwint.h (HOST_BITS_PER___INT64): Remove.
36979         (HOST_BITS_PER_WIDE_INT): Define to 64 and remove __int64 case.
36980         (HOST_WIDE_INT_PRINT_*): Remove 32bit case.
36981         (HOST_WIDEST_INT*): Define to HOST_WIDE_INT*.
36982         (HOST_WIDEST_FAST_INT): Remove __int64 case.
36983         * vmsdbg.h (struct _DST_SRC_COMMAND): Use int64_t
36984         for dst_q_src_df_rms_cdt.
36985         * configure: Regenerate.
36986         * config.in: Likewise.
36987
36988 2014-05-26  Michael Tautschnig  <mt@debian.org>
36989
36990         PR target/61249
36991         * doc/extend.texi (X86 Built-in Functions): Fix parameter lists of
36992         __builtin_ia32_vfrczs[sd] and __builtin_ia32_mpsadbw256.
36993
36994 2014-05-26  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
36995
36996         PR rtl-optimization/61278
36997         * shrink-wrap.c (move_insn_for_shrink_wrap): Check df_live.
36998
36999 2014-05-26  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
37000
37001         PR rtl-optimization/61220
37002         Part of PR rtl-optimization/61225
37003         * shrink-wrap.c (move_insn_for_shrink_wrap): Skip SP and FP adjustment
37004         insn; skip split_edge for a block with only one successor.
37005
37006 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37007
37008         * symtab.c (symtab_nonoverwritable_alias): Copy READONLY flag
37009         for variables.
37010
37011 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37012
37013         * ipa-visibility.c (can_replace_by_local_alias_in_vtable): New function.
37014         (update_vtable_references): New function.
37015         (function_and_variable_visibility): Rewrite also vtable initializers.
37016         * varpool.c (cgraph_variable_initializer_availability): Remove assert.
37017
37018 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37019
37020         * ggc.h (ggc_grow): New function.
37021         * ggc-none.c (ggc_grow): New function.
37022         * ggc-page.c (ggc_grow): Likewise.
37023
37024 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37025
37026         * ipa.c (cgraph_non_local_node_p_1, cgraph_local_node_p,
37027         address_taken_from_non_vtable_p, comdat_can_be_unshared_p_1,
37028         comdat_can_be_unshared_p, cgraph_externally_visible_p,
37029         varpool_externally_visible_p, can_replace_by_local_alias,
37030         update_visibility_by_resolution_info, function_and_variable_visibility,
37031         pass_data_ipa_function_and_variable_visibility,
37032         make_pass_ipa_function_and_variable_visibility,
37033         whole_program_function_and_variable_visibility,
37034         pass_data_ipa_whole_program_visibility,
37035         make_pass_ipa_whole_program_visibility): Move to ipa-visibility.c
37036         * cgraph.h (cgraph_local_node_p): Declare.
37037         * ipa-visibility.c: New file.
37038         * Makefile.in (OBJS): Add ipa-visiblity.o
37039
37040 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37041
37042         * gimple-fold.c (can_refer_decl_in_current_unit_p): Be sure
37043         that var decl is available.
37044
37045 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37046
37047         * tree-core.h (tree_decl_with_vis): Replace comdat_group by
37048         symtab_node pointer.
37049         * tree.c (copy_node_stat): Be sure to not copy symtab_node pointer.
37050         (find_decls_types_r): Do not walk COMDAT_GROUP.
37051         * tree.h (DECL_COMDAT_GROUP): Revamp to use decl_comdat_group.
37052         * varasm.c (make_decl_one_only): Use set_comdat_group;
37053         create node if needed.
37054         * ipa-inline-transform.c (save_inline_function_body): Update
37055         way we decl->symtab mapping.
37056         * symtab.c (symtab_hash, hash_node, eq_node
37057         symtab_insert_node_to_hashtable): Remove.
37058         (symtab_register_node): Update.
37059         (symtab_unregister_node): Update.
37060         (symtab_get_node): Reimplement as inline function.
37061         (symtab_add_to_same_comdat_group): Update.
37062         (symtab_dissolve_same_comdat_group_list): Update.
37063         (dump_symtab_base): Update.
37064         (verify_symtab_base): Update.
37065         (symtab_make_decl_local): Update.
37066         (fixup_same_cpp_alias_visibility): Update.
37067         (symtab_nonoverwritable_alias): Update.
37068         * cgraphclones.c (set_new_clone_decl_and_node_flags): Update.
37069         * ipa.c (update_visibility_by_resolution_info): UPdate.
37070         * bb-reorder.c: Include cgraph.h
37071         * lto-streamer-out.c (DFS_write_tree_body, hash_tree): Do not deal
37072         with comdat groups.
37073         * ipa-comdats.c (set_comdat_group, ipa_comdats): Update.
37074         * cgraph.c (cgraph_get_create_node): Update.
37075         * cgraph.h (struct symtab_node): Add get_comdat_group, set_comdat_group
37076         and comdat_group_.
37077         (symtab_get_node): Make inline.
37078         (symtab_insert_node_to_hashtable): Remove.
37079         (symtab_can_be_discarded): Update.
37080         (decl_comdat_group): New function.
37081         * tree-streamer-in.c (lto_input_ts_decl_with_vis_tree_pointers):
37082         Update.
37083         * lto-cgraph.c (lto_output_node, lto_output_varpool_node): Stream out
37084         comdat group name.
37085         (read_comdat_group): New function.
37086         (input_node, input_varpool_node): Use it.
37087         * trans-mem.c (ipa_tm_create_version_alias): Update code creating
37088         comdat groups.
37089         * mips.c (mips_start_unique_function): Likewise.
37090         (ix86_code_end): Likewise.
37091         (rs6000_code_end): Likweise.
37092         * tree-streamer-out.c (DECL_COMDAT_GROUP): Do not stream comdat group.
37093
37094 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37095
37096         * gengtype-state.c (fatal_reading_state): Bring offline.
37097         * optabs.c (widening_optab_handler): Bring offline.
37098         * optabs.h (widening_optab_handler): Likewise.
37099         * final.c (get_attr_length_1): Likewise.
37100
37101 2014-05-23  Jan Hubicka  <hubicka@ucw.cz>
37102
37103         * sched-int.h (sd_iterator_cond): Manually tail recurse.
37104
37105 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37106
37107         * config/rs6000/440.md (ppc440-integer): Include shift without dot.
37108         (ppc440-compare): Include shift with dot.
37109         * config/rs6000/e300c2c3.md (ppce300c3_iu): Include shift without dot.
37110         * config/rs6000/e5500.md (e5500_sfx2): Include constant shift
37111         without dot.
37112         * config/rs6000/e6500.md (e6500_sfx): Exclude constant shift
37113         without dot.
37114         (e6500_sfx2): Include it.
37115         * config/rs6000/rs6000.md ( *zero_extend<mode>di2_internal1,
37116         *zero_extend<mode>di2_internal2, *zero_extend<mode>di2_internal3,
37117         *zero_extendsidi2_lfiwzx, andsi3_mc, andsi3_nomc,
37118         andsi3_internal0_nomc, extzvsi_internal, extzvdi_internal,
37119         *extzvdi_internal1, *extzvdi_internal2, rotlsi3, *rotlsi3_64,
37120         *rotlsi3_internal4, *rotlsi3_internal7le, *rotlsi3_internal7be,
37121         *rotlsi3_internal10le, *rotlsi3_internal10be, rlwinm,
37122         *lshiftrt_internal1le, *lshiftrt_internal1be,
37123         *lshiftrt_internal4le, *lshiftrt_internal4be, rotldi3,
37124         *rotldi3_internal4, *rotldi3_internal7le, *rotldi3_internal7be,
37125         *rotldi3_internal10le, *rotldi3_internal10be,
37126         *rotldi3_internal13le, *rotldi3_internal13be, *ashldi3_internal4,
37127         ashldi3_internal5, *ashldi3_internal6, *ashldi3_internal7,
37128         ashldi3_internal8, *ashldi3_internal9, anddi3_mc, anddi3_nomc,
37129         *anddi3_internal2_mc, *anddi3_internal3_mc, and 4 anonymous
37130         define_insns): Use type "shift" in the appropriate alternatives.
37131
37132 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37133
37134         * config/rs6000/rs6000.md (type): Add "logical".  Delete
37135         "fast_compare".
37136         (dot): Adjust comment.
37137         (andsi3_mc, *andsi3_internal2_mc, *andsi3_internal3_mc,
37138         *andsi3_internal4, *andsi3_internal5_mc, *boolsi3_internal2,
37139         *boolsi3_internal3, *boolccsi3_internal2, *boolccsi3_internal3,
37140         anddi3_mc, *anddi3_internal2_mc, *anddi3_internal3_mc,
37141         *booldi3_internal2, *booldi3_internal3, *boolcdi3_internal2,
37142         *boolcdi3_internal3, *boolccdi3_internal2, *boolccdi3_internal3,
37143         *mov<mode>_internal2, and 10 anonymous define_insns): Use "logical".
37144         * config/rs6000/rs6000.c (rs6000_adjust_cost): Adjust.
37145
37146         * config/rs6000/40x.md (ppc403-integer, ppc403-compare): Adjust.
37147         * config/rs6000/440.md (ppc440-integer, ppc440-compare): Adjust.
37148         * config/rs6000/476.md (ppc476-simple-integer, ppc476-compare): Adjust.
37149         * config/rs6000/603.md (ppc603-integer, ppc603-compare): Adjust.
37150         * config/rs6000/6xx.md (ppc604-integer, ppc604-compare): Adjust.
37151         * config/rs6000/7450.md (ppc7450-integer, ppc7450-compare): Adjust.
37152         * config/rs6000/7xx.md (ppc750-integer, ppc750-compare): Adjust.
37153         * config/rs6000/8540.md (ppc8540_su): Adjust.
37154         * config/rs6000/cell.md (cell-integer, cell-fast-cmp,
37155         cell-cmp-microcoded): Adjust.
37156         * config/rs6000/e300c2c3.md (ppce300c3_cmp, ppce300c3_iu): Adjust.
37157         * config/rs6000/e500mc.md (e500mc_su): Adjust.
37158         * config/rs6000/e500mc64.md (e500mc64_su, e500mc64_su2): Adjust.
37159         * config/rs6000/e5500.md (e5500_sfx, e5500_sfx2): Adjust.
37160         * config/rs6000/e6500.md (e6500_sfx, e6500_sfx2): Adjust.
37161         * config/rs6000/mpc.md (mpccore-integer, mpccore-compare): Adjust.
37162         * config/rs6000/power4.md (power4-integer, power4-cmp): Adjust.
37163         * config/rs6000/power5.md (power5-integer, power5-cmp): Adjust.
37164         * config/rs6000/power6.md (power6-integer, power6-fast-compare):
37165         Adjust.
37166         * config/rs6000/power7.md (power7-integer, power7-cmp): Adjust.
37167         * config/rs6000/power8.md (power8-1cyc, power8-fast-compare):
37168         Adjust.  Adjust comment.
37169         * config/rs6000/rs64.md (rs64a-integer, rs64a-compare): Adjust.
37170         * config/rs6000/titan.md (titan_fxu_adder, titan_fxu_alu): Adjust.
37171
37172 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37173
37174         * config/rs6000/rs6000.md (type): Add "add".
37175         (*add<mode>3_internal1, addsi3_high, *add<mode>3_internal2,
37176         *add<mode>3_internal3, *neg<mode>2_internal, and 5 anonymous
37177         define_insns): Use it.
37178         * config/rs6000/rs6000.c (rs6000_adjust_cost): Adjust.
37179
37180         * config/rs6000/40x.md (ppc403-integer, ppc403-compare): Adjust.
37181         * config/rs6000/440.md (ppc440-integer, ppc440-compare): Adjust.
37182         * config/rs6000/476.md (ppc476-simple-integer, ppc476-compare): Adjust.
37183         * config/rs6000/601.md (ppc601-integer): Adjust.
37184         * config/rs6000/603.md (ppc603-integer, ppc603-compare): Adjust.
37185         * config/rs6000/6xx.md (ppc604-integer, ppc604-compare): Adjust.
37186         * config/rs6000/7450.md (ppc7450-integer, ppc7450-compare): Adjust.
37187         * config/rs6000/7xx.md (ppc750-integer, ppc750-compare): Adjust.
37188         * config/rs6000/8540.md (ppc8540_su): Adjust.
37189         * config/rs6000/cell.md (cell-integer, cell-fast-cmp,
37190         cell-cmp-microcoded): Adjust.
37191         * config/rs6000/e300c2c3.md (ppce300c3_cmp, ppce300c3_iu): Adjust.
37192         * config/rs6000/e500mc.md (e500mc_su): Adjust.
37193         * config/rs6000/e500mc64.md (e500mc64_su, e500mc64_su2): Adjust.
37194         * config/rs6000/e5500.md (e5500_sfx, e5500_sfx2): Adjust.
37195         * config/rs6000/e6500.md (e6500_sfx, e6500_sfx2): Adjust.
37196         * config/rs6000/mpc.md (mpccore-integer, mpccore-compare): Adjust.
37197         * config/rs6000/power4.md (power4-integer, power4-cmp): Adjust.
37198         * config/rs6000/power5.md (power5-integer, power5-cmp): Adjust.
37199         * config/rs6000/power6.md (power6-integer, power6-fast-compare):
37200         Adjust.
37201         * config/rs6000/power7.md (power7-integer, power7-cmp): Adjust.
37202         * config/rs6000/power8.md (power8-1cyc, power8-fast-compare): Adjust.
37203         * config/rs6000/rs64.md (rs64a-integer, rs64a-compare): Adjust.
37204         * config/rs6000/titan.md (titan_fxu_adder, titan_fxu_alu): Adjust.
37205
37206 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37207
37208         * config/rs6000/rs6000.md (type): Delete "var_shift_rotate",
37209         "delayed_compare", "var_delayed_compare".
37210         (var_shift): New attribute.
37211         (cell_micro): Adjust.
37212         (*andsi3_internal2_mc, *andsi3_internal3_mc, *andsi3_internal4,
37213         *andsi3_internal5_mc, *extzvsi_internal1, *extzvsi_internal2,
37214         rotlsi3, *rotlsi3_64, *rotlsi3_internal2, *rotlsi3_internal3,
37215         *rotlsi3_internal4, *rotlsi3_internal5, *rotlsi3_internal6,
37216         *rotlsi3_internal8le, *rotlsi3_internal8be, *rotlsi3_internal9le,
37217         *rotlsi3_internal9be, *rotlsi3_internal10le, *rotlsi3_internal10be,
37218         *rotlsi3_internal11le, *rotlsi3_internal11be, *rotlsi3_internal12le,
37219         *rotlsi3_internal12be, ashlsi3, *ashlsi3_64, lshrsi3, *lshrsi3_64,
37220         *lshiftrt_internal2le, *lshiftrt_internal2be, *lshiftrt_internal3le,
37221         *lshiftrt_internal3be, *lshiftrt_internal5le, *lshiftrt_internal5be,
37222         *lshiftrt_internal5le, *lshiftrt_internal5be, ashrsi3, *ashrsi3_64,
37223         rotldi3, *rotldi3_internal2, *rotldi3_internal3, *rotldi3_internal4,
37224         *rotldi3_internal5, *rotldi3_internal6, *rotldi3_internal7le,
37225         *rotldi3_internal7be, *rotldi3_internal8le, *rotldi3_internal8be,
37226         *rotldi3_internal9le, *rotldi3_internal9be, *rotldi3_internal10le,
37227         *rotldi3_internal10be, *rotldi3_internal11le, *rotldi3_internal11be,
37228         *rotldi3_internal12le, *rotldi3_internal12be, *rotldi3_internal13le,
37229         *rotldi3_internal13be, *rotldi3_internal14le, *rotldi3_internal14be,
37230         *rotldi3_internal15le, *rotldi3_internal15be, *ashldi3_internal1,
37231         *ashldi3_internal2, *ashldi3_internal3, *lshrdi3_internal1,
37232         *lshrdi3_internal2, *lshrdi3_internal3, *ashrdi3_internal1,
37233         *ashrdi3_internal2, *ashrdi3_internal3, *anddi3_internal2_mc,
37234         *anddi3_internal3_mc, as well as 11 anonymous define_insns): Adjust.
37235         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_cracked_insn,
37236         insn_must_be_first_in_group, insn_must_be_last_in_group): Adjust.
37237
37238         * config/rs6000/40x.md (ppc403-integer, ppc403-compare): Adjust.
37239         * config/rs6000/440.md (ppc440-integer): Adjust.
37240         * config/rs6000/476.md (ppc476-simple-integer, ppc476-compare): Adjust.
37241         * config/rs6000/601.md (ppc601-integer, ppc601-compare): Adjust.
37242         * config/rs6000/603.md (ppc603-integer, ppc603-compare): Adjust.
37243         * config/rs6000/6xx.md (ppc604-integer, ppc604-compare): Adjust.
37244         * config/rs6000/7450.md (ppc7450-integer, ppc7450-compare): Adjust.
37245         * config/rs6000/7xx.md (ppc750-integer, ppc750-compare): Adjust.
37246         * config/rs6000/8540.md (ppc8540_su): Adjust.
37247         * config/rs6000/cell.md (cell-integer, cell-fast-cmp,
37248         cell-cmp-microcoded): Adjust.
37249         * config/rs6000/e300c2c3.md (ppce300c3_cmp): Adjust.
37250         * config/rs6000/e500mc.md (e500mc_su): Adjust.
37251         * config/rs6000/e500mc64.md (e500mc64_su, e500mc64_su2,
37252         e500mc64_delayed): Adjust.
37253         * config/rs6000/e5500.md (e5500_sfx, e5500_delayed): Adjust.
37254         * config/rs6000/e6500.md (e6500_sfx, e6500_delayed): Adjust.
37255         * config/rs6000/mpc.md (mpccore-integer, mpccore-compare): Adjust.
37256         * config/rs6000/power4.md (power4-integer, power4-compare): Adjust.
37257         * config/rs6000/power5.md (power5-integer, power5-compare): Adjust.
37258         * config/rs6000/power6.md (power6-shift, power6-var-rotate,
37259         power6-delayed-compare, power6-var-delayed-compare): Adjust.
37260         * config/rs6000/power7.md (power7-integer, power7-compare): Adjust.
37261         * config/rs6000/power8.md (power8-1cyc, power8-compare): Adjust.
37262         Adjust comment.
37263         * config/rs6000/rs64.md (rs64a-integer, rs64a-compare): Adjust.
37264         * config/rs6000/titan.md (titan_fxu_shift_and_rotate): Adjust.
37265
37266 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37267
37268         * config/rs6000/rs6000.md (type): Delete "idiv", "ldiv".  Add "div".
37269         (bits): New mode_attr.
37270         (idiv_ldiv): Delete mode_attr.
37271         (udiv<mode>3, *div<mode>3, div<div_extend>_<mode>): Adjust.
37272         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_cracked_insn,
37273         rs6000_adjust_priority, is_nonpipeline_insn,
37274         insn_must_be_first_in_group, insn_must_be_last_in_group): Adjust.
37275
37276         * config/rs6000/40x.md (ppc403-idiv): Adjust.
37277         * config/rs6000/440.md (ppc440-idiv): Adjust.
37278         * config/rs6000/476.md (ppc476-idiv): Adjust.
37279         * config/rs6000/601.md (ppc601-idiv): Adjust.
37280         * config/rs6000/603.md (ppc603-idiv): Adjust.
37281         * config/rs6000/6xx.md (ppc604-idiv, ppc620-idiv, ppc630-idiv,
37282         ppc620-ldiv): Adjust.
37283         * config/rs6000/7450.md (ppc7450-idiv): Adjust.
37284         * config/rs6000/7xx.md (ppc750-idiv): Adjust.
37285         * config/rs6000/8540.md (ppc8540_divide): Adjust.
37286         * config/rs6000/a2.md (ppca2-idiv, ppca2-ldiv): Adjust.
37287         * config/rs6000/cell.md (cell-idiv, cell-ldiv): Adjust.
37288         * config/rs6000/e300c2c3.md (ppce300c3_divide): Adjust.
37289         * config/rs6000/e500mc.md (e500mc_divide): Adjust.
37290         * config/rs6000/e500mc64.md (e500mc64_divide): Adjust.
37291         * config/rs6000/e5500.md (e5500_divide, e5500_divide_d): Adjust.
37292         * config/rs6000/e6500.md (e6500_divide, e6500_divide_d): Adjust.
37293         * config/rs6000/mpc.md (mpccore-idiv): Adjust.
37294         * config/rs6000/power4.md (power4-idiv, power4-ldiv): Adjust.
37295         * config/rs6000/power5.md (power5-idiv, power5-ldiv): Adjust.
37296         * config/rs6000/power6.md (power6-idiv, power6-ldiv): Adjust.
37297         * config/rs6000/power7.md (power7-idiv, power7-ldiv): Adjust.
37298         * config/rs6000/power8.md (power8-idiv, power8-ldiv): Adjust.
37299         * config/rs6000/rs64.md (rs64a-idiv, rs64a-ldiv): Adjust.
37300         * config/rs6000/titan.md (titan_fxu_div): Adjust.
37301
37302 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37303
37304         * config/rs6000/rs6000.md (type): Delete "insert_word",
37305         "insert_dword".  Add "insert".
37306         (size): Update comment.
37307         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_cracked_insn,
37308         insn_must_be_first_in_group): Adjust.
37309         (insvsi_internal, *insvsi_internal1, *insvsi_internal2,
37310         *insvsi_internal3, *insvsi_internal4, *insvsi_internal5,
37311         *insvsi_internal6, insvdi_internal): Adjust.
37312
37313         * config/rs6000/40x.md (ppc403-integer): Adjust.
37314         * config/rs6000/440.md (ppc440-integer): Adjust.
37315         * config/rs6000/476.md (ppc476-simple-integer): Adjust.
37316         * config/rs6000/601.md (ppc601-integer): Adjust.
37317         * config/rs6000/603.md (ppc603-integer): Adjust.
37318         * config/rs6000/6xx.md (ppc604-integer): Adjust.
37319         * config/rs6000/7450.md (ppc7450-integer): Adjust.
37320         * config/rs6000/7xx.md (ppc750-integer): Adjust.
37321         * config/rs6000/8540.md (ppc8540_su): Adjust.
37322         * config/rs6000/cell.md (cell-integer, cell-insert): Adjust.
37323         * config/rs6000/e300c2c3.md (ppce300c3_iu): Adjust.
37324         * config/rs6000/e500mc.md (e500mc_su): Adjust.
37325         * config/rs6000/e500mc64.md (e500mc64_su): Adjust.
37326         * config/rs6000/e5500.md (e5500_sfx): Adjust.
37327         * config/rs6000/e6500.md (e6500_sfx): Adjust.
37328         * config/rs6000/mpc.md (mpccore-integer): Adjust.
37329         * config/rs6000/power4.md (power4-integer, power4-insert): Adjust.
37330         * config/rs6000/power5.md (power5-integer, power5-insert): Adjust.
37331         * config/rs6000/power6.md (power6-insert, power6-insert-dword): Adjust.
37332         * config/rs6000/power7.md (power7-integer): Adjust.
37333         * config/rs6000/power8.md (power8-1cyc): Adjust.
37334         * config/rs6000/rs64.md (rs64a-integer): Adjust.
37335         * config/rs6000/titan.md (titan_fxu_shift_and_rotate): Adjust.
37336
37337 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37338
37339         * config/rs6000/rs6000.md (type): Add "mul".  Delete "imul",
37340         "imul2", "imul3", "lmul", "imul_compare", "lmul_compare".
37341         (size): New attribute.
37342         (dot): New attribute.
37343         (cell_micro): Adjust.
37344         (mulsi3, *mulsi3_internal1, *mulsi3_internal2, mulsidi3,
37345         umulsidi3, smulsi3_highpart, umulsi3_highpart, muldi3,
37346         *muldi3_internal1, *muldi3_internal2, smuldi3_highpart,
37347         umuldi3_highpart): Adjust.
37348         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_cracked_insn,
37349         rs6000_adjust_priority, is_nonpipeline_insn,
37350         insn_must_be_first_in_group, insn_must_be_last_in_group): Adjust.
37351
37352         * config/rs6000/40x.md (ppc403-imul, ppc405-imul, ppc405-imul2,
37353         ppc405-imul3): Adjust.
37354         * config/rs6000/440.md (ppc440-imul, ppc440-imul2): Adjust.
37355         * config/rs6000/476.md (ppc476-imul): Adjust.
37356         * config/rs6000/601.md (ppc601-imul): Adjust.
37357         * config/rs6000/603.md (ppc603-imul, ppc603-imul2): Adjust.
37358         * config/rs6000/6xx.md (ppc604-imul, ppc604e-imul, ppc620-imul,
37359         ppc620-imul2, ppc620-imul3, ppc620-lmul): Adjust.
37360         * config/rs6000/7450.md (ppc7450-imul, ppc7450-imul2): Adjust.
37361         * config/rs6000/7xx.md (ppc750-imul, ppc750-imul2, ppc750-imul3):
37362         Adjust.
37363         * config/rs6000/8540.md (ppc8540_multiply): Adjust.
37364         * config/rs6000/a2.md (ppca2-imul, ppca2-lmul): Adjust.
37365         * config/rs6000/cell.md (cell-lmul, cell-lmul-cmp, cell-imul23,
37366         cell-imul): Adjust.
37367         * config/rs6000/e300c2c3.md (ppce300c3_multiply): Adjust.
37368         * config/rs6000/e500mc.md (e500mc_multiply): Adjust.
37369         * config/rs6000/e500mc64.md (e500mc64_multiply): Adjust.
37370         * config/rs6000/e5500.md (e5500_multiply, e5500_multiply_i): Adjust.
37371         * config/rs6000/e6500.md (e6500_multiply, e6500_multiply_i): Adjust.
37372         * config/rs6000/mpc.md (mpccore-imul): Adjust.
37373         * config/rs6000/power4.md (power4-lmul-cmp, power4-imul-cmp,
37374         power4-lmul, power4-imul, power4-imul3): Adjust.
37375         * config/rs6000/power5.md (power5-lmul-cmp, power5-imul-cmp,
37376         power5-lmul, power5-imul, power5-imul3): Adjust.
37377         * config/rs6000/power6.md (power6-lmul-cmp, power6-imul-cmp,
37378         power6-lmul, power6-imul, power6-imul3): Adjust.
37379         * config/rs6000/power7.md (power7-mul, power7-mul-compare): Adjust.
37380         * config/rs6000/power8.md (power8-mul, power8-mul-compare): Adjust.
37381
37382         * config/rs6000/rs64.md (rs64a-imul, rs64a-imul2, rs64a-imul3,
37383         rs64a-lmul): Adjust.
37384         * config/rs6000/titan.md (titan_imul): Adjust.
37385
37386 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37387
37388         * config/rs6000/rs6000.md (type): Add new value "halfmul".
37389         (*macchwc, *macchw, *macchwuc, *macchwu, *machhwc, *machhw,
37390         *machhwuc, *machhwu, *maclhwc, *maclhw, *maclhwuc, *maclhwu,
37391         *nmacchwc, *nmacchw, *nmachhwc, *nmachhw, *nmaclhwc, *nmaclhw,
37392         *mulchwc, *mulchw, *mulchwuc, *mulchwu, *mulhhwc, *mulhhw,
37393         *mulhhwuc, *mulhhwu, *mullhwc, *mullhw, *mullhwuc, *mullhwu): Use it.
37394         * config/rs6000/40x.md (ppc405-imul3): Add type halfmul.
37395         * config/rs6000/440.md (ppc440-imul2): Add type halfmul.
37396         * config/rs6000/476.md (ppc476-imul): Add type halfmul.
37397         * config/rs6000/titan.md: Delete nonsensical comment.
37398         (titan_imul): Add type imul3.
37399         (titan_mulhw): Remove type imul3; add type halfmul.
37400
37401 2014-05-23  Segher Boessenkool  <segher@kernel.crashing.org>
37402
37403         * config/rs6000/rs6000.md (type): Reorder, reformat.
37404
37405 2014-05-23  Martin Jambor  <mjambor@suse.cz>
37406
37407         PR tree-optimization/53787
37408         * params.def (PARAM_IPA_MAX_AA_STEPS): New param.
37409         * ipa-prop.h (ipa_node_params): Rename uses_analysis_done to
37410         analysis_done, update all uses.
37411         * ipa-prop.c: Include domwalk.h
37412         (param_analysis_info): Removed.
37413         (param_aa_status): New type.
37414         (ipa_bb_info): Likewise.
37415         (func_body_info): Likewise.
37416         (ipa_get_bb_info): New function.
37417         (aa_overwalked): Likewise.
37418         (find_dominating_aa_status): Likewise.
37419         (parm_bb_aa_status_for_bb): Likewise.
37420         (parm_preserved_before_stmt_p): Changed to use new param AA info.
37421         (load_from_unmodified_param): Accept func_body_info as a parameter
37422         instead of parms_ainfo.
37423         (parm_ref_data_preserved_p): Changed to use new param AA info.
37424         (parm_ref_data_pass_through_p): Likewise.
37425         (ipa_load_from_parm_agg_1): Likewise.  Update callers.
37426         (compute_complex_assign_jump_func): Changed to use new param AA info.
37427         (compute_complex_ancestor_jump_func): Likewise.
37428         (ipa_compute_jump_functions_for_edge): Likewise.
37429         (ipa_compute_jump_functions): Removed.
37430         (ipa_compute_jump_functions_for_bb): New function.
37431         (ipa_analyze_indirect_call_uses): Likewise, moved variable
37432         declarations down.
37433         (ipa_analyze_virtual_call_uses): Accept func_body_info instead of node
37434         and info, moved variable declarations down.
37435         (ipa_analyze_call_uses): Accept and pass on func_body_info instead of
37436         node and info.
37437         (ipa_analyze_stmt_uses): Likewise.
37438         (ipa_analyze_params_uses): Removed.
37439         (ipa_analyze_params_uses_in_bb): New function.
37440         (ipa_analyze_controlled_uses): Likewise.
37441         (free_ipa_bb_info): Likewise.
37442         (analysis_dom_walker): New class.
37443         (ipa_analyze_node): Handle node-specific forbidden analysis,
37444         initialize and free func_body_info, use dominator walker.
37445         (ipcp_modif_dom_walker): New class.
37446         (ipcp_transform_function): Create and free func_body_info, use
37447         ipcp_modif_dom_walker, moved a lot of functionality there.
37448
37449 2014-05-23  Marek Polacek  <polacek@redhat.com>
37450             Jakub Jelinek  <jakub@redhat.com>
37451
37452         * builtins.def: Change SANITIZE_FLOAT_DIVIDE to SANITIZE_NONDEFAULT.
37453         * gcc.c (sanitize_spec_function): Likewise.
37454         * convert.c (convert_to_integer): Include "ubsan.h".  Add
37455         floating-point to integer instrumentation.
37456         * doc/invoke.texi: Document -fsanitize=float-cast-overflow.
37457         * flag-types.h (enum sanitize_code): Add SANITIZE_FLOAT_CAST and
37458         SANITIZE_NONDEFAULT.
37459         * opts.c (common_handle_option): Handle -fsanitize=float-cast-overflow.
37460         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_FLOAT_CAST_OVERFLOW,
37461         BUILT_IN_UBSAN_HANDLE_FLOAT_CAST_OVERFLOW_ABORT): Add.
37462         * ubsan.c: Include "realmpfr.h" and "dfp.h".
37463         (get_ubsan_type_info_for_type): Handle REAL_TYPEs.
37464         (ubsan_type_descriptor): Set tkind to 0xffff for types other than
37465         float/double/long double.
37466         (ubsan_instrument_float_cast): New function.
37467         * ubsan.h (ubsan_instrument_float_cast): Declare.
37468
37469 2014-05-23 Jiong Wang  <jiong.wang@arm.com>
37470
37471         * config/aarch64/predicates.md (aarch64_call_insn_operand): New
37472         predicate.
37473         * config/aarch64/constraints.md ("Ucs", "Usf"):  New constraints.
37474         * config/aarch64/aarch64.md (*sibcall_insn, *sibcall_value_insn):
37475         Adjust for tailcalling through registers.
37476         * config/aarch64/aarch64.h (enum reg_class): New caller save
37477         register class.
37478         (REG_CLASS_NAMES): Likewise.
37479         (REG_CLASS_CONTENTS): Likewise.
37480         * config/aarch64/aarch64.c (aarch64_function_ok_for_sibcall):
37481         Allow tailcalling without decls.
37482
37483 2014-05-23  Thomas Schwinge  <thomas@codesourcery.com>
37484
37485         * gimplify.c (omp_notice_variable) <case OMP_CLAUSE_DEFAULT_NONE>:
37486         Rewrite check for ORT_PARALLEL and ORT_COMBINED_PARALLEL.
37487
37488         * omp-low.c (expand_omp_for_static_chunk): Rename variable si to
37489         gsi, and variables v_* to v*.
37490
37491 2014-05-23  Eric Botcazou  <ebotcazou@adacore.com>
37492
37493         * varasm.c (output_constructor_bitfield): Fix thinkos in latest change.
37494
37495 2014-05-23  Thomas Schwinge  <thomas@codesourcery.com>
37496
37497         * gimple.h (enum gf_mask): Add and use GF_OMP_FOR_SIMD.
37498         * omp-low.c: Update accordingly.
37499
37500         * gimple.h (enum gf_mask): Rewrite "<< 0" shift expressions used
37501         for GF_OMP_FOR_KIND_MASK, GF_OMP_FOR_KIND_FOR,
37502         GF_OMP_FOR_KIND_DISTRIBUTE, GF_OMP_FOR_KIND_SIMD,
37503         GF_OMP_FOR_KIND_CILKSIMD, GF_OMP_TARGET_KIND_MASK,
37504         GF_OMP_TARGET_KIND_REGION, GF_OMP_TARGET_KIND_DATA,
37505         GF_OMP_TARGET_KIND_UPDATE.
37506
37507         * gimplify.c (omp_notice_variable) <case OMP_CLAUSE_DEFAULT_NONE>:
37508         Explicitly enumerate the expected region types.
37509
37510 2014-05-23  Paul Eggert  <eggert@cs.ucla.edu>
37511
37512         PR other/56955
37513         * doc/extend.texi (Function Attributes): Fix  __attribute__ ((malloc))
37514         documentation; the old documentation didn't clearly state the
37515         constraints on the contents of the pointed-to storage.
37516
37517 2014-05-23  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37518
37519         Fix bootstrap error on ia64
37520         * config/ia64/ia64.c (ia64_first_cycle_multipass_dfa_lookahead_guard):
37521         Return default value.
37522
37523 2014-05-23  Thomas Preud'homme  <thomas.preudhomme@arm.com>
37524
37525         PR tree-optimization/54733
37526         * tree-ssa-math-opts.c (nop_stats): New "bswap_stats" structure.
37527         (CMPNOP): Define.
37528         (find_bswap_or_nop_load): New.
37529         (find_bswap_1): Renamed to ...
37530         (find_bswap_or_nop_1): This. Also add support for memory source.
37531         (find_bswap): Renamed to ...
37532         (find_bswap_or_nop): This. Also add support for memory source and
37533         detection of bitwise operations equivalent to load in target
37534         endianness.
37535         (execute_optimize_bswap): Likewise. Also move its leading comment back
37536         in place and split statement transformation into ...
37537         (bswap_replace): This.
37538
37539 2014-05-22  Vladimir Makarov  <vmakarov@redhat.com>
37540
37541         PR rtl-optimization/61215
37542         * lra-elelimination.c (lra_eliminate_regs_1): Don't use
37543         simplify_gen_subreg until final substitution.
37544
37545 2014-05-23  Alan Modra  <amodra@gmail.com>
37546
37547         PR target/61231
37548         * config/rs6000/rs6000.c (mem_operand_gpr): Handle SImode.
37549         * config/rs6000/rs6000.md (extendsidi2_lfiwax, extendsidi2_nocell):
37550         Use "Y" constraint rather than "m".
37551
37552 2014-05-23  Kugan Vivekanandarajah  <kuganv@linaro.org>
37553
37554         * config/aarch64/aarch64.c (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): New
37555         define.
37556         * config/aarch64/aarch64-protos.h (aarch64_atomic_assign_expand_fenv):
37557         New function declaration.
37558         * config/aarch64/aarch64-builtins.c (aarch64_builtins) : Add
37559         AARCH64_BUILTIN_GET_FPCR, AARCH64_BUILTIN_SET_FPCR.
37560         AARCH64_BUILTIN_GET_FPSR and AARCH64_BUILTIN_SET_FPSR.
37561         (aarch64_init_builtins) : Initialize builtins
37562         __builtins_aarch64_set_fpcr, __builtins_aarch64_get_fpcr.
37563         __builtins_aarch64_set_fpsr and __builtins_aarch64_get_fpsr.
37564         (aarch64_expand_builtin) : Expand builtins __builtins_aarch64_set_fpcr
37565         __builtins_aarch64_get_fpcr, __builtins_aarch64_get_fpsr,
37566         and __builtins_aarch64_set_fpsr.
37567         (aarch64_atomic_assign_expand_fenv): New function.
37568         * config/aarch64/aarch64.md (set_fpcr): New pattern.
37569         (get_fpcr) : Likewise.
37570         (set_fpsr) : Likewise.
37571         (get_fpsr) : Likewise.
37572         (unspecv): Add UNSPECV_GET_FPCR and UNSPECV_SET_FPCR, UNSPECV_GET_FPSR
37573         and UNSPECV_SET_FPSR.
37574         * doc/extend.texi (AARCH64 Built-in Functions) : Document
37575         __builtins_aarch64_set_fpcr, __builtins_aarch64_get_fpcr.
37576         __builtins_aarch64_set_fpsr and __builtins_aarch64_get_fpsr.
37577
37578 2014-05-22  Vladimir Makarov  <vmakarov@redhat.com>
37579
37580         PR rtl-optimization/60969
37581         * ira-costs.c (record_reg_classes): Process NO_REGS for matching
37582         constraints.  Set up mem cost for NO_REGS case.
37583
37584 2014-05-22  Thomas Schwinge  <thomas@codesourcery.com>
37585
37586         * builtin-types.def: Simplify examples for DEF_FUNCTION_TYPE_*.
37587
37588 2012-05-22  Bernd Schmidt  <bernds@codesourcery.com>
37589
37590         * config/darwin.c: Include "lto-section-names.h".
37591         (LTO_SEGMENT_NAME): Don't define.
37592         * config/i386/winnt.c: Include "lto-section-names.h".
37593         * lto-streamer.c: Include "lto-section-names.h".
37594         * lto-streamer.h (LTO_SECTION_NAME_PREFIX): Don't define.
37595         * lto-wrapper.c: Include "lto-section-names.h".
37596         (LTO_SECTION_NAME_PREFIX): Don't define.
37597         * lto-section-names.h: New file.
37598         * cgraphunit.c: Include "lto-section-names.h".
37599
37600 2014-05-22  Peter Bergner  <bergner@vnet.ibm.com>
37601
37602         * config/rs6000/htm.md (ttest): Use correct shift value to get CR0.
37603
37604 2014-05-22  Richard Earnshaw  <rearnsha@arm.com>
37605
37606         PR target/61208
37607         * arm.md (arm_cmpdi_unsigned): Fix length calculation for Thumb2.
37608
37609 2014-05-22  Nick Clifton  <nickc@redhat.com>
37610
37611         * config/msp430/msp430.h (ASM_SPEC): Add spaces after inserted options.
37612
37613 2014-05-22  Eric Botcazou  <ebotcazou@adacore.com>
37614
37615         * tree-ssa-forwprop.c (associate_plusminus): Extend (T)(P + A) - (T)P
37616         -> (T)A transformation to integer types.
37617
37618 2014-05-22  Teresa Johnson  <tejohnson@google.com>
37619
37620         * gcov-io.c (gcov_position): Use gcov_nonruntime_assert.
37621         (gcov_is_error): Remove gcc_assert from IN_LIBGCOV code.
37622         (gcov_rewrite): Use gcov_nonruntime_assert.
37623         (gcov_open): Ditto.
37624         (gcov_write_words): Ditto.
37625         (gcov_write_length): Ditto.
37626         (gcov_read_words): Use gcov_nonruntime_assert, and remove
37627         gcc_assert from IN_LIBGCOV code.
37628         (gcov_read_summary): Use gcov_error to flag profile corruption.
37629         (gcov_sync): Use gcov_nonruntime_assert.
37630         (gcov_seek): Remove gcc_assert from IN_LIBGCOV code.
37631         (gcov_histo_index): Use gcov_nonruntime_assert.
37632         (static void gcov_histogram_merge): Ditto.
37633         (compute_working_sets): Ditto.
37634         * gcov-io.h (gcov_nonruntime_assert): Define.
37635         (gcov_error): Define for !IN_LIBGCOV
37636
37637 2014-05-22  Richard Biener  <rguenther@suse.de>
37638
37639         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Handle
37640         BUILT_IN_REALLOC like BUILT_IN_STRDUP.
37641         (call_may_clobber_ref_p_1): Handle BUILT_IN_REALLOC as allocation
37642         and deallocation site.
37643         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
37644         Handle BUILT_IN_REALLOC similar to BUILT_IN_STRDUP with also
37645         passing through the incoming points-to set.
37646         (handle_lhs_call): Use flags argument instead of recomputing it.
37647         (find_func_aliases_for_call): Call handle_lhs_call with proper
37648         call return flags.
37649
37650 2014-05-22  Jakub Jelinek  <jakub@redhat.com>
37651
37652         * tree-streamer-in.c (unpack_ts_real_cst_value_fields): Make sure
37653         all padding bits in REAL_VALUE_TYPE are cleared.
37654
37655 2014-05-22  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37656
37657         Cleanup and improve multipass_dfa_lookahead_guard
37658         * config/i386/i386.c (core2i7_first_cycle_multipass_filter_ready_try,)
37659         (core2i7_first_cycle_multipass_begin,)
37660         (core2i7_first_cycle_multipass_issue,)
37661         (core2i7_first_cycle_multipass_backtrack): Update signature.
37662         * config/ia64/ia64.c
37663         (ia64_first_cycle_multipass_dfa_lookahead_guard_spec): Remove.
37664         (ia64_first_cycle_multipass_dfa_lookahead_guard): Update signature.
37665         (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD_GUARD_SPEC): Remove
37666         hook definition.
37667         (ia64_first_cycle_multipass_dfa_lookahead_guard): Merge logic from
37668         ia64_first_cycle_multipass_dfa_lookahead_guard_spec.  Update return
37669         values.
37670         * config/rs6000/rs6000.c (rs6000_use_sched_lookahead_guard): Update
37671         return values.
37672         * doc/tm.texi: Regenerate.
37673         * doc/tm.texi.in
37674         (TARGET_SCHED_FIRST_CYCLE_MULTIPASS_DFA_LOOKAHEAD_GUARD_SPEC): Remove.
37675         * haifa-sched.c (ready_try): Make signed to allow negative values.
37676         (rebug_ready_list_1): Update.
37677         (choose_ready): Simplify.
37678         (sched_extend_ready_list): Update.
37679
37680 2014-05-22  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37681
37682         Remove IA64 speculation tweaking flags
37683         * config/ia64/ia64.c (ia64_set_sched_flags): Delete handling of
37684         speculation tuning flags.
37685         (msched-prefer-non-data-spec-insns,)
37686         (msched-prefer-non-control-spec-insns): Obsolete options.
37687         * haifa-sched.c (choose_ready): Remove handling of
37688         PREFER_NON_CONTROL_SPEC and PREFER_NON_DATA_SPEC.
37689         * sched-int.h (enum SPEC_SCHED_FLAGS): Remove PREFER_NON_CONTROL_SPEC
37690         and PREFER_NON_DATA_SPEC.
37691         * sel-sched.c (process_spec_exprs): Remove handling of
37692         PREFER_NON_CONTROL_SPEC and PREFER_NON_DATA_SPEC.
37693
37694 2014-05-22  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37695
37696         Improve scheduling debug output
37697         * haifa-sched.c (debug_ready_list): Remove unnecessary prototype.
37698         (advance_one_cycle): Update.
37699         (schedule_insn, queue_to_ready): Add debug printouts.
37700         (debug_ready_list_1): New static function.
37701         (debug_ready_list): Update.
37702         (max_issue): Add debug printouts.
37703         (dump_insn_stream): New static function.
37704         (schedule_block): Use it.  Also better indent printouts.
37705
37706 2014-05-22  Maxim Kuvyrkov  <maxim.kuvyrkov@linaro.org>
37707
37708         Fix sched_insn debug counter
37709         * haifa-sched.c (schedule_insn): Update.
37710         (struct haifa_saved_data): Add nonscheduled_insns_begin.
37711         (save_backtrack_point, restore_backtrack_point): Update.
37712         (first_nonscheduled_insn): New static function.
37713         (queue_to_ready, choose_ready): Use it.
37714         (schedule_block): Init nonscheduled_insns_begin.
37715         (sched_emit_insn): Update.
37716
37717
37718 2014-05-22  Kugan Vivekanandarajah  <kuganv@linaro.org>
37719
37720         * config/aarch64/aarch64.c (aarch64_regno_regclass) : Change CORE_REGS
37721         to GENERAL_REGS.
37722         (aarch64_secondary_reload) : LikeWise.
37723         (aarch64_class_max_nregs) : Remove CORE_REGS.
37724         * config/aarch64/aarch64.h (enum reg_class) : Remove CORE_REGS.
37725         (REG_CLASS_NAMES) : Likewise.
37726         (REG_CLASS_CONTENTS) : LikeWise.
37727         (INDEX_REG_CLASS) : Change CORE_REGS to GENERAL_REGS.
37728
37729 2014-05-21  Guozhi Wei  <carrot@google.com>
37730
37731         PR target/61202
37732         * config/aarch64/arm_neon.h (vqdmulh_n_s16): Change the last operand's
37733         constraint.
37734         (vqdmulhq_n_s16): Likewise.
37735
37736 2014-05-21  Segher Boessenkool  <segher@kernel.crashing.org>
37737
37738         * config/rs6000/predicates.md (update_indexed_address_mem): Delete.
37739
37740 2014-05-21  Marek Polacek  <polacek@redhat.com>
37741
37742         PR sanitizer/61272
37743         * ubsan.c (is_ubsan_builtin_p): Turn assert into a condition.
37744
37745 2014-05-21  Martin Jambor  <mjambor@suse.cz>
37746
37747         * doc/invoke.texi (Optimize Options): Document parameters
37748         ipa-cp-eval-threshold, ipa-max-agg-items, ipa-cp-loop-hint-bonus and
37749         ipa-cp-array-index-hint-bonus.
37750
37751 2014-05-21  Mark Wielaard  <mjw@redhat.com>
37752
37753         PR debug/16063
37754         * dwarf2out.c (gen_enumeration_type_die): Add DW_AT_type if DWARF
37755         version >= 3 or not strict DWARF.
37756         * langhooks.h (struct lang_hooks_for_types): Add
37757         enum_underlying_base_type.
37758         * langhooks.c (lhd_enum_underlying_base_type): New function.
37759         * gcc/langhooks.h (struct lang_hooks_for_types): Add
37760         enum_underlying_base_type.
37761         * langhooks-def.h (lhd_enum_underlying_base_type): New declaration.
37762         (LANG_HOOKS_ENUM_UNDERLYING_BASE_TYPE): New define.
37763         (LANG_HOOKS_FOR_TYPES_INITIALIZER): Add new lang hook.
37764
37765 2014-05-21  Richard Biener  <rguenther@suse.de>
37766
37767         * doc/invoke.texi (-flto-partition=): Document one and none algorithms.
37768
37769 2014-05-21  John Marino  <gnugcc@marino.st>
37770
37771         * config.gcc (*-*-dragonfly*): New target.
37772         * configure.ac: Detect dl_iterate_phdr (*freebsd*, *dragonfly*).
37773         * configure: Regenerate.
37774         * config/dragonfly-stdint.h: New.
37775         * config/dragonfly.h: New.
37776         * config/dragonfly.opt: New.
37777         * config/i386/dragonfly.h: New.
37778         * ginclude/stddef.h: Detect _PTRDIFF_T_DECLARED for DragonFly.
37779
37780 2014-05-21  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
37781
37782         * tree.def (VOID_CST): New.
37783         * tree-core.h (TI_VOID): New.
37784         * tree.h (void_node): New.
37785         * tree.c (tree_node_structure_for_code, tree_code_size)
37786         (iterative_hash_expr): Handle VOID_CST.
37787         (build_common_tree_nodes): Initialize void_node.
37788
37789 2014-05-21  Bernd Schmidt  <bernds@codesourcery.com>
37790
37791         * reload1.c (remove_init_insns, will_delete_init_insn_p): New static
37792         functions.
37793         (reload, calculate_needs_all_insns, reload_as_needed): Use them.
37794
37795         * config/bfin/bfin.c (split_load_immediate): Use gen_int_mode in a few
37796         more places.
37797
37798         * cfgrtl.c (cfg_layout_initialize): Weaken assert to only trigger if
37799         flag_reorder_blocks_and_partition.
37800         * hw-doloop.c (reorg_loops): Avoid reordering if that flag is set.
37801
37802 2014-05-21  Oleg Endo  <olegendo@gcc.gnu.org>
37803
37804         PR target/54236
37805         * config/sh/sh.md (*addc_r_1): Rename to addc_t_r.  Remove empty
37806         constraints.
37807         (*addc_r_t): Add new insn_and_split.
37808
37809 2014-05-21  Jakub Jelinek  <jakub@redhat.com>
37810
37811         PR middle-end/61252
37812         * omp-low.c (handle_simd_reference): New function.
37813         (lower_rec_input_clauses): Use it.  Defer adding reference
37814         initialization even for reduction without placeholder if in simd,
37815         handle it properly later on.
37816
37817 2014-05-20  Jan Hubicka  <hubicka@ucw.cz>
37818
37819         PR tree-optimization/60899
37820         * gimple-fold.c (can_refer_decl_in_current_unit_p): Cleanup;
37821         assume all static symbols will have definition wile parsing and
37822         check the do have definition later in compilation; check that
37823         variable referring symbol will be output before concluding that
37824         reference is safe; be conservative for referring local statics;
37825         be more precise about when comdat is output in other partition.
37826
37827 2014-05-20  Jan Hubicka  <hubicka@ucw.cz>
37828
37829         PR bootstrap/60984
37830         * ipa-inline-transform.c (inline_call): Use add CALLEE_REMOVED
37831         parameter.
37832         * ipa-inline.c (inline_to_all_callers): If callee was removed; return.
37833         (ipa_inline): Loop inline_to_all_callers until no more aliases
37834         are removed.
37835
37836 2014-05-20  Jan Hubicka  <hubicka@ucw.cz>
37837
37838         * ipa.c (ipa_discover_readonly_nonaddressable_var): Fix dumping;
37839         set writeonly flag only for vars actually written to.
37840
37841 2014-05-20  Dehao Chen  <dehao@google.com>
37842
37843         * ipa-inline-transform.c (clone_inlined_nodes): Use min of edge count
37844         and callee count to get clone count.
37845         * tree-inline.c (expand_call_inline): Use callee count instead of bb
37846         count in copy_body.
37847
37848 2014-05-20  Richard Sandiford  <rdsandiford@googlemail.com>
37849
37850         PR rtl-optimization/61243
37851         * emit-rtl.c (emit_copy_of_insn_after): Copy CROSSING_JUMP_P.
37852
37853 2014-05-20  Xinliang David Li  <davidxl@google.com>
37854
37855         * cgraphunit.c (walk_polymorphic_call_targets): Add
37856         dbgcnt and fopt-info support.
37857         * ipa-prop.c (ipa_make_edge_direct_to_target): Ditto.
37858         * ipa-devirt.c (ipa_devirt): Ditto.
37859         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children): Ditto.
37860         * ipa.c (walk_polymorphic_call_targets): Ditto.
37861         * gimple-fold.c (fold_gimple_assign): Ditto.
37862         (gimple_fold_call): Ditto.
37863         * dbgcnt.def: New counter.
37864
37865 2014-05-20  DJ Delorie  <dj@redhat.com>
37866
37867         * config/msp430/msp430.md (split): Don't allow subregs when
37868         splitting SImode adds.
37869         (andneghi): Fix subtraction logic.
37870         * config/msp430/predicates.md (msp430_nonsubreg_or_imm_operand): New.
37871
37872 2014-05-20  Jan Hubicka  <hubicka@ucw.cz>
37873
37874         * tree.h (DECL_ONE_ONLY): Return true only for externally visible
37875         symbols.
37876         * except.c (switch_to_exception_section, resolve_unique_section,
37877         get_named_text_section, default_function_rodata_section,
37878         align_variable, get_block_for_decl, default_section_type_flags):
37879         Use DECL_COMDAT_GROUP instead of DECL_ONE_ONLY.
37880         * symtab.c (symtab_add_to_same_comdat_group,
37881         symtab_make_decl_local, fixup_same_cpp_alias_visibility,
37882         symtab_nonoverwritable_alias, symtab_get_symbol_partitioning_class):
37883         Likewise.
37884         * cgraphclones.c (cgraph_create_virtual_clone): Likewise.
37885         * bb-reorder.c (pass_partition_blocks::gate): Likewise.
37886         * config/c6x/c6x.c (c6x_elf_unique_section): Likewise.
37887         (c6x_function_in_section_p): Likewise.
37888         * config/darwin.c (machopic_select_section): Likewise.
37889         * config/arm/arm.c (arm_function_in_section_p): Likewise.
37890         * config/mips/mips.c (mips_function_rodata_section): Likewise.
37891         * config/mep/mep.c (mep_select_section): LIkewise.
37892         * config/i386/i386.c (x86_64_elf_unique_section): Likewise.
37893
37894 2014-05-20  Eric Botcazou  <ebotcazou@adacore.com>
37895
37896         * tree-ssa-dom.c (hashable_expr_equal_p) <EXPR_CALL>: Also compare the
37897         EH region of calls to pure functions that can throw an exception.
37898         * tree-ssa-sccvn.c (vn_reference_eq): Remove duplicated test.
37899         (copy_reference_ops_from_call): Also copy the EH region of the call if
37900         it can throw an exception.
37901
37902 2014-05-20  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
37903
37904         * simplify-rtx.c (simplify_binary_operation_1): Optimize case of
37905         nested VEC_SELECTs that are inverses of each other.
37906
37907 2014-05-20  Richard Biener  <rguenther@suse.de>
37908
37909         * tree-ssa-sccvn.c (process_scc): Dump SCC here, when iterating,
37910         (extract_and_process_scc_for_name): not here.
37911         (cond_dom_walker::before_dom_children): Only process
37912         stmts that end the BB in interesting ways.
37913         (run_scc_vn): Mark param uses as visited.
37914
37915 2014-05-20  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
37916
37917         * config/arm/arm.md (arith_shiftsi): Do not predicate for
37918         arm_restrict_it.
37919
37920 2014-05-20  Nick Clifton  <nickc@redhat.com>
37921
37922         * config/msp430/msp430.c (TARGET_GIMPLIFY_VA_ARG_EXPR): Define.
37923         (msp430_gimplify_va_arg_expr): New function.
37924         (msp430_print_operand): Handle (CONST (ZERO_EXTRACT)).
37925
37926         * config/msp430/msp430.md (zero_extendpsisi2): Use + constraint on
37927         operand 0 in order to prevent confusion about the number of
37928         registers involved.
37929
37930 2014-05-20  Richard Biener  <rguenther@suse.de>
37931
37932         PR tree-optimization/61221
37933         * tree-ssa-pre.c (el_to_update): Remove.
37934         (eliminate_dom_walker::before_dom_children): Handle released
37935         VDEFs by value-numbering them to the associated VUSE.  Update
37936         stmt immediately for substituted call address.
37937         (eliminate): Remove delayed stmt updating code.
37938         * tree-ssa-sccvn.c (vuse_ssa_val): New function valueizing
37939         possibly late re-numbered vuses.
37940         (vn_reference_lookup_2): Adjust.
37941         (vn_reference_lookup_pieces): Likewise.
37942         (vn_reference_lookup): Likewise.
37943
37944 2014-05-20  Richard Biener  <rguenther@suse.de>
37945
37946         * config.gcc: Remove need_64bit_hwint.
37947         * configure.ac: Do not define NEED_64BIT_HOST_WIDE_INT.
37948         * hwint.h: Do not check NEED_64BIT_HOST_WIDE_INT but assume
37949         it to be true.
37950         * config.in: Regenerate.
37951         * configure: Likewise.
37952
37953 2014-05-19  David Wohlferd <dw@LimeGreenSocks.com>
37954
37955         * doc/extend.texi: Create Label Attributes section,
37956         move all label attributes into it and reference it.
37957
37958 2014-05-19  Richard Earnshaw  <rearnsha@arm.com>
37959
37960         * arm.c (thumb1_reorg): When scanning backwards skip anything
37961         that's not a proper insn.
37962
37963 2014-05-19  Richard Biener  <rguenther@suse.de>
37964
37965         PR tree-optimization/61221
37966         * tree-ssa-pre.c (eliminate_dom_walker::before_dom_children):
37967         Do nothing for unreachable blocks.
37968         * tree-ssa-sccvn.c (cond_dom_walker::before_dom_children):
37969         Improve unreachability detection.
37970
37971 2014-05-19  Richard Biener  <rguenther@suse.de>
37972
37973         PR tree-optimization/61209
37974         * tree-ssa-sccvn.c (visit_phi): Avoid setting expr to VN_TOP.
37975
37976 2014-05-19  Nick Clifton  <nickc@redhat.com>
37977
37978         * except.c (init_eh): Fix computation of builtin setjmp buffer
37979         size to allow for targets where POINTER_SIZE > BITS_PER_WORD.
37980
37981 2014-05-19  Richard Biener  <rguenther@suse.de>
37982
37983         PR tree-optimization/61184
37984         * tree-vrp.c (is_negative_overflow_infinity): Use
37985         TREE_OVERFLOW_P and do that check first.
37986         (is_positive_overflow_infinity): Likewise.
37987         (is_overflow_infinity): Likewise.
37988         (vrp_operand_equal_p): Properly treat operands with
37989         differing overflow as not equal.
37990
37991 2014-05-19  Bernd Schmidt  <bernds@codesourcery.com>
37992
37993         * simplify-rtx.c (simplify_unary_operation_1): Use CONST_INT_P in
37994         shift simplification where it was intended.
37995
37996 2014-05-19  Christian Bruel  <christian.bruel@st.com>
37997
37998         PR target/61195
37999         * config/sh/sh.md (movsf_ie): Unset fp_mode for fmov.
38000
38001 2014-05-19  Richard Sandiford  <r.sandiford@uk.ibm.com>
38002
38003         PR target/61084
38004         * config/sparc/sparc.c (sparc_fold_builtin): Use widest_int rather
38005         than wide_int.
38006
38007 2014-05-19  Richard Sandiford  <rdsandiford@googlemail.com>
38008
38009         * reg-notes.def (CROSSING_JUMP): Likewise.
38010         * rtl.h (rtx_def): Update comment for jump flag.
38011         (CROSSING_JUMP_P): Define.
38012         * cfgcleanup.c (try_forward_edges, try_optimize_cfg): Use it instead
38013         of a REG_CROSSING_JUMP note.
38014         * cfghooks.c (tidy_fallthru_edges): Likewise.
38015         * cfgrtl.c (fixup_partition_crossing, rtl_verify_edges): Likewise.
38016         * emit-rtl.c (try_split): Likewise.
38017         * haifa-sched.c (sched_create_recovery_edges): Likewise.
38018         * ifcvt.c (find_if_case_1, find_if_case_2): Likewise.
38019         * jump.c (redirect_jump_2): Likewise.
38020         * reorg.c (follow_jumps, fill_slots_from_thread): Likewise.
38021         (relax_delay_slots): Likewise.
38022         * config/arc/arc.md (jump_i, cbranchsi4_scratch, *bbit): Likewise.
38023         (bbit_di): Likewise.
38024         * config/arc/arc.c (arc_reorg, arc_can_follow_jump): Likewise.
38025         * config/sh/sh.md (jump_compact): Likewise.
38026         * bb-reorder.c (rotate_loop): Likewise.
38027         (pass_duplicate_computed_gotos::execute): Likewise.
38028         (add_reg_crossing_jump_notes): Rename to...
38029         (update_crossing_jump_flags): ...this.
38030         (pass_partition_blocks::execute): Update accordingly.
38031
38032 2014-05-19  Richard Sandiford  <rdsandiford@googlemail.com>
38033
38034         * tree.h: Remove extraneous template <>.
38035
38036 2014-05-17  Jan Hubicka  <hubicka@ucw.cz>
38037
38038         * ipa.c (symtab_remove_unreachable_nodes): Remove
38039         symbol from comdat group if its body was eliminated.
38040         (comdat_can_be_unshared_p_1): Static symbols can always be privatized.
38041         * symtab.c (symtab_remove_from_same_comdat_group): Break out from ...
38042         (symtab_unregister_node): ... this one.
38043         (verify_symtab_base): More strict checking of comdats.
38044         * cgraph.h (symtab_remove_from_same_comdat_group): Declare.
38045
38046 2014-05-17  Jan Hubicka  <hubicka@ucw.cz>
38047
38048         * tree-pass.h (make_pass_ipa_comdats): New pass.
38049         * timevar.def (TV_IPA_COMDATS): New timevar.
38050         * passes.def (pass_ipa_comdats): Add.
38051         * Makefile.in (OBJS): Add ipa-comdats.o
38052         * ipa-comdats.c: New file.
38053
38054 2014-05-17  Jan Hubicka  <hubicka@ucw.cz>
38055
38056         * ipa.c (update_visibility_by_resolution_info): New function.
38057         (function_and_variable_visibility): Use it.
38058
38059 2014-05-17  Jan Hubicka  <hubicka@ucw.cz>
38060
38061         * cgraph.h (symtab_first_defined_symbol, symtab_next_defined_symbol):
38062         New functions.
38063         (FOR_EACH_DEFINED_SYMBOL): New macro.
38064         (varpool_first_static_initializer, varpool_next_static_initializer,
38065         varpool_first_defined_variable, varpool_next_defined_variable):
38066         Fix comments.
38067         (symtab_in_same_comdat_p): Correctly deal with inline functions.
38068
38069 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
38070
38071         * ggc-page.c (ggc_handle_finalizers): Add comment.
38072
38073 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
38074
38075         * ggc-common.c (ggc_internal_cleared_alloc): Adjust.
38076         * ggc-none.c (ggc_internal_alloc): Assert if a finalizer is passed.
38077         (ggc_internal_cleared_alloc): Likewise.
38078         * ggc-page.c (finalizer): New class.
38079         (vec_finalizer): Likewise.
38080         (globals::finalizers): New member.
38081         (globals::vec_finalizers): Likewise.
38082         (ggc_internal_alloc): Record the finalizer if any for the block being
38083         allocated.
38084         (ggc_handle_finalizers): New function.
38085         (ggc_collect): Call ggc_handle_finalizers.
38086         * ggc.h (ggc_internal_alloc): Add arguments to allow installing a
38087         finalizer.
38088         (ggc_internal_cleared_alloc): Likewise.
38089         (finalize): New function.
38090         (need_finalization_p): Likewise.
38091         (ggc_alloc): Install the type's destructor as the finalizer if it
38092         might do something.
38093         (ggc_cleared_alloc): Likewise.
38094         (ggc_vec_alloc): Likewise.
38095         (ggc_cleared_vec_alloc): Likewise.
38096
38097 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
38098
38099         * ggc.h (ggc_alloc_cleared_simd_clone_stat): Remove function.
38100
38101 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
38102
38103         * alias.c (record_alias_subset): Adjust.
38104         * bitmap.c (bitmap_element_allocate): Likewise.
38105         (bitmap_gc_alloc_stat): Likewise.
38106         * cfg.c (init_flow): Likewise.
38107         (alloc_block): Likewise.
38108         (unchecked_make_edge): Likewise.
38109         * cfgloop.c (alloc_loop): Likewise.
38110         (flow_loops_find): Likewise.
38111         (rescan_loop_exit): Likewise.
38112         * cfgrtl.c (init_rtl_bb_info): Likewise.
38113         * cgraph.c (insert_new_cgraph_node_version): Likewise.
38114         (cgraph_allocate_node): Likewise.
38115         (cgraph_create_edge_1): Likewise.
38116         (cgraph_allocate_init_indirect_info): Likewise.
38117         * cgraphclones.c (cgraph_clone_edge): Likewise.
38118         * cgraphunit.c (add_asm_node): Likewise.
38119         (init_lowered_empty_function): Likewise.
38120         * config/aarch64/aarch64.c (aarch64_init_machine_status): Likewise.
38121         * config/alpha/alpha.c (alpha_init_machine_status): Likewise.
38122         (alpha_use_linkage): Likewise.
38123         * config/arc/arc.c (arc_init_machine_status): Likewise.
38124         * config/arm/arm.c (arm_init_machine_status): Likewise.
38125         * config/avr/avr.c (avr_init_machine_status): Likewise.
38126         * config/bfin/bfin.c (bfin_init_machine_status): Likewise.
38127         * config/c6x/c6x.c (c6x_init_machine_status): Likewise.
38128         * config/cris/cris.c (cris_init_machine_status): Likewise.
38129         * config/darwin.c (machopic_indirection_name): Likewise.
38130         (darwin_build_constant_cfstring): Likewise.
38131         (darwin_enter_string_into_cfstring_table): Likewise.
38132         * config/epiphany/epiphany.c (epiphany_init_machine_status): Likewise.
38133         * config/frv/frv.c (frv_init_machine_status): Likewise.
38134         * config/i386/i386.c (get_dllimport_decl): Likewise.
38135         (ix86_init_machine_status): Likewise.
38136         (assign_386_stack_local): Likewise.
38137         * config/i386/winnt.c (i386_pe_record_external_function): Likewise.
38138         (i386_pe_maybe_record_exported_symbol): Likewise.
38139         (i386_pe_record_stub): Likewise.
38140         * config/ia64/ia64.c (ia64_init_machine_status): Likewise.
38141         * config/iq2000/iq2000.c (iq2000_init_machine_status): Likewise.
38142         * config/m32c/m32c.c (m32c_init_machine_status): Likewise.
38143         (m32c_note_pragma_address): Likewise.
38144         * config/mep/mep.c (mep_init_machine_status): Likewise.
38145         (mep_note_pragma_flag): Likewise.
38146         * config/mips/mips.c (mflip_mips16_use_mips16_p): Likewise.
38147         (mips16_local_alias): Likewise.
38148         (mips_init_machine_status): Likewise.
38149         * config/mmix/mmix.c (mmix_init_machine_status): Likewise.
38150         * config/moxie/moxie.c (moxie_init_machine_status): Likewise.
38151         * config/msp430/msp430.c (msp430_init_machine_status): Likewise.
38152         * config/nds32/nds32.c (nds32_init_machine_status): Likewise.
38153         * config/nios2/nios2.c (nios2_init_machine_status): Likewise.
38154         * config/pa/pa.c (pa_init_machine_status): Likewise.
38155         (pa_get_deferred_plabel): Likewise.
38156         * config/rl78/rl78.c (rl78_init_machine_status): Likewise.
38157         * config/rs6000/rs6000.c (builtin_function_type): Likewise.
38158         (rs6000_init_machine_status): Likewise.
38159         (output_toc): Likewise.
38160         * config/s390/s390.c (s390_init_machine_status): Likewise.
38161         * config/score/score.c (score_output_external): Likewise.
38162         * config/sparc/sparc.c (sparc_init_machine_status): Likewise.
38163         * config/spu/spu.c (spu_init_machine_status): Likewise.
38164         * config/tilegx/tilegx.c (tilegx_init_machine_status): Likewise.
38165         * config/tilepro/tilepro.c (tilepro_init_machine_status): Likewise.
38166         * config/xtensa/xtensa.c (xtensa_init_machine_status): Likewise.
38167         * coverage.c (coverage_end_function): Likewise.
38168         * dbxout.c (dbxout_init): Likewise.
38169         * doc/gty.texi: Don't mention variable_size attribute.
38170         * dwarf2cfi.c (new_cfi): Adjust.
38171         (new_cfi_row): Likewise.
38172         (copy_cfi_row): Likewise.
38173         (create_cie_data): Likewise.
38174         * dwarf2out.c (dwarf2out_alloc_current_fde): Likewise.
38175         (new_loc_descr): Likewise.
38176         (find_AT_string_in_table): Likewise.
38177         (add_addr_table_entry): Likewise.
38178         (new_die): Likewise.
38179         (add_var_loc_to_decl): Likewise.
38180         (clone_die): Likewise.
38181         (clone_as_declaration): Likewise.
38182         (break_out_comdat_types): Likewise.
38183         (new_loc_list): Likewise.
38184         (add_loc_descr_to_each): Likewise.
38185         (add_location_or_const_value_attribute): Likewise.
38186         (add_linkage_name): Likewise.
38187         (lookup_filename): Likewise.
38188         (dwarf2out_var_location): Likewise.
38189         (new_line_info_table): Likewise.
38190         (dwarf2out_init): Likewise.
38191         (mem_loc_descriptor): Likewise.
38192         (loc_descriptor): Likewise.
38193         (add_const_value_attribute): Likewise.
38194         (tree_add_const_value_attribute): Likewise.
38195         (comp_dir_string): Likewise.
38196         (dwarf2out_vms_debug_main_pointer): Likewise.
38197         (string_cst_pool_decl): Likewise.
38198         * emit-rtl.c (set_mem_attrs): Likewise.
38199         (get_reg_attrs): Likewise.
38200         (start_sequence): Likewise.
38201         (init_emit): Likewise.
38202         (init_emit_regs): Likewise.
38203         * except.c (init_eh_for_function): Likewise.
38204         (gen_eh_region): Likewise.
38205         (gen_eh_region_catch): Likewise.
38206         (gen_eh_landing_pad): Likewise.
38207         (add_call_site): Likewise.
38208         * function.c (add_frame_space): Likewise.
38209         (insert_temp_slot_address): Likewise.
38210         (assign_stack_temp_for_type): Likewise.
38211         (get_hard_reg_initial_val): Likewise.
38212         (allocate_struct_function): Likewise.
38213         (prepare_function_start): Likewise.
38214         (types_used_by_var_decl_insert): Likewise.
38215         * gengtype.c (variable_size_p): Remove function.
38216         (enum alloc_quantity): Remove enum.
38217         (write_typed_alloc_def): Remove function.
38218         (write_typed_struct_alloc_def): Likewise.
38219         (write_typed_typedef_alloc_def): Likewise.
38220         (write_typed_alloc_defns): Likewise.
38221         (main): Adjust.
38222         * ggc-common.c (ggc_cleared_alloc_htab_ignore_args): Adjust.
38223         (ggc_cleared_alloc_ptr_array_two_args): Likewise.
38224         * ggc.h (ggc_alloc): new function.
38225         (ggc_cleared_alloc): Likewise.
38226         (ggc_vec_alloc): Template on type of vector element, and remove
38227         element size argument.
38228         (ggc_cleared_vec_alloc): Likewise.
38229         * gimple.c (gimple_build_omp_for): Adjust.
38230         (gimple_copy): Likewise.
38231         * ipa-cp.c (get_replacement_map): Likewise.
38232         (find_aggregate_values_for_callers_subset): Likewise.
38233         (known_aggs_to_agg_replacement_list): Likewise.
38234         * ipa-devirt.c (get_odr_type): Likewise.
38235         * ipa-prop.c (ipa_node_duplication_hook): Likewise.
38236         (read_agg_replacement_chain): Likewise.
38237         * loop-iv.c (get_simple_loop_desc): Likewise.
38238         * lto-cgraph.c (input_node_opt_summary): Likewise.
38239         * lto-section-in.c (lto_new_in_decl_state): Likewise.
38240         * lto-streamer-in.c (lto_input_eh_catch_list): Likewise.
38241         (input_eh_region): Likewise.
38242         (input_eh_lp): Likewise.
38243         (input_cfg): Likewise.
38244         * optabs.c (set_optab_libfunc): Likewise.
38245         (init_tree_optimization_optabs): Likewise.
38246         (set_conv_libfunc): Likewise.
38247         * passes.c (do_per_function_toporder): Likewise.
38248         * rtl.h: Don't use variable_size gty attribute.
38249         * sese.c (if_region_set_false_region): Adjust.
38250         * stringpool.c (gt_pch_save_stringpool): Likewise.
38251         * target-globals.c (save_target_globals): Likewise.
38252         * toplev.c (general_init): Likewise.
38253         * trans-mem.c (record_tm_replacement): Likewise.
38254         (split_bb_make_tm_edge): Likewise.
38255         * tree-cfg.c (move_sese_region_to_fn): Likewise.
38256         * tree-data-ref.h (lambda_vector_new): Likewise.
38257         * tree-eh.c (add_stmt_to_eh_lp_fn): Likewise.
38258         * tree-iterator.c (tsi_link_before): Likewise.
38259         (tsi_link_after): Likewise.
38260         * tree-scalar-evolution.c (new_scev_info_str): Likewise.
38261         * tree-ssa-loop-niter.c (record_estimate): Likewise.
38262         * tree-ssa-operands.c (ssa_operand_alloc): Likewise.
38263         * tree-ssa-operands.h: Don't use variable_size gty attribute.
38264         * tree-ssa.c (init_tree_ssa): Adjust.
38265         * tree-ssanames.c (set_range_info): Likewise.
38266         (get_ptr_info): Likewise.
38267         (duplicate_ssa_name_ptr_info): Likewise.
38268         (duplicate_ssa_name_range_info): Likewise.
38269         * tree-streamer-in.c (unpack_ts_real_cst_value_fields): Likewise.
38270         (unpack_ts_fixed_cst_value_fields): Likewise.
38271         * tree.c (build_fixed): Likewise.
38272         (build_real): Likewise.
38273         (build_string): Likewise.
38274         (decl_priority_info): Likewise.
38275         (decl_debug_expr_insert): Likewise.
38276         (decl_value_expr_insert): Likewise.
38277         (decl_debug_args_insert): Likewise.
38278         (type_hash_add): Likewise.
38279         (build_omp_clause): Likewise.
38280         * ubsan.c (decl_for_type_insert): Likewise.
38281         * varasm.c (get_unnamed_section): Likewise.
38282         (get_noswitch_section): Likewise.
38283         (get_section): Likewise.
38284         (get_block_for_section): Likewise.
38285         (create_block_symbol): Likewise.
38286         (build_constant_desc): Likewise.
38287         (create_constant_pool): Likewise.
38288         (force_const_mem): Likewise.
38289         (record_tm_clone_pair): Likewise.
38290         * varpool.c (varpool_create_empty_node): Likewise.
38291
38292 2014-05-17  Trevor Saunders  <tsaunders@mozilla.com>
38293
38294         * dwarf2out.c (tree_add_const_value_attribute): Call
38295         ggc_internal_cleared_alloc instead of ggc_alloc_cleared_atomic.
38296         * gengtype.c (write_typed_alloc_def): Call ggc_internal_<x>alloc
38297         instead of ggc_internal_<x>alloc_stat.
38298         * ggc-common.c (ggc_internal_cleared_alloc): Drop _stat suffix.
38299         (ggc_realloc): Likewise.
38300         * ggc-none.c (ggc_internal_alloc): Likewise.
38301         (ggc_internal_cleared_alloc): Likewise.
38302         * ggc-page.c: Likewise.
38303         * ggc.h (ggc_internal_alloc_stat): Likewise.
38304         (ggc_internal_alloc): Remove macro.
38305         (ggc_internal_cleared_alloc_stat): Drop _stat suffix.
38306         (ggc_internal_cleared_alloc): Remove macro.
38307         (GGC_RESIZEVEC): Adjust.
38308         (ggc_resizevar): Remove macro.
38309         (ggc_internal_vec_alloc_stat): Drop _stat suffix.
38310         (ggc_internal_cleared_vec_alloc_stat): Likewise.
38311         (ggc_internal_vec_cleared_alloc): Remove macro.
38312         (ggc_alloc_atomic_stat): Drop _stat suffix.
38313         (ggc_alloc_atomic): Remove macro.
38314         (ggc_alloc_cleared_atomic): Remove macro.
38315         (ggc_alloc_string_stat): Drop _stat suffix.
38316         (ggc_alloc_string): Remove macro.
38317         (ggc_alloc_rtx_def_stat): Adjust.
38318         (ggc_alloc_tree_node_stat): Likewise.
38319         (ggc_alloc_cleared_tree_node_stat): Likewise.
38320         (ggc_alloc_cleared_gimple_statement_stat): Likewise.
38321         (ggc_alloc_cleared_simd_clone_stat): Likewise.
38322         * gimple.c (gimple_build_omp_for): Likewise.
38323         (gimple_copy): Likewise.
38324         * stringpool.c (ggc_alloc_string_stat): Drop _stat suffix.
38325         * toplev.c (realloc_for_line_map): Adjust.
38326         * tree-data-ref.h (lambda_vector_new): Likewise.
38327         * tree-phinodes.c (allocate_phi_node): Likewise.
38328         * tree.c (grow_tree_vec_stat): Likewise.
38329         * vec.h (va_gc::reserve): Adjust.
38330
38331 2014-05-17  Ajit Agarwal  <ajitkum@xilinx.com>
38332
38333         * config/microblaze/microblaze.c (break_handler): New Declaration.
38334         (microblaze_break_function_p,microblaze_is_break_handler): New.
38335         (compute_frame_size): Use microblaze_break_function_p.
38336         Add the test of break_handler.
38337         (microblaze_function_prologue) : Add the test of variable
38338         break_handler.  Check the fnname by BREAK_HANDLER_NAME.
38339         (microblaze_function_epilogue) : Add the test of break_handler.
38340         (microblaze_globalize_label) : Add the test of break_handler.
38341         Check the name by BREAK_HANDLER_NAME.
38342
38343         * config/microblaze/microblaze.h (BREAK_HANDLER_NAME): New macro
38344
38345         * config/microblaze/microblaze.md (*<optab>,<optab>_internal): Add
38346         microblaze_is_break_handler test.
38347         (call_internal1,call_value_intern): Use microblaze_break_function_p.
38348         Use SYMBOL_REF_DECL.
38349
38350         * config/microblaze/microblaze-protos.h
38351         (microblaze_break_function_p,microblaze_is_break_handler):
38352         New Declaration.
38353
38354         * doc/extend.texi (MicroBlaze break_handler Functions): Document
38355         new MicroBlaze break_handler functions.
38356
38357 2014-05-17  Uros Bizjak  <ubizjak@gmail.com>
38358
38359         * doc/extend.texi (Size of an asm): Move node text according
38360         to its @menu entry position.
38361
38362 2014-05-17  Marc Glisse  <marc.glisse@inria.fr>
38363
38364         PR tree-optimization/61140
38365         PR tree-optimization/61150
38366         PR tree-optimization/61197
38367         * tree-ssa-phiopt.c (value_replacement): Punt on multiple phis.
38368
38369 2014-05-17  Uros Bizjak  <ubizjak@gmail.com>
38370
38371         * doc/invoke.texi (free): Mention Alpha.  Also enabled at -Os.
38372
38373 2014-05-17  Richard Sandiford  <r.sandiford@uk.ibm.com>
38374
38375         * wide-int.cc: Only include longlong.h if W_TYPE_SIZE==32 or
38376         __SIZEOF_INT128__ is defined.
38377
38378 2014-05-17  Richard Sandiford  <rdsandiford@googlemail.com>
38379
38380         * config/rs6000/rs6000.c (rs6000_real_tls_symbol_ref_p): New function.
38381         (rs6000_delegitimize_address): Use it.
38382
38383 2014-05-17  Richard Sandiford  <rdsandiford@googlemail.com>
38384
38385         * emit-rtl.h (replace_equiv_address, replace_equiv_address_nv): Add an
38386         inplace argument.  Store the new address in the original MEM when true.
38387         * emit-rtl.c (change_address_1): Likewise.
38388         (adjust_address_1, adjust_automodify_address_1, offset_address):
38389         Update accordingly.
38390         * rtl.h (plus_constant): Add an inplace argument.
38391         * explow.c (plus_constant): Likewise.  Try to reuse the original PLUS
38392         when true.  Avoid generating (plus X (const_int 0)).
38393         * function.c (instantiate_virtual_regs_in_rtx): Adjust the PLUS
38394         in-place.  Pass true to plus_constant.
38395         (instantiate_virtual_regs_in_insn): Pass true to replace_equiv_address.
38396
38397 2014-05-16  Dehao Chen  <dehao@google.com>
38398
38399         * tree-cfg.c (gimple_merge_blocks): Updates bb count with max count.
38400
38401 2014-05-16  Oleg Endo  <olegendo@gcc.gnu.org>
38402
38403         PR target/54089
38404         * config/sh/predicates.md (negt_reg_shl31_operand): Match additional
38405         patterns.
38406         * config/sh/sh.md (*negt_msb): Merge SH2A and non-SH2A variants.
38407
38408 2014-05-16  Dehao Chen  <dehao@google.com>
38409
38410         * ira-int.h (REG_FREQ_FROM_EDGE_FREQ): Use
38411         optimize_function_for_size_p.
38412         * regs.h (REG_FREQ_FROM_BB): Likewise.
38413
38414 2014-05-16  Oleg Endo  <olegendo@gcc.gnu.org>
38415
38416         PR target/51244
38417         * config/sh/sh.c (sh_eval_treg_value): Handle t_reg_operand and
38418         negt_reg_operand cases.
38419         * config/sh/sh.md (*cset_zero): Likewise by using cbranch_treg_value
38420         predicate.
38421         * config/sh/predicates.md (cbranch_treg_value): Simplify.
38422
38423 2014-05-16  Oleg Endo  <olegendo@gcc.gnu.org>
38424
38425         * config/sh/sh.c (sh_option_override): Set branch cost to 2 for all
38426         target variants.
38427
38428 2014-05-16  David Malcolm  <dmalcolm@redhat.com>
38429
38430         Revert:
38431         2014-04-29  David Malcolm  <dmalcolm@redhat.com>
38432
38433         * tree-cfg.c (dump_function_to_file): Dump the return type of
38434         functions, in a line to itself before the function body, mimicking
38435         the layout of a C function.
38436
38437 2014-05-16  Dehao Chen  <dehao@google.com>
38438
38439         * cfghooks.c (make_forwarder_block): Use direct computation to
38440         get fall-through edge's count and frequency.
38441
38442 2014-05-16  Benno Schulenberg  <bensberg@justemail.net>
38443
38444         * config/arc/arc.c (arc_init): Fix typo in error message.
38445         * config/i386/i386.c (ix86_expand_builtin): Likewise.
38446         (split_stack_prologue_scratch_regno): Likewise.
38447         * fortran/check.c (gfc_check_fn_rc2008): Remove duplicate
38448         word from error message.
38449
38450 2014-05-16  Zhouyi Zhou <yizhouzhou@ict.ac.cn>
38451
38452         * ira-costs.c: Fix typo in comment.
38453
38454 2014-05-16  David Wohlferd <dw@LimeGreenSocks.com>
38455
38456         * doc/extend.texi: (Visibility Pragmas) Fix misplaced @xref
38457
38458 2014-05-16  Jan Hubicka  <hubicka@ucw.cz>
38459
38460         * varpool.c (dump_varpool_node): Dump write-only flag.
38461         * lto-cgraph.c (lto_output_varpool_node, input_varpool_node): Stream
38462         write-only flag.
38463         * tree-cfg.c (execute_fixup_cfg): Remove statements setting
38464         write-only variables.
38465         * ipa.c (process_references): New function.
38466         (set_readonly_bit): New function.
38467         (set_writeonly_bit): New function.
38468         (clear_addressable_bit): New function.
38469         (ipa_discover_readonly_nonaddressable_var): Mark write only variables;
38470         fix handling of aliases.
38471         * cgraph.h (struct varpool_node): Add writeonly flag.
38472
38473 2014-05-16  Vladimir Makarov  <vmakarov@redhat.com>
38474
38475         PR rtl-optimization/60969
38476         * ira-costs.c (record_reg_classes): Allow only memory for pseudo.
38477         Calculate costs for this case.
38478
38479 2014-05-16  Eric Botcazou  <ebotcazou@adacore.com>
38480
38481         * fold-const (fold_unary_loc) <NON_LVALUE_EXPR>: New case.
38482         <CASE_CONVERT>: Pass arg0 instead of op0 to fold_convert_const.
38483
38484 2014-05-16  Richard Biener  <rguenther@suse.de>
38485
38486         PR tree-optimization/61194
38487         * tree-vect-patterns.c (adjust_bool_pattern): Also handle
38488         bool patterns ending in a COND_EXPR.
38489
38490 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38491
38492         * config/aarch64/aarch64.c (aarch64_rtx_mult_cost): Fix FNMUL case.
38493
38494 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38495
38496         * config/aarch64/aarch64.c (aarch64_rtx_costs): Handle the case
38497         where we were unable to cost an RTX.
38498
38499 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38500
38501         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost SYMBOL_REF,
38502         HIGH, LO_SUM.
38503
38504 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38505             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38506
38507         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost TRUNCATE.
38508
38509 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38510             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38511
38512         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost FMA,
38513         FLOAT_EXTEND, FLOAT_TRUNCATE, ABS, SMAX, and SMIN.
38514
38515 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38516             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38517
38518         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost comparison
38519         operators.
38520
38521 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38522             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38523
38524         * config/aarch64/aarch64.c (aarch64_rtx_costs): Improve costs for
38525         DIV/MOD.
38526
38527 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38528             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38529
38530         * config/aarch64/aarch64.c (aarch64_rtx_arith_op_extract_p): New.
38531         (aarch64_rtx_costs): Improve costs for SIGN/ZERO_EXTRACT.
38532
38533 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38534             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38535
38536         * config/aarch64/aarch64.c (aarch64_rtx_costs): Improve costs for
38537         rotates and shifts.
38538
38539 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38540             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38541
38542         * config/aarch64/aarch64.c (aarch64_rtx_costs): Cost
38543         ZERO_EXTEND and SIGN_EXTEND better.
38544
38545 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38546             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38547
38548         * config/aarch64/aarch64.c (aarch64_rtx_costs): Improve cost for
38549         logical operations.
38550
38551 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38552             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38553
38554         * config/aarch64/aarch64.c (aarch64_rtx_costs): Use address
38555         costs when costing loads and stores to memory.
38556
38557 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38558             Philip Tomsich  <philipp.tomsich@theobroma-systems.com>
38559
38560         * config/aarch64/aarch64.c (aarch64_rtx_costs): Improve costing
38561         for SET RTX.
38562
38563 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38564
38565         * config/aarch64/aarch64.c (aarch64_rtx_costs): Set default costs.
38566
38567 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38568             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38569
38570         * config/aarch64/aarch64.c (aarch64_strip_shift_or_extend): Rename
38571         to...
38572         (aarch64_strip_extend): ...this, don't strip shifts, check RTX is
38573         well formed.
38574         (aarch64_rtx_mult_cost): New.
38575         (aarch64_rtx_costs): Use it, refactor as appropriate.
38576
38577 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38578             Philipp Tomsich  <philipp.tomsich@theobroma-systems.com>
38579
38580         * config/aarch64/aarch64.c (aarch64_build_constant): Conditionally
38581         emit instructions, return number of instructions which would
38582         be emitted.
38583         (aarch64_add_constant): Update call to aarch64_build_constant.
38584         (aarch64_output_mi_thunk): Likewise.
38585         (aarch64_rtx_costs): Estimate cost of a CONST_INT, cost of
38586         a CONST_DOUBLE.
38587
38588 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38589
38590         * config/aarch64/aarch64.c (aarch64_rtx_costs_wrapper): New.
38591         (TARGET_RTX_COSTS): Call it.
38592
38593 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38594
38595         * config/aarch64/aarch64.c (cortexa57_addrcost_table): New.
38596         (cortexa57_vector_cost): Likewise.
38597         (cortexa57_tunings): Use them.
38598
38599 2014-05-16  James Greenhalgh  <james.greenhalgh@arm.com>
38600
38601         * config/aarch64/aarch64-protos.h (scale_addr_mode_cost): New.
38602         (cpu_addrcost_table): Use it.
38603         * config/aarch64/aarch64.c (generic_addrcost_table): Initialize it.
38604         (aarch64_address_cost): Rewrite using aarch64_classify_address,
38605         move it.
38606
38607 2014-05-16  Richard Biener  <rguenther@suse.de>
38608
38609         * tree-ssa-sccvn.c: Include tree-cfg.h and domwalk.h.
38610         (set_ssa_val_to): Handle unexpected sets to VN_TOP.
38611         (visit_phi): Ignore edges marked as not executable.
38612         (class cond_dom_walker): New.
38613         (cond_dom_walker::before_dom_children): Value-number
38614         control statements and mark successor edges as not
38615         executable if possible.
38616         (run_scc_vn): First walk all control statements in
38617         dominator order, marking edges as not executable.
38618         * tree-inline.c (copy_edges_for_bb): Be not confused
38619         about random edge flags.
38620
38621 2014-05-16  Richard Biener  <rguenther@suse.de>
38622
38623         * tree-ssa-sccvn.c (visit_use): Also constant-fold calls.
38624
38625 2014-05-15  Peter Bergner  <bergner@vnet.ibm.com>
38626
38627         PR target/61193
38628         * config/rs6000/htmxlintrin.h (_HTM_TBEGIN_STARTED): New define.
38629         (__TM_simple_begin): Use it.
38630         (__TM_begin): Likewise.
38631
38632 2014-05-15  Martin Jambor  <mjambor@suse.cz>
38633
38634         PR ipa/61085
38635         * ipa-prop.c (update_indirect_edges_after_inlining): Check
38636         type_preserved flag when the indirect edge is polymorphic.
38637
38638 2014-05-15  Martin Jambor  <mjambor@suse.cz>
38639
38640         PR tree-optimization/61090
38641         * tree-sra.c (sra_modify_expr): Pass the current gsi to
38642         build_ref_for_model.
38643
38644 2014-05-15  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
38645
38646         * config/arm/arm.c (arm_option_override): Use the SCHED_PRESSURE_MODEL
38647         enum name for PARAM_SCHED_PRESSURE_ALGORITHM.
38648
38649 2014-05-15  Jakub Jelinek  <jakub@redhat.com>
38650
38651         PR tree-optimization/61158
38652         * fold-const.c (fold_binary_loc): If X is zero-extended and
38653         shiftc >= prec, make sure zerobits is all ones instead of
38654         invoking undefined behavior.
38655
38656 2014-05-15  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
38657
38658         * regcprop.h: New file.
38659         * regcprop.c (skip_debug_insn_p): New decl.
38660         (replace_oldest_value_reg): Check skip_debug_insn_p.
38661         (copyprop_hardreg_forward_bb_without_debug_insn): New function.
38662         * shrink-wrap.c: Include regcprop.h.
38663         (prepare_shrink_wrap): Call
38664         copyprop_hardreg_forward_bb_without_debug_insn.
38665
38666 2014-05-15  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
38667
38668         * shrink-wrap.h: Update comment.
38669         * shrink-wrap.c: Update comment.
38670         (next_block_for_reg): Rename to live_edge_for_reg.
38671         (live_edge_for_reg): Allow live_edge->dest has two predecessors.
38672         (move_insn_for_shrink_wrap): Split live_edge.
38673         (prepre_shrink_wrap): One more parameter for move_insn_for_shrink_wrap.
38674
38675 2014-05-14  Eric Botcazou  <ebotcazou@adacore.com>
38676
38677         * config/sparc/sparc-protos.h (sparc_absnegfloat_split_legitimate):
38678         Delete.
38679         * config/sparc/sparc.c (sparc_absnegfloat_split_legitimate): Likewise.
38680         * config/sparc/sparc.md (fptype_ut699): New attribute.
38681         (in_branch_delay): Return false if -mfix-ut699 is specified and
38682         fptype_ut699 is set to single.
38683         (truncdfsf2): Add fptype_ut699 attribute.
38684         (fix_truncdfsi2): Likewise.
38685         (floatsisf2): Change fptype attribute.
38686         (fix_truncsfsi2): Likewise.
38687         (negtf2_notv9): Delete.
38688         (negtf2_v9): Likewise.
38689         (negtf2_hq): New instruction.
38690         (negtf2): New instruction and splitter.
38691         (negdf2_notv9): Rewrite.
38692         (abstf2_notv9): Delete.
38693         (abstf2_hq_v9): Likewise.
38694         (abstf2_v9): Likewise.
38695         (abstf2_hq): New instruction.
38696         (abstf2): New instruction and splitter.
38697         (absdf2_notv9): Rewrite.
38698
38699 2014-05-14  Cary Coutant  <ccoutant@google.com>
38700
38701         PR debug/61013
38702         * opts.c (common_handle_option): Don't special-case "-g".
38703         (set_debug_level): Default to at least level 2 with "-g".
38704
38705 2014-05-14  DJ Delorie  <dj@redhat.com>
38706
38707         * config/msp430/msp430.c (msp430_builtin): Add
38708         MSP430_BUILTIN_DELAY_CYCLES.
38709         (msp430_init_builtins): Register void __delay_cycles(long long).
38710         (msp430_builtin_decl): Add it.
38711         (cg_magic_constant): New.
38712         (msp430_expand_delay_cycles): New.
38713         (msp430_expand_builtin): Call it.
38714         (msp430_print_operand_raw): Change integer printing from "int" to
38715         HOST_WIDE_INT.
38716         * config/msp430/msp430.md (define_constants): Add delay_cycles tags.
38717         (delay_cycles_start): New.
38718         (delay_cycles_end): New.
38719         (delay_cycles_32): New.
38720         (delay_cycles_32x): New.
38721         (delay_cycles_16): New.
38722         (delay_cycles_16x): New.
38723         (delay_cycles_2): New.
38724         (delay_cycles_1): New.
38725         * doc/extend.texi: Document __delay_cycles().
38726
38727 2014-05-14  Sandra Loosemore  <sandra@codesourcery.com>
38728
38729         * config/nios2/nios2.md (nios2_cbranch): Fix paste-o in
38730         length attribute computation.
38731
38732 2014-05-14  Richard Sandiford  <rdsandiford@googlemail.com>
38733
38734         PR debug/61188
38735         * print-rtl.c (print_rtx): Suppress uids if flag_dump_unnumbered.
38736
38737 2014-05-14  Richard Sandiford  <r.sandiford@uk.ibm.com>
38738
38739         PR target/61084
38740         * config/sparc/sparc.md: Fix types of low and high in DI constant
38741         splitter.  Use gen_int_mode in some other splitters.
38742
38743 2014-05-14  Martin Jambor  <mjambor@suse.cz>
38744
38745         PR ipa/60897
38746         * ipa-prop.c (ipa_modify_formal_parameters): Reset DECL_LANG_SPECIFIC.
38747
38748 2014-05-14  James Norris  <jnorris@codesourcery.com>
38749
38750         * omp-low.c (expand_parallel_call): Remove shadow variable.
38751         (expand_omp_taskreg): Likewise.
38752
38753 2014-05-14  Ilya Tocar  <ilya.tocar@intel.com>
38754
38755         * common/config/i386/i386-common.c
38756         (OPTION_MASK_ISA_CLFLUSHOPT_SET): Define.
38757         (OPTION_MASK_ISA_XSAVES_SET): Ditto.
38758         (OPTION_MASK_ISA_XSAVEC_SET): Ditto.
38759         (OPTION_MASK_ISA_CLFLUSHOPT_UNSET): Ditto.
38760         (OPTION_MASK_ISA_XSAVES_UNSET): Ditto.
38761         (OPTION_MASK_ISA_XSAVEC_UNSET): Ditto.
38762         (ix86_handle_option): Handle OPT_mxsavec, OPT_mxsaves, OPT_mclflushopt.
38763         * config.gcc (i[34567]86-*-*): Add clflushoptintrin.h,
38764         xsavecintrin.h, xsavesintrin.h.
38765         (x86_64-*-*): Ditto.
38766         * config/i386/clflushoptintrin.h: New.
38767         * config/i386/xsavecintrin.h: Ditto.
38768         * config/i386/xsavesintrin.h: Ditto.
38769         * config/i386/cpuid.h (bit_CLFLUSHOPT): Define.
38770         (bit_XSAVES): Ditto.
38771         (bit_XSAVES): Ditto.
38772         * config/i386/driver-i386.c (host_detect_local_cpu): Handle
38773         -mclflushopt, -mxsavec, -mxsaves, -mno-xsaves, -mno-xsavec,
38774         -mno-clflushopt.
38775         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
38776         OPTION_MASK_ISA_CLFLUSHOPT, OPTION_MASK_ISA_XSAVEC,
38777         OPTION_MASK_ISA_XSAVES.
38778         * config/i386/i386.c (ix86_target_string): Handle -mclflushopt,
38779         -mxsavec, -mxsaves.
38780         (PTA_CLFLUSHOPT) Define.
38781         (PTA_XSAVEC): Ditto.
38782         (PTA_XSAVES): Ditto.
38783         (ix86_option_override_internal): Handle new options.
38784         (ix86_valid_target_attribute_inner_p): Ditto.
38785         (ix86_builtins): Add IX86_BUILTIN_XSAVEC, IX86_BUILTIN_XSAVEC64,
38786         IX86_BUILTIN_XSAVES, IX86_BUILTIN_XRSTORS, IX86_BUILTIN_XSAVES64,
38787         IX86_BUILTIN_XRSTORS64, IX86_BUILTIN_CLFLUSHOPT.
38788         (bdesc_special_args): Add __builtin_ia32_xsaves,
38789         __builtin_ia32_xrstors, __builtin_ia32_xsavec, __builtin_ia32_xsaves64,
38790         __builtin_ia32_xrstors64, __builtin_ia32_xsavec64.
38791         (ix86_init_mmx_sse_builtins): Add __builtin_ia32_clflushopt.
38792         (ix86_expand_builtin): Handle new builtins.
38793         * config/i386/i386.h (TARGET_CLFLUSHOPT) Define.
38794         (TARGET_CLFLUSHOPT_P): Ditto.
38795         (TARGET_XSAVEC): Ditto.
38796         (TARGET_XSAVEC_P): Ditto.
38797         (TARGET_XSAVES): Ditto.
38798         (TARGET_XSAVES_P): Ditto.
38799         * config/i386/i386.md (ANY_XSAVE): Add UNSPECV_XSAVEC, UNSPECV_XSAVES.
38800         (ANY_XSAVE64)" Add UNSPECV_XSAVEC64, UNSPECV_XSAVES64.
38801         (attr xsave): Add xsavec, xsavec64, xsaves, xsaves64.
38802         (ANY_XRSTOR): New.
38803         (ANY_XRSTOR64): Ditto.
38804         (xrstor): Ditto.
38805         (xrstor): Change into <xrstor>.
38806         (xrstor_rex64): Change into <xrstor>_rex64.
38807         (xrstor64): Change into <xrstor>64
38808         (clflushopt): New.
38809         * config/i386/i386.opt (mclflushopt): New.
38810         (mxsavec): Ditto.
38811         (mxsaves): Ditto.
38812         * config/i386/x86intrin.h: Add clflushoptintrin.h, xsavesintrin.h,
38813         xsavecintrin.h.
38814         * doc/invoke.texi: Document new options.
38815
38816 2014-05-14  Andrey Belevantsev  <abel@ispras.ru>
38817
38818         PR rtl-optimization/60866
38819         * sel-sched-ir (sel_init_new_insn): New parameter old_seqno.
38820         Default it to -1.  Pass it down to init_simplejump_data.
38821         (init_simplejump_data): New parameter old_seqno.  Pass it down
38822         to get_seqno_for_a_jump.
38823         (get_seqno_for_a_jump): New parameter old_seqno.  Use it for
38824         initializing new jump seqno as a last resort.  Add comment.
38825         (sel_redirect_edge_and_branch): Save old seqno of the conditional
38826         jump and pass it down to sel_init_new_insn.
38827         (sel_redirect_edge_and_branch_force): Likewise.
38828
38829 2014-05-14  Georg-Johann Lay  <avr@gjlay.de>
38830
38831         * config/avr/avr.h (REG_CLASS_CONTENTS): Use unsigned suffix for
38832         shifted values to avoid build warning.
38833
38834 2014-05-14  Eric Botcazou  <ebotcazou@adacore.com>
38835
38836         * cfgcleanup.c (try_forward_edges): Use location_t for locations.
38837         * cfgrtl.c (rtl_merge_blocks): Fix comment.
38838         (cfg_layout_merge_blocks): Likewise.
38839         * except.c (emit_to_new_bb_before): Remove prev_bb local variable.
38840
38841 2014-05-14  Andrey Belevantsev  <abel@ispras.ru>
38842
38843         PR rtl-optimization/60901
38844         * config/i386/i386.c (ix86_dependencies_evaluation_hook): Check that
38845         bb predecessor belongs to the same scheduling region.  Adjust comment.
38846
38847 2014-05-13  Peter Bergner  <bergner@vnet.ibm.com>
38848
38849         * doc/sourcebuild.texi: (dfp_hw): Document.
38850         (p8vector_hw): Likewise.
38851         (powerpc_eabi_ok): Likewise.
38852         (powerpc_elfv2): Likewise.
38853         (powerpc_htm_ok): Likewise.
38854         (ppc_recip_hw): Likewise.
38855         (vsx_hw): Likewise.
38856
38857 2014-05-13  Cary Coutant  <ccoutant@google.com>
38858
38859         * opts.c (finish_options): Use -ggnu-pubnames with -gsplit-dwarf.
38860
38861 2014-05-13  David Malcolm  <dmalcolm@redhat.com>
38862
38863         * gengtype-parse.c (require3): Eliminate in favor of...
38864         (require4): New.
38865         (require_template_declaration): Update to support optional single *
38866         on a type.
38867
38868         * gengtype.c (get_ultimate_base_class): Add a non-const overload.
38869         (create_user_defined_type): Handle a single level of explicit
38870         pointerness within template arguments.
38871         (struct write_types_data): Add field "kind".
38872         (filter_type_name): Handle "*" character.
38873         (write_user_func_for_structure_ptr): Require a write_types_data
38874         rather than just a prefix string, so that we can look up the kind
38875         of the wtd and use it as an index into wrote_user_func_for_ptr,
38876         ensuring that such functions are written at most once.  Support
38877         subclasses by invoking the marking function of the ultimate base class.
38878         (write_user_func_for_structure_body): Require a write_types_data
38879         rather than just a prefix string, so that we can pass this to
38880         write_user_func_for_structure_ptr.
38881         (write_func_for_structure): Likewise.
38882         (ggc_wtd): Add initializer of new "kind" field.
38883         (pch_wtd): Likewise.
38884
38885         * gengtype.h (enum write_types_kinds): New.
38886         (struct type): Add field wrote_user_func_for_ptr to the "s"
38887         union member.
38888
38889 2014-05-13  Richard Sandiford  <r.sandiford@uk.ibm.com>
38890
38891         * fold-const.c (optimize_bit_field_compare): Use wi:: operations
38892         instead of const_binop.
38893         (fold_binary_loc): Likewise.
38894
38895 2014-05-13  Richard Sandiford  <r.sandiford@uk.ibm.com>
38896
38897         * tree-dfa.h (get_addr_base_and_unit_offset_1): Update array index
38898         calculation to match get_ref_base_and_extent.
38899
38900 2014-05-13  Catherine Moore  <clm@codesourcery.com>
38901             Sandra Loosemore  <sandra@codesourcery.com>
38902
38903         * configure.ac: Fix assembly for explicit JALR relocation check.
38904         * configure: Regenerate.
38905
38906 2014-05-13  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
38907
38908         * config/arm/arm.c (neon_itype): Remove NEON_RESULTPAIR.
38909         (arm_init_neon_builtins): Remove handling of NEON_RESULTPAIR.
38910         Remove associated type declarations and initialisations.
38911         (arm_expand_neon_builtin): Likewise.
38912         (neon_emit_pair_result_insn): Delete.
38913         * config/arm/arm_neon_builtins (vtrn, vzip, vuzp): Delete.
38914         * config/arm/neon.md (neon_vtrn<mode>): Delete.
38915         (neon_vzip<mode>): Likewise.
38916         (neon_vuzp<mode>): Likewise.
38917
38918 2014-05-13  Richard Biener  <rguenther@suse.de>
38919
38920         PR ipa/60973
38921         * tree-inline.c (remap_gimple_stmt): Clear tail call flag,
38922         it needs revisiting whether the call still may be tail-called.
38923
38924 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38925
38926         * rtl.def (SYMBOL_REF): Remove middle "0" field.
38927         * rtl.h (block_symbol): Reduce number of fields to 2.
38928         (rtx_def): Add u2.symbol_ref_flags.
38929         (SYMBOL_REF_FLAGS): Use it.
38930         (SYMBOL_REF_DATA, SET_SYMBOL_REF_DECL, SYMBOL_REF_DECL)
38931         (SET_SYMBOL_REF_CONSTANT, SYMBOL_REF_CONSTANT): Lower index.
38932         * gengtype.c (adjust_field_rtx_def): Remove SYMBOL_REF_FLAGS handling.
38933         Lower index of SYMBOL_REF_DATA.
38934         * print-rtl.c (print_rtx): Lower index for SYMBOL_REF_DATA.
38935         Print SYMBOL_REF_FLAGS at the same time.
38936         * genattrtab.c (attr_rtx_1): Only initialize 1 "0" SYMBOL_REF field.
38937
38938 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38939
38940         * rtl.def (VAR_LOCATION): Remove "i" field.
38941         * rtl.h (rtx_def): Add u2.var_location_status.
38942         (PAT_VAR_LOCATION_STATUS): Use it.
38943         (gen_rtx_VAR_LOCATION): Declare.
38944         * gengenrtl.c (excluded_rtx): Add VAR_LOCATION.
38945         * emit-rtl.c (gen_rtx_VAR_LOCATION): New function.
38946         * var-tracking.c (emit_note_insn_var_location): Remove casts.
38947
38948 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38949
38950         * rtl.def (scratch): Fix outdated comment and remove "0" field.
38951         * gengtype.c (adjust_field_rtx_def): Update accordingly.
38952
38953 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38954
38955         * rtl.def (DEBUG_INSN, INSN, JUMP_INSN, CALL_INSN, JUMP_TABLE_DATA)
38956         (BARRIER, CODE_LABEL, NOTE): Remove first "i" field.
38957         * rtl.h (rtx_def): Add insn_uid to u2 field.
38958         (RTX_FLAG_CHECK8): Delete in favor of...
38959         (RTL_INSN_CHAIN_FLAG_CHECK): ...this new macro.
38960         (INSN_DELETED_P): Update accordingly.
38961         (INSN_UID): Use u2.insn_uid.
38962         (INSN_CHAIN_CODE_P): Define.
38963         (PREV_INSN, NEXT_INSN, BLOCK_FOR_INSN, PATTERN, INSN_LOCATION)
38964         (INSN_CODE, REG_NOTES, CALL_INSN_FUNCTION_USAGE, CODE_LABEL_NUMBER)
38965         (NOTE_DATA, NOTE_DELETED_LABEL_NAME, NOTE_BLOCK, NOTE_EH_HANDLER)
38966         (NOTE_BASIC_BLOCK, NOTE_VAR_LOCATION, NOTE_CFI, NOTE_LABEL_NUMBER)
38967         (NOTE_KIND, LABEL_NAME, LABEL_NUSES, JUMP_LABEL, LABEL_REFS): Lower
38968         indices accordingly.
38969         * print-rtl.c (print_rtx): Print INSN_UIDs before the main loop.
38970         Update indices for insn-chain rtxes.
38971         * gengtype.c (gen_rtx_next): Adjust test for insn-chain rtxes.
38972         (adjust_field_rtx_def): Lower '0' indices for all insn-chain rtxes.
38973         * emit-rtl.c (gen_label_rtx): Update gen_rtx_LABEL call.
38974         * caller-save.c (init_caller_save): Update gen_rtx_INSN calls.
38975         * combine.c (try_combine): Likewise.
38976         * ira.c (setup_prohibited_mode_move_regs): Likewise.
38977
38978 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38979
38980         * rtl.def (REG): Remove middle field.
38981         * rtl.h (rtx_def): Add orignal_regno to u2.
38982         (ORIGINAL_REGNO): Use it instead of field 1.
38983         (REG_ATTRS): Lower field index accordingly.
38984         * gengtype.c (adjust_field_rtx_def): Remove handling of
38985         ORIGINAL_REGNO.  Move REG_ATTRS index down.
38986         * print-rtl.c (print_rtx): Move ORIGINAL_REGNO handling to the
38987         code that prints the REGNO.
38988
38989 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38990
38991         * print-rtl.c (print_rtx): Guard whole '0' block with ifndef
38992         GENERATOR_FILE.
38993
38994 2014-05-13  Richard Sandiford  <rdsandiford@googlemail.com>
38995
38996         * rtl.h (rtx_def): Mark u2 as GTY ((skip)).
38997
38998 2014-05-13  Bin Cheng  <bin.cheng@arm.com>
38999
39000         * tree-ssa-loop-ivopts.c (contain_complex_addr_expr): New.
39001         (alloc_iv): Lower base expressions containing ADDR_EXPR.
39002
39003 2014-05-13  Ian Bolton  <ian.bolton@arm.com>
39004
39005         * config/aarch64/aarch64-protos.h
39006         (aarch64_hard_regno_caller_save_mode): New prototype.
39007         * config/aarch64/aarch64.c (aarch64_hard_regno_caller_save_mode):
39008         New function.
39009         * config/aarch64/aarch64.h (HARD_REGNO_CALLER_SAVE_MODE): New macro.
39010
39011 2014-05-13  Christian Bruel  <christian.bruel@st.com>
39012
39013         * target.def (mode_switching): New hook vector.
39014         (mode_emit, mode_needed, mode_after, mode_entry): New hooks.
39015         (mode_exit, modepriority_to_mode): Likewise.
39016         * mode-switching.c (MODE_NEEDED, MODE_AFTER, MODE_ENTRY): Hookify.
39017         (MODE_EXIT, MODE_PRIORITY_TO_MODE, EMIT_MODE_SET): Likewise.
39018         * target.h: Include tm.h and hard-reg-set.h.
39019         * doc/tm.texi.in (EMIT_MODE_SET, MODE_NEEDED, MODE_AFTER, MODE_ENTRY)
39020         (MODE_EXIT, MODE_PRIORITY_TO_MODE): Delete and hookify.
39021         * doc/tm.texi Regenerate.
39022         * config/sh/sh.h (MODE_NEEDED, MODE_AFTER, MODE_ENTRY): Delete
39023         (MODE_EXIT, MODE_PRIORITY_TO_MODE, EMIT_MODE_SET): Likewise.
39024         * config/sh/sh.c (sh_emit_mode_set, sh_mode_priority): Hookify.
39025         (sh_mode_needed, sh_mode_after, sh_mode_entry, sh_mode_exit): Likewise.
39026         * config/i386/i386.h (MODE_NEEDED, MODE_AFTER, MODE_ENTRY): Delete
39027         (MODE_EXIT, MODE_PRIORITY_TO_MODE, EMIT_MODE_SET): Likewise.
39028         * config/i386/i386-protos.h (ix86_mode_needed, ix86_mode_after)
39029         (ix86_mode_entrym, ix86_emit_mode_set): Remove external declaration.
39030         * config/i386/i386.c (ix86_mode_needed, ix86_mode_after,
39031         (ix86_mode_exit, ix86_mode_entry, ix86_mode_priority)
39032         (ix86_emit_mode_set): Hookify.
39033         * config/epiphany/epiphany.h (MODE_NEEDED, MODE_AFTER, MODE_ENTRY):
39034         Delete.
39035         (MODE_EXIT, MODE_PRIORITY_TO_MODE, EMIT_MODE_SET): Likewise.
39036         * config/epiphany/epiphany-protos.h (epiphany_mode_needed)
39037         (emit_set_fp_mode, epiphany_mode_entry_exit, epiphany_mode_after)
39038         (epiphany_mode_priority_to_mode): Remove declaration.
39039         * config/epiphany/epiphany.c (emit_set_fp_mode): Hookify.
39040         (epiphany_mode_needed, epiphany_mode_priority_to_mode): Likewise.
39041         (epiphany_mode_entry, epiphany_mode_exit, epiphany_mode_after):
39042         Likewise.
39043         (epiphany_mode_priority_to_mode): Change priority type.  Hookify.
39044         (epiphany_mode_needed, epiphany_mode_entry_exit): Hookify.
39045         (epiphany_mode_after, epiphany_mode_entry, emit_set_fp_mode): Hookify.
39046
39047 2014-05-13  Jakub Jelinek  <jakub@redhat.com>
39048
39049         PR target/61060
39050         * config/i386/i386.c (ix86_expand_set_or_movmem): If count_exp
39051         is const0_rtx, return immediately.  Don't test count == 0 when
39052         it is always true.
39053
39054 2014-05-13  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
39055
39056         * Makefile.in: add shrink-wrap.o.
39057         * config/i386/i386.c: include "shrink-wrap.h"
39058         * function.c: Likewise.
39059         (requires_stack_frame_p, next_block_for_reg,
39060         move_insn_for_shrink_wrap, prepare_shrink_wrap,
39061         dup_block_and_redirect): Move to shrink-wrap.c
39062         (thread_prologue_and_epilogue_insns): Extract three code segments
39063         as functions in shrink-wrap.c
39064         * function.h: Move #ifdef HAVE_simple_return ... #endif block to
39065         shrink-wrap.h
39066         * shrink-wrap.c: New file.
39067         * shrink-wrap.h: New file.
39068
39069 2014-05-12  David Wohlferd  <dw@LimeGreenSocks.com>
39070
39071         * doc/extend.texi: Reflect current numbers of pragmas.  Remove
39072         reference to Solaris.
39073
39074 2014-05-12  Mike Stump  <mikestump@comcast.net>
39075
39076         PR other/31778
39077         * genattrtab.c (filename): Add.
39078         (convert_set_attr_alternative): Improve error message.
39079         (check_defs): Restore read_md_filename for error messages.
39080         (gen_insn): Save filename.
39081
39082 2014-05-12  Dimitris Papavasiliou  <dpapavas@gmail.com>
39083
39084         * doc/invoke.texi: Document new switches -Wno-shadow-ivar,
39085         -fno-local-ivars and -fivar-visibility.
39086         * c-family/c.opt: Make -Wshadow also implicitly enable
39087         -Wshadow-ivar.
39088
39089 2014-05-12  David Wohlferd  <dw@LimeGreenSocks.com>
39090
39091         * doc/tm.texi: Remove reference to deleted macro.
39092         * doc/tm.texi.in: Likewise.
39093
39094 2014-05-12  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
39095
39096         PR target/60991
39097         * config/avr/avr.c (avr_out_store_psi): Use correct constant
39098         to restore Y.
39099
39100 2014-05-12  Georg-Johann Lay  <avr@gjlay.de>
39101
39102         PR libgcc/61152
39103         * config/arm/arm.h (License): Add GCC Runtime Library Exception.
39104         * config/arm/aout.h (License): Same.
39105         * config/arm/bpabi.h (License): Same.
39106         * config/arm/elf.h (License): Same.
39107         * config/arm/linux-elf.h (License): Same.
39108         * config/arm/linux-gas.h (License): Same.
39109         * config/arm/netbsd-elf.h (License): Same.
39110         * config/arm/uclinux-eabi.h (License): Same.
39111         * config/arm/uclinux-elf.h (License): Same.
39112         * config/arm/vxworks.h (License): Same.
39113
39114 2014-05-11  Jakub Jelinek  <jakub@redhat.com>
39115
39116         * tree.h (OMP_CLAUSE_LINEAR_STMT): Define.
39117         * tree.c (omp_clause_num_ops): Increase OMP_CLAUSE_LINEAR
39118         number of operands to 3.
39119         (walk_tree_1): Walk all operands of OMP_CLAUSE_LINEAR.
39120         * tree-nested.c (convert_nonlocal_omp_clauses,
39121         convert_local_omp_clauses): Handle OMP_CLAUSE_DEPEND.
39122         * gimplify.c (gimplify_scan_omp_clauses): Handle
39123         OMP_CLAUSE_LINEAR_STMT.
39124         * omp-low.c (lower_rec_input_clauses): Fix typo.
39125         (maybe_add_implicit_barrier_cancel, lower_omp_1): Add
39126         cast between Fortran boolean_type_node and C _Bool if
39127         needed.
39128
39129 2014-05-11  Richard Sandiford  <rdsandiford@googlemail.com>
39130
39131         PR tree-optimization/61136
39132         * wide-int.h (multiple_of_p): Define a version that doesn't return
39133         the quotient.
39134         * fold-const.c (extract_muldiv_1): Use wi::multiple_of_p instead of an
39135         integer_zerop/const_binop pair.
39136         (multiple_of_p): Likewise, converting both operands to widest_int
39137         precision.
39138
39139 2014-05-09  Teresa Johnson  <tejohnson@google.com>
39140
39141         * cgraphunit.c (analyze_functions): Use correct dump file.
39142
39143 2014-05-09  Florian Weimer  <fweimer@redhat.com>
39144
39145         * cfgexpand.c (stack_protect_decl_p): New function, extracted from
39146         expand_used_vars.
39147         (stack_protect_return_slot_p): New function.
39148         (expand_used_vars): Call stack_protect_decl_p and
39149         stack_protect_return_slot_p for -fstack-protector-strong.
39150
39151 2014-05-09  David Wohlferd <LimeGreenSocks@yahoo.com>
39152         Andrew Haley <aph@redhat.com>
39153         Richard Sandiford <rdsandiford@googlemail.com>
39154
39155         * doc/extend.texi: Rewrite inline asm page / re-org asm-related
39156         pages.
39157
39158 2014-05-09  Kenneth Zadeck  <zadeck@naturalbridge.com>
39159
39160         PR middle-end/61111
39161         * fold-const.c (fold_binary_loc): Changed width of mask.
39162
39163 2014-05-09  Georg-Johann Lay  <avr@gjlay.de>
39164
39165         * config/avr/avr-fixed.md (round<mode>3): Use -1U instead of -1 in
39166         unsigned int initializers for regno_in, regno_out.
39167
39168 2014-05-09  Georg-Johann Lay  <avr@gjlay.de>
39169
39170         PR target/61055
39171         * config/avr/avr.md (cc): Add new attribute set_vzn.
39172         (addqi3, addqq3, adduqq3, subqi3, subqq3, subuqq3, negqi2) [cc]:
39173         Set cc insn attribute to set_vzn instead of set_zn for alternatives
39174         with INC, DEC or NEG.
39175         * config/avr/avr.c (avr_notice_update_cc): Handle SET_VZN.
39176         (avr_out_plus_1): ADIW sets cc0 to CC_SET_CZN.
39177         INC, DEC and ADD+ADC set cc0 to CC_CLOBBER.
39178
39179 2014-05-09  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39180
39181         Revert:
39182         2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39183
39184         * wide-int.cc (UTItype): Define.
39185         (UDWtype): Define for appropriate W_TYPE_SIZE.
39186
39187 2014-05-09  Richard Biener  <rguenther@suse.de>
39188
39189         * Makefile.in (GTFILES): Remove tree-ssa-propagate.c.
39190         * tree-ssa-propagate.c: Do not include gt-tree-ssa-propagate.h.
39191         (interesting_ssa_edges, varying_ssa_edges): Move out of GC space.
39192         (add_ssa_edge, process_ssa_edge_worklist, ssa_prop_init,
39193         ssa_propagate): Adjust.
39194
39195 2014-05-08  Jeff Law  <law@redhat.com>
39196
39197         PR tree-optimization/61009
39198         * tree-ssa-threadedge.c (thread_through_normal_block): Return a
39199         tri-state rather than a boolean.  When a block is too big to
39200         thread through, inform caller via negative return value.
39201         (thread_across_edge): If a block was too big for normal threading,
39202         then it's too big for a joiner too, so remove temporary equivalences
39203         and return immediately.
39204
39205 2014-05-08  Manuel López-Ibáñez  <manu@gcc.gnu.org>
39206             Matthias Klose  <doko@ubuntu.com>
39207
39208         PR driver/61106
39209         * optc-gen.awk: Fix option handling for -Wunused-parameter.
39210
39211 2014-05-08  Uros Bizjak  <ubizjak@gmail.com>
39212
39213         PR target/59952
39214         * config/i386/i386.c (PTA_HASWELL): Remove PTA_RTM.
39215
39216 2014-05-08  Uros Bizjak  <ubizjak@gmail.com>
39217
39218         PR target/61092
39219         * config/alpha/alpha.c: Include gimple-iterator.h.
39220         (alpha_gimple_fold_builtin): New function.  Move
39221         ALPHA_BUILTIN_UMULH folding from ...
39222         (alpha_fold_builtin): ... here.
39223         (TARGET_GIMPLE_FOLD_BUILTIN): New define.
39224
39225 2014-05-08  Wei Mi  <wmi@google.com>
39226
39227         PR target/58066
39228         * config/i386/i386.c (ix86_compute_frame_layout): Update
39229         preferred_stack_boundary for call, expanded from tls descriptor.
39230         * config/i386/i386.md (*tls_global_dynamic_32_gnu): Update RTX
39231         to depend on SP register.
39232         (*tls_local_dynamic_base_32_gnu): Ditto.
39233         (*tls_local_dynamic_32_once): Ditto.
39234         (tls_global_dynamic_64_<mode>): Set
39235         ix86_tls_descriptor_calls_expanded_in_cfun.
39236         (tls_local_dynamic_base_64_<mode>): Ditto.
39237         (tls_global_dynamic_32): Set
39238         ix86_tls_descriptor_calls_expanded_in_cfun. Update RTX
39239         to depend on SP register.
39240         (tls_local_dynamic_base_32): Ditto.
39241
39242 2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39243
39244         * config/arm/arm_neon.h: Update comment.
39245         * config/arm/neon-docgen.ml: Delete.
39246         * config/arm/neon-gen.ml: Delete.
39247         * doc/arm-neon-intrinsics.texi: Update comment.
39248
39249 2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39250
39251         * config/arm/arm_neon_builtins.def (vadd, vsub): Only define the v2sf
39252         and v4sf versions.
39253         (vand, vorr, veor, vorn, vbic): Remove.
39254         * config/arm/neon.md (neon_vadd, neon_vsub, neon_vadd_unspec): Adjust
39255         iterator.
39256         (neon_vsub_unspec): Likewise.
39257         (neon_vorr, neon_vand, neon_vbic, neon_veor, neon_vorn): Remove.
39258
39259 2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39260
39261         * config/arm/arm_neon.h (vadd_s8): GNU C implementation
39262         (vadd_s16): Likewise.
39263         (vadd_s32): Likewise.
39264         (vadd_f32): Likewise.
39265         (vadd_u8): Likewise.
39266         (vadd_u16): Likewise.
39267         (vadd_u32): Likewise.
39268         (vadd_s64): Likewise.
39269         (vadd_u64): Likewise.
39270         (vaddq_s8): Likewise.
39271         (vaddq_s16): Likewise.
39272         (vaddq_s32): Likewise.
39273         (vaddq_s64): Likewise.
39274         (vaddq_f32): Likewise.
39275         (vaddq_u8): Likewise.
39276         (vaddq_u16): Likewise.
39277         (vaddq_u32): Likewise.
39278         (vaddq_u64): Likewise.
39279         (vmul_s8): Likewise.
39280         (vmul_s16): Likewise.
39281         (vmul_s32): Likewise.
39282         (vmul_f32): Likewise.
39283         (vmul_u8): Likewise.
39284         (vmul_u16): Likewise.
39285         (vmul_u32): Likewise.
39286         (vmul_p8): Likewise.
39287         (vmulq_s8): Likewise.
39288         (vmulq_s16): Likewise.
39289         (vmulq_s32): Likewise.
39290         (vmulq_f32): Likewise.
39291         (vmulq_u8): Likewise.
39292         (vmulq_u16): Likewise.
39293         (vmulq_u32): Likewise.
39294         (vsub_s8): Likewise.
39295         (vsub_s16): Likewise.
39296         (vsub_s32): Likewise.
39297         (vsub_f32): Likewise.
39298         (vsub_u8): Likewise.
39299         (vsub_u16): Likewise.
39300         (vsub_u32): Likewise.
39301         (vsub_s64): Likewise.
39302         (vsub_u64): Likewise.
39303         (vsubq_s8): Likewise.
39304         (vsubq_s16): Likewise.
39305         (vsubq_s32): Likewise.
39306         (vsubq_s64): Likewise.
39307         (vsubq_f32): Likewise.
39308         (vsubq_u8): Likewise.
39309         (vsubq_u16): Likewise.
39310         (vsubq_u32): Likewise.
39311         (vsubq_u64): Likewise.
39312         (vand_s8): Likewise.
39313         (vand_s16): Likewise.
39314         (vand_s32): Likewise.
39315         (vand_u8): Likewise.
39316         (vand_u16): Likewise.
39317         (vand_u32): Likewise.
39318         (vand_s64): Likewise.
39319         (vand_u64): Likewise.
39320         (vandq_s8): Likewise.
39321         (vandq_s16): Likewise.
39322         (vandq_s32): Likewise.
39323         (vandq_s64): Likewise.
39324         (vandq_u8): Likewise.
39325         (vandq_u16): Likewise.
39326         (vandq_u32): Likewise.
39327         (vandq_u64): Likewise.
39328         (vorr_s8): Likewise.
39329         (vorr_s16): Likewise.
39330         (vorr_s32): Likewise.
39331         (vorr_u8): Likewise.
39332         (vorr_u16): Likewise.
39333         (vorr_u32): Likewise.
39334         (vorr_s64): Likewise.
39335         (vorr_u64): Likewise.
39336         (vorrq_s8): Likewise.
39337         (vorrq_s16): Likewise.
39338         (vorrq_s32): Likewise.
39339         (vorrq_s64): Likewise.
39340         (vorrq_u8): Likewise.
39341         (vorrq_u16): Likewise.
39342         (vorrq_u32): Likewise.
39343         (vorrq_u64): Likewise.
39344         (veor_s8): Likewise.
39345         (veor_s16): Likewise.
39346         (veor_s32): Likewise.
39347         (veor_u8): Likewise.
39348         (veor_u16): Likewise.
39349         (veor_u32): Likewise.
39350         (veor_s64): Likewise.
39351         (veor_u64): Likewise.
39352         (veorq_s8): Likewise.
39353         (veorq_s16): Likewise.
39354         (veorq_s32): Likewise.
39355         (veorq_s64): Likewise.
39356         (veorq_u8): Likewise.
39357         (veorq_u16): Likewise.
39358         (veorq_u32): Likewise.
39359         (veorq_u64): Likewise.
39360         (vbic_s8): Likewise.
39361         (vbic_s16): Likewise.
39362         (vbic_s32): Likewise.
39363         (vbic_u8): Likewise.
39364         (vbic_u16): Likewise.
39365         (vbic_u32): Likewise.
39366         (vbic_s64): Likewise.
39367         (vbic_u64): Likewise.
39368         (vbicq_s8): Likewise.
39369         (vbicq_s16): Likewise.
39370         (vbicq_s32): Likewise.
39371         (vbicq_s64): Likewise.
39372         (vbicq_u8): Likewise.
39373         (vbicq_u16): Likewise.
39374         (vbicq_u32): Likewise.
39375         (vbicq_u64): Likewise.
39376         (vorn_s8): Likewise.
39377         (vorn_s16): Likewise.
39378         (vorn_s32): Likewise.
39379         (vorn_u8): Likewise.
39380         (vorn_u16): Likewise.
39381         (vorn_u32): Likewise.
39382         (vorn_s64): Likewise.
39383         (vorn_u64): Likewise.
39384         (vornq_s8): Likewise.
39385         (vornq_s16): Likewise.
39386         (vornq_s32): Likewise.
39387         (vornq_s64): Likewise.
39388         (vornq_u8): Likewise.
39389         (vornq_u16): Likewise.
39390         (vornq_u32): Likewise.
39391         (vornq_u64): Likewise.
39392
39393 2014-05-08  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
39394
39395         * wide-int.cc (UTItype): Define.
39396         (UDWtype): Define for appropriate W_TYPE_SIZE.
39397
39398 2014-05-08  Marc Glisse  <marc.glisse@inria.fr>
39399
39400         PR tree-optimization/59100
39401         * tree-ssa-phiopt.c: Include tree-inline.h.
39402         (neutral_element_p, absorbing_element_p): New functions.
39403         (value_replacement): Handle conditional binary operations with a
39404         neutral or absorbing element.
39405
39406 2014-05-08  Richard Biener  <rguenther@suse.de>
39407
39408         * tree-ssa-sccvn.c (vn_get_expr_for): Valueize operands before
39409         folding the expression.
39410         (valueize_expr): Remove.
39411         (visit_reference_op_load): Do not valueize the result of
39412         vn_get_expr_for.
39413         (simplify_binary_expression): Likewise.
39414         (simplify_unary_expression): Likewise.
39415
39416 2014-05-08  Richard Biener  <rguenther@suse.de>
39417
39418         * gimplify.c (gimplify_call_expr): Use saved fnptrtype for
39419         looking at TYPE_ARG_TYPES.
39420
39421 2014-05-08  Richard Biener  <rguenther@suse.de>
39422
39423         * gimple-fold.c (gimple_fold_stmt_to_constant_1): Remove
39424         pointer propagation special-case.
39425
39426 2014-05-08  Bin Cheng  <bin.cheng@arm.com>
39427
39428         * tree-affine.c (tree_to_aff_combination): Handle MEM_REF for
39429         core part of address expressions.
39430
39431 2014-05-08  Alan Modra  <amodra@gmail.com>
39432
39433         PR target/60737
39434         * config/rs6000/rs6000.c (expand_block_move): Allow 64-bit
39435         loads and stores when -mno-strict-align at any alignment.
39436         (expand_block_clear): Similarly.  Also correct calculation of
39437         instruction count.
39438
39439 2014-05-07  Thomas Preud'homme  <thomas.preudhomme@arm.com>
39440
39441         PR middle-end/39246
39442         * tree-complex.c (expand_complex_move): Keep line info when expanding
39443         complex move.
39444         * tree-ssa-uninit.c (warn_uninit): New argument. Ignore assignment
39445         of complex expression. Use new argument to display correct location
39446         for values coming from phi statement.
39447         (warn_uninitialized_vars): Adapt to new signature of warn_uninit.
39448         (warn_uninitialized_phi): Pass location of phi argument to
39449         warn_uninit.
39450         * tree-ssa.c (ssa_undefined_value_p): For SSA_NAME initialized by a
39451         COMPLEX_EXPR, recurse on each part of the COMPLEX_EXPR.
39452
39453 2014-05-07  Segher Boessenkool  <segher@kernel.crashing.org>
39454
39455         * config/rs6000/predicates.md (indexed_address_mem): New.
39456         * config/rs6000/rs6000.md (type): Remove load_ext, load_ext_u,
39457         load_ext_ux, load_ux, load_u, store_ux, store_u, fpload_ux, fpload_u,
39458         fpstore_ux, fpstore_u.
39459         (sign_extend, indexed, update): New.
39460         (cell_micro): Adjust.
39461         (*zero_extend<mode>di2_internal1, *zero_extendsidi2_lfiwzx,
39462         *extendsidi2_lfiwax, *extendsidi2_nocell, *extendsfdf2_fpr,
39463         *movsi_internal1, *movsi_internal1_single, *movhi_internal,
39464         *movqi_internal, *movcc_internal1, mov<mode>_hardfloat,
39465         *mov<mode>_softfloat, *mov<mode>_hardfloat32, *mov<mode>_hardfloat64,
39466         *mov<mode>_softfloat64, *movdi_internal32, *movdi_internal64,
39467         *mov<mode>_string, *ldmsi8, *ldmsi7, *ldmsi6, *ldmsi5, *ldmsi4,
39468         *ldmsi3, *stmsi8, *stmsi7, *stmsi6, *stmsi5, *stmsi4, *stmsi3,
39469         *movdi_update1, movdi_<mode>_update, movdi_<mode>_update_stack,
39470         *movsi_update1, *movsi_update2, movsi_update, movsi_update_stack,
39471         *movhi_update1, *movhi_update2, *movhi_update3, *movhi_update4,
39472         *movqi_update1, *movqi_update2, *movqi_update3, *movsf_update1,
39473         *movsf_update2, *movsf_update3, *movsf_update4, *movdf_update1,
39474         *movdf_update2, load_toc_aix_si, load_toc_aix_di, probe_stack_<mode>,
39475         *stmw, *lmw, as well as 10 anonymous patterns): Adjust.
39476
39477         * config/rs6000/dfp.md (movsd_store, movsd_load): Adjust.
39478         * config/rs6000/vsx.md (*vsx_movti_32bit, *vsx_extract_<mode>_load,
39479         *vsx_extract_<mode>_store): Adjust.
39480         * config/rs6000/rs6000.c (rs6000_adjust_cost, is_microcoded_insn,
39481         is_cracked_insn, insn_must_be_first_in_group,
39482         insn_must_be_last_in_group): Adjust.
39483
39484         * config/rs6000/40x.md (ppc403-load, ppc403-store, ppc405-float):
39485         Adjust.
39486         * config/rs6000/440.md (ppc440-load, ppc440-store, ppc440-fpload,
39487         ppc440-fpstore): Adjust.
39488         * config/rs6000/476.md (ppc476-load, ppc476-store, ppc476-fpload,
39489         ppc476-fpstore): Adjust.
39490         * config/rs6000/601.md (ppc601-load, ppc601-store, ppc601-fpload,
39491         ppc601-fpstore): Adjust.
39492         * config/rs6000/603.md (ppc603-load, ppc603-store, ppc603-fpload):
39493         Adjust.
39494         * config/rs6000/6xx.md (ppc604-load, ppc604-store, ppc604-fpload):
39495         Adjust.
39496         * config/rs6000/7450.md (ppc7450-load, ppc7450-store, ppc7450-fpload,
39497         ppc7450-fpstore): Adjust.
39498         * config/rs6000/7xx.md (ppc750-load, ppc750-store): Adjust.
39499         * config/rs6000/8540.md (ppc8540_load, ppc8540_store): Adjust.
39500         * config/rs6000/a2.md (ppca2-load, ppca2-fp-load, ppca2-fp-store):
39501         Adjust.
39502         * config/rs6000/cell.md (cell-load, cell-load-ux, cell-load-ext,
39503         cell-fpload, cell-fpload-update, cell-store, cell-store-update,
39504         cell-fpstore, cell-fpstore-update): Adjust.
39505         * config/rs6000/e300c2c3.md (ppce300c3_load, ppce300c3_fpload,
39506         ppce300c3_store, ppce300c3_fpstore): Adjust.
39507         * config/rs6000/e500mc.md (e500mc_load, e500mc_fpload, e500mc_store,
39508         e500mc_fpstore): Adjust.
39509         * config/rs6000/e500mc64.md (e500mc64_load, e500mc64_fpload,
39510         e500mc64_store, e500mc64_fpstore): Adjust.
39511         * config/rs6000/e5500.md (e5500_load, e5500_fpload, e5500_store,
39512         e5500_fpstore): Adjust.
39513         * config/rs6000/e6500.md (e6500_load, e6500_fpload, e6500_store,
39514         e6500_fpstore): Adjust.
39515         * config/rs6000/mpc.md (mpccore-load, mpccore-store, mpccore-fpload):
39516         Adjust.
39517         * config/rs6000/power4.md (power4-load, power4-load-ext,
39518         power4-load-ext-update, power4-load-ext-update-indexed,
39519         power4-load-update-indexed, power4-load-update, power4-fpload,
39520         power4-fpload-update, power4-store, power4-store-update,
39521         power4-store-update-indexed, power4-fpstore, power4-fpstore-update):
39522         Adjust.
39523         * config/rs6000/power5.md (power5-load, power5-load-ext,
39524         power5-load-ext-update, power5-load-ext-update-indexed,
39525         power5-load-update-indexed, power5-load-update, power5-fpload,
39526         power5-fpload-update, power5-store, power5-store-update,
39527         power5-store-update-indexed, power5-fpstore, power5-fpstore-update):
39528         Adjust.
39529         * config/rs6000/power6.md (power6-load, power6-load-ext,
39530         power6-load-update, power6-load-update-indexed,
39531         power6-load-ext-update, power6-load-ext-update-indexed, power6-fpload,
39532         power6-fpload-update, power6-store, power6-store-update,
39533         power6-store-update-indexed, power6-fpstore, power6-fpstore-update):
39534         Adjust.
39535         * config/rs6000/power7.md (power7-load, power7-load-ext,
39536         power7-load-update, power7-load-update-indexed,
39537         power7-load-ext-update, power7-load-ext-update-indexed, power7-fpload,
39538         power7-fpload-update, power7-store, power7-store-update,
39539         power7-store-update-indexed, power7-fpstore, power7-fpstore-update):
39540         Adjust.
39541         * config/rs6000/power8.md (power8-load, power8-load-update,
39542         power8-load-ext, power8-load-ext-update, power8-fpload,
39543         power8-fpload-update, power8-store, power8-store-update-indexed,
39544         power8-fpstore, power8-fpstore-update): Adjust.
39545         * config/rs6000/rs64.md (rs64a-load, rs64a-store, rs64a-fpload):
39546         Adjust.
39547         * config/rs6000/titan.md (titan_lsu_load, titan_lsu_fpload,
39548         titan_lsu_store, titan_lsu_fpstore): Adjust.
39549         * config/rs6000/xfpu.md (fp-load, fp-store): Adjust.
39550
39551 2014-05-07  Oleg Endo  <olegendo@gcc.gnu.org>
39552
39553         PR target/60884
39554         * config/sh/sh-mem.cc (sh_expand_strlen): Use loop when emitting
39555         unrolled byte insns.  Emit address increments after move insns.
39556
39557 2014-05-07  David Malcolm  <dmalcolm@redhat.com>
39558
39559         * gimple.h (gimple_builtin_call_types_compatible_p): Accept a
39560         const_gimple, rather than a gimple.
39561         (gimple_call_builtin_p): Likewise, for the three variants.
39562
39563         * gimple.c (gimple_builtin_call_types_compatible_p): Likewise.
39564         (gimple_call_builtin_p): Likewise, for the three variants.
39565
39566 2014-05-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
39567
39568         PR tree-optimization/61095
39569         * tree-ssanames.c (get_nonzero_bits): Fix type extension in wi::shwi.
39570
39571 2014-05-07  Richard Biener  <rguenther@suse.de>
39572
39573         PR tree-optimization/61034
39574         * tree-ssa-alias.c (call_may_clobber_ref_p_1): Export.
39575         (maybe_skip_until): Use translate to take into account
39576         lattices when trying to do disambiguations.
39577         (get_continuation_for_phi_1): Likewise.
39578         (get_continuation_for_phi): Adjust for added translate arguments.
39579         (walk_non_aliased_vuses): Likewise.
39580         * tree-ssa-alias.h (get_continuation_for_phi): Adjust prototype.
39581         (walk_non_aliased_vuses): Likewise.
39582         (call_may_clobber_ref_p_1): Declare.
39583         * tree-ssa-sccvn.c (vn_reference_lookup_3): Also disambiguate against
39584         calls.  Stop early if we are only supposed to disambiguate.
39585         * tree-ssa-pre.c (translate_vuse_through_block): Adjust.
39586
39587 2014-05-07  Joern Rennecke  <joern.rennecke@embecosm.com>
39588
39589         * config/epiphany/epiphany.c (epiphany_handle_interrupt_attribute):
39590         Emit an error when the function has arguments.
39591
39592 2014-05-07  Thomas Schwinge  <thomas@codesourcery.com>
39593
39594         * cfgloop.h (unswitch_loops): Remove.
39595         * doc/passes.texi: Remove references to loop-unswitch.c
39596         * timevar.def (TV_LOOP_UNSWITCH): Remove.
39597
39598 2014-05-07  Evgeny Stupachenko  <evstupac@gmail.com>
39599
39600         * tree-vect-data-refs.c (vect_grouped_load_supported): New
39601         check for loads group of length 3.
39602         (vect_permute_load_chain): New permutations for loads group of
39603         length 3.
39604         * tree-vect-stmts.c (vect_model_load_cost): Change cost
39605         of vec_perm_shuffle for the new permutations.
39606
39607 2014-05-07  Alan Lawrence  <alan.lawrence@arm.com>
39608
39609         * config/aarch64/arm_neon.h (vtrn1_f32, vtrn1_p8, vtrn1_p16, vtrn1_s8,
39610         vtrn1_s16, vtrn1_s32, vtrn1_u8, vtrn1_u16, vtrn1_u32, vtrn1q_f32,
39611         vtrn1q_f64, vtrn1q_p8, vtrn1q_p16, vtrn1q_s8, vtrn1q_s16, vtrn1q_s32,
39612         vtrn1q_s64, vtrn1q_u8, vtrn1q_u16, vtrn1q_u32, vtrn1q_u64, vtrn2_f32,
39613         vtrn2_p8, vtrn2_p16, vtrn2_s8, vtrn2_s16, vtrn2_s32, vtrn2_u8,
39614         vtrn2_u16, vtrn2_u32, vtrn2q_f32, vtrn2q_f64, vtrn2q_p8, vtrn2q_p16,
39615         vtrn2q_s8, vtrn2q_s16, vtrn2q_s32, vtrn2q_s64, vtrn2q_u8, vtrn2q_u16,
39616         vtrn2q_u32, vtrn2q_u64): Replace temporary asm with __builtin_shuffle.
39617
39618 2014-05-07  Thomas Schwinge  <thomas@codesourcery.com>
39619
39620         * loop-unswitch.c: Delete.
39621
39622 2014-05-07  Richard Biener  <rguenther@suse.de>
39623
39624         * config.gcc: Always set need_64bit_hwint to yes.
39625
39626 2014-05-07  Chung-Ju Wu  <jasonwucj@gmail.com>
39627
39628         * config/nds32/nds32.h (HONOR_REG_ALLOC_ORDER): Have it in favor
39629         of using optimize_size.
39630
39631 2014-05-06  Mike Stump  <mikestump@comcast.net>
39632
39633         * wide-int.h (wi::int_traits <HOST_WIDE_INT>): Always define.
39634
39635 2014-05-06  Joseph Myers  <joseph@codesourcery.com>
39636
39637         * config/i386/sse.md (*mov<mode>_internal)
39638         (*<sse>_loadu<ssemodesuffix><avxsizesuffix><mask_name>)
39639         (*<sse2_avx_avx512f>_loaddqu<mode><mask_name>)
39640         (<sse>_andnot<mode>3, <code><mode>3, *andnot<mode>3)
39641         (*<code><mode>3, *andnot<mode>3<mask_name>)
39642         (<mask_codefor><code><mode>3<mask_name>): Only consider
39643         TARGET_SSE_PACKED_SINGLE_INSN_OPTIMAL for modes of size 16.
39644
39645 2014-05-06  Richard Sandiford  <rdsandiford@googlemail.com>
39646
39647         Revert:
39648         2014-05-03  Richard Sandiford  <rdsandiford@googlemail.com>
39649
39650         * lra-constraints.c (valid_address_p): Move earlier in file.
39651         Add a constraint argument to the address_info version.
39652         (satisfies_memory_constraint_p): New function.
39653         (satisfies_address_constraint_p): Likewise.
39654         (process_alt_operands, curr_insn_transform): Use them.
39655         (process_address): Pass the constraint to valid_address_p when
39656         checking address operands.
39657
39658 2014-05-06  Richard Sandiford  <r.sandiford@uk.ibm.com>
39659
39660         * lto-cgraph.c (compute_ltrans_boundary): Make node variables local
39661         to their respective blocks.  Fix inadvertent use of "node".
39662
39663 2014-05-06  Richard Sandiford  <rdsandiford@googlemail.com>
39664
39665         * emit-rtl.c (init_derived_machine_modes): New functionm, split
39666         out from...
39667         (init_emit_once): ...here.
39668         * rtl.h (init_derived_machine_modes): Declare.
39669         * toplev.c (do_compile): Call it even if no_backend.
39670
39671 2014-05-06  Kenneth Zadeck  <zadeck@naturalbridge.com>
39672             Mike Stump  <mikestump@comcast.net>
39673             Richard Sandiford  <rdsandiford@googlemail.com>
39674             Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
39675
39676         * alias.c (ao_ref_from_mem): Use wide-int interfaces.
39677         (rtx_equal_for_memref_p): Update comment.
39678         (adjust_offset_for_component_ref): Use wide-int interfaces.
39679         * builtins.c (get_object_alignment_2): Likewise.
39680         (c_readstr): Likewise.
39681         (target_char_cast): Add comment.
39682         (determine_block_size): Use wide-int interfaces.
39683         (expand_builtin_signbit): Likewise.
39684         (fold_builtin_int_roundingfn): Likewise.
39685         (fold_builtin_bitop): Likewise.
39686         (fold_builtin_bswap): Likewise.
39687         (fold_builtin_logarithm): Use signop.
39688         (fold_builtin_pow): Likewise.
39689         (fold_builtin_memory_op): Use wide-int interfaces.
39690         (fold_builtin_object_size): Likewise.
39691         * cfgloop.c (alloc_loop): Initialize nb_iterations_upper_bound and
39692         nb_iterations_estimate.
39693         (record_niter_bound): Use wide-int interfaces.
39694         (get_estimated_loop_iterations_int): Likewise.
39695         (get_estimated_loop_iterations): Likewise.
39696         (get_max_loop_iterations): Likewise.
39697         * cfgloop.h: Include wide-int.h.
39698         (struct nb_iter_bound): Change bound to widest_int.
39699         (struct loop): Change nb_iterations_upper_bound and
39700         nb_iterations_estimate to widest_int.
39701         (record_niter_bound): Switch to use widest_int.
39702         (get_estimated_loop_iterations): Likewise.
39703         (get_max_loop_iterations): Likewise.
39704         (gcov_type_to_double_int): Rename to gcov_type_to_wide_int and
39705         update for wide-int.
39706         * cgraph.c (cgraph_add_thunk): Use wide-int interfaces.
39707         * combine.c (try_combine): Likewise.
39708         (subst): Use CONST_SCALAR_INT_P rather than CONST_INT_P.
39709         * config/aarch64/aarch64.c (aapcs_vfp_sub_candidate): Use wide-int
39710         interfaces.
39711         (aarch64_float_const_representable_p): Likewise.
39712         * config/arc/arc.c: Include wide-int.h.
39713         (arc_can_use_doloop_p): Use wide-int interfaces.
39714         * config/arm/arm.c (aapcs_vfp_sub_candidate): Likewise.
39715         (vfp3_const_double_index): Likewise.
39716         * config/avr/avr.c (avr_out_round): Likewise.
39717         (avr_fold_builtin): Likewise.
39718         * config/bfin/bfin.c (bfin_local_alignment): Likewise.
39719         (bfin_can_use_doloop_p): Likewise.
39720         * config/darwin.c (darwin_mergeable_constant_section): Likewise.
39721         (machopic_select_rtx_section): Update to handle CONST_WIDE_INT.
39722         * config/i386/i386.c: Include wide-int.h.
39723         (ix86_data_alignment): Use wide-int interfaces.
39724         (ix86_local_alignment): Likewise.
39725         (ix86_emit_swsqrtsf): Update real_from_integer.
39726         * config/msp430/msp430.c (msp430_attr): Use wide-int interfaces.
39727         * config/nds32/nds32.c (nds32_insert_attributes): Likewise.
39728         * config/rs6000/predicates.md (any_operand): Add const_wide_int.
39729         (zero_constant): Likewise.
39730         (input_operand): Likewise.
39731         (splat_input_operand): Likewise.
39732         (non_logical_cint_operand): Change const_double to const_wide_int.
39733         * config/rs6000/rs6000.c (num_insns_constant): Handle CONST_WIDE_INT.
39734         (easy_altivec_constant): Remove comment.
39735         (paired_expand_vector_init): Use CONSTANT_P.
39736         (rs6000_legitimize_address): Handle CONST_WIDE_INT.
39737         (rs6000_emit_move): Update checks.
39738         (rs6000_aggregate_candidate): Use wide-int interfaces.
39739         (rs6000_expand_ternop_builtin): Likewise.
39740         (rs6000_output_move_128bit): Handle CONST_WIDE_INT.
39741         (rs6000_assemble_integer): Likewise.
39742         (rs6000_hash_constant): Likewise.
39743         (output_toc): Likewise.
39744         (rs6000_rtx_costs): Likewise.
39745         (rs6000_emit_swrsqrt); Update call to real_from_integer.
39746         * config/rs6000/rs6000-c.c: Include wide-int.h.
39747         (altivec_resolve_overloaded_builtin): Use wide-int interfaces.
39748         * config/rs6000/rs6000.h (TARGET_SUPPORTS_WIDE_INT): New.
39749         * config/rs6000/rs6000.md: Use const_scalar_int_operand.
39750         Handle CONST_WIDE_INT.
39751         * config/sol2-c.c (solaris_pragma_align): Change low to unsigned HWI.
39752         Use tree_fits_uhwi_p.
39753         * config/sparc/sparc.c: Include wide-int.h.
39754         (sparc_fold_builtin): Use wide-int interfaces.
39755         * config/vax/vax.c: Include wide-int.h.
39756         (vax_float_literal): Use real_from_integer.
39757         * coretypes.h (struct hwivec_def): New.
39758         (hwivec): New.
39759         (const_hwivec): New.
39760         * cse.c (hash_rtx_cb): Handle CONST_WIDE_INT.
39761         (equiv_constant): Handle CONST_WIDE_INT.
39762         * cselib.c (rtx_equal_for_cselib_1): Use CASE_CONST_UNIQUE.
39763         (cselib_hash_rtx): Handle CONST_WIDE_INT.
39764         * dbxout.c (stabstr_U): Use wide-int interfaces.
39765         (dbxout_type): Update to use cst_fits_shwi_p.
39766         * defaults.h (LOG2_BITS_PER_UNIT): Define.
39767         (TARGET_SUPPORTS_WIDE_INT): Add default.
39768         * dfp.c: Include wide-int.h.
39769         (decimal_real_to_integer2): Use wide-int interfaces and rename to
39770         decimal_real_to_integer.
39771         * dfp.h (decimal_real_to_integer2): Return a wide_int and rename to
39772         decimal_real_to_integer.
39773         * doc/generic.texi (Constant expressions): Update for wide_int.
39774         * doc/rtl.texi (const_double): Likewise.
39775         (const_wide_int, CONST_WIDE_INT, CONST_WIDE_INT_VEC): New.
39776         (CONST_WIDE_INT_NUNITS, CONST_WIDE_INT_ELT): New.
39777         * doc/tm.texi.in (REAL_VALUE_TO_INT): Remove.
39778         (REAL_VALUE_FROM_INT): Remove.
39779         (TARGET_SUPPORTS_WIDE_INT): New.
39780         * doc/tm.texi: Regenerate.
39781         * dojump.c (prefer_and_bit_test): Use wide-int interfaces.
39782         * double-int.h: Include wide-int.h.
39783         (struct wi::int_traits): New.
39784         * dwarf2out.c (get_full_len): New.
39785         (dw_val_equal_p): Add case dw_val_class_wide_int.
39786         (size_of_loc_descr): Likewise.
39787         (output_loc_operands): Likewise.
39788         (insert_double): Remove.
39789         (insert_wide_int): New.
39790         (add_AT_wide): New.
39791         (print_die): Add case dw_val_class_wide_int.
39792         (attr_checksum): Likewise.
39793         (attr_checksum_ordered): Likewise.
39794         (same_dw_val_p): Likewise.
39795         (size_of_die): Likewise.
39796         (value_format): Likewise.
39797         (output_die): Likewise.
39798         (double_int_type_size_in_bits): Rename to offset_int_type_size_in_bits.
39799         Use wide-int.
39800         (clz_loc_descriptor): Use wide-int interfaces.
39801         (mem_loc_descriptor): Likewise.  Handle CONST_WIDE_INT.
39802         (loc_descriptor): Use wide-int interfaces.  Handle CONST_WIDE_INT.
39803         (round_up_to_align): Use wide-int interfaces.
39804         (field_byte_offset): Likewise.
39805         (insert_double): Rename to insert_wide_int.  Use wide-int interfaces.
39806         (add_const_value_attribute): Handle CONST_WIDE_INT.  Update
39807         CONST_DOUBLE handling.  Use wide-int interfaces.
39808         (add_bound_info): Use tree_fits_uhwi_p.  Use wide-int interfaces.
39809         (gen_enumeration_type_die): Use add_AT_wide.
39810         (hash_loc_operands): Add case dw_val_class_wide_int.
39811         (compare_loc_operands): Likewise.
39812         * dwarf2out.h: Include wide-int.h.
39813         (wide_int_ptr): New.
39814         (enum dw_val_class): Add dw_val_class_wide_int.
39815         (struct dw_val_struct): Add val_wide.
39816         * emit-rtl.c (const_wide_int_htab): New.
39817         (const_wide_int_htab_hash): New.
39818         (const_wide_int_htab_eq): New.
39819         (lookup_const_wide_int): New.
39820         (const_double_htab_hash): Use wide-int interfaces.
39821         (const_double_htab_eq): Likewise.
39822         (rtx_to_double_int): Conditionally compile for wide-int.
39823         (immed_double_int_const): Rename to immed_wide_int_const and
39824         update for wide-int.
39825         (immed_double_const): Conditionally compile for wide-int.
39826         (init_emit_once): Use wide-int interfaces.
39827         * explow.c (plus_constant): Likewise.
39828         * expmed.c (mask_rtx): Move further up file.  Use wide-int interfaces.
39829         (lshift_value): Use wide-int interfaces.
39830         (expand_mult): Likewise.
39831         (choose_multiplier): Likewise.
39832         (expand_smod_pow2): Likewise.
39833         (make_tree): Likewise.
39834         * expr.c (convert_modes): Consolidate handling of constants.
39835         Use wide-int interfaces.
39836         (emit_group_load_1): Add note.
39837         (store_expr): Update comment.
39838         (get_inner_reference): Use wide-int interfaces.
39839         (expand_constructor): Update comment.
39840         (expand_expr_real_2): Use wide-int interfaces.
39841         (expand_expr_real_1): Likewise.
39842         (reduce_to_bit_field_precision): Likewise.
39843         (const_vector_from_tree): Likewise.
39844         * final.c: Include wide-int-print.h.
39845         (output_addr_const): Handle CONST_WIDE_INT.  Use CONST_DOUBLE_AS_INT_P.
39846         * fixed-value.c: Include wide-int.h.
39847         (fixed_from_string): Use wide-int interfaces.
39848         (fixed_to_decimal): Likewise.
39849         (fixed_convert_from_real): Likewise.
39850         (real_convert_from_fixed): Likewise.
39851         * fold-const.h (mem_ref_offset): Return an offset_int.
39852         (div_if_zero_remainder): Remove code parameter.
39853         * fold-const.c (div_if_zero_remainder): Remove code parameter.
39854         Use wide-int interfaces.
39855         (may_negate_without_overflow_p): Use wide-int interfaces.
39856         (negate_expr_p): Likewise.
39857         (fold_negate_expr): Likewise.
39858         (int_const_binop_1): Likewise.
39859         (const_binop): Likewise.
39860         (fold_convert_const_int_from_int): Likewise.
39861         (fold_convert_const_int_from_real): Likewise.
39862         (fold_convert_const_int_from_fixed): Likewise.
39863         (fold_convert_const_fixed_from_int): Likewise.
39864         (all_ones_mask_p): Take an unsigned size.  Use wide-int interfaces.
39865         (sign_bit_p): Use wide-int interfaces.
39866         (make_range_step): Likewise.
39867         (build_range_check): Likewise.  Pass an integer of the correct type
39868         instead of using integer_one_node.
39869         (range_predecessor): Pass an integer of the correct type instead
39870         of using integer_one_node.
39871         (range_successor): Likewise.
39872         (merge_ranges): Likewise.
39873         (unextend): Use wide-int interfaces.
39874         (extract_muldiv_1): Likewise.
39875         (fold_div_compare): Likewise.
39876         (fold_single_bit_test): Likewise.
39877         (fold_sign_changed_comparison): Likewise.
39878         (try_move_mult_to_index): Update calls to div_if_zero_remainder.
39879         (fold_plusminus_mult_expr): Use wide-int interfaces.
39880         (native_encode_int): Likewise.
39881         (native_interpret_int): Likewise.
39882         (fold_unary_loc): Likewise.
39883         (pointer_may_wrap_p): Likewise.
39884         (size_low_cst): Likewise.
39885         (mask_with_tz): Likewise.
39886         (fold_binary_loc): Likewise.
39887         (fold_ternary_loc): Likewise.
39888         (multiple_of_p): Likewise.
39889         (tree_call_nonnegative_warnv_p): Update calls to
39890         tree_int_cst_min_precision and real_from_integer.
39891         (fold_negate_const): Use wide-int interfaces.
39892         (fold_abs_const): Likewise.
39893         (fold_relational_const): Use tree_int_cst_lt.
39894         (round_up_loc): Use wide-int interfaces.
39895         * genemit.c (gen_exp): Add CONST_WIDE_INT case.
39896         * gengenrtl.c (excluded_rtx): Add CONST_WIDE_INT case.
39897         * gengtype.c: Remove include of double-int.h.
39898         (do_typedef): Use wide-int interfaces.
39899         (open_base_files): Add wide-int.h.
39900         (main): Add offset_int and widest_int typedefs.
39901         * gengtype-lex.l: Handle "^".
39902         (CXX_KEYWORD): Add "static".
39903         * gengtype-parse.c (require3): New.
39904         (require_template_declaration): Handle constant template arguments
39905         and nested templates.
39906         * gengtype-state.c: Don't include "double-int.h".
39907         * genpreds.c (write_one_predicate_function): Update comment.
39908         (write_tm_constrs_h): Add check for hval and lval use in
39909         CONST_WIDE_INT.
39910         * genrecog.c (validate_pattern): Add CONST_WIDE_INT case.
39911         (add_to_sequence): Likewise.
39912         * gensupport.c (struct std_pred_table): Add const_scalar_int_operand
39913         and const_double_operand.
39914         * gimple.c (preprocess_case_label_vec_for_gimple): Use wide-int
39915         interfaces.
39916         * gimple-fold.c (get_base_constructor): Likewise.
39917         (fold_array_ctor_reference): Likewise.
39918         (fold_nonarray_ctor_reference): Likewise.
39919         (fold_const_aggregate_ref_1): Likewise.
39920         (gimple_val_nonnegative_real_p): Likewise.
39921         (gimple_fold_indirect_ref): Likewise.
39922         * gimple-pretty-print.c (dump_ssaname_info): Likewise.
39923         * gimple-ssa-strength-reduction.c: Include wide-int-print.h.
39924         (struct slsr_cand_d): Change index to be widest_int.
39925         (struct incr_info_d): Change incr to be widest_int.
39926         (alloc_cand_and_find_basis): Use wide-int interfaces.
39927         (slsr_process_phi): Likewise.
39928         (backtrace_base_for_ref): Likewise.  Return a widest_int.
39929         (restructure_reference): Take a widest_int instead of a double_int.
39930         (slsr_process_ref): Use wide-int interfaces.
39931         (create_mul_ssa_cand): Likewise.
39932         (create_mul_imm_cand): Likewise.
39933         (create_add_ssa_cand): Likewise.
39934         (create_add_imm_cand): Take a widest_int instead of a double_int.
39935         (slsr_process_add): Use wide-int interfaces.
39936         (slsr_process_cast): Likewise.
39937         (slsr_process_copy): Likewise.
39938         (dump_candidate): Likewise.
39939         (dump_incr_vec): Likewise.
39940         (replace_ref): Likewise.
39941         (cand_increment): Likewise.  Return a widest_int.
39942         (cand_abs_increment): Likewise.
39943         (replace_mult_candidate): Take a widest_int instead of a double_int.
39944         (replace_unconditional_candidate): Use wide-int interfaces.
39945         (incr_vec_index): Take a widest_int instead of a double_int.
39946         (create_add_on_incoming_edge): Likewise.
39947         (create_phi_basis): Use wide-int interfaces.
39948         (replace_conditional_candidate): Likewise.
39949         (record_increment): Take a widest_int instead of a double_int.
39950         (record_phi_increments): Use wide-int interfaces.
39951         (phi_incr_cost): Take a widest_int instead of a double_int.
39952         (lowest_cost_path): Likewise.
39953         (total_savings): Likewise.
39954         (analyze_increments): Use wide-int interfaces.
39955         (ncd_with_phi): Take a widest_int instead of a double_int.
39956         (ncd_of_cand_and_phis): Likewise.
39957         (nearest_common_dominator_for_cands): Likewise.
39958         (insert_initializers): Use wide-int interfaces.
39959         (all_phi_incrs_profitable): Likewise.
39960         (replace_one_candidate): Likewise.
39961         (replace_profitable_candidates): Likewise.
39962         * godump.c: Include wide-int-print.h.
39963         (go_output_typedef): Use wide-int interfaces.
39964         * graphite-clast-to-gimple.c (gmp_cst_to_tree): Likewise.
39965         * graphite-sese-to-poly.c (tree_int_to_gmp): Likewise.
39966         (build_loop_iteration_domains): Likewise.
39967         * hooks.h: Include wide-int.h rather than double-int.h.
39968         (hook_bool_dint_dint_uint_bool_true): Delete.
39969         (hook_bool_wint_wint_uint_bool_true): Declare.
39970         * hooks.c (hook_bool_dint_dint_uint_bool_true): Removed.
39971         (hook_bool_wint_wint_uint_bool_true): New.
39972         * internal-fn.c (ubsan_expand_si_overflow_addsub_check): Use wide-int
39973         interfaces.
39974         (ubsan_expand_si_overflow_mul_check): Likewise.
39975         * ipa-devirt.c (get_polymorphic_call_info): Likewise.
39976         * ipa-prop.c (compute_complex_assign_jump_func): Likewise.
39977         (get_ancestor_addr_info): Likewise.
39978         (ipa_modify_call_arguments): Likewise.
39979         * loop-doloop.c (doloop_modify): Likewise.
39980         (doloop_optimize): Likewise.
39981         * loop-iv.c (iv_number_of_iterations): Likewise.
39982         * loop-unroll.c (decide_unroll_constant_iterations): Likewise.
39983         (unroll_loop_constant_iterations): Likewise.
39984         (decide_unroll_runtime_iterations): Likewise.
39985         (unroll_loop_runtime_iterations): Likewise.
39986         (decide_peel_simple): Likewise.
39987         (decide_unroll_stupid): Likewise.
39988         * lto-streamer-in.c (streamer_read_wi): Add.
39989         (input_cfg): Use wide-int interfaces.
39990         (lto_input_tree_1): Likewise.
39991         * lto-streamer-out.c (streamer_write_wi): Add.
39992         (hash_tree): Use wide-int interfaces.
39993         (output_cfg): Likewise.
39994         * Makefile.in (OBJS): Add wide-int.o and wide-int-print.o.
39995         (GTFILES): Add wide-int.h and signop.h.
39996         (TAGS): Look for .cc files too.
39997         * omp-low.c (scan_omp_1_op): Use wide-int interfaces.
39998         * optabs.c (expand_subword_shift): Likewise.
39999         (expand_doubleword_shift): Likewise.
40000         (expand_absneg_bit): Likewise.
40001         (expand_copysign_absneg): Likewise.
40002         (expand_copysign_bit): Likewise.
40003         * postreload.c (reload_cse_simplify_set): Likewise.
40004         * predict.c (predict_iv_comparison): Likewise.
40005         * pretty-print.h: Include wide-int-print.h.
40006         (pp_wide_int) New.
40007         * print-rtl.c (print_rtx): Add CONST_WIDE_INT case.
40008         * print-tree.c: Include wide-int-print.h.
40009         (print_node_brief): Use wide-int interfaces.
40010         (print_node): Likewise.
40011         * read-rtl.c (validate_const_wide_int): New.
40012         (read_rtx_code): Add CONST_WIDE_INT case.
40013         * real.c: Include wide-int.h.
40014         (real_to_integer2): Delete.
40015         (real_to_integer): New function, returning a wide_int.
40016         (real_from_integer): Take a wide_int rather than two HOST_WIDE_INTs.
40017         (ten_to_ptwo): Update call to real_from_integer.
40018         (real_digit): Likewise.
40019         * real.h: Include signop.h, wide-int.h and insn-modes.h.
40020         (real_to_integer2, REAL_VALUE_FROM_INT, REAL_VALUE_FROM_UNSIGNED_INT)
40021         (REAL_VALUE_TO_INT): Delete.
40022         (real_to_integer): Declare a wide-int form.
40023         (real_from_integer): Take a wide_int rather than two HOST_WIDE_INTs.
40024         * recog.c (const_int_operand): Improve comment.
40025         (const_scalar_int_operand): New.
40026         (const_double_operand): Add a separate definition for CONST_WIDE_INT.
40027         * rtlanal.c (commutative_operand_precedence): Handle CONST_WIDE_INT.
40028         (split_double): Likewise.
40029         * rtl.c (DEF_RTL_EXPR): Handle CONST_WIDE_INT.
40030         (rtx_size): Likewise.
40031         (rtx_alloc_stat_v): New.
40032         (rtx_alloc_stat): Now calls rtx_alloc_stat_v.
40033         (cwi_output_hex): New.
40034         (iterative_hash_rtx): Handle CONST_WIDE_INT.
40035         (cwi_check_failed_bounds): New.
40036         * rtl.def (CONST_WIDE_INT): New.
40037         * rtl.h: Include <utility> and wide-int.h.
40038         (struct hwivec_def): New.
40039         (CWI_GET_NUM_ELEM): New.
40040         (CWI_PUT_NUM_ELEM): New.
40041         (struct rtx_def): Add num_elem and hwiv.
40042         (CASE_CONST_SCALAR_INT): Modify for TARGET_SUPPORTS_WIDE_INT.
40043         (CASE_CONST_UNIQUE): Likewise.
40044         (CASE_CONST_ANY): Likewise.
40045         (CONST_SCALAR_INT_P): Likewise.
40046         (CONST_WIDE_INT_P): New.
40047         (CWI_ELT): New.
40048         (HWIVEC_CHECK): New.
40049         (cwi_check_failed_bounds): New.
40050         (CWI_ELT): New.
40051         (HWIVEC_CHECK): New.
40052         (CONST_WIDE_INT_VEC) New.
40053         (CONST_WIDE_INT_NUNITS) New.
40054         (CONST_WIDE_INT_ELT) New.
40055         (rtx_mode_t): New type.
40056         (wi::int_traits <rtx_mode_t>): New.
40057         (wi::shwi): New.
40058         (wi::min_value): New.
40059         (wi::max_value): New.
40060         (rtx_alloc_v) New.
40061         (const_wide_int_alloc): New.
40062         (immed_wide_int_const): New.
40063         * sched-vis.c (print_value): Handle CONST_WIDE_INT.
40064         * sel-sched-ir.c (lhs_and_rhs_separable_p): Update comment.
40065         * signop.h: New file.
40066         * simplify-rtx.c (mode_signbit_p): Handle CONST_WIDE_INT.
40067         (simplify_const_unary_operation): Use wide-int interfaces.
40068         (simplify_binary_operation_1): Likewise.
40069         (simplify_const_binary_operation): Likewise.
40070         (simplify_const_relational_operation): Likewise.
40071         (simplify_immed_subreg): Likewise.
40072         * stmt.c (expand_case): Likewise.
40073         * stor-layout.h (set_min_and_max_values_for_integral_type): Take a
40074         signop rather than a bool.
40075         * stor-layout.c (layout_type): Use wide-int interfaces.
40076         (initialize_sizetypes): Update calls to
40077         set_min_and_max_values_for_integral_type.
40078         (set_min_and_max_values_for_integral_type): Take a signop rather
40079         than a bool.  Use wide-int interfaces.
40080         (fixup_signed_type): Update accordingly.  Remove
40081         HOST_BITS_PER_DOUBLE_INT limit.
40082         (fixup_unsigned_type): Likewise.
40083         * system.h (STATIC_CONSTANT_P): New.
40084         (STATIC_ASSERT): New.
40085         * target.def (can_use_doloop_p): Take widest_ints rather than
40086         double_ints.
40087         * target.h: Include wide-int.h rather than double-int.h.
40088         * targhooks.h (can_use_doloop_if_innermost): Take widest_ints rather
40089         than double_ints.
40090         * targhooks.c (default_cxx_get_cookie_size): Use tree_int_cst_lt
40091         rather than INT_CST_LT_UNSIGNED.
40092         (can_use_doloop_if_innermost): Take widest_ints rather than
40093         double_ints.
40094         * tree-affine.c: Include wide-int-print.h.
40095         (double_int_ext_for_comb): Delete.
40096         (wide_int_ext_for_comb): New.
40097         (aff_combination_zero): Use wide-int interfaces.
40098         (aff_combination_const): Take a widest_int instead of a double_int.
40099         (aff_combination_elt): Use wide-int interfaces.
40100         (aff_combination_scale): Take a widest_int instead of a double_int.
40101         (aff_combination_add_elt): Likewise.
40102         (aff_combination_add_cst): Likewise.
40103         (aff_combination_add): Use wide-int interfaces.
40104         (aff_combination_convert): Likewise.
40105         (tree_to_aff_combination): Likewise.
40106         (add_elt_to_tree): Take a widest_int instead of a double_int.
40107         (aff_combination_to_tree): Use wide-int interfaces.
40108         (aff_combination_remove_elt): Likewise.
40109         (aff_combination_add_product): Take a widest_int instead of
40110         a double_int.
40111         (aff_combination_mult): Use wide-int interfaces.
40112         (aff_combination_expand): Likewise.
40113         (double_int_constant_multiple_p): Delete.
40114         (wide_int_constant_multiple_p): New.
40115         (aff_combination_constant_multiple_p): Take a widest_int pointer
40116         instead of a double_int pointer.
40117         (print_aff): Use wide-int interfaces.
40118         (get_inner_reference_aff): Take a widest_int pointer
40119         instead of a double_int pointer.
40120         (aff_comb_cannot_overlap_p): Take widest_ints instead of double_ints.
40121         * tree-affine.h: Include wide-int.h.
40122         (struct aff_comb_elt): Change type of coef to widest_int.
40123         (struct affine_tree_combination): Change type of offset to widest_int.
40124         (double_int_ext_for_comb): Delete.
40125         (wide_int_ext_for_comb): New.
40126         (aff_combination_const): Use widest_int instead of double_int.
40127         (aff_combination_scale): Likewise.
40128         (aff_combination_add_elt): Likewise.
40129         (aff_combination_constant_multiple_p): Likewise.
40130         (get_inner_reference_aff): Likewise.
40131         (aff_comb_cannot_overlap_p): Likewise.
40132         (aff_combination_zero_p): Use wide-int interfaces.
40133         * tree.c: Include tree.h.
40134         (init_ttree): Use make_int_cst.
40135         (tree_code_size): Removed code for INTEGER_CST case.
40136         (tree_size): Add INTEGER_CST case.
40137         (make_node_stat): Update comment.
40138         (get_int_cst_ext_nunits, build_new_int_cst, build_int_cstu): New.
40139         (build_int_cst_type): Use wide-int interfaces.
40140         (double_int_to_tree): Likewise.
40141         (double_int_fits_to_tree_p): Delete.
40142         (force_fit_type_double): Delete.
40143         (force_fit_type): New.
40144         (int_cst_hash_hash): Use wide-int interfaces.
40145         (int_cst_hash_eq): Likewise.
40146         (build_int_cst_wide): Delete.
40147         (wide_int_to_tree): New.
40148         (cache_integer_cst): Use wide-int interfaces.
40149         (build_low_bits_mask): Likewise.
40150         (cst_and_fits_in_hwi): Likewise.
40151         (real_value_from_int_cst): Likewise.
40152         (make_int_cst_stat): New.
40153         (integer_zerop): Use wide_int interfaces.
40154         (integer_onep): Likewise.
40155         (integer_all_onesp): Likewise.
40156         (integer_pow2p): Likewise.
40157         (integer_nonzerop): Likewise.
40158         (tree_log2): Likewise.
40159         (tree_floor_log2): Likewise.
40160         (tree_ctz): Likewise.
40161         (int_size_in_bytes): Likewise.
40162         (mem_ref_offset): Return an offset_int rather than a double_int.
40163         (build_type_attribute_qual_variant): Use wide_int interfaces.
40164         (type_hash_eq): Likewise
40165         (tree_int_cst_equal): Likewise.
40166         (tree_int_cst_lt): Delete.
40167         (tree_int_cst_compare): Likewise.
40168         (tree_fits_shwi_p): Use wide_int interfaces.
40169         (tree_fits_uhwi_p): Likewise.
40170         (tree_int_cst_sign_bit): Likewise.
40171         (tree_int_cst_sgn): Likewise.
40172         (tree_int_cst_min_precision): Take a signop rather than a bool.
40173         (simple_cst_equal): Use wide_int interfaces.
40174         (compare_tree_int): Likewise.
40175         (iterative_hash_expr): Likewise.
40176         (int_fits_type_p): Likewise.  Use tree_int_cst_lt rather than
40177         INT_CST_LT.
40178         (get_type_static_bounds): Use wide_int interfaces.
40179         (tree_int_cst_elt_check_failed): New.
40180         (build_common_tree_nodes): Reordered to set prec before filling in
40181         value.
40182         (int_cst_value): Check cst_and_fits_in_hwi.
40183         (widest_int_cst_value): Use wide_int interfaces.
40184         (upper_bound_in_type): Likewise.
40185         (lower_bound_in_type): Likewise.
40186         (num_ending_zeros): Likewise.
40187         (drop_tree_overflow): Likewise.
40188         * tree-call-cdce.c (check_pow): Update call to real_from_integer.
40189         (gen_conditions_for_pow_cst_base): Likewise.
40190         * tree-cfg.c: Include wide-int.h and wide-int-print.h.
40191         (group_case_labels_stmt): Use wide-int interfaces.
40192         (verify_gimple_assign_binary): Likewise.
40193         (print_loop): Likewise.
40194         * tree-chrec.c (tree_fold_binomial): Likewise.
40195         * tree-core.h (struct tree_base): Add int_length.
40196         (struct tree_int_cst): Change rep of value.
40197         * tree-data-ref.c (dr_analyze_innermost): Use wide-int interfaces.
40198         (dr_may_alias_p): Likewise.
40199         (max_stmt_executions_tree): Likewise.
40200         * tree.def (INTEGER_CST): Update comment.
40201         * tree-dfa.c (get_ref_base_and_extent): Use wide-int interfaces.
40202         * tree-dfa.h (get_addr_base_and_unit_offset_1): Likewise.
40203         * tree-dump.c: Include wide-int.h and wide-int-print.h.
40204         (dequeue_and_dump): Use wide-int interfaces.
40205         * tree.h: Include wide-int.h.
40206         (NULL_TREE): Moved to earlier loc in file.
40207         (TREE_INT_CST_ELT_CHECK): New.
40208         (tree_int_cst_elt_check_failed): New.
40209         (TYPE_SIGN): New.
40210         (TREE_INT_CST): Delete.
40211         (TREE_INT_CST_LOW): Use wide-int interfaces.
40212         (TREE_INT_CST_HIGH): Delete.
40213         (TREE_INT_CST_NUNITS): New.
40214         (TREE_INT_CST_EXT_NUNITS): Likewise.
40215         (TREE_INT_CST_OFFSET_NUNITS): Likewise.
40216         (TREE_INT_CST_ELT): Likewise.
40217         (INT_CST_LT): Delete.
40218         (tree_int_cst_elt_check): New (two forms).
40219         (type_code_size): Update comment.
40220         (make_int_cst_stat, make_int_cst): New.
40221         (tree_to_double_int): Delete.
40222         (double_int_fits_to_tree_p): Delete.
40223         (force_fit_type_double): Delete.
40224         (build_int_cstu): Replace with out-of-line function.
40225         (build_int_cst_wide): Delete.
40226         (tree_int_cst_lt): Define inline.
40227         (tree_int_cst_le): New.
40228         (tree_int_cst_compare): Define inline.
40229         (tree_int_cst_min_precision): Take a signop rather than a bool.
40230         (wi::int_traits <const_tree>): New.
40231         (wi::int_traits <tree>): New.
40232         (wi::extended_tree): New.
40233         (wi::int_traits <wi::extended_tree>): New.
40234         (wi::to_widest): New.
40235         (wi::to_offset): New.
40236         (wi::fits_to_tree_p): New.
40237         (wi::min_value): New.
40238         (wi::max_value): New.
40239         * tree-inline.c (remap_gimple_op_r): Use wide-int interfaces.
40240         (copy_tree_body_r): Likewise.
40241         * tree-object-size.c (compute_object_offset): Likewise.
40242         (addr_object_size): Likewise.
40243         * tree-predcom.c: Include wide-int-print.h.
40244         (struct dref_d): Change type of offset to widest_int.
40245         (dump_dref): Call wide-int printer.
40246         (aff_combination_dr_offset): Use wide-int interfaces.
40247         (determine_offset): Take a widest_int pointer rather than a
40248         double_int pointer.
40249         (split_data_refs_to_components): Use wide-int interfaces.
40250         (suitable_component_p): Likewise.
40251         (order_drefs): Likewise.
40252         (add_ref_to_chain): Likewise.
40253         (valid_initializer_p): Likewise.
40254         (determine_roots_comp): Likewise.
40255         * tree-pretty-print.c: Include wide-int-print.h.
40256         (dump_generic_node): Use wide-int interfaces.
40257         * tree-sra.c (sra_ipa_modify_expr): Likewise.
40258         * tree-ssa-address.c (addr_for_mem_ref): Likewise.
40259         (move_fixed_address_to_symbol): Likewise.
40260         (move_hint_to_base): Likewise.
40261         (move_pointer_to_base): Likewise.
40262         (move_variant_to_index): Likewise.
40263         (most_expensive_mult_to_index): Likewise.
40264         (addr_to_parts): Likewise.
40265         (copy_ref_info): Likewise.
40266         * tree-ssa-alias.c (indirect_ref_may_alias_decl_p): Likewise.
40267         (indirect_refs_may_alias_p): Likewise.
40268         (stmt_kills_ref_p_1): Likewise.
40269         * tree-ssa.c (non_rewritable_mem_ref_base): Likewise.
40270         * tree-ssa-ccp.c: Update comment at top of file.  Include
40271         wide-int-print.h.
40272         (struct prop_value_d): Change type of mask to widest_int.
40273         (extend_mask): New function.
40274         (dump_lattice_value): Use wide-int interfaces.
40275         (get_default_value): Likewise.
40276         (set_constant_value): Likewise.
40277         (set_value_varying): Likewise.
40278         (valid_lattice_transition): Likewise.
40279         (set_lattice_value): Likewise.
40280         (value_to_double_int): Delete.
40281         (value_to_wide_int): New.
40282         (get_value_from_alignment): Use wide-int interfaces.
40283         (get_value_for_expr): Likewise.
40284         (do_dbg_cnt): Likewise.
40285         (ccp_finalize): Likewise.
40286         (ccp_lattice_meet): Likewise.
40287         (bit_value_unop_1): Use widest_ints rather than double_ints.
40288         (bit_value_binop_1): Likewise.
40289         (bit_value_unop): Use wide-int interfaces.
40290         (bit_value_binop): Likewise.
40291         (bit_value_assume_aligned): Likewise.
40292         (evaluate_stmt): Likewise.
40293         (ccp_fold_stmt): Likewise.
40294         (visit_cond_stmt): Likewise.
40295         (ccp_visit_stmt): Likewise.
40296         * tree-ssa-forwprop.c (forward_propagate_addr_expr_1): Likewise.
40297         (constant_pointer_difference): Likewise.
40298         (associate_pointerplus): Likewise.
40299         (combine_conversions): Likewise.
40300         * tree-ssa-loop.h: Include wide-int.h.
40301         (struct tree_niter_desc): Change type of max to widest_int.
40302         * tree-ssa-loop-im.c (mem_refs_may_alias_p): Use wide-int interfaces.
40303         * tree-ssa-loop-ivcanon.c (remove_exits_and_undefined_stmts): Likewise.
40304         (remove_redundant_iv_tests): Likewise.
40305         (canonicalize_loop_induction_variables): Likewise.
40306         * tree-ssa-loop-ivopts.c (alloc_iv): Likewise.
40307         (constant_multiple_of): Take a widest_int pointer instead of
40308         a double_int pointer.
40309         (get_computation_aff): Use wide-int interfaces.
40310         (ptr_difference_cost): Likewise.
40311         (difference_cost): Likewise.
40312         (get_loop_invariant_expr_id): Likewise.
40313         (get_computation_cost_at): Likewise.
40314         (iv_elimination_compare_lt): Likewise.
40315         (may_eliminate_iv): Likewise.
40316         * tree-ssa-loop-niter.h (estimated_loop_iterations): Use widest_int
40317         instead of double_int.
40318         (max_loop_iterations): Likewise.
40319         (max_stmt_executions): Likewise.
40320         (estimated_stmt_executions): Likewise.
40321         * tree-ssa-loop-niter.c: Include wide-int-print.h.
40322         (split_to_var_and_offset): Use wide-int interfaces.
40323         (determine_value_range): Likewise.
40324         (bound_difference_of_offsetted_base): Likewise.
40325         (bounds_add): Take a widest_int instead of a double_int.
40326         (number_of_iterations_ne_max): Use wide-int interfaces.
40327         (number_of_iterations_ne): Likewise.
40328         (number_of_iterations_lt_to_ne): Likewise.
40329         (assert_loop_rolls_lt): Likewise.
40330         (number_of_iterations_lt): Likewise.
40331         (number_of_iterations_le): Likewise.
40332         (number_of_iterations_cond): Likewise.
40333         (number_of_iterations_exit): Likewise.
40334         (finite_loop_p): Likewise.
40335         (derive_constant_upper_bound_assign): Likewise.
40336         (derive_constant_upper_bound): Return a widest_int.
40337         (derive_constant_upper_bound_ops): Likewise.
40338         (do_warn_aggressive_loop_optimizations): Use wide-int interfaces.
40339         (record_estimate): Take a widest_int rather than a double_int.
40340         (record_nonwrapping_iv): Use wide-int interfaces.
40341         (double_int_cmp): Delete.
40342         (wide_int_cmp): New.
40343         (bound_index): Take a widest_int rather than a double_int.
40344         (discover_iteration_bound_by_body_walk): Use wide-int interfaces.
40345         (maybe_lower_iteration_bound): Likewise.
40346         (estimate_numbers_of_iterations_loop): Likewise.
40347         (estimated_loop_iterations): Take a widest_int pointer than than
40348         a double_int pointer.
40349         (estimated_loop_iterations_int): Use wide-int interfaces.
40350         (max_loop_iterations): Take a widest_int pointer than than
40351         a double_int pointer.
40352         (max_loop_iterations_int): Use wide-int interfaces.
40353         (max_stmt_executions): Take a widest_int pointer than than
40354         a double_int pointer.
40355         (estimated_stmt_executions): Likewise.
40356         (n_of_executions_at_most): Use wide-int interfaces.
40357         (scev_probably_wraps_p): Likewise.
40358         * tree-ssa-math-opts.c (gimple_expand_builtin_pow): Update calls
40359         to real_to_integer.
40360         * tree-scalar-evolution.c (simplify_peeled_chrec): Use wide-int
40361         interfaces.
40362         * tree-ssanames.c (set_range_info): Use wide_int_refs rather than
40363         double_ints.  Adjust for trailing_wide_ints <3> representation.
40364         (set_nonzero_bits): Likewise.
40365         (get_range_info): Return wide_ints rather than double_ints.
40366         Adjust for trailing_wide_ints <3> representation.
40367         (get_nonzero_bits): Likewise.
40368         (duplicate_ssa_name_range_info): Adjust for trailing_wide_ints <3>
40369         representation.
40370         * tree-ssanames.h (struct range_info_def): Replace min, max and
40371         nonzero_bits with a trailing_wide_ints <3>.
40372         (set_range_info): Use wide_int_refs rather than double_ints.
40373         (set_nonzero_bits): Likewise.
40374         (get_range_info): Return wide_ints rather than double_ints.
40375         (get_nonzero_bits): Likewise.
40376         * tree-ssa-phiopt.c (jump_function_from_stmt): Use wide-int interfaces.
40377         * tree-ssa-pre.c (phi_translate_1): Likewise.
40378         * tree-ssa-reassoc.c (decrement_power): Use calls to real_from_integer.
40379         (acceptable_pow_call): Likewise.
40380         * tree-ssa-sccvn.c (copy_reference_ops_from_ref): Use wide-int
40381         interfaces.
40382         (vn_reference_fold_indirect): Likewise.
40383         (vn_reference_maybe_forwprop_address): Likewise.
40384         (valueize_refs_1): Likewise.
40385         * tree-ssa-structalias.c (get_constraint_for_ptr_offset): Likewise.
40386         * tree-ssa-uninit.c (is_value_included_in): Use wide-int interfaces,
40387         tree_int_cst_lt and tree_int_cst_le.
40388         * tree-streamer-in.c (unpack_ts_base_value_fields): Use wide-int
40389         interfaces.
40390         (streamer_alloc_tree): Likewise.
40391         * tree-streamer-out.c (pack_ts_int_cst_value_fields): Likewise.
40392         (streamer_write_tree_header): Likewise.
40393         (streamer_write_integer_cst): Likewise.
40394         * tree-switch-conversion.c (emit_case_bit_tests): Likewise.
40395         (build_constructors): Likewise.
40396         (array_value_type): Likewise.
40397         * tree-vect-data-refs.c (vect_prune_runtime_alias_test_list): Likewise.
40398         (vect_check_gather): Likewise.
40399         * tree-vect-generic.c (build_replicated_const): Likewise.
40400         (expand_vector_divmod): Likewise.
40401         * tree-vect-loop.c (vect_transform_loop): Likewise.
40402         * tree-vect-loop-manip.c (vect_do_peeling_for_loop_bound): Likewise.
40403         (vect_do_peeling_for_alignment): Likewise.
40404         * tree-vect-patterns.c (vect_recog_divmod_pattern): Likewise.
40405         * tree-vrp.c: Include wide-int.h.
40406         (operand_less_p): Use wide-int interfaces and tree_int_cst_lt.
40407         (extract_range_from_assert): Use wide-int interfaces.
40408         (vrp_int_const_binop): Likewise.
40409         (zero_nonzero_bits_from_vr): Take wide_int pointers rather than
40410         double_int pointers.
40411         (ranges_from_anti_range): Use wide-int interfaces.
40412         (quad_int_cmp): Delete.
40413         (quad_int_pair_sort): Likewise.
40414         (extract_range_from_binary_expr_1): Use wide-int interfaces.
40415         (extract_range_from_unary_expr_1): Likewise.
40416         (adjust_range_with_scev): Likewise.
40417         (masked_increment): Take and return wide_ints rather than double_ints.
40418         (register_edge_assert_for_2): Use wide-int interfaces.
40419         (check_array_ref): Likewise.
40420         (search_for_addr_array): Likewise.
40421         (maybe_set_nonzero_bits): Likewise.
40422         (union_ranges): Pass an integer of the correct type instead of
40423         using integer_one_node.
40424         (intersect_ranges): Likewise.
40425         (simplify_truth_ops_using_ranges): Likewise.
40426         (simplify_bit_ops_using_ranges): Use wide-int interfaces.
40427         (range_fits_type_p): Likewise.
40428         (simplify_cond_using_ranges): Likewise.  Take a signop rather than
40429         a bool.
40430         (simplify_conversion_using_ranges): Use wide-int interfaces.
40431         (simplify_float_conversion_using_ranges): Likewise.
40432         (vrp_finalize): Likewise.
40433         * value-prof.c (gimple_divmod_fixed_value_transform): Likewise.
40434         (gimple_stringops_transform): Likewise.
40435         * varasm.c (decode_addr_const): Likewise.
40436         (const_hash_1): Likewise.
40437         (const_rtx_hash_1): Likewise
40438         (output_constant): Likewise.
40439         (array_size_for_constructor): Likewise.
40440         (output_constructor_regular_field): Likewise.
40441         (output_constructor_bitfield): Likewise.
40442         * var-tracking.c (loc_cmp): Handle CONST_WIDE_INT.
40443         * mkconfig.sh: Include machmode.h to pick up BITS_PER_UNIT for
40444         GENERATOR_FILEs.
40445         * gencheck.c: Define BITS_PER_UNIT.
40446         * wide-int.cc: New.
40447         * wide-int.h: New.
40448         * wide-int-print.cc: New.
40449         * wide-int-print.h: New.
40450
40451 2014-05-06  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
40452
40453         * config/avr/avr.c (avr_can_eliminate): Mark unused argument.
40454
40455 2014-05-06  Richard Biener  <rguenther@suse.de>
40456
40457         * tree-pass.h (TODO_verify_ssa, TODO_verify_flow,
40458         TODO_verify_stmts, TODO_verify_rtl_sharing): Remove.
40459         (TODO_verify_all): Adjust.
40460         * asan.c: Remove references to TODO_verify_ssa, TODO_verify_flow,
40461         TODO_verify_stmts and TODO_verify_rtl_sharing.
40462         * bb-reorder.c: Likewise.
40463         * cfgexpand.c: Likewise.
40464         * cprop.c: Likewise.
40465         * cse.c: Likewise.
40466         * function.c: Likewise.
40467         * fwprop.c: Likewise.
40468         * gcse.c: Likewise.
40469         * gimple-ssa-isolate-paths.c: Likewise.
40470         * gimple-ssa-strength-reduction.c: Likewise.
40471         * ipa-split.c: Likewise.
40472         * loop-init.c: Likewise.
40473         * loop-unroll.c: Likewise.
40474         * lower-subreg.c: Likewise.
40475         * modulo-sched.c: Likewise.
40476         * postreload-gcse.c: Likewise.
40477         * predict.c: Likewise.
40478         * recog.c: Likewise.
40479         * sched-rgn.c: Likewise.
40480         * store-motion.c: Likewise.
40481         * tracer.c: Likewise.
40482         * trans-mem.c: Likewise.
40483         * tree-call-cdce.c: Likewise.
40484         * tree-cfg.c: Likewise.
40485         * tree-cfgcleanup.c: Likewise.
40486         * tree-complex.c: Likewise.
40487         * tree-eh.c: Likewise.
40488         * tree-emutls.c: Likewise.
40489         * tree-if-conv.c: Likewise.
40490         * tree-into-ssa.c: Likewise.
40491         * tree-loop-distribution.c: Likewise.
40492         * tree-object-size.c: Likewise.
40493         * tree-parloops.c: Likewise.
40494         * tree-pass.h: Likewise.
40495         * tree-sra.c: Likewise.
40496         * tree-ssa-ccp.c: Likewise.
40497         * tree-ssa-copy.c: Likewise.
40498         * tree-ssa-copyrename.c: Likewise.
40499         * tree-ssa-dce.c: Likewise.
40500         * tree-ssa-dom.c: Likewise.
40501         * tree-ssa-dse.c: Likewise.
40502         * tree-ssa-forwprop.c: Likewise.
40503         * tree-ssa-ifcombine.c: Likewise.
40504         * tree-ssa-loop-ch.c: Likewise.
40505         * tree-ssa-loop-ivcanon.c: Likewise.
40506         * tree-ssa-loop.c: Likewise.
40507         * tree-ssa-math-opts.c: Likewise.
40508         * tree-ssa-phiopt.c: Likewise.
40509         * tree-ssa-phiprop.c: Likewise.
40510         * tree-ssa-pre.c: Likewise.
40511         * tree-ssa-reassoc.c: Likewise.
40512         * tree-ssa-sink.c: Likewise.
40513         * tree-ssa-strlen.c: Likewise.
40514         * tree-ssa-tail-merge.c: Likewise.
40515         * tree-ssa-uncprop.c: Likewise.
40516         * tree-switch-conversion.c: Likewise.
40517         * tree-tailcall.c: Likewise.
40518         * tree-vect-generic.c: Likewise.
40519         * tree-vectorizer.c: Likewise.
40520         * tree-vrp.c: Likewise.
40521         * tsan.c: Likewise.
40522         * var-tracking.c: Likewise.
40523         * bt-load.c: Likewise.
40524         * cfgcleanup.c: Likewise.
40525         * combine-stack-adj.c: Likewise.
40526         * combine.c: Likewise.
40527         * compare-elim.c: Likewise.
40528         * config/epiphany/resolve-sw-modes.c: Likewise.
40529         * config/i386/i386.c: Likewise.
40530         * config/mips/mips.c: Likewise.
40531         * config/s390/s390.c: Likewise.
40532         * config/sh/sh_treg_combine.cc: Likewise.
40533         * config/sparc/sparc.c: Likewise.
40534         * dce.c: Likewise.
40535         * dse.c: Likewise.
40536         * final.c: Likewise.
40537         * ifcvt.c: Likewise.
40538         * mode-switching.c: Likewise.
40539         * passes.c: Likewise.
40540         * postreload.c: Likewise.
40541         * ree.c: Likewise.
40542         * reg-stack.c: Likewise.
40543         * regcprop.c: Likewise.
40544         * regrename.c: Likewise.
40545         * web.c: Likewise.
40546
40547 2014-05-06  Richard Biener  <rguenther@suse.de>
40548
40549         PR middle-end/61070
40550         * bitmap.c (debug_bitmap): Dump to stderr, not stdout.
40551         * tree-ssa-structalias.c (dump_solution_for_var): Likewise.
40552
40553 2014-05-05  Jan Hubicka  <hubicka@ucw.cz>
40554
40555         PR ipa/60965
40556         * ipa-devirt.c (get_class_context): Allow POD to change to non-POD.
40557
40558 2014-05-05  Radovan Obradovic  <robradovic@mips.com>
40559             Tom de Vries  <tom@codesourcery.com>
40560
40561         * target.def (call_fusage_contains_non_callee_clobbers): New
40562         DEFHOOKPOD.
40563         * doc/tm.texi.in (@node Stack and Calling): Add Miscellaneous Register
40564         Hooks to @menu.
40565         (@node Miscellaneous Register Hooks): New node.
40566         (@hook TARGET_CALL_FUSAGE_CONTAINS_NON_CALLEE_CLOBBERS): New hook.
40567         * doc/tm.texi: Regenerate.
40568
40569 2014-05-05  Marek Polacek  <polacek@redhat.com>
40570
40571         PR driver/61065
40572         * opts.c (common_handle_option): Call error_at instead of warning_at.
40573
40574 2014-05-05  Richard Biener  <rguenther@suse.de>
40575
40576         * passes.c (execute_function_todo): Don't reset TODO_verify_ssa
40577         from last_verified if update_ssa ran.  Move TODO_verify_rtl_sharing
40578         under the TODO_verify_il umbrella.
40579
40580 2014-05-05  Richard Biener  <rguenther@suse.de>
40581
40582         * passes.c (execute_function_todo): Move TODO_verify_flow under
40583         the TODO_verify_ul umbrella.
40584
40585 2014-05-05  Richard Biener  <rguenther@suse.de>
40586
40587         PR middle-end/61010
40588         * fold-const.c (fold_binary_loc): Consistently avoid canonicalizing
40589         X & CST away from a CST that is the mask of a mode.
40590
40591 2014-05-05  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
40592
40593         * config/picochip/picochip-protos.h (picochip_regno_nregs): Change
40594         int argument to enum machine_mode.
40595         (picochip_class_max_nregs): Ditto.
40596         * config/picochip/picochip.c (picochip_regno_nregs): Ditto.
40597         (picochip_class_max_nregs): Ditto.
40598
40599 2014-05-05  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
40600
40601         * target.def: Add new target hook.
40602         * doc/tm.texi: Regenerate.
40603         * targhooks.h (default_keep_leaf_when_profiled): Add prototype.
40604         * targhooks.c (default_keep_leaf_when_profiled): New function.
40605
40606         * config/s390/s390.c (s390_keep_leaf_when_profiled): New function.
40607         (TARGET_KEEP_LEAF_WHEN_PROFILED): Define.
40608
40609 2014-05-05  Bin Cheng  <bin.cheng@arm.com>
40610
40611         PR tree-optimization/60363
40612         * gcc/tree-ssa-threadupdate.c (get_value_locus_in_path): New.
40613         (copy_phi_args): New parameters.  Call get_value_locus_in_path.
40614         (update_destination_phis): New parameter.
40615         (create_edge_and_update_destination_phis): Ditto.
40616         (ssa_fix_duplicate_block_edges): Pass new arguments.
40617         (thread_single_edge): Ditto.
40618
40619 2014-05-04  Peter Bergner  <bergner@vnet.ibm.com>
40620
40621         * config/rs6000/rs6000.h (RS6000_BTM_HARD_FLOAT): New define.
40622         (RS6000_BTM_COMMON): Add RS6000_BTM_HARD_FLOAT.
40623         (TARGET_EXTRA_BUILTINS): Add TARGET_HARD_FLOAT.
40624         * config/rs6000/rs6000-builtin.def (BU_MISC_1):
40625         Use RS6000_BTM_HARD_FLOAT.
40626         (BU_MISC_2): Likewise.
40627         * config/rs6000/rs6000.c (rs6000_builtin_mask_calculate): Handle
40628         RS6000_BTM_HARD_FLOAT.
40629         (rs6000_option_override_internal): Enforce -mhard-float if -mhard-dfp
40630         is explicitly used.
40631         (rs6000_invalid_builtin): Add hard floating builtin support.
40632         (rs6000_expand_builtin): Relax the gcc_assert to allow the new
40633         hard float builtins.
40634         (rs6000_builtin_mask_names): Add RS6000_BTM_HARD_FLOAT.
40635
40636 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40637
40638         * config/sh/sh_optimize_sett_clrt.cc (sh_optimize_sett_clrt::execute):
40639         Add missing function* argument.
40640
40641 2014-05-03  Richard Sandiford  <rdsandiford@googlemail.com>
40642
40643         * lra-constraints.c (valid_address_p): Move earlier in file.
40644         Add a constraint argument to the address_info version.
40645         (satisfies_memory_constraint_p): New function.
40646         (satisfies_address_constraint_p): Likewise.
40647         (process_alt_operands, curr_insn_transform): Use them.
40648         (process_address): Pass the constraint to valid_address_p when
40649         checking address operands.
40650
40651 2014-05-03  Richard Sandiford  <rdsandiford@googlemail.com>
40652
40653         * config/mips/mips.c (mips_isa_rev): New variable.
40654         (mips_set_architecture): Set it.
40655         * config/mips/mips.h (TARGET_CPU_CPP_BUILTINS): Set __mips_isa_rev
40656         from mips_isa_rev.
40657         (ISA_HAS_MUL3, ISA_HAS_FP_CONDMOVE, ISA_HAS_8CC, ISA_HAS_FP4)
40658         (ISA_HAS_PAIRED_SINGLE, ISA_HAS_MADD_MSUB, ISA_HAS_FP_RECIP_RSQRT)
40659         (ISA_HAS_CLZ_CLO, ISA_HAS_ROR, ISA_HAS_WSBH, ISA_HAS_PREFETCH)
40660         (ISA_HAS_SEB_SEH, ISA_HAS_EXT_INS, ISA_HAS_MXHC1)
40661         (ISA_HAS_HILO_INTERLOCKS, ISA_HAS_SYNCI, MIN_FPRS_PER_FMT): Reexpress
40662         conditions in terms of mips_isa_rev.
40663         (mips_isa_rev): Declare.
40664
40665 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40666
40667         * config/sh/sh-mem.cc: Use tabs instead of spaces.
40668         (prob_unlikely, prob_likely): Make variables const.
40669
40670 2014-05-03  Denis Chertykov  <chertykov@gmail.com>
40671
40672         * config/avr/avr.c (avr_adjust_insn_length): Handle JUMP_TABLE_DATA.
40673
40674 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40675
40676         * config/sh/sh.h (SH_ASM_SPEC): Handle m1, m2*, m3* and m4* cases.
40677
40678 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40679
40680         * config/sh/sh.h (ROUND_ADVANCE): Delete macro.
40681         (ROUND_REG, PASS_IN_REG_P): Move and rename macros to ...
40682         * config/sh/sh.c (sh_round_reg, sh_pass_in_reg_p): ... these new
40683         functions.
40684         (sh_arg_partial_bytes, sh_function_arg, sh_function_arg_advance,
40685         sh_setup_incoming_varargs): Replace usage of PASS_IN_REG_P with
40686         sh_pass_in_reg_p.
40687         Replace usage of ROUND_REG with sh_round_reg.
40688         Use CEIL instead of ROUND_ADVANCE.
40689
40690 2014-05-03  Oleg Endo  <olegendo@gcc.gnu.org>
40691
40692         PR target/61026
40693         * config/sh/sh.c: Include stdlib headers before everything else.
40694
40695 2014-05-02  Jakub Jelinek  <jakub@redhat.com>
40696
40697         * gimplify.c (gimplify_adjust_omp_clauses_1): Handle
40698         GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE.
40699         (gimplify_adjust_omp_clauses): Simd region is never
40700         directly nested in combined parallel.  Instead, for linear
40701         with copyin/copyout, if in combined for simd loop, make decl
40702         firstprivate/lastprivate on OMP_FOR.
40703         * omp-low.c (expand_omp_for_generic, expand_omp_for_static_nochunk,
40704         expand_omp_for_static_chunk): When setting endvar, also set
40705         fd->loop.v to the same value.
40706
40707 2014-05-02  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
40708
40709         * hwint.h (zext_hwi): Fix signed overflow for prec == 63.
40710
40711 2014-05-02  Alan Lawrence  <alan.lawrence@arm.com>
40712
40713         * config/aarch64/aarch64.c (aarch64_expand_vec_perm_1): Tidy bit-flip
40714         expression.
40715
40716 2014-05-02  Marek Polacek  <polacek@redhat.com>
40717
40718         * doc/invoke.texi: Describe -fsanitize=float-divide-by-zero.
40719
40720 2014-05-02  Kito Cheng  <kito@0xlab.org>
40721
40722         * defaults.h (HONOR_REG_ALLOC_ORDER): Change HONOR_REG_ALLOC_ORDER
40723         to a C expression marco.
40724         * ira-color.c (HONOR_REG_ALLOC_ORDER) : Ditto.
40725         * config/arm/arm.h (HONOR_REG_ALLOC_ORDER): Ditto.
40726         * config/nds32/nds32.h (HONOR_REG_ALLOC_ORDER): Ditto.
40727         * doc/tm.texi (HONOR_REG_ALLOC_ORDER): Update document for
40728         HONOR_REG_ALLOC_ORDER.
40729         * doc/tm.texi.in (HONOR_REG_ALLOC_ORDER): Ditto.
40730
40731 2014-05-01  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
40732
40733         * config/arc/arc.c (TARGET_LRA_P): Undef before redefine.
40734
40735 2014-05-01  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
40736
40737         * config/arc/arc.c (arc_select_cc_mode): Fix typo.
40738
40739 2014-05-01  Yuri Rumyantsev  <ysrumyan@gmail.com>
40740
40741         * tree-if-conv.c (is_cond_scalar_reduction): New function.
40742         (convert_scalar_cond_reduction): Likewise.
40743         (predicate_scalar_phi): Add recognition and transformation
40744         of simple conditioanl reduction to be vectorizable.
40745
40746 2014-05-01  Marek Polacek  <polacek@redhat.com>
40747
40748         PR c/43245
40749         * doc/invoke.texi: Document -Wdiscarded-qualifiers.
40750
40751 2014-04-30  Alan Lawrence  <alan.lawrence@arm.com>
40752
40753         * config/aarch64/arm_neon.h (vuzp1_f32, vuzp1_p8, vuzp1_p16, vuzp1_s8,
40754         vuzp1_s16, vuzp1_s32, vuzp1_u8, vuzp1_u16, vuzp1_u32, vuzp1q_f32,
40755         vuzp1q_f64, vuzp1q_p8, vuzp1q_p16, vuzp1q_s8, vuzp1q_s16, vuzp1q_s32,
40756         vuzp1q_s64, vuzp1q_u8, vuzp1q_u16, vuzp1q_u32, vuzp1q_u64, vuzp2_f32,
40757         vuzp2_p8, vuzp2_p16, vuzp2_s8, vuzp2_s16, vuzp2_s32, vuzp2_u8,
40758         vuzp2_u16, vuzp2_u32, vuzp2q_f32, vuzp2q_f64, vuzp2q_p8, vuzp2q_p16,
40759         vuzp2q_s8, vuzp2q_s16, vuzp2q_s32, vuzp2q_s64, vuzp2q_u8, vuzp2q_u16,
40760         vuzp2q_u32, vuzp2q_u64): Replace temporary asm with __builtin_shuffle.
40761
40762 2014-04-30  Joern Rennecke  <joern.rennecke@embecosm.com>
40763
40764         * config/arc/arc.opt (mlra): Move comment above option name
40765         to avoid mis-parsing as language options.
40766
40767 2014-04-30  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
40768
40769         * config/sol2-10.h (TARGET_LIBC_HAS_FUNCTION): Move ...
40770         * config/sol2.h: ... here.
40771         * config/sol2-10.h: Remove.
40772
40773         * config/sol2-bi.h (WCHAR_TYPE, WCHAR_TYPE_SIZE, WINT_TYPE)
40774         (WINT_TYPE_SIZE, MULTILIB_DEFAULTS, DEF_ARCH32_SPEC)
40775         (DEF_ARCH64_SPEC, ASM_CPU_DEFAULT_SPEC, LINK_ARCH64_SPEC_BASE)
40776         (LINK_ARCH64_SPEC, ARCH_DEFAULT_EMULATION, TARGET_LD_EMULATION)
40777         (LINK_ARCH_SPEC, SUBTARGET_EXTRA_SPECS): Move ...
40778         * config/sol2.h: ... here.
40779         (SECTION_NAME_FORMAT): Don't redefine.
40780         (STARTFILE_ARCH32_SPEC): Rename to ...
40781         (STARTFILE_ARCH_SPEC): ... this.
40782         (ASM_OUTPUT_ALIGNED_COMMON): Move ...
40783         * config/sparc/sol2.h: ... here.
40784         (SECTION_NAME_FORMAT): Don't undef.
40785         * config/i386/sol2.h (ASM_CPU_DEFAULT_SPEC)
40786         (SUBTARGET_EXTRA_SPECS): Remove.
40787         * config/sparc/sol2.h (ASM_CPU_DEFAULT_SPEC): Remove.
40788
40789         * config/i386/sol2-bi.h (TARGET_SUBTARGET_DEFAULT)
40790         (MD_STARTFILE_PREFIX): Remove.
40791         (SUBTARGET_OPTIMIZATION_OPTIONS, ASM_CPU32_DEFAULT_SPEC)
40792         (ASM_CPU64_DEFAULT_SPEC, ASM_CPU_SPEC, ASM_SPEC, DEFAULT_ARCH32_P)
40793         (ARCH64_SUBDIR, ARCH32_EMULATION, ARCH64_EMULATION)
40794         (ASM_COMMENT_START, JUMP_TABLES_IN_TEXT_SECTION)
40795         (ASM_OUTPUT_DWARF_PCREL, ASM_OUTPUT_ALIGNED_COMMON)
40796         (USE_IX86_FRAME_POINTER, USE_X86_64_FRAME_POINTER): Move ...
40797         * config/i386/sol2.h: ... here.
40798         (TARGET_SUBTARGET_DEFAULT, SIZE_TYPE, PTRDIFF_TYPE): Remove.
40799         * config/i386/sol2-bi.h: Remove.
40800         * config/sol2.h (MD_STARTFILE_PREFIX): Remove.
40801         (LINK_ARCH32_SPEC_BASE): Remove /usr/ccs/lib/libp, /usr/ccs/lib.
40802
40803         * config/i386/t-sol2-64: Rename to ...
40804         * config/i386/t-sol2: ... this.
40805         * config/sparc/t-sol2-64: Rename to ...
40806         * config/sparc/t-sol2: ... this.
40807
40808         * config.gcc (*-*-solaris2*): Split sol2_tm_file into
40809         sol2_tm_file_head, sol2_tm_file_tail.
40810         Include ${cpu_type}/sol2.h before sol2.h.
40811         Remove sol2-10.h.
40812         (i[34567]86-*-solaris2* | x86_64-*-solaris2.1[0-9]*): Include
40813         i386/x86-64.h between sol2_tm_file_head and sol2_tm_file_tail.
40814         Remove i386/sol2-bi.h, sol2-bi.h from tm_file.
40815         Reflect i386/t-sol2-64 renaming.
40816         (sparc*-*-solaris2*): Remove sol2-bi.h from tm_file.
40817         Reflect sparc/t-sol2-64 renaming.
40818
40819 2014-04-30  Richard Biener  <rguenther@suse.de>
40820
40821         * passes.c (execute_function_todo): Move TODO_verify_stmts
40822         and TODO_verify_ssa under the TODO_verify_il umbrella.
40823         * tree-ssa.h (verify_ssa): Adjust prototype.
40824         * tree-ssa.c (verify_ssa): Add parameter to tell whether
40825         we should verify SSA operands.
40826         * tree-cfg.h (verify_gimple_in_cfg): Adjust prototype.
40827         * tree-cfg.c (verify_gimple_in_cfg): Add parameter to tell
40828         whether we should verify whether not throwing stmts have EH info.
40829         * graphite-scop-detection.c (create_sese_edges): Adjust.
40830         * tree-ssa-loop-manip.c (verify_loop_closed_ssa): Likewise.
40831         * tree-eh.c (lower_try_finally_switch): Do not add the
40832         default case label twice.
40833
40834 2014-04-30  Marek Polacek  <polacek@redhat.com>
40835
40836         * gcc.c (sanitize_spec_function): Handle SANITIZE_FLOAT_DIVIDE.
40837         * builtins.def: Initialize builtins even for SANITIZE_FLOAT_DIVIDE.
40838         * flag-types.h (enum sanitize_code): Add SANITIZE_FLOAT_DIVIDE.
40839         * opts.c (common_handle_option): Add -fsanitize=float-divide-by-zero.
40840
40841 2014-04-29  Alan Lawrence  <alan.lawrence@arm.com>
40842
40843         * config/aarch64/arm_neon.h (vzip1_f32, vzip1_p8, vzip1_p16, vzip1_s8,
40844         vzip1_s16, vzip1_s32, vzip1_u8, vzip1_u16, vzip1_u32, vzip1q_f32,
40845         vzip1q_f64, vzip1q_p8, vzip1q_p16, vzip1q_s8, vzip1q_s16, vzip1q_s32,
40846         vzip1q_s64, vzip1q_u8, vzip1q_u16, vzip1q_u32, vzip1q_u64, vzip2_f32,
40847         vzip2_p8, vzip2_p16, vzip2_s8, vzip2_s16, vzip2_s32, vzip2_u8,
40848         vzip2_u16, vzip2_u32, vzip2q_f32, vzip2q_f64, vzip2q_p8, vzip2q_p16,
40849         vzip2q_s8, vzip2q_s16, vzip2q_s32, vzip2q_s64, vzip2q_u8, vzip2q_u16,
40850         vzip2q_u32, vzip2q_u64): Replace inline __asm__ with __builtin_shuffle.
40851
40852 2014-04-29  David Malcolm  <dmalcolm@redhat.com>
40853
40854         * tree-cfg.c (dump_function_to_file): Dump the return type of
40855         functions, in a line to itself before the function body, mimicking
40856         the layout of a C function.
40857
40858 2014-04-29  Jakub Jelinek  <jakub@redhat.com>
40859
40860         PR tree-optimization/60971
40861         * tree-tailcall.c (process_assignment): Reject conversions which
40862         reduce precision.
40863
40864 2014-04-29  James Greenhalgh  <james.greenhalgh@arm.com>
40865
40866         * calls.c (initialize_argument_information): Always treat
40867         PUSH_ARGS_REVERSED as 1, simplify code accordingly.
40868         (expand_call): Likewise.
40869         (emit_library_call_calue_1): Likewise.
40870         * expr.c (PUSH_ARGS_REVERSED): Do not define.
40871         (emit_push_insn): Always treat PUSH_ARGS_REVERSED as 1, simplify
40872         code accordingly.
40873
40874 2014-04-29  Nick Clifton  <nickc@redhat.com>
40875
40876         * config/msp430/msp430.md (umulsidi): Fix typo.
40877         (mulhisi3): Enable even inside interrupt handlers.
40878         * config/msp430/msp430.c (msp430_print_operand): %O: Allow for the
40879         bigger return address pushed in large mode.
40880
40881 2014-04-29  Nick Clifton  <nickc@redhat.com>
40882
40883         * config/arc/arc.c (arc_select_cc_mode): Fix parentheses.
40884         (arc_init_reg_tables): Use a machine_mode enum to iterate over
40885         available modes.
40886         * config/m32r/m32r.c (init_reg_tables): Likewise.
40887         * config/m32c/m32c.c (m32c_illegal_subreg_p): Use a machine_mode
40888         enum to hold the modes.
40889
40890 2014-04-29  Richard Biener  <rguenther@suse.de>
40891
40892         * dominance.c (free_dominance_info): Add overload with
40893         function parameter.
40894         (dom_info_state): Likewise.
40895         (dom_info_available_p): Likewise.
40896         * basic-block.h (free_dominance_info, dom_info_state,
40897         dom_info_available_p): Declare overloads.
40898         * passes.c (execute_function_todo): Verify that verifiers
40899         don't change dominator info state.  Drop dominator info
40900         for IPA pass invocations.
40901         * cgraph.c (release_function_body): Restore asserts that
40902         dominator information is released.
40903
40904 2014-04-29  Patrick Palka  <patrick@parcs.ath.cx>
40905
40906         * doc/invoke.texi: Fix typo.
40907         * tree-vrp.c: Fix typos.
40908         * gimple.c (infer_nonnull_range): Reorder operands of an && condition.
40909
40910 2014-04-29  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
40911
40912         * config/aarch64/aarch64.md (mov<mode>cc): New for GPF.
40913
40914 2014-04-28  James Greenhalgh  <james.greenhalgh@arm.com>
40915
40916         * config/aarch64/aarch64-builtins.c
40917         (aarch64_types_storestruct_lane_qualifiers): New.
40918         (TYPES_STORESTRUCT_LANE): Likewise.
40919         * config/aarch64/aarch64-simd-builtins.def (st2_lane): New.
40920         (st3_lane): Likewise.
40921         (st4_lane): Likewise.
40922         * config/aarch64/aarch64-simd.md (vec_store_lanesoi_lane<mode>): New.
40923         (vec_store_lanesci_lane<mode>): Likewise.
40924         (vec_store_lanesxi_lane<mode>): Likewise.
40925         (aarch64_st2_lane<VQ:mode>): Likewise.
40926         (aarch64_st3_lane<VQ:mode>): Likewise.
40927         (aarch64_st4_lane<VQ:mode>): Likewise.
40928         * config/aarch64/aarch64.md (unspec): Add UNSPEC_ST{2,3,4}_LANE.
40929         * config/aarch64/arm_neon.h
40930         (__ST2_LANE_FUNC): Rewrite using builtins, update use points to
40931         use new macro arguments.
40932         (__ST3_LANE_FUNC): Likewise.
40933         (__ST4_LANE_FUNC): Likewise.
40934         * config/aarch64/iterators.md (V_TWO_ELEM): New.
40935         (V_THREE_ELEM): Likewise.
40936         (V_FOUR_ELEM): Likewise.
40937
40938 2014-04-28  David Malcolm  <dmalcolm@redhat.com>
40939
40940         * doc/gimple.texi: Replace the description of the now-defunct
40941         union gimple_statement_d with a diagram showing the
40942         gimple_statement_base class hierarchy and its relationships to
40943         the GSS_ and GIMPLE_ enums.
40944
40945 2014-04-28  James Greenhalgh  <james.greenhalgh@arm.com>
40946
40947         * config/aarch64/aarch64-protos.h (aarch64_modes_tieable_p): New.
40948         * config/aarch64/aarch64.c
40949         (aarch64_cannot_change_mode_class): Weaken conditions.
40950         (aarch64_modes_tieable_p): New.
40951         * config/aarch64/aarch64.h (MODES_TIEABLE_P): Use it.
40952
40953 2014-04-28  Pat Haugen  <pthaugen@us.ibm.com>
40954
40955         * config/rs6000/sync.md (AINT mode_iterator): Move definition.
40956         (loadsync_<mode>): Change mode.
40957         (load_quadpti, store_quadpti): New.
40958         (atomic_load<mode>, atomic_store<mode>): Add support for TI mode.
40959         * config/rs6000/rs6000.md (unspec enum): Add UNSPEC_LSQ.
40960
40961 2014-04-28  Martin Jambor  <mjambor@suse.cz>
40962
40963         * tree-sra.c (sra_modify_expr): Generate new memory accesses with
40964         same alias type as the original statement.
40965         (subreplacement_assignment_data): New type.
40966         (handle_unscalarized_data_in_subtree): New type of parameter,
40967         generate new memory accesses with same alias type as the original
40968         statement.
40969         (load_assign_lhs_subreplacements): Likewise.
40970         (sra_modify_constructor_assign): Generate new memory accesses with
40971         same alias type as the original statement.
40972
40973 2014-04-28  Richard Biener  <rguenther@suse.de>
40974
40975         * tree-pass.h (TODO_verify_il): Define.
40976         (TODO_verify_all): Complete properly.
40977         * passes.c (execute_function_todo): Move existing loop-closed
40978         SSA verification under TODO_verify_il.
40979         (execute_one_pass): Trigger TODO_verify_il at todo-after time.
40980         * graphite-sese-to-poly.c (rewrite_cross_bb_scalar_deps):
40981         Fix tree sharing issue.
40982
40983 2014-04-28  Richard Biener  <rguenther@suse.de>
40984
40985         PR middle-end/60092
40986         * builtins.def (DEF_C11_BUILTIN): Add.
40987         (BUILT_IN_ALIGNED_ALLOC): Likewise.
40988         * coretypes.h (enum function_class): Add function_c11_misc.
40989         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Handle
40990         BUILT_IN_ALIGNED_ALLOC like BUILT_IN_MALLOC.
40991         (call_may_clobber_ref_p_1): Likewise.
40992         * tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Likewise.
40993         (mark_all_reaching_defs_necessary_1): Likewise.
40994         (propagate_necessity): Likewise.
40995         (eliminate_unnecessary_stmts): Likewise.
40996         * tree-ssa-ccp.c (evaluate_stmt): Handle BUILT_IN_ALIGNED_ALLOC.
40997
40998 2014-04-28  Richard Biener  <rguenther@suse.de>
40999
41000         * tree-vrp.c (vrp_var_may_overflow): Remove.
41001         (vrp_visit_phi_node): Rather than bumping to +-INF possibly
41002         with overflow immediately bump to one before that value and
41003         let iteration figure out overflow status.
41004
41005 2014-04-28  Richard Biener  <rguenther@suse.de>
41006
41007         * configure.ac: Do valgrind header checks unconditionally.
41008         Add --enable-valgrind-annotations.
41009         * system.h: Guard valgrind header inclusion with
41010         ENABLE_VALGRIND_ANNOTATIONS instead of ENABLE_VALGRIND_CHECKING.
41011         * alloc-pool.c (pool_alloc, pool_free): Use
41012         ENABLE_VALGRIND_ANNOTATIONS instead of ENABLE_VALGRIND_CHECKING
41013         to guard possibly dead code.
41014         * config.in: Regenerated.
41015         * configure: Likewise.
41016
41017 2014-04-28  Jeff Law  <law@redhat.com>
41018
41019         PR tree-optimization/60902
41020         * tree-ssa-threadedge.c
41021         (record_temporary_equivalences_from_stmts_at_dest): Only iterate
41022         over real defs when invalidating outputs from statements that do not
41023         produce useful outputs for threading.
41024
41025 2014-04-28  Richard Biener  <rguenther@suse.de>
41026
41027         PR tree-optimization/60979
41028         * graphite-scop-detection.c (scopdet_basic_block_info): Reject
41029         SCOPs that end in a block with a successor with abnormal
41030         predecessors.
41031
41032 2014-04-28  Richard Biener  <rguenther@suse.de>
41033
41034         * tree-pass.h (execute_pass_list): Adjust prototype.
41035         * passes.c (pass_manager::execute_early_local_passes): Adjust.
41036         (do_per_function): Change callback signature, push all actual
41037         work to the callbals.
41038         (do_per_function_toporder): Likewise.
41039         (execute_function_dump): Adjust.
41040         (execute_function_todo): Likewise.
41041         (clear_last_verified): Likewise.
41042         (verify_curr_properties): Likewise.
41043         (update_properties_after_pass): Likewise.
41044         (execute_pass_list_1): Split out from ...
41045         (execute_pass_list): ... here.  Adjust.
41046         (execute_ipa_pass_list): Likewise.
41047         * cgraphunit.c (cgraph_add_new_function): Adjust.
41048         (analyze_function): Likewise.
41049         (expand_function): Likewise.
41050         * cgraph.c (release_function_body): Free dominance info
41051         here instead of asserting it was magically freed elsewhere.
41052
41053 2014-04-28  Eric Botcazou  <ebotcazou@adacore.com>
41054
41055         * configure.ac: Tweak GAS check for LEON instructions on SPARC.
41056         * configure: Regenerate.
41057         * config/sparc/sparc.opt (muser-mode): New option.
41058         * config/sparc/sync.md (atomic_compare_and_swap<mode>_1): Do not enable
41059         for LEON3.
41060         (atomic_compare_and_swap_leon3_1): New instruction for LEON3.
41061         * doc/invoke.texi (SPARC options): Document -muser-mode.
41062
41063 2014-04-27  Richard Sandiford  <rdsandiford@googlemail.com>
41064
41065         * cselib.c (find_slot_memmode): Delete.
41066         (cselib_hasher): Change compare_type to a struct.
41067         (cselib_hasher::equal): Update accordingly.  Don't expect wrapped
41068         constants.
41069         (preserve_constants_and_equivs): Adjust for new compare_type.
41070         (cselib_find_slot): Likewise.  Take the mode of the rtx as argument.
41071         (wrap_constant): Delete.
41072         (cselib_lookup_mem, cselib_lookup_1): Update calls to cselib_find_slot.
41073
41074 2014-04-26  Markus Trippelsdorf  <markus@trippelsdorf.de>
41075
41076         * doc/install.texi (Building with profile feedback): Remove
41077         outdated sentence.
41078
41079 2014-04-26  Tom de Vries  <tom@codesourcery.com>
41080
41081         * config/i386/i386.md (define_expand "ldexpxf3"): Fix out-of-bounds
41082         array accesses.
41083
41084 2014-04-25  Cary Coutant  <ccoutant@google.com>
41085
41086         PR debug/60929
41087         * dwarf2out.c (should_move_die_to_comdat): A type definition
41088         can contain a subprogram definition, but don't move it to a
41089         comdat unit.
41090         (clone_as_declaration): Copy DW_AT_abstract_origin attribute.
41091         (generate_skeleton_bottom_up): Remove DW_AT_object_pointer attribute
41092         from original DIE.
41093         (clone_tree_hash): Rename to...
41094         (clone_tree_partial): ...this; change callers.  Copy
41095         DW_TAG_subprogram DIEs as declarations.
41096         (copy_decls_walk): Don't copy children of a declaration into a
41097         type unit.
41098
41099 2014-04-25  H.J. Lu  <hongjiu.lu@intel.com>
41100
41101         PR target/60969
41102         * config/i386/i386.md (*movsf_internal): Set MODE to SI for
41103         alternative 12.
41104
41105 2014-04-25  Jiong Wang  <jiong.wang@arm.com>
41106
41107         * config/arm/predicates.md (call_insn_operand): Add long_call check.
41108         * config/arm/arm.md (sibcall, sibcall_value): Force the address to
41109         reg for long_call.
41110         * config/arm/arm.c (arm_function_ok_for_sibcall): Remove long_call
41111         restriction.
41112
41113 2014-04-25  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41114
41115         * config/arm/arm.c (arm_cortex_a8_tune): Initialise T16-related fields.
41116
41117 2014-04-25  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
41118
41119         PR tree-optimization/60930
41120         * gimple-ssa-strength-reduction.c (create_mul_imm_cand):  Reject
41121         creating a multiply candidate by folding two constant
41122         multiplicands when the result overflows.
41123
41124 2014-04-25  Jakub Jelinek  <jakub@redhat.com>
41125
41126         PR tree-optimization/60960
41127         * tree-vect-generic.c (expand_vector_operation): Only call
41128         expand_vector_divmod if type's mode satisfies VECTOR_MODE_P.
41129
41130 2014-04-25  Tom de Vries  <tom@codesourcery.com>
41131
41132         * expr.c (clobber_reg_mode): New function.
41133         * expr.h (clobber_reg): New function.
41134
41135 2014-04-25  Tom de Vries  <tom@codesourcery.com>
41136
41137         * rtlanal.c (find_all_hard_reg_sets): Note INSN_CALL_FUNCTION_USAGE
41138         clobbers.
41139
41140 2014-04-25  Radovan Obradovic  <robradovic@mips.com>
41141             Tom de Vries  <tom@codesourcery.com>
41142
41143         * rtlanal.c (find_all_hard_reg_sets): Add bool implicit parameter and
41144         handle.
41145         * rtl.h (find_all_hard_reg_sets): Add bool parameter.
41146         * haifa-sched.c (recompute_todo_spec, check_clobbered_conditions): Add
41147         new argument to find_all_hard_reg_sets call.
41148
41149 2014-04-25  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41150
41151         * config/arm/aarch-common.c (aarch_rev16_shright_mask_imm_p):
41152         Use HOST_WIDE_INT_C for mask literal.
41153         (aarch_rev16_shleft_mask_imm_p): Likewise.
41154
41155 2014-04-25  Eric Botcazou  <ebotcazou@adacore.com>
41156
41157         PR target/60941
41158         * config/sparc/sparc.md (ashlsi3_extend): Delete.
41159
41160 2014-04-25  Marc Glisse  <marc.glisse@inria.fr>
41161
41162         PR preprocessor/56540
41163         * config/i386/i386-c.c (ix86_target_macros): Define
41164         __SIZEOF_FLOAT80__ and __SIZEOF_FLOAT128__.
41165
41166 2014-04-25  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
41167
41168         * configure.ac (tga_func): Remove.
41169         (LIB_TLS_SPEC): Remove.
41170         * configure: Regenerate.
41171         * config.in: Regenerate.
41172         * config/sol2.h (LIB_SPEC): Don't use LIB_TLS_SPEC.
41173
41174 2014-04-25  Richard Biener  <rguenther@suse.de>
41175
41176         PR ipa/60912
41177         * tree-ssa-structalias.c (ipa_pta_execute): Compute direct
41178         call stmt use/clobber sets during stmt walk instead of
41179         walking the possibly incomplete set of caller edges.
41180
41181 2014-04-25  Richard Biener  <rguenther@suse.de>
41182
41183         PR ipa/60911
41184         * passes.c (apply_ipa_transforms): Inline into only caller ...
41185         (execute_one_pass): ... here.  Properly bring in function
41186         bodies for nodes we want to apply IPA transforms to.
41187
41188 2014-04-24  Cong Hou  <congh@google.com>
41189
41190         PR tree-optimization/60896
41191         * tree-vect-patterns.c (vect_recog_dot_prod_pattern): Pick up
41192         all statements in PATTERN_DEF_SEQ in recognized widen-mult pattern.
41193         (vect_mark_pattern_stmts): Set the def type of all statements in
41194         PATTERN_DEF_SEQ as vect_internal_def.
41195
41196 2014-04-24  Michael Meissner  <meissner@linux.vnet.ibm.com>
41197
41198         * doc/extend.texi (PowerPC Built-in Functions): Document new
41199         powerpc extended divide, bcd, pack/unpack 128-bit, builtin functions.
41200         (PowerPC AltiVec/VSX Built-in Functions): Likewise.
41201
41202         * config/rs6000/predicates.md (const_0_to_3_operand): New
41203         predicate to match 0..3 integer constants.
41204
41205         * config/rs6000/rs6000-builtin.def (BU_DFP_MISC_1): Add new macros
41206         to support adding miscellaneous builtin functions.
41207         (BU_DFP_MISC_2): Likewise.
41208         (BU_P7_MISC_1): Likewise.
41209         (BU_P7_MISC_2): Likewise.
41210         (BU_P8V_MISC_3): Likewise.
41211         (BU_MISC_1): Likewise.
41212         (BU_MISC_2): Likewise.
41213         (DIVWE): Add extended divide builtin functions.
41214         (DIVWEO): Likewise.
41215         (DIVWEU): Likewise.
41216         (DIVWEUO): Likewise.
41217         (DIVDE): Likewise.
41218         (DIVDEO): Likewise.
41219         (DIVDEU): Likewise.
41220         (DIVDEUO): Likewise.
41221         (DXEX): Add decimal floating-point builtin functions.
41222         (DXEXQ): Likewise.
41223         (DDEDPD): Likewise.
41224         (DDEDPDQ): Likewise.
41225         (DENBCD): Likewise.
41226         (DENBCDQ): Likewise.
41227         (DIEX): Likewise.
41228         (DIEXQ): Likewise.
41229         (DSCLI): Likewise.
41230         (DSCLIQ): Likewise.
41231         (DSCRI): Likewise.
41232         (DSCRIQ): Likewise.
41233         (CDTBCD): Add new BCD builtin functions.
41234         (CBCDTD): Likewise.
41235         (ADDG6S): Likewise.
41236         (BCDADD): Likewise.
41237         (BCDADD_LT): Likewise.
41238         (BCDADD_EQ): Likewise.
41239         (BCDADD_GT): Likewise.
41240         (BCDADD_OV): Likewise.
41241         (BCDSUB): Likewise.
41242         (BCDSUB_LT): Likewise.
41243         (BCDSUB_EQ): Likewise.
41244         (BCDSUB_GT): Likewise.
41245         (BCDSUB_OV): Likewise.
41246         (PACK_TD): Add new pack/unpack 128-bit type builtin functions.
41247         (UNPACK_TD): Likewise.
41248         (PACK_TF): Likewise.
41249         (UNPACK_TF): Likewise.
41250         (UNPACK_TF_0): Likewise.
41251         (UNPACK_TF_1): Likewise.
41252         (PACK_V1TI): Likewise.
41253         (UNPACK_V1TI): Likewise.
41254
41255         * config/rs6000/rs6000.c (rs6000_builtin_mask_calculate): Add
41256         support for decimal floating point builtin functions.
41257         (rs6000_expand_ternop_builtin): Add checks for the new builtin
41258         functions that take constant arguments.
41259         (rs6000_invalid_builtin): Add decimal floating point builtin support.
41260         (rs6000_init_builtins): Setup long double, _Decimal64, and
41261         _Decimal128 types for new builtin functions.
41262         (builtin_function_type): Set the unsigned flags appropriately for
41263         the new builtin functions.
41264         (rs6000_opt_masks): Add support for decimal floating point builtin
41265         functions.
41266
41267         * config/rs6000/rs6000.h (RS6000_BTM_DFP): Add support for decimal
41268         floating point builtin functions.
41269         (RS6000_BTM_COMMON): Likewise.
41270         (RS6000_BTI_long_double): Likewise.
41271         (RS6000_BTI_dfloat64): Likewise.
41272         (RS6000_BTI_dfloat128): Likewise.
41273         (long_double_type_internal_node): Likewise.
41274         (dfloat64_type_internal_node): Likewise.
41275         (dfloat128_type_internal_node): Likewise.
41276
41277         * config/rs6000/altivec.h (UNSPEC_BCDADD): Add support for ISA
41278         2.07 bcd arithmetic instructions.
41279         (UNSPEC_BCDSUB): Likewise.
41280         (UNSPEC_BCD_OVERFLOW): Likewise.
41281         (UNSPEC_BCD_ADD_SUB): Likewise.
41282         (bcd_add_sub): Likewise.
41283         (BCD_TEST): Likewise.
41284         (bcd<bcd_add_sub>): Likewise.
41285         (bcd<bcd_add_sub>_test): Likewise.
41286         (bcd<bcd_add_sub>_test2): Likewise.
41287         (bcd<bcd_add_sub>_<code>): Likewise.
41288         (peephole2 for combined bcd ops): Likewise.
41289
41290         * config/rs6000/dfp.md (UNSPEC_DDEDPD): Add support for new
41291         decimal floating point builtin functions.
41292         (UNSPEC_DENBCD): Likewise.
41293         (UNSPEC_DXEX): Likewise.
41294         (UNSPEC_DIEX): Likewise.
41295         (UNSPEC_DSCLI): Likewise.
41296         (UNSPEC_DSCRI): Likewise.
41297         (D64_D128): Likewise.
41298         (dfp_suffix): Likewise.
41299         (dfp_ddedpd_<mode>): Likewise.
41300         (dfp_denbcd_<mode>): Likewise.
41301         (dfp_dxex_<mode>): Likewise.
41302         (dfp_diex_<mode>): Likewise.
41303         (dfp_dscli_<mode>): Likewise.
41304         (dfp_dscri_<mode>): Likewise.
41305
41306         * config/rs6000/rs6000.md (UNSPEC_ADDG6S): Add support for new BCD
41307         builtin functions.
41308         (UNSPEC_CDTBCD): Likewise.
41309         (UNSPEC_CBCDTD): Likewise.
41310         (UNSPEC_DIVE): Add support for new extended divide builtin functions.
41311         (UNSPEC_DIVEO): Likewise.
41312         (UNSPEC_DIVEU): Likewise.
41313         (UNSPEC_DIVEUO): Likewise.
41314         (UNSPEC_UNPACK_128BIT): Add support for new builtin functions to
41315         pack/unpack 128-bit types.
41316         (UNSPEC_PACK_128BIT): Likewise.
41317         (idiv_ldiv): New mode attribute to set the 32/64-bit divide type.
41318         (udiv<mode>3): Use idiv_ldiv mode attribute.
41319         (div<mode>3): Likewise.
41320         (addg6s): Add new BCD builtin functions.
41321         (cdtbcd): Likewise.
41322         (cbcdtd): Likewise.
41323         (UNSPEC_DIV_EXTEND): Add support for new extended divide instructions.
41324         (div_extend): Likewise.
41325         (div<div_extend>_<mode>"): Likewise.
41326         (FP128_64): Add support for new builtin functions to pack/unpack
41327         128-bit types.
41328         (unpack<mode>): Likewise.
41329         (unpacktf_0): Likewise.
41330         (unpacktf_1): Likewise.
41331         (unpack<mode>_dm): Likewise.
41332         (unpack<mode>_nodm): Likewise.
41333         (pack<mode>): Likewise.
41334         (unpackv1ti): Likewise.
41335         (packv1ti): Likewise.
41336
41337 2014-04-24  Vishnu K S  <Vishnu.k_s@atmel.com>
41338
41339         * gcc/config/avr/avr.c: Add comment on why -fdelete-null-pointer-checks
41340         is disabled.
41341
41342 2014-04-24  Jakub Jelinek  <jakub@redhat.com>
41343
41344         * tree.h (OMP_CLAUSE_LINEAR_GIMPLE_SEQ): Define.
41345         * gimplify.c (omp_is_private): Change last argument's type to int.
41346         Only diagnose lastprivate if the simd argument is 1, only diagnose
41347         linear if the simd argument is 2.
41348         (gimplify_omp_for): Adjust omp_is_private callers.  When adding
41349         lastprivate or private, add the clause to OMP_FOR_CLAUSES.  Pass
41350         GOVD_EXPLICIT to omp_add_variable.  For simd with collapse == 1
41351         create OMP_CLAUSE_LINEAR rather than OMP_CLAUSE_PRIVATE for var.
41352         If var != decl and decl is in OMP_CLAUSE_LINEAR, gimplify decl
41353         increment to OMP_CLAUSE_LINEAR_GIMPLE_SEQ.
41354         * omp-low.c (scan_sharing_clauses, lower_lastprivate_clauses): Handle
41355         OMP_CLAUSE_LINEAR_GIMPLE_SEQ.
41356         * tree-nested.c (convert_nonlocal_omp_clauses,
41357         convert_local_omp_clauses): Handle OMP_CLAUSE_LINEAR.
41358
41359 2014-04-24  Segher Boessenkool  <segher@kernel.crashing.org>
41360
41361         PR target/60822
41362         * config/m68k/m68k.md (extendplussidi): Don't allow memory for
41363         operand 1.
41364
41365 2014-04-24  Dimitris Papavasiliou  <dpapavas@gmail.com>
41366
41367         * flag-types.h (enum ivar_visibility): Add.
41368
41369 2014-04-24  Trevor Saunders  <tsaunders@mozilla.com>
41370
41371         * config/sh/sh_treg_combine.c (sh_treg_combine::execute): Take
41372         function * argument.
41373
41374 2014-04-24  Alan Lawrence  <alan.lawrence@arm.com>
41375
41376         * config/aarch64/aarch64.c (aarch64_evpc_tbl): Enable for bigendian.
41377
41378 2014-04-24  Radovan Obradovic  <robradovic@mips.com>
41379             Tom de Vries  <tom@codesourcery.com>
41380
41381         * reg-notes.def (REG_NOTE (CALL_DECL)): New reg-note REG_CALL_DECL.
41382         * calls.c (expand_call, emit_library_call_value_1): Add REG_CALL_DECL
41383         reg-note.
41384         * combine.c (distribute_notes): Handle REG_CALL_DECL reg-note.
41385         * emit-rtl.c (try_split): Same.
41386
41387 2014-04-24  Radovan Obradovic  <robradovic@mips.com>
41388             Tom de Vries  <tom@codesourcery.com>
41389
41390         * common.opt (fuse-caller-save): New option.
41391
41392 2014-04-24  Tejas Belagod  <tejas.belagod@arm.com>
41393
41394         * config/aarch64/aarch64.c (aarch64_evpc_tbl): Reverse order of
41395         elements for big-endian.
41396
41397 2014-04-24  Richard Biener  <rguenther@suse.de>
41398
41399         * expr.c (expand_expr_real_1): Avoid gimple_assign_rhs_to_tree
41400         during TER and instead use the sepops interface for expanding
41401         non-GIMPLE_SINGLE_RHS.
41402
41403 2014-04-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
41404
41405         * config/i386/sol2.h (ASM_PREFERRED_EH_DATA_FORMAT): Only redefine
41406         if not HAVE_AS_IX86_DIFF_SECT_DELTA.
41407
41408 2014-04-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
41409
41410         * configure.ac (gcc_cv_as_cfi_directive): Support Solaris/x86
41411         assembler 64-bit option.
41412         * configure: Regenerate.
41413
41414 2014-04-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41415
41416         * config/aarch64/aarch64.h (TARGET_CPU_CPP_BUILTINS): Check
41417         TARGET_SIMD rather than TARGET_GENERAL_REGS_ONLY.
41418         (TARGET_SIMD): Take AARCH64_ISA_SIMD into account.
41419         (TARGET_FLOAT): Take AARCH64_ISA_FP into account.
41420         (TARGET_CRYPTO): Take TARGET_SIMD into account.
41421
41422 2014-04-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41423
41424         * config/aarch64/aarch64-builtins.c
41425         (aarch64_builtin_vectorized_function): Handle BUILT_IN_BSWAP16,
41426         BUILT_IN_BSWAP32, BUILT_IN_BSWAP64.
41427         * config/aarch64/aarch64-simd.md (bswap<mode>): New pattern.
41428         * config/aarch64/aarch64-simd-builtins.def: Define vector bswap
41429         builtins.
41430         * config/aarch64/iterator.md (VDQHSD): New mode iterator.
41431         (Vrevsuff): New mode attribute.
41432
41433 2014-04-24  Terry Guo  <terry.guo@arm.com>
41434
41435         * config/arm/arm.h (machine_function): Define variable
41436         after_arm_reorg here.
41437         * config/arm/arm.c (after_arm_reorg): Remove the definition.
41438         (arm_split_constant): Update the way to access variable
41439         after_arm_reorg.
41440         (arm_reorg): Ditto.
41441         (arm_output_function_epilogue): Remove the reset of after_arm_reorg.
41442
41443 2014-04-23  Tom de Vries  <tom@codesourcery.com>
41444
41445         * target-hooks-macros.h: Fix DEFHOOKPOD argument order in comment.
41446
41447 2014-04-23  David Malcolm  <dmalcolm@redhat.com>
41448
41449         * is-a.h: Update comments to reflect the following changes to the
41450         "pointerness" of the API, making the template parameter match the
41451         return type, allowing use of is-a.h with typedefs of pointers.
41452         (is_a_helper::cast): Return a T rather then a pointer to a T, so
41453         that the return type matches the parameter to the is_a_helper.
41454         (as_a): Likewise.
41455         (dyn_cast): Likewise.
41456
41457         * cgraph.c (cgraph_node_for_asm): Update for removal of implicit
41458         pointer from the is-a.h API.
41459
41460         * cgraph.h (is_a_helper <cgraph_node>::test): Convert to...
41461         (is_a_helper <cgraph_node *>::test): ...this, matching change to
41462         is-a.h API.
41463         (is_a_helper <varpool_node>::test): Likewise, convert to...
41464         (is_a_helper <varpool_node *>::test): ...this.
41465
41466         (varpool_first_variable): Update for removal of implicit pointer
41467         from the is-a.h API.
41468         (varpool_next_variable): Likewise.
41469         (varpool_first_static_initializer): Likewise.
41470         (varpool_next_static_initializer): Likewise.
41471         (varpool_first_defined_variable): Likewise.
41472         (varpool_next_defined_variable): Likewise.
41473         (cgraph_first_defined_function): Likewise.
41474         (cgraph_next_defined_function): Likewise.
41475         (cgraph_first_function): Likewise.
41476         (cgraph_next_function): Likewise.
41477         (cgraph_first_function_with_gimple_body): Likewise.
41478         (cgraph_next_function_with_gimple_body): Likewise.
41479         (cgraph_alias_target): Likewise.
41480         (varpool_alias_target): Likewise.
41481         (cgraph_function_or_thunk_node): Likewise.
41482         (varpool_variable_node): Likewise.
41483         (symtab_real_symbol_p): Likewise.
41484         * cgraphunit.c (referred_to_p): Likewise.
41485         (analyze_functions): Likewise.
41486         (handle_alias_pairs): Likewise.
41487         * gimple-fold.c (can_refer_decl_in_current_unit_p): Likewise.
41488         * gimple-ssa.h (gimple_vuse_op): Likewise.
41489         (gimple_vdef_op): Likewise.
41490         * gimple-streamer-in.c (input_gimple_stmt): Likewise.
41491         * gimple.c (gimple_build_asm_1): Likewise.
41492         (gimple_build_try): Likewise.
41493         (gimple_build_resx): Likewise.
41494         (gimple_build_eh_dispatch): Likewise.
41495         (gimple_build_omp_for): Likewise.
41496         (gimple_omp_for_set_clauses): Likewise.
41497
41498         * gimple.h (is_a_helper <gimple_statement_asm>::test): Convert to...
41499         (is_a_helper <gimple_statement_asm *>::test): ...this.
41500         (is_a_helper <gimple_statement_bind>::test): Convert to...
41501         (is_a_helper <gimple_statement_bind *>::test): ...this.
41502         (is_a_helper <gimple_statement_call>::test): Convert to...
41503         (is_a_helper <gimple_statement_call *>::test): ...this.
41504         (is_a_helper <gimple_statement_catch>::test): Convert to...
41505         (is_a_helper <gimple_statement_catch *>::test): ...this.
41506         (is_a_helper <gimple_statement_resx>::test): Convert to...
41507         (is_a_helper <gimple_statement_resx *>::test): ...this.
41508         (is_a_helper <gimple_statement_eh_dispatch>::test): Convert to...
41509         (is_a_helper <gimple_statement_eh_dispatch *>::test): ...this.
41510         (is_a_helper <gimple_statement_eh_else>::test): Convert to...
41511         (is_a_helper <gimple_statement_eh_else *>::test): ...this.
41512         (is_a_helper <gimple_statement_eh_filter>::test): Convert to...
41513         (is_a_helper <gimple_statement_eh_filter *>::test): ...this.
41514         (is_a_helper <gimple_statement_eh_mnt>::test): Convert to...
41515         (is_a_helper <gimple_statement_eh_mnt *>::test): ...this.
41516         (is_a_helper <gimple_statement_omp_atomic_load>::test): Convert to...
41517         (is_a_helper <gimple_statement_omp_atomic_load *>::test): ...this.
41518         (is_a_helper <gimple_statement_omp_atomic_store>::test): Convert to...
41519         (is_a_helper <gimple_statement_omp_atomic_store *>::test): ...this.
41520         (is_a_helper <gimple_statement_omp_return>::test): Convert to...
41521         (is_a_helper <gimple_statement_omp_return *>::test): ...this.
41522         (is_a_helper <gimple_statement_omp_continue>::test): Convert to...
41523         (is_a_helper <gimple_statement_omp_continue *>::test): ...this.
41524         (is_a_helper <gimple_statement_omp_critical>::test): Convert to...
41525         (is_a_helper <gimple_statement_omp_critical *>::test): ...this.
41526         (is_a_helper <gimple_statement_omp_for>::test): Convert to...
41527         (is_a_helper <gimple_statement_omp_for *>::test): ...this.
41528         (is_a_helper <gimple_statement_omp_taskreg>::test): Convert to...
41529         (is_a_helper <gimple_statement_omp_taskreg *>::test): ...this.
41530         (is_a_helper <gimple_statement_omp_parallel>::test): Convert to...
41531         (is_a_helper <gimple_statement_omp_parallel *>::test): ...this.
41532         (is_a_helper <gimple_statement_omp_target>::test): Convert to...
41533         (is_a_helper <gimple_statement_omp_target *>::test): ...this.
41534         (is_a_helper <gimple_statement_omp_sections>::test): Convert to...
41535         (is_a_helper <gimple_statement_omp_sections *>::test): ...this.
41536         (is_a_helper <gimple_statement_omp_single>::test): Convert to...
41537         (is_a_helper <gimple_statement_omp_single *>::test): ...this.
41538         (is_a_helper <gimple_statement_omp_teams>::test): Convert to...
41539         (is_a_helper <gimple_statement_omp_teams *>::test): ...this.
41540         (is_a_helper <gimple_statement_omp_task>::test): Convert to...
41541         (is_a_helper <gimple_statement_omp_task *>::test): ...this.
41542         (is_a_helper <gimple_statement_phi>::test): Convert to...
41543         (is_a_helper <gimple_statement_phi *>::test): ...this.
41544         (is_a_helper <gimple_statement_transaction>::test): Convert to...
41545         (is_a_helper <gimple_statement_transaction *>::test): ...this.
41546         (is_a_helper <gimple_statement_try>::test): Convert to...
41547         (is_a_helper <gimple_statement_try *>::test): ...this.
41548         (is_a_helper <gimple_statement_wce>::test): Convert to...
41549         (is_a_helper <gimple_statement_wce *>::test): ...this.
41550         (is_a_helper <const gimple_statement_asm>::test): Convert to...
41551         (is_a_helper <const gimple_statement_asm *>::test): ...this.
41552         (is_a_helper <const gimple_statement_bind>::test): Convert to...
41553         (is_a_helper <const gimple_statement_bind *>::test): ...this.
41554         (is_a_helper <const gimple_statement_call>::test): Convert to...
41555         (is_a_helper <const gimple_statement_call *>::test): ...this.
41556         (is_a_helper <const gimple_statement_catch>::test): Convert to...
41557         (is_a_helper <const gimple_statement_catch *>::test): ...this.
41558         (is_a_helper <const gimple_statement_resx>::test): Convert to...
41559         (is_a_helper <const gimple_statement_resx *>::test): ...this.
41560         (is_a_helper <const gimple_statement_eh_dispatch>::test): Convert to...
41561         (is_a_helper <const gimple_statement_eh_dispatch *>::test): ...this.
41562         (is_a_helper <const gimple_statement_eh_filter>::test): Convert to...
41563         (is_a_helper <const gimple_statement_eh_filter *>::test): ...this.
41564         (is_a_helper <const gimple_statement_omp_atomic_load>::test):
41565         Convert to...
41566         (is_a_helper <const gimple_statement_omp_atomic_load *>::test):
41567         ...this.
41568         (is_a_helper <const gimple_statement_omp_atomic_store>::test):
41569         Convert to...
41570         (is_a_helper <const gimple_statement_omp_atomic_store *>::test):
41571         ...this.
41572         (is_a_helper <const gimple_statement_omp_return>::test): Convert to...
41573         (is_a_helper <const gimple_statement_omp_return *>::test): ...this.
41574         (is_a_helper <const gimple_statement_omp_continue>::test): Convert
41575         to...
41576         (is_a_helper <const gimple_statement_omp_continue *>::test): ...this.
41577         (is_a_helper <const gimple_statement_omp_critical>::test): Convert
41578         to...
41579         (is_a_helper <const gimple_statement_omp_critical *>::test): ...this.
41580         (is_a_helper <const gimple_statement_omp_for>::test): Convert to...
41581         (is_a_helper <const gimple_statement_omp_for *>::test): ...this.
41582         (is_a_helper <const gimple_statement_omp_taskreg>::test): Convert to...
41583         (is_a_helper <const gimple_statement_omp_taskreg *>::test): ...this.
41584         (is_a_helper <const gimple_statement_omp_parallel>::test): Convert
41585         to...
41586         (is_a_helper <const gimple_statement_omp_parallel *>::test): ...this.
41587         (is_a_helper <const gimple_statement_omp_target>::test): Convert to...
41588         (is_a_helper <const gimple_statement_omp_target *>::test): ...this.
41589         (is_a_helper <const gimple_statement_omp_sections>::test): Convert
41590         to...
41591         (is_a_helper <const gimple_statement_omp_sections *>::test): ...this.
41592         (is_a_helper <const gimple_statement_omp_single>::test): Convert to...
41593         (is_a_helper <const gimple_statement_omp_single *>::test): ...this.
41594         (is_a_helper <const gimple_statement_omp_teams>::test): Convert to...
41595         (is_a_helper <const gimple_statement_omp_teams *>::test): ...this.
41596         (is_a_helper <const gimple_statement_omp_task>::test): Convert to...
41597         (is_a_helper <const gimple_statement_omp_task *>::test): ...this.
41598         (is_a_helper <const gimple_statement_phi>::test): Convert to...
41599         (is_a_helper <const gimple_statement_phi *>::test): ...this.
41600         (is_a_helper <const gimple_statement_transaction>::test): Convert to...
41601         (is_a_helper <const gimple_statement_transaction *>::test): ...this.
41602         (is_a_helper <const gimple_statement_with_ops>::test): Convert to...
41603         (is_a_helper <const gimple_statement_with_ops *>::test): ...this.
41604         (is_a_helper <gimple_statement_with_ops>::test): Convert to...
41605         (is_a_helper <gimple_statement_with_ops *>::test): ...this.
41606         (is_a_helper <const gimple_statement_with_memory_ops>::test): Convert
41607         to...
41608         (is_a_helper <const gimple_statement_with_memory_ops *>::test):
41609         ...this.
41610         (is_a_helper <gimple_statement_with_memory_ops>::test): Convert to...
41611         (is_a_helper <gimple_statement_with_memory_ops *>::test): ...this.
41612
41613         (gimple_use_ops): Update for removal of implicit pointer from the
41614         is-a.h API.
41615         (gimple_set_use_ops): Likewise.
41616         (gimple_vuse): Likewise.
41617         (gimple_vdef): Likewise.
41618         (gimple_vuse_ptr): Likewise.
41619         (gimple_vdef_ptr): Likewise.
41620         (gimple_set_vuse): Likewise.
41621         (gimple_set_vdef): Likewise.
41622         (gimple_omp_return_set_lhs): Likewise.
41623         (gimple_omp_return_lhs): Likewise.
41624         (gimple_omp_return_lhs_ptr): Likewise.
41625         (gimple_call_fntype): Likewise.
41626         (gimple_call_set_fntype): Likewise.
41627         (gimple_call_set_internal_fn): Likewise.
41628         (gimple_call_use_set): Likewise.
41629         (gimple_call_clobber_set): Likewise.
41630         (gimple_bind_vars): Likewise.
41631         (gimple_bind_set_vars): Likewise.
41632         (gimple_bind_body_ptr): Likewise.
41633         (gimple_bind_set_body): Likewise.
41634         (gimple_bind_add_stmt): Likewise.
41635         (gimple_bind_block): Likewise.
41636         (gimple_bind_set_block): Likewise.
41637         (gimple_asm_ninputs): Likewise.
41638         (gimple_asm_noutputs): Likewise.
41639         (gimple_asm_nclobbers): Likewise.
41640         (gimple_asm_nlabels): Likewise.
41641         (gimple_asm_input_op): Likewise.
41642         (gimple_asm_input_op_ptr): Likewise.
41643         (gimple_asm_output_op): Likewise.
41644         (gimple_asm_output_op_ptr): Likewise.
41645         (gimple_asm_set_output_op): Likewise.
41646         (gimple_asm_clobber_op): Likewise.
41647         (gimple_asm_set_clobber_op): Likewise.
41648         (gimple_asm_label_op): Likewise.
41649         (gimple_asm_set_label_op): Likewise.
41650         (gimple_asm_string): Likewise.
41651         (gimple_catch_types): Likewise.
41652         (gimple_catch_types_ptr): Likewise.
41653         (gimple_catch_handler_ptr): Likewise.
41654         (gimple_catch_set_types): Likewise.
41655         (gimple_catch_set_handler): Likewise.
41656         (gimple_eh_filter_types): Likewise.
41657         (gimple_eh_filter_types_ptr): Likewise.
41658         (gimple_eh_filter_failure_ptr): Likewise.
41659         (gimple_eh_filter_set_types): Likewise.
41660         (gimple_eh_filter_set_failure): Likewise.
41661         (gimple_eh_must_not_throw_fndecl): Likewise.
41662         (gimple_eh_must_not_throw_set_fndecl): Likewise.
41663         (gimple_eh_else_n_body_ptr): Likewise.
41664         (gimple_eh_else_e_body_ptr): Likewise.
41665         (gimple_eh_else_set_n_body): Likewise.
41666         (gimple_eh_else_set_e_body): Likewise.
41667         (gimple_try_eval_ptr): Likewise.
41668         (gimple_try_cleanup_ptr): Likewise.
41669         (gimple_try_set_eval): Likewise.
41670         (gimple_try_set_cleanup): Likewise.
41671         (gimple_wce_cleanup_ptr): Likewise.
41672         (gimple_wce_set_cleanup): Likewise.
41673         (gimple_phi_capacity): Likewise.
41674         (gimple_phi_num_args): Likewise.
41675         (gimple_phi_result): Likewise.
41676         (gimple_phi_result_ptr): Likewise.
41677         (gimple_phi_set_result): Likewise.
41678         (gimple_phi_arg): Likewise.
41679         (gimple_phi_set_arg): Likewise.
41680         (gimple_resx_region): Likewise.
41681         (gimple_resx_set_region): Likewise.
41682         (gimple_eh_dispatch_region): Likewise.
41683         (gimple_eh_dispatch_set_region): Likewise.
41684         (gimple_omp_critical_name): Likewise.
41685         (gimple_omp_critical_name_ptr): Likewise.
41686         (gimple_omp_critical_set_name): Likewise.
41687         (gimple_omp_for_clauses): Likewise.
41688         (gimple_omp_for_clauses_ptr): Likewise.
41689         (gimple_omp_for_set_clauses): Likewise.
41690         (gimple_omp_for_collapse): Likewise.
41691         (gimple_omp_for_index): Likewise.
41692         (gimple_omp_for_index_ptr): Likewise.
41693         (gimple_omp_for_set_index): Likewise.
41694         (gimple_omp_for_initial): Likewise.
41695         (gimple_omp_for_initial_ptr): Likewise.
41696         (gimple_omp_for_set_initial): Likewise.
41697         (gimple_omp_for_final): Likewise.
41698         (gimple_omp_for_final_ptr): Likewise.
41699         (gimple_omp_for_set_final): Likewise.
41700         (gimple_omp_for_incr): Likewise.
41701         (gimple_omp_for_incr_ptr): Likewise.
41702         (gimple_omp_for_set_incr): Likewise.
41703         (gimple_omp_for_pre_body_ptr): Likewise.
41704         (gimple_omp_for_set_pre_body): Likewise.
41705         (gimple_omp_parallel_clauses): Likewise.
41706         (gimple_omp_parallel_clauses_ptr): Likewise.
41707         (gimple_omp_parallel_set_clauses): Likewise.
41708         (gimple_omp_parallel_child_fn): Likewise.
41709         (gimple_omp_parallel_child_fn_ptr): Likewise.
41710         (gimple_omp_parallel_set_child_fn): Likewise.
41711         (gimple_omp_parallel_data_arg): Likewise.
41712         (gimple_omp_parallel_data_arg_ptr): Likewise.
41713         (gimple_omp_parallel_set_data_arg): Likewise.
41714         (gimple_omp_task_clauses): Likewise.
41715         (gimple_omp_task_clauses_ptr): Likewise.
41716         (gimple_omp_task_set_clauses): Likewise.
41717         (gimple_omp_task_child_fn): Likewise.
41718         (gimple_omp_task_child_fn_ptr): Likewise.
41719         (gimple_omp_task_set_child_fn): Likewise.
41720         (gimple_omp_task_data_arg): Likewise.
41721         (gimple_omp_task_data_arg_ptr): Likewise.
41722         (gimple_omp_task_set_data_arg): Likewise.
41723         (gimple_omp_taskreg_clauses): Likewise.
41724         (gimple_omp_taskreg_clauses_ptr): Likewise.
41725         (gimple_omp_taskreg_set_clauses): Likewise.
41726         (gimple_omp_taskreg_child_fn): Likewise.
41727         (gimple_omp_taskreg_child_fn_ptr): Likewise.
41728         (gimple_omp_taskreg_set_child_fn): Likewise.
41729         (gimple_omp_taskreg_data_arg): Likewise.
41730         (gimple_omp_taskreg_data_arg_ptr): Likewise.
41731         (gimple_omp_taskreg_set_data_arg): Likewise.
41732         (gimple_omp_task_copy_fn): Likewise.
41733         (gimple_omp_task_copy_fn_ptr): Likewise.
41734         (gimple_omp_task_set_copy_fn): Likewise.
41735         (gimple_omp_task_arg_size): Likewise.
41736         (gimple_omp_task_arg_size_ptr): Likewise.
41737         (gimple_omp_task_set_arg_size): Likewise.
41738         (gimple_omp_task_arg_align): Likewise.
41739         (gimple_omp_task_arg_align_ptr): Likewise.
41740         (gimple_omp_task_set_arg_align): Likewise.
41741         (gimple_omp_single_clauses): Likewise.
41742         (gimple_omp_single_clauses_ptr): Likewise.
41743         (gimple_omp_single_set_clauses): Likewise.
41744         (gimple_omp_target_clauses): Likewise.
41745         (gimple_omp_target_clauses_ptr): Likewise.
41746         (gimple_omp_target_set_clauses): Likewise.
41747         (gimple_omp_target_child_fn): Likewise.
41748         (gimple_omp_target_child_fn_ptr): Likewise.
41749         (gimple_omp_target_set_child_fn): Likewise.
41750         (gimple_omp_target_data_arg): Likewise.
41751         (gimple_omp_target_data_arg_ptr): Likewise.
41752         (gimple_omp_target_set_data_arg): Likewise.
41753         (gimple_omp_teams_clauses): Likewise.
41754         (gimple_omp_teams_clauses_ptr): Likewise.
41755         (gimple_omp_teams_set_clauses): Likewise.
41756         (gimple_omp_sections_clauses): Likewise.
41757         (gimple_omp_sections_clauses_ptr): Likewise.
41758         (gimple_omp_sections_set_clauses): Likewise.
41759         (gimple_omp_sections_control): Likewise.
41760         (gimple_omp_sections_control_ptr): Likewise.
41761         (gimple_omp_sections_set_control): Likewise.
41762         (gimple_omp_for_set_cond): Likewise.
41763         (gimple_omp_for_cond): Likewise.
41764         (gimple_omp_atomic_store_set_val): Likewise.
41765         (gimple_omp_atomic_store_val): Likewise.
41766         (gimple_omp_atomic_store_val_ptr): Likewise.
41767         (gimple_omp_atomic_load_set_lhs): Likewise.
41768         (gimple_omp_atomic_load_lhs): Likewise.
41769         (gimple_omp_atomic_load_lhs_ptr): Likewise.
41770         (gimple_omp_atomic_load_set_rhs): Likewise.
41771         (gimple_omp_atomic_load_rhs): Likewise.
41772         (gimple_omp_atomic_load_rhs_ptr): Likewise.
41773         (gimple_omp_continue_control_def): Likewise.
41774         (gimple_omp_continue_control_def_ptr): Likewise.
41775         (gimple_omp_continue_set_control_def): Likewise.
41776         (gimple_omp_continue_control_use): Likewise.
41777         (gimple_omp_continue_control_use_ptr): Likewise.
41778         (gimple_omp_continue_set_control_use): Likewise.
41779         (gimple_transaction_body_ptr): Likewise.
41780         (gimple_transaction_label): Likewise.
41781         (gimple_transaction_label_ptr): Likewise.
41782         (gimple_transaction_set_body): Likewise.
41783         (gimple_transaction_set_label): Likewise.
41784
41785         * ipa-devirt.c (build_type_inheritance_graph): Likewise.
41786         * ipa-inline-analysis.c (inline_write_summary): Likewise.
41787         * ipa-ref.c (ipa_record_reference): Likewise.
41788         * ipa-reference.c (analyze_function): Likewise.
41789         (ipa_reference_write_optimization_summary): Likewise.
41790         * ipa.c (symtab_remove_unreachable_nodes): Likewise.
41791         (address_taken_from_non_vtable_p): Likewise.
41792         (comdat_can_be_unshared_p_1): Likewise.
41793         * lto-cgraph.c (lto_output_ref): Likewise.
41794         (add_references): Likewise.
41795         (compute_ltrans_boundary): Likewise.
41796         (output_symtab): Likewise.
41797         (input_ref): Likewise.
41798         (input_cgraph_1): Likewise.
41799         (output_cgraph_opt_summary): Likewise.
41800         * lto-streamer-out.c (lto_output): Likewise.
41801         (output_symbol_p): Likewise.
41802         * lto-streamer.h (lsei_next_function_in_partition): Likewise.
41803         (lsei_start_function_in_partition): Likewise.
41804         (lsei_next_variable_in_partition): Likewise.
41805         (lsei_start_variable_in_partition): Likewise.
41806         * symtab.c (insert_to_assembler_name_hash): Likewise.
41807         (unlink_from_assembler_name_hash): Likewise.
41808         (symtab_unregister_node): Likewise.
41809         (symtab_remove_node): Likewise.
41810         (dump_symtab_node): Likewise.
41811         (verify_symtab_base): Likewise.
41812         (verify_symtab_node): Likewise.
41813         (symtab_make_decl_local): Likewise.
41814         (symtab_alias_ultimate_target): Likewise.
41815         (symtab_resolve_alias): Likewise.
41816         (symtab_get_symbol_partitioning_class): Likewise.
41817         * tree-phinodes.c (allocate_phi_node): Likewise.
41818         (reserve_phi_args_for_new_edge): Likewise.
41819         (remove_phi_args): Likewise.
41820         * varpool.c (varpool_node_for_asm): Likewise.
41821         (varpool_remove_unreferenced_decls): Likewise.
41822
41823 2014-04-23  Jeff Law  <law@redhat.com>
41824
41825         PR tree-optimization/60902
41826         * tree-ssa-threadedge.c
41827         (record_temporary_equivalences_from_stmts_at_dest): Make sure to
41828         invalidate outputs from statements that do not produce useful
41829         outputs for threading.
41830
41831 2014-04-23  Venkataramanan Kumar  <venkataramanan.kumar@linaro.org>
41832
41833         * config/aarch64/aarch64.md (stack_protect_set, stack_protect_test)
41834         (stack_protect_set_<mode>, stack_protect_test_<mode>): Add
41835         machine descriptions for Stack Smashing Protector.
41836
41837 2014-04-23  Richard Earnshaw  <rearnsha@arm.com>
41838
41839         * aarch64.md (<optab>_rol<mode>3): New pattern.
41840         (<optab>_rolsi3_uxtw): Likewise.
41841         * aarch64.c (aarch64_strip_shift): Handle ROTATE and ROTATERT.
41842
41843 2014-04-23  James Greenhalgh  <james.greenhalgh@arm.com>
41844
41845         * config/arm/arm.c (arm_cortex_a57_tune): Initialize all fields.
41846         (arm_cortex_a12_tune): Likewise.
41847
41848 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41849
41850         * config/aarch64/aarch64.c (aarch64_rtx_costs): Handle BSWAP.
41851
41852 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41853
41854         * config/arm/arm.md (arm_rev16si2): New pattern.
41855         (arm_rev16si2_alt): Likewise.
41856         * config/arm/arm.c (arm_new_rtx_costs): Handle rev16 case.
41857
41858 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41859
41860         * config/aarch64/aarch64.md (rev16<mode>2): New pattern.
41861         (rev16<mode>2_alt): Likewise.
41862         * config/aarch64/aarch64.c (aarch64_rtx_costs): Handle rev16 case.
41863         * config/arm/aarch-common.c (aarch_rev16_shright_mask_imm_p): New.
41864         (aarch_rev16_shleft_mask_imm_p): Likewise.
41865         (aarch_rev16_p_1): Likewise.
41866         (aarch_rev16_p): Likewise.
41867         * config/arm/aarch-common-protos.h (aarch_rev16_p): Declare extern.
41868         (aarch_rev16_shright_mask_imm_p): Likewise.
41869         (aarch_rev16_shleft_mask_imm_p): Likewise.
41870
41871 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41872
41873         * config/arm/aarch-common-protos.h (alu_cost_table): Add rev field.
41874         * config/arm/aarch-cost-tables.h (generic_extra_costs): Specify
41875         rev cost.
41876         (cortex_a53_extra_costs): Likewise.
41877         (cortex_a57_extra_costs): Likewise.
41878         * config/arm/arm.c (cortexa9_extra_costs): Likewise.
41879         (cortexa7_extra_costs): Likewise.
41880         (cortexa8_extra_costs): Likewise.
41881         (cortexa12_extra_costs): Likewise.
41882         (cortexa15_extra_costs): Likewise.
41883         (v7m_extra_costs): Likewise.
41884         (arm_new_rtx_costs): Handle BSWAP.
41885
41886 2013-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41887
41888         * config/arm/arm.c (cortexa8_extra_costs): New table.
41889         (arm_cortex_a8_tune): New tuning struct.
41890         * config/arm/arm-cores.def (cortex-a8): Use cortex_a8 tuning struct.
41891
41892 2014-04-23  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
41893
41894         * config/arm/arm.c (arm_new_rtx_costs): Handle FMA.
41895
41896 2014-04-23  Richard Biener  <rguenther@suse.de>
41897
41898         * Makefile.in (OBJS): Remove loop-unswitch.o.
41899         * tree-pass.h (make_pass_rtl_unswitch): Remove.
41900         * passes.def (pass_rtl_unswitch): Likewise.
41901         * loop-init.c (gate_rtl_unswitch): Likewise.
41902         (rtl_unswitch): Likewise.
41903         (pass_data_rtl_unswitch): Likewise.
41904         (pass_rtl_unswitch): Likewise.
41905         (make_pass_rtl_unswitch): Likewise.
41906         * rtl.h (reversed_condition): Likewise.
41907         (compare_and_jump_seq): Likewise.
41908         * loop-iv.c (reversed_condition): Move here from loop-unswitch.c
41909         and make static.
41910         * loop-unroll.c (compare_and_jump_seq): Likewise.
41911
41912 2014-04-23  Richard Biener  <rguenther@suse.de>
41913
41914         PR tree-optimization/60903
41915         * tree-ssa-loop-im.c (analyze_memory_references): Remove
41916         commented code block.
41917         (execute_sm_if_changed): Properly apply IRREDUCIBLE_LOOP
41918         loop flags to newly created BBs and edges.
41919
41920 2014-04-23  Nick Clifton  <nickc@redhat.com>
41921
41922         * config/msp430/msp430.c (msp430_handle_option): Move function
41923         to msp430-common.c
41924         (msp430_option_override): Simplify mcu and mcpu option handling.
41925         (msp430_is_f5_mcu): Rename to msp430_use_f5_series_hwmult.  Add
41926         support for -mhwmult command line option.
41927         (has_32bit_hwmult): Rename to use_32bit_hwmult.  Add support for
41928         -mhwmult command line option.
41929         (msp430_hwmult_enabled): Delete.
41930         (msp43o_output_labelref): Add support for -mhwmult command line option.
41931         * config/msp430/msp430.md (mulhisi3, umulhisi3, mulsidi3)
41932         (umulsidi3): Likewise.
41933         * config/msp430/msp430.opt (mmcu): Add Report attribute.
41934         (mcpu, mlarge, msmall): Likewise.
41935         (mhwmult): New option.
41936         * config/msp430/msp430-protos.h (msp430_hwmult_enabled): Remove
41937         prototype.
41938         (msp430_is_f5_mcu): Remove prototype.
41939         (msp430_use_f5_series_hwmult): Add prototype.
41940         * config/msp430/msp430-opts.h: New file.
41941         * common/config/msp430: New directory.
41942         * common/config/msp430/msp430-common.c: New file.
41943         * config.gcc (msp430): Remove target_has_targetm_common.
41944         * doc/invoke.texi: Document -mhwmult command line option.
41945
41946 2014-04-23  Nick Clifton  <nickc@redhat.com>
41947
41948         * config/i386/cygwin.h (ENDFILE_SPEC): Include
41949         default-manifest.o if it can be found in the search path.
41950         * config/i386/mingw32.h (ENDFILE_SPEC): Likewise.
41951
41952 2014-04-23  Terry Guo  <terry.guo@arm.com>
41953
41954         * config/arm/arm.h (ASM_APP_OFF): Re-define it in a cleaner way.
41955
41956 2014-04-23  Richard Biener  <rguenther@suse.de>
41957
41958         PR middle-end/60895
41959         * tree-inline.c (declare_return_variable): Use mark_addressable.
41960
41961 2014-04-23  Richard Biener  <rguenther@suse.de>
41962
41963         PR middle-end/60891
41964         * loop-init.c (loop_optimizer_init): Make sure to apply
41965         LOOPS_MAY_HAVE_MULTIPLE_LATCHES before fixing up loops.
41966
41967 2014-04-22  Jakub Jelinek  <jakub@redhat.com>
41968
41969         PR sanitizer/60275
41970         * common.opt (fsanitize-recover, fsanitize-undefined-trap-on-error):
41971         New options.
41972         * gcc.c (sanitize_spec_function): Don't return "" for "undefined"
41973         if flag_sanitize_undefined_trap_on_error.
41974         * sanitizer.def (BUILT_IN_UBSAN_HANDLE_DIVREM_OVERFLOW_ABORT,
41975         BUILT_IN_UBSAN_HANDLE_SHIFT_OUT_OF_BOUNDS_ABORT,
41976         BUILT_IN_UBSAN_HANDLE_VLA_BOUND_NOT_POSITIVE_ABORT,
41977         BUILT_IN_UBSAN_HANDLE_TYPE_MISMATCH_ABORT,
41978         BUILT_IN_UBSAN_HANDLE_ADD_OVERFLOW_ABORT,
41979         BUILT_IN_UBSAN_HANDLE_SUB_OVERFLOW_ABORT,
41980         BUILT_IN_UBSAN_HANDLE_MUL_OVERFLOW_ABORT,
41981         BUILT_IN_UBSAN_HANDLE_NEGATE_OVERFLOW_ABORT,
41982         BUILT_IN_UBSAN_HANDLE_LOAD_INVALID_VALUE_ABORT): New builtins.
41983         * ubsan.c (ubsan_instrument_unreachable): Return
41984         __builtin_trap () if flag_sanitize_undefined_trap_on_error.
41985         (ubsan_expand_null_ifn): Emit __builtin_trap ()
41986         if flag_sanitize_undefined_trap_on_error and
41987         __ubsan_handle_type_mismatch_abort if !flag_sanitize_recover.
41988         (ubsan_expand_null_ifn, ubsan_build_overflow_builtin,
41989         instrument_bool_enum_load): Emit __builtin_trap () if
41990         flag_sanitize_undefined_trap_on_error and
41991         __builtin_handle_*_abort () if !flag_sanitize_recover.
41992         * doc/invoke.texi (-fsanitize-recover,
41993         -fsanitize-undefined-trap-on-error): Document.
41994
41995 2014-04-22  Christian Bruel  <christian.bruel@st.com>
41996
41997         * config/sh/sh.md (mov<mode>): Replace movQIHI.
41998         Force immediates to SImode.
41999
42000 2014-04-22  Sandra Loosemore  <sandra@codesourcery.com>
42001
42002         * config/nios2/nios2.md (UNSPEC_ROUND): New.
42003         (lroundsfsi2): New.
42004         * config/nios2/nios2.opt (mno-custom-round, mcustom-round=): New.
42005         * config/nios2/nios2-opts.h (N2FPU_ALL_CODES): Add round.
42006         * config/nios2/nios2.c (N2F_NO_ERRNO): Define.
42007         (nios2_fpu_insn): Add entry for round.
42008         (N2FPU_NO_ERRNO_P): Define.
42009         (nios2_custom_check_insns): Add check for N2F_NO_ERRNO and
42010         flag_errno_math.
42011         * doc/invoke.texi (Nios II Options): Document -mcustom-round.
42012
42013 2014-04-22  Richard Henderson  <rth@redhat.com>
42014
42015         * config/aarch64/aarch64 (addti3, subti3): New expanders.
42016         (add<GPI>3_compare0): Remove leading * from name.
42017         (add<GPI>3_carryin): Likewise.
42018         (sub<GPI>3_compare0): Likewise.
42019         (sub<GPI>3_carryin): Likewise.
42020         (<su_optab>mulditi3): New expander.
42021         (multi3): New expander.
42022         (madd<GPI>): Remove leading * from name.
42023
42024 2014-04-22  Martin Jambor  <mjambor@suse.cz>
42025
42026         * cgraphclones.c (cgraph_function_versioning): Copy
42027         ipa_transforms_to_apply instead of asserting it is empty.
42028
42029 2014-04-22  H.J. Lu  <hongjiu.lu@intel.com>
42030
42031         PR target/60868
42032         * config/i386/i386.c (ix86_expand_set_or_movmem): Call counter_mode
42033         on count_exp to get mode.
42034
42035 2014-04-22  Andrew Pinski  <apinski@cavium.com>
42036
42037         * config/aarch64/aarch64.c (aarch64_load_symref_appropriately):
42038         Handle TLS for ILP32.
42039         * config/aarch64/aarch64.md (tlsie_small): Rename to ...
42040         (tlsie_small_<mode>): this and handle PTR.
42041         (tlsie_small_sidi): New pattern.
42042         (tlsle_small): Change to an expand to handle ILP32.
42043         (tlsle_small_<mode>): New pattern.
42044         (tlsdesc_small): Rename to ...
42045         (tlsdesc_small_<mode>): this and handle PTR.
42046
42047 2014-04-22  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
42048
42049         * config/aarch64/aarch64.c (TARGET_FLAGS_REGNUM): Define.
42050
42051 2014-04-22  Alex Velenko  <Alex.Velenko@arm.com>
42052
42053         * config/aarch64/aarch64-builtins.c (TYPES_REINTERP): Removed.
42054         (aarch64_types_signed_unsigned_qualifiers): Qualifier added.
42055         (aarch64_types_signed_poly_qualifiers): Likewise.
42056         (aarch64_types_unsigned_signed_qualifiers): Likewise.
42057         (aarch64_types_poly_signed_qualifiers): Likewise.
42058         (TYPES_REINTERP_SS): Type macro added.
42059         (TYPES_REINTERP_SU): Likewise.
42060         (TYPES_REINTERP_SP): Likewise.
42061         (TYPES_REINTERP_US): Likewise.
42062         (TYPES_REINTERP_PS): Likewise.
42063         (aarch64_fold_builtin): New expression folding added.
42064         * config/aarch64/aarch64-simd-builtins.def (REINTERP):
42065         Declarations removed.
42066         (REINTERP_SS): Declarations added.
42067         (REINTERP_US): Likewise.
42068         (REINTERP_PS): Likewise.
42069         (REINTERP_SU): Likewise.
42070         (REINTERP_SP): Likewise.
42071         * config/aarch64/arm_neon.h (vreinterpret_p8_f64): Implemented.
42072         (vreinterpretq_p8_f64): Likewise.
42073         (vreinterpret_p16_f64): Likewise.
42074         (vreinterpretq_p16_f64): Likewise.
42075         (vreinterpret_f32_f64): Likewise.
42076         (vreinterpretq_f32_f64): Likewise.
42077         (vreinterpret_f64_f32): Likewise.
42078         (vreinterpret_f64_p8): Likewise.
42079         (vreinterpret_f64_p16): Likewise.
42080         (vreinterpret_f64_s8): Likewise.
42081         (vreinterpret_f64_s16): Likewise.
42082         (vreinterpret_f64_s32): Likewise.
42083         (vreinterpret_f64_s64): Likewise.
42084         (vreinterpret_f64_u8): Likewise.
42085         (vreinterpret_f64_u16): Likewise.
42086         (vreinterpret_f64_u32): Likewise.
42087         (vreinterpret_f64_u64): Likewise.
42088         (vreinterpretq_f64_f32): Likewise.
42089         (vreinterpretq_f64_p8): Likewise.
42090         (vreinterpretq_f64_p16): Likewise.
42091         (vreinterpretq_f64_s8): Likewise.
42092         (vreinterpretq_f64_s16): Likewise.
42093         (vreinterpretq_f64_s32): Likewise.
42094         (vreinterpretq_f64_s64): Likewise.
42095         (vreinterpretq_f64_u8): Likewise.
42096         (vreinterpretq_f64_u16): Likewise.
42097         (vreinterpretq_f64_u32): Likewise.
42098         (vreinterpretq_f64_u64): Likewise.
42099         (vreinterpret_s64_f64): Likewise.
42100         (vreinterpretq_s64_f64): Likewise.
42101         (vreinterpret_u64_f64): Likewise.
42102         (vreinterpretq_u64_f64): Likewise.
42103         (vreinterpret_s8_f64): Likewise.
42104         (vreinterpretq_s8_f64): Likewise.
42105         (vreinterpret_s16_f64): Likewise.
42106         (vreinterpretq_s16_f64): Likewise.
42107         (vreinterpret_s32_f64): Likewise.
42108         (vreinterpretq_s32_f64): Likewise.
42109         (vreinterpret_u8_f64): Likewise.
42110         (vreinterpretq_u8_f64): Likewise.
42111         (vreinterpret_u16_f64): Likewise.
42112         (vreinterpretq_u16_f64): Likewise.
42113         (vreinterpret_u32_f64): Likewise.
42114         (vreinterpretq_u32_f64): Likewise.
42115
42116 2014-04-22  Alex Velenko  <Alex.Velenko@arm.com>
42117
42118         * config/aarch64/aarch64/aarch64-builtins.c (TYPES_REINTERP): Removed.
42119         * config/aarch64/aarch64/aarch64-simd-builtins.def (REINTERP): Removed.
42120         (vreinterpret_p8_s8): Likewise.
42121         * config/aarch64/aarch64/arm_neon.h (vreinterpret_p8_s8): Uses cast.
42122         (vreinterpret_p8_s16): Likewise.
42123         (vreinterpret_p8_s32): Likewise.
42124         (vreinterpret_p8_s64): Likewise.
42125         (vreinterpret_p8_f32): Likewise.
42126         (vreinterpret_p8_u8): Likewise.
42127         (vreinterpret_p8_u16): Likewise.
42128         (vreinterpret_p8_u32): Likewise.
42129         (vreinterpret_p8_u64): Likewise.
42130         (vreinterpret_p8_p16): Likewise.
42131         (vreinterpretq_p8_s8): Likewise.
42132         (vreinterpretq_p8_s16): Likewise.
42133         (vreinterpretq_p8_s32): Likewise.
42134         (vreinterpretq_p8_s64): Likewise.
42135         (vreinterpretq_p8_f32): Likewise.
42136         (vreinterpretq_p8_u8): Likewise.
42137         (vreinterpretq_p8_u16): Likewise.
42138         (vreinterpretq_p8_u32): Likewise.
42139         (vreinterpretq_p8_u64): Likewise.
42140         (vreinterpretq_p8_p16): Likewise.
42141         (vreinterpret_p16_s8): Likewise.
42142         (vreinterpret_p16_s16): Likewise.
42143         (vreinterpret_p16_s32): Likewise.
42144         (vreinterpret_p16_s64): Likewise.
42145         (vreinterpret_p16_f32): Likewise.
42146         (vreinterpret_p16_u8): Likewise.
42147         (vreinterpret_p16_u16): Likewise.
42148         (vreinterpret_p16_u32): Likewise.
42149         (vreinterpret_p16_u64): Likewise.
42150         (vreinterpret_p16_p8): Likewise.
42151         (vreinterpretq_p16_s8): Likewise.
42152         (vreinterpretq_p16_s16): Likewise.
42153         (vreinterpretq_p16_s32): Likewise.
42154         (vreinterpretq_p16_s64): Likewise.
42155         (vreinterpretq_p16_f32): Likewise.
42156         (vreinterpretq_p16_u8): Likewise.
42157         (vreinterpretq_p16_u16): Likewise.
42158         (vreinterpretq_p16_u32): Likewise.
42159         (vreinterpretq_p16_u64): Likewise.
42160         (vreinterpretq_p16_p8): Likewise.
42161         (vreinterpret_f32_s8): Likewise.
42162         (vreinterpret_f32_s16): Likewise.
42163         (vreinterpret_f32_s32): Likewise.
42164         (vreinterpret_f32_s64): Likewise.
42165         (vreinterpret_f32_u8): Likewise.
42166         (vreinterpret_f32_u16): Likewise.
42167         (vreinterpret_f32_u32): Likewise.
42168         (vreinterpret_f32_u64): Likewise.
42169         (vreinterpret_f32_p8): Likewise.
42170         (vreinterpret_f32_p16): Likewise.
42171         (vreinterpretq_f32_s8): Likewise.
42172         (vreinterpretq_f32_s16): Likewise.
42173         (vreinterpretq_f32_s32): Likewise.
42174         (vreinterpretq_f32_s64): Likewise.
42175         (vreinterpretq_f32_u8): Likewise.
42176         (vreinterpretq_f32_u16): Likewise.
42177         (vreinterpretq_f32_u32): Likewise.
42178         (vreinterpretq_f32_u64): Likewise.
42179         (vreinterpretq_f32_p8): Likewise.
42180         (vreinterpretq_f32_p16): Likewise.
42181         (vreinterpret_s64_s8): Likewise.
42182         (vreinterpret_s64_s16): Likewise.
42183         (vreinterpret_s64_s32): Likewise.
42184         (vreinterpret_s64_f32): Likewise.
42185         (vreinterpret_s64_u8): Likewise.
42186         (vreinterpret_s64_u16): Likewise.
42187         (vreinterpret_s64_u32): Likewise.
42188         (vreinterpret_s64_u64): Likewise.
42189         (vreinterpret_s64_p8): Likewise.
42190         (vreinterpret_s64_p16): Likewise.
42191         (vreinterpretq_s64_s8): Likewise.
42192         (vreinterpretq_s64_s16): Likewise.
42193         (vreinterpretq_s64_s32): Likewise.
42194         (vreinterpretq_s64_f32): Likewise.
42195         (vreinterpretq_s64_u8): Likewise.
42196         (vreinterpretq_s64_u16): Likewise.
42197         (vreinterpretq_s64_u32): Likewise.
42198         (vreinterpretq_s64_u64): Likewise.
42199         (vreinterpretq_s64_p8): Likewise.
42200         (vreinterpretq_s64_p16): Likewise.
42201         (vreinterpret_u64_s8): Likewise.
42202         (vreinterpret_u64_s16): Likewise.
42203         (vreinterpret_u64_s32): Likewise.
42204         (vreinterpret_u64_s64): Likewise.
42205         (vreinterpret_u64_f32): Likewise.
42206         (vreinterpret_u64_u8): Likewise.
42207         (vreinterpret_u64_u16): Likewise.
42208         (vreinterpret_u64_u32): Likewise.
42209         (vreinterpret_u64_p8): Likewise.
42210         (vreinterpret_u64_p16): Likewise.
42211         (vreinterpretq_u64_s8): Likewise.
42212         (vreinterpretq_u64_s16): Likewise.
42213         (vreinterpretq_u64_s32): Likewise.
42214         (vreinterpretq_u64_s64): Likewise.
42215         (vreinterpretq_u64_f32): Likewise.
42216         (vreinterpretq_u64_u8): Likewise.
42217         (vreinterpretq_u64_u16): Likewise.
42218         (vreinterpretq_u64_u32): Likewise.
42219         (vreinterpretq_u64_p8): Likewise.
42220         (vreinterpretq_u64_p16): Likewise.
42221         (vreinterpret_s8_s16): Likewise.
42222         (vreinterpret_s8_s32): Likewise.
42223         (vreinterpret_s8_s64): Likewise.
42224         (vreinterpret_s8_f32): Likewise.
42225         (vreinterpret_s8_u8): Likewise.
42226         (vreinterpret_s8_u16): Likewise.
42227         (vreinterpret_s8_u32): Likewise.
42228         (vreinterpret_s8_u64): Likewise.
42229         (vreinterpret_s8_p8): Likewise.
42230         (vreinterpret_s8_p16): Likewise.
42231         (vreinterpretq_s8_s16): Likewise.
42232         (vreinterpretq_s8_s32): Likewise.
42233         (vreinterpretq_s8_s64): Likewise.
42234         (vreinterpretq_s8_f32): Likewise.
42235         (vreinterpretq_s8_u8): Likewise.
42236         (vreinterpretq_s8_u16): Likewise.
42237         (vreinterpretq_s8_u32): Likewise.
42238         (vreinterpretq_s8_u64): Likewise.
42239         (vreinterpretq_s8_p8): Likewise.
42240         (vreinterpretq_s8_p16): Likewise.
42241         (vreinterpret_s16_s8): Likewise.
42242         (vreinterpret_s16_s32): Likewise.
42243         (vreinterpret_s16_s64): Likewise.
42244         (vreinterpret_s16_f32): Likewise.
42245         (vreinterpret_s16_u8): Likewise.
42246         (vreinterpret_s16_u16): Likewise.
42247         (vreinterpret_s16_u32): Likewise.
42248         (vreinterpret_s16_u64): Likewise.
42249         (vreinterpret_s16_p8): Likewise.
42250         (vreinterpret_s16_p16): Likewise.
42251         (vreinterpretq_s16_s8): Likewise.
42252         (vreinterpretq_s16_s32): Likewise.
42253         (vreinterpretq_s16_s64): Likewise.
42254         (vreinterpretq_s16_f32): Likewise.
42255         (vreinterpretq_s16_u8): Likewise.
42256         (vreinterpretq_s16_u16): Likewise.
42257         (vreinterpretq_s16_u32): Likewise.
42258         (vreinterpretq_s16_u64): Likewise.
42259         (vreinterpretq_s16_p8): Likewise.
42260         (vreinterpretq_s16_p16): Likewise.
42261         (vreinterpret_s32_s8): Likewise.
42262         (vreinterpret_s32_s16): Likewise.
42263         (vreinterpret_s32_s64): Likewise.
42264         (vreinterpret_s32_f32): Likewise.
42265         (vreinterpret_s32_u8): Likewise.
42266         (vreinterpret_s32_u16): Likewise.
42267         (vreinterpret_s32_u32): Likewise.
42268         (vreinterpret_s32_u64): Likewise.
42269         (vreinterpret_s32_p8): Likewise.
42270         (vreinterpret_s32_p16): Likewise.
42271         (vreinterpretq_s32_s8): Likewise.
42272         (vreinterpretq_s32_s16): Likewise.
42273         (vreinterpretq_s32_s64): Likewise.
42274         (vreinterpretq_s32_f32): Likewise.
42275         (vreinterpretq_s32_u8): Likewise.
42276         (vreinterpretq_s32_u16): Likewise.
42277         (vreinterpretq_s32_u32): Likewise.
42278         (vreinterpretq_s32_u64): Likewise.
42279         (vreinterpretq_s32_p8): Likewise.
42280         (vreinterpretq_s32_p16): Likewise.
42281         (vreinterpret_u8_s8): Likewise.
42282         (vreinterpret_u8_s16): Likewise.
42283         (vreinterpret_u8_s32): Likewise.
42284         (vreinterpret_u8_s64): Likewise.
42285         (vreinterpret_u8_f32): Likewise.
42286         (vreinterpret_u8_u16): Likewise.
42287         (vreinterpret_u8_u32): Likewise.
42288         (vreinterpret_u8_u64): Likewise.
42289         (vreinterpret_u8_p8): Likewise.
42290         (vreinterpret_u8_p16): Likewise.
42291         (vreinterpretq_u8_s8): Likewise.
42292         (vreinterpretq_u8_s16): Likewise.
42293         (vreinterpretq_u8_s32): Likewise.
42294         (vreinterpretq_u8_s64): Likewise.
42295         (vreinterpretq_u8_f32): Likewise.
42296         (vreinterpretq_u8_u16): Likewise.
42297         (vreinterpretq_u8_u32): Likewise.
42298         (vreinterpretq_u8_u64): Likewise.
42299         (vreinterpretq_u8_p8): Likewise.
42300         (vreinterpretq_u8_p16): Likewise.
42301         (vreinterpret_u16_s8): Likewise.
42302         (vreinterpret_u16_s16): Likewise.
42303         (vreinterpret_u16_s32): Likewise.
42304         (vreinterpret_u16_s64): Likewise.
42305         (vreinterpret_u16_f32): Likewise.
42306         (vreinterpret_u16_u8): Likewise.
42307         (vreinterpret_u16_u32): Likewise.
42308         (vreinterpret_u16_u64): Likewise.
42309         (vreinterpret_u16_p8): Likewise.
42310         (vreinterpret_u16_p16): Likewise.
42311         (vreinterpretq_u16_s8): Likewise.
42312         (vreinterpretq_u16_s16): Likewise.
42313         (vreinterpretq_u16_s32): Likewise.
42314         (vreinterpretq_u16_s64): Likewise.
42315         (vreinterpretq_u16_f32): Likewise.
42316         (vreinterpretq_u16_u8): Likewise.
42317         (vreinterpretq_u16_u32): Likewise.
42318         (vreinterpretq_u16_u64): Likewise.
42319         (vreinterpretq_u16_p8): Likewise.
42320         (vreinterpretq_u16_p16): Likewise.
42321         (vreinterpret_u32_s8): Likewise.
42322         (vreinterpret_u32_s16): Likewise.
42323         (vreinterpret_u32_s32): Likewise.
42324         (vreinterpret_u32_s64): Likewise.
42325         (vreinterpret_u32_f32): Likewise.
42326         (vreinterpret_u32_u8): Likewise.
42327         (vreinterpret_u32_u16): Likewise.
42328         (vreinterpret_u32_u64): Likewise.
42329         (vreinterpret_u32_p8): Likewise.
42330         (vreinterpret_u32_p16): Likewise.
42331         (vreinterpretq_u32_s8): Likewise.
42332         (vreinterpretq_u32_s16): Likewise.
42333         (vreinterpretq_u32_s32): Likewise.
42334         (vreinterpretq_u32_s64): Likewise.
42335         (vreinterpretq_u32_f32): Likewise.
42336         (vreinterpretq_u32_u8): Likewise.
42337         (vreinterpretq_u32_u16): Likewise.
42338         (vreinterpretq_u32_u64): Likewise.
42339         (vreinterpretq_u32_p8): Likewise.
42340         (vreinterpretq_u32_p16): Likewise.
42341
42342 2014-04-22  Alex Velenko  <Alex.Velenko@arm.com>
42343
42344         * gcc/config/aarch64/aarch64-simd.md (aarch64_s<optab><mode>):
42345         Pattern extended.
42346         * config/aarch64/aarch64-simd-builtins.def (sqneg): Iterator extended.
42347         (sqabs): Likewise.
42348         * config/aarch64/arm_neon.h (vqneg_s64): New intrinsic.
42349         (vqnegd_s64): Likewise.
42350         (vqabs_s64): Likewise.
42351         (vqabsd_s64): Likewise.
42352
42353 2014-04-22  Richard Henderson  <rth@redhat.com>
42354
42355         * config/sparc/sparc.c (sparc_init_modes): Hoist GET_MODE_SIZE
42356         computation to the top of the loop.
42357
42358 2014-04-22  Renlin  <renlin.li@arm.com>
42359             Jiong Wang  <jiong.wang@arm.com>
42360
42361         * config/aarch64/aarch64.h (aarch64_frame): Delete "fp_lr_offset".
42362         * config/aarch64/aarch64.c (aarch64_layout_frame)
42363         (aarch64_initial_elimination_offset): Likewise.
42364
42365 2014-04-22  Marcus Shawcroft  <marcus.shawcroft@arm.com>
42366
42367         * config/aarch64/aarch64.c (aarch64_initial_elimination_offset):
42368         Fix indentation.
42369
42370 2014-04-22  Richard Sandiford  <rdsandiford@googlemail.com>
42371
42372         * machmode.h (bitwise_mode_for_mode): Declare.
42373         * stor-layout.h (bitwise_type_for_mode): Likewise.
42374         * stor-layout.c (bitwise_mode_for_mode): New function.
42375         (bitwise_type_for_mode): Likewise.
42376         * builtins.c (fold_builtin_memory_op): Use it instead of
42377         int_mode_for_mode and build_nonstandard_integer_type.
42378
42379 2014-04-22  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
42380
42381         * config.gcc (enable_obsolete): Remove *-*-solaris2.9*.
42382         (*-*-solaris2.[0-9] | *-*-solaris2.[0-9].*): Mark unsupported.
42383         (*-*-solaris2*): Simplify.
42384         (i[34567]86-*-solaris2* | x86_64-*-solaris2.1[0-9]*): Likewise.
42385         (i[34567]86-*-solaris2* | x86_64-*-solaris2.1[0-9]*): Remove
42386         *-*-solaris2.9* handling.
42387
42388         * configure.ac (gcc_cv_as_hidden): Remove test for Solaris 9/x86
42389         as bug.
42390         (gcc_cv_ld_hidden): Remove *-*-solaris2.9* handling.
42391         (ld_tls_support): Remove i?86-*-solaris2.9, sparc*-*-solaris2.9
42392         handling, simplify.
42393         (gcc_cv_as_gstabs_flag): Remove workaround for Solaris 9/x86 as bug.
42394         * configure: Regenerate.
42395
42396         * config/i386/sol2-9.h: Remove.
42397
42398         * doc/install.texi (Specific, i?86-*-solaris2.9): Remove.
42399         (Specific, *-*-solaris2*): Mention Solaris 9 support removal.
42400         Remove Solaris 9 references.
42401
42402 2014-04-22  Vidya Praveen  <vidyapraveen@arm.com>
42403
42404         * aarch64.md (float<GPI:mode><GPF:mode>2): Remove.
42405         (floatuns<GPI:mode><GPF:mode>2): Remove.
42406         (<optab><fcvt_target><GPF:mode>2): New pattern for equal width float
42407         and floatuns conversions.
42408         (<optab><fcvt_iesize><GPF:mode>2): New pattern for inequal width float
42409         and floatuns conversions.
42410         * iterators.md (fcvt_target, FCVT_TARGET): Support SF and DF modes.
42411         (w1,w2): New mode attributes for inequal width conversions.
42412
42413 2014-04-22  Renlin Li  <Renlin.Li@arm.com>
42414
42415         * config/aarch64/aarch64.c (aarch64_print_operand_address): Adjust
42416         the output asm format.
42417
42418 2014-04-22  James Greenhalgh  <james.greenhalgh@arm.com>
42419
42420         * config/aarch64/aarch64-simd.md
42421         (aarch64_cm<optab>di): Always split.
42422         (*aarch64_cm<optab>di): New.
42423         (aarch64_cmtstdi): Always split.
42424         (*aarch64_cmtstdi): New.
42425
42426 2014-04-22  Jakub Jelinek  <jakub@redhat.com>
42427
42428         PR tree-optimization/60823
42429         * omp-low.c (ipa_simd_modify_function_body): Go through
42430         all SSA_NAMEs and for those refering to vector arguments
42431         which are going to be replaced adjust SSA_NAME_VAR and,
42432         if it is a default definition, change it into a non-default
42433         definition assigned at the beginning of function from new_decl.
42434         (ipa_simd_modify_stmt_ops): Rewritten.
42435         * tree-dfa.c (set_ssa_default_def): When removing default def,
42436         check for NULL loc instead of NULL *loc.
42437
42438 2014-04-22  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
42439
42440         * config/arm/arm.c (arm_hard_regno_mode_ok): Loosen
42441         restrictions on core registers for DImode values in Thumb2.
42442
42443 2014-04-22  Ian Bolton  <ian.bolton@arm.com>
42444
42445         * config/arm/arm.md (*anddi_notdi_zesidi): New pattern.
42446         * config/arm/thumb2.md (*iordi_notdi_zesidi): New pattern.
42447
42448 2014-04-22  Ian Bolton  <ian.bolton@arm.com>
42449
42450         * config/arm/thumb2.md (*iordi_notdi_di): New pattern.
42451         (*iordi_notzesidi_di): Likewise.
42452         (*iordi_notsesidi_di): Likewise.
42453
42454 2014-04-22  Ian Bolton  <ian.bolton@arm.com>
42455
42456         * config/arm/arm-protos.h (tune_params): New struct members.
42457         * config/arm/arm.c: Initialise tune_params per processor.
42458         (thumb2_reorg): Suppress conversion from t32 to t16 when optimizing
42459         for speed, based on new tune_params.
42460
42461 2014-04-22  Alex Velenko  <Alex.Velenko@arm.com>
42462
42463         * config/aarch64/aarch64-builtins.c (BUILTIN_VDQF_DF): Macro added.
42464         * config/aarch64/aarch64-simd-builtins.def (frintn): Use added macro.
42465         * config/aarch64/aarch64-simd.md (<frint_pattern>): Comment corrected.
42466         * config/aarch64/aarch64.md (<frint_pattern>): Likewise.
42467         * config/aarch64/arm_neon.h (vrnd_f64): Added.
42468         (vrnda_f64): Likewise.
42469         (vrndi_f64): Likewise.
42470         (vrndm_f64): Likewise.
42471         (vrndn_f64): Likewise.
42472         (vrndp_f64): Likewise.
42473         (vrndx_f64): Likewise.
42474
42475 2014-04-22  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
42476
42477         * config/arm/arm.c (arm_print_operand, thumb_exit): Make sure
42478         GET_MODE_SIZE argument is enum machine_mode.
42479
42480 2014-04-22  Jakub Jelinek  <jakub@redhat.com>
42481
42482         PR target/60910
42483         * config/sparc/sparc.c (sparc_init_modes): Pass enum machine_mode
42484         value instead of int to GET_MODE_CLASS and GET_MODE_SIZE macros.
42485
42486 2014-04-22  Lin Zuojian  <manjian2006@gmail.com>
42487
42488         PR middle-end/60281
42489         * asan.c (asan_emit_stack_protection): Force the base to align to
42490         appropriate bits if STRICT_ALIGNMENT.  Set shadow_mem align to
42491         appropriate bits if STRICT_ALIGNMENT.
42492         * cfgexpand.c (expand_stack_vars): Set base_align appropriately
42493         when asan is on.
42494         (expand_used_vars): Leave a space in the stack frame for alignment
42495         if STRICT_ALIGNMENT.
42496
42497 2014-04-21  David Malcolm  <dmalcolm@redhat.com>
42498
42499         * gimple.h (gimple_assign_single_p): Accept a const_gimple rather
42500         than a gimple.
42501         (gimple_store_p): Likewise.
42502         (gimple_assign_load_p): Likewise.
42503         (gimple_assign_cast_p): Likewise.
42504         (gimple_clobber_p): Likewise.
42505
42506         * doc/gimple.texi (gimple_assign_cast_p): Accept a const_gimple
42507         rather than a gimple.
42508         (gimple_assign_cast_p): Likewise.
42509
42510 2014-04-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
42511
42512         PR target/60735
42513         * config/rs6000/rs6000.md (mov<mode>_softfloat32, FMOVE64 case):
42514         If mode is DDmode and TARGET_E500_DOUBLE allow move.
42515
42516         * config/rs6000/rs6000.c (rs6000_debug_reg_global): Print some
42517         more debug information for E500 if -mdebug=reg.
42518
42519 2014-04-21  Uros Bizjak  <ubizjak@gmail.com>
42520
42521         PR target/60909
42522         * config/i386/i386.c (ix86_expand_builtin)
42523         <case IX86_BUILTIN_RDRAND{16,32,64}_STEP>: Use temporary
42524         register for target RTX.
42525         <case IX86_BUILTIN_RDSEED{16,32,64}_STEP>: Ditto.
42526
42527 2014-04-18  Cong Hou  <congh@google.com>
42528
42529         * tree-vect-patterns.c (vect_recog_widen_mult_pattern): Enhance
42530         the widen-mult pattern by handling two operands with different sizes,
42531         and operands whose size is smaller than half of the result type.
42532
42533 2014-04-18  Jan Hubicka  <hubicka@ucw.cz>
42534
42535         * ipa-inline.h (INLINE_HINT_known_hot): New hint.
42536         * ipa-inline-analysis.c (dump_inline_hints): Dump it.
42537         (do_estimate_edge_time): Compute it.
42538         * ipa-inline.c (want_inline_small_function_p): Bypass
42539         INLINE_INSNS_AUTO/SINGLE limits for calls that are known to be hot.
42540
42541 2014-04-18  Jan Hubicka  <hubicka@ucw.cz>
42542
42543         * ipa-inline.c (spec_rem): New static variable.
42544         (dump_overall_stats): New function.
42545         (dump_inline_stats): New function.
42546
42547 2014-04-18  Richard Henderson  <rth@redhat.com>
42548
42549         * config/aarch64/aarch64.c (aarch64_register_move_cost): Pass a mode
42550         to GET_MODE_SIZE, not a reg_class_t.
42551
42552 2014-04-18  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
42553
42554         * config/rs6000/vsx.md (vsx_xxmrghw_<mode>): Adjust for little-endian.
42555         (vsx_xxmrglw_<mode>): Likewise.
42556
42557 2014-04-17  Michael Meissner  <meissner@linux.vnet.ibm.com>
42558
42559         PR target/60876
42560         * config/rs6000/rs6000.c (rs6000_setup_reg_addr_masks): Make sure
42561         GET_MODE_SIZE gets passed an enum machine_mode type and not integer.
42562         (rs6000_init_hard_regno_mode_ok): Likewise.
42563
42564 2014-04-17  Jan Hubicka  <hubicka@ucw.cz>
42565
42566         * ipa-inline.c (inline_small_functions): Account only non-cold
42567         functions.
42568         * doc/invoke.texi (inline-unit-growth): Update documentation.
42569
42570 2014-04-17  Pat Haugen  <pthaugen@us.ibm.com>
42571
42572         * config/rs6000/rs6000.md (addti3, subti3): New.
42573
42574 2014-04-17  H.J. Lu  <hongjiu.lu@intel.com>
42575
42576         PR target/60863
42577         * config/i386/i386.c (ix86_expand_clear): Remove outdated
42578         comment.  Check optimize_insn_for_size_p instead of
42579         optimize_insn_for_speed_p.
42580
42581 2014-04-17  Martin Jambor  <mjambor@suse.cz>
42582
42583         * gimple-iterator.c (gsi_start_edge): New function.
42584         * gimple-iterator.h (gsi_start_edge): Declare.
42585         * tree-sra.c (single_non_eh_succ): New function.
42586         (disqualify_ops_if_throwing_stmt): Renamed to
42587         disqualify_if_bad_bb_terminating_stmt.  Allow throwing statements
42588         having one non-EH successor BB.
42589         (sra_modify_expr): If stmt ends bb, use single non-EH successor to
42590         generate loads into replacements.
42591         (sra_modify_assign): Likewise and and also use the simple path for
42592         such statements.
42593         (sra_modify_function_body): Commit statements on edges.
42594
42595 2014-04-17  Richard Biener  <rguenther@suse.de>
42596
42597         PR middle-end/60849
42598         * tree-ssa-propagate.c (valid_gimple_rhs_p): Allow vector
42599         comparison results and add clarifying comment.
42600
42601 2014-04-17  Jakub Jelinek  <jakub@redhat.com>
42602
42603         * genmodes.c (struct mode_data): Add need_bytesize_adj field.
42604         (blank_mode): Initialize it.
42605         (emit_mode_size_inline, emit_mode_nunits_inline,
42606         emit_mode_inner_inline): New functions.
42607         (emit_insn_modes_h): Call them and surround their output with
42608         #if GCC_VERSION >= 4001 ... #endif.
42609         * machmode.h (GET_MODE_SIZE, GET_MODE_NUNITS, GET_MODE_INNER):
42610         For GCC_VERSION >= 4001 use mode_*_inline routines instead of
42611         mode_* arrays if the argument is __builtin_constant_p.
42612         * lower-subreg.c (dump_choices): Make sure GET_MODE_SIZE argument
42613         is enum machine_mode.
42614
42615 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42616
42617         * passes.c (opt_pass::execute): Adjust.
42618         (pass_manager::execute_pass_mode_switching): Likewise.
42619         (early_local_passes::execute): Likewise.
42620         (execute_one_pass): Pass cfun to the pass's execute method.
42621         * tree-pass.h (opt_pass::execute): Add function * argument.
42622         * asan.c, auto-inc-dec.c, bb-reorder.c, bt-load.c, cfgcleanup.c,
42623         cfgexpand.c, cfgrtl.c, cgraphbuild.c, combine-stack-adj.c, combine.c,
42624         compare-elim.c, config/arc/arc.c, config/epiphany/mode-switch-use.c,
42625         config/epiphany/resolve-sw-modes.c, config/i386/i386.c,
42626         config/mips/mips.c, config/rl78/rl78.c, config/s390/s390.c,
42627         config/sparc/sparc.c, cprop.c, dce.c, df-core.c, dse.c, dwarf2cfi.c,
42628         except.c, final.c, function.c, fwprop.c, gcse.c, gimple-low.c,
42629         gimple-ssa-isolate-paths.c, gimple-ssa-strength-reduction.c,
42630         graphite.c, ifcvt.c, init-regs.c, ipa-cp.c, ipa-devirt.c,
42631         ipa-inline-analysis.c, ipa-inline.c, ipa-profile.c, ipa-pure-const.c,
42632         ipa-reference.c, ipa-split.c, ipa.c, ira.c, jump.c, loop-init.c,
42633         lower-subreg.c, mode-switching.c, omp-low.c, postreload-gcse.c,
42634         postreload.c, predict.c, recog.c, ree.c, reg-stack.c, regcprop.c,
42635         reginfo.c, regrename.c, reorg.c, sched-rgn.c, stack-ptr-mod.c,
42636         store-motion.c, tracer.c, trans-mem.c, tree-call-cdce.c, tree-cfg.c,
42637         tree-cfgcleanup.c, tree-complex.c, tree-eh.c, tree-emutls.c,
42638         tree-if-conv.c, tree-into-ssa.c, tree-loop-distribution.c, tree-nrv.c,
42639         tree-object-size.c, tree-parloops.c, tree-predcom.c, tree-ssa-ccp.c,
42640         tree-ssa-copy.c, tree-ssa-copyrename.c, tree-ssa-dce.c,
42641         tree-ssa-dom.c, tree-ssa-dse.c, tree-ssa-forwprop.c,
42642         tree-ssa-ifcombine.c, tree-ssa-loop-ch.c, tree-ssa-loop-im.c,
42643         tree-ssa-loop-ivcanon.c, tree-ssa-loop-prefetch.c,
42644         tree-ssa-loop-unswitch.c, tree-ssa-loop.c, tree-ssa-math-opts.c,
42645         tree-ssa-phiopt.c, tree-ssa-phiprop.c, tree-ssa-pre.c,
42646         tree-ssa-reassoc.c, tree-ssa-sink.c, tree-ssa-strlen.c,
42647         tree-ssa-structalias.c, tree-ssa-uncprop.c, tree-ssa-uninit.c,
42648         tree-ssa.c, tree-ssanames.c, tree-stdarg.c, tree-switch-conversion.c,
42649         tree-tailcall.c, tree-vect-generic.c, tree-vectorizer.c, tree-vrp.c,
42650         tree.c, tsan.c, ubsan.c, var-tracking.c, vtable-verify.c, web.c:
42651         Adjust.
42652
42653 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42654
42655         * passes.c (opt_pass::gate): Take function * argument.
42656         (gate_all_early_local_passes): Merge into
42657         (early_local_passes::gate): this.
42658         (gate_all_early_optimizations): Merge into
42659         (all_early_optimizations::gate): this.
42660         (gate_all_optimizations): Mege into
42661         (all_optimizations::gate): this.
42662         (gate_all_optimizations_g): Merge into
42663         (all_optimizations_g::gate): this.
42664         (gate_rest_of_compilation): Mege into
42665         (rest_of_compilation::gate): this.
42666         (gate_postreload): Merge into
42667         (postreload::gate): this.
42668         (dump_one_pass): Pass cfun to the pass's gate method.
42669         (execute_ipa_summary_passes): Likewise.
42670         (execute_one_pass): Likewise.
42671         (ipa_write_summaries_2): Likewise.
42672         (ipa_write_optimization_summaries_1): Likewise.
42673         (ipa_read_summaries_1): Likewise.
42674         (ipa_read_optimization_summaries_1): Likewise.
42675         (execute_ipa_stmt_fixups): Likewise.
42676         * tree-pass.h (opt_pass::gate): Add function * argument.
42677         * asan.c, auto-inc-dec.c, bb-reorder.c, bt-load.c,
42678         combine-stack-adj.c, combine.c, compare-elim.c,
42679         config/epiphany/resolve-sw-modes.c, config/i386/i386.c,
42680         config/rl78/rl78.c, config/sh/sh_optimize_sett_clrt.cc,
42681         config/sh/sh_treg_combine.cc, config/sparc/sparc.c, cprop.c, cse.c,
42682         dce.c, df-core.c, dse.c, dwarf2cfi.c, except.c,  fwprop.c, gcse.c,
42683         gimple-ssa-isolate-paths.c, gimple-ssa-strength-reduction.c,
42684         graphite.c, ifcvt.c, init-regs.c, ipa-cp.c, ipa-devirt.c,
42685         ipa-profile.c, ipa-pure-const.c, ipa-reference.c, ipa-split.c, ipa.c,
42686         loop-init.c, lower-subreg.c, mode-switching.c, modulo-sched.c,
42687         omp-low.c, postreload-gcse.c, postreload.c, predict.c, recog.c, ree.c,
42688         reg-stack.c, regcprop.c, regrename.c, reorg.c, sched-rgn.c,
42689         store-motion.c, tracer.c, trans-mem.c, tree-call-cdce.c, tree-cfg.c,
42690         tree-cfgcleanup.c, tree-complex.c, tree-eh.c, tree-emutls.c,
42691         tree-if-conv.c, tree-into-ssa.c, tree-loop-distribution.c,
42692         tree-nrv.c, tree-parloops.c, tree-predcom.c, tree-profile.c,
42693         tree-sra.c, tree-ssa-ccp.c, tree-ssa-copy.c, tree-ssa-copyrename.c,
42694         tree-ssa-dce.c, tree-ssa-dom.c, tree-ssa-dse.c, tree-ssa-forwprop.c,
42695         tree-ssa-ifcombine.c, tree-ssa-loop-ch.c, tree-ssa-loop-im.c,
42696         tree-ssa-loop-ivcanon.c, tree-ssa-loop-prefetch.c,
42697         tree-ssa-loop-unswitch.c, tree-ssa-loop.c, tree-ssa-math-opts.c,
42698         tree-ssa-phiopt.c, tree-ssa-phiprop.c, tree-ssa-pre.c,
42699         tree-ssa-reassoc.c, tree-ssa-sink.c, tree-ssa-strlen.c,
42700         tree-ssa-structalias.c, tree-ssa-uncprop.c, tree-ssa-uninit.c,
42701         tree-ssa.c, tree-stdarg.c, tree-switch-conversion.c, tree-tailcall.c,
42702         tree-vect-generic.c, tree-vectorizer.c, tree-vrp.c, tsan.c, ubsan.c,
42703         var-tracking.c, vtable-verify.c, web.c: Adjust.
42704
42705 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42706
42707         * configure.ac: Check for -Woverloaded-virtual and enable it if found.
42708         * configure: Regenerate.
42709
42710 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42711
42712         * passes.c (dump_one_pass): don't check pass->has_gate.
42713         (execute_ipa_summary_passes): Likewise.
42714         (execute_one_pass): Likewise.
42715         (ipa_write_summaries_2): Likewise.
42716         (ipa_write_optimization_summaries_1): Likewise.
42717         (ipa_read_optimization_summaries_1): Likewise.
42718         (execute_ipa_stmt_fixups): Likewise.
42719         * tree-pass.h (pass_data::has_gate): Remove.
42720         * asan.c, auto-inc-dec.c, bb-reorder.c, bt-load.c, cfgcleanup.c,
42721         cfgexpand.c, cfgrtl.c, cgraphbuild.c, combine-stack-adj.c, combine.c,
42722         compare-elim.c, config/arc/arc.c, config/epiphany/mode-switch-use.c,
42723         config/epiphany/resolve-sw-modes.c, config/i386/i386.c,
42724         config/mips/mips.c, config/rl78/rl78.c, config/s390/s390.c,
42725         config/sh/sh_optimize_sett_clrt.cc, config/sh/sh_treg_combine.cc,
42726         config/sparc/sparc.c, cprop.c, cse.c, dce.c, df-core.c, dse.c,
42727         dwarf2cfi.c, except.c, final.c, function.c, fwprop.c, gcse.c,
42728         gimple-low.c, gimple-ssa-isolate-paths.c,
42729         gimple-ssa-strength-reduction.c, graphite.c, ifcvt.c, init-regs.c,
42730         ipa-cp.c, ipa-devirt.c, ipa-inline-analysis.c, ipa-inline.c,
42731         ipa-profile.c, ipa-pure-const.c, ipa-reference.c, ipa-split.c, ipa.c,
42732         ira.c, jump.c, loop-init.c, lower-subreg.c, mode-switching.c,
42733         modulo-sched.c, omp-low.c, postreload-gcse.c, postreload.c, predict.c,
42734         recog.c, ree.c, reg-stack.c, regcprop.c, reginfo.c, regrename.c,
42735         reorg.c, sched-rgn.c, stack-ptr-mod.c, store-motion.c, tracer.c,
42736         trans-mem.c, tree-call-cdce.c, tree-cfg.c, tree-cfgcleanup.c,
42737         tree-complex.c, tree-eh.c, tree-emutls.c, tree-if-conv.c,
42738         tree-into-ssa.c, tree-loop-distribution.c, tree-nrv.c,
42739         tree-object-size.c, tree-parloops.c, tree-predcom.c, tree-profile.c,
42740         tree-sra.c, tree-ssa-ccp.c, tree-ssa-copy.c, tree-ssa-copyrename.c,
42741         tree-ssa-dce.c, tree-ssa-dom.c, tree-ssa-dse.c, tree-ssa-forwprop.c,
42742         tree-ssa-ifcombine.c, tree-ssa-loop-ch.c, tree-ssa-loop-im.c,
42743         tree-ssa-loop-ivcanon.c, tree-ssa-loop-prefetch.c,
42744         tree-ssa-loop-unswitch.c, tree-ssa-loop.c, tree-ssa-math-opts.c,
42745         tree-ssa-phiopt.c, tree-ssa-phiprop.c, tree-ssa-pre.c,
42746         tree-ssa-reassoc.c, tree-ssa-sink.c, tree-ssa-strlen.c,
42747         tree-ssa-structalias.c, tree-ssa-uncprop.c, tree-ssa-uninit.c,
42748         tree-ssa.c, tree-ssanames.c, tree-stdarg.c, tree-switch-conversion.c,
42749         tree-tailcall.c, tree-vect-generic.c, tree-vectorizer.c, tree-vrp.c,
42750         tree.c, tsan.c, ubsan.c, var-tracking.c, vtable-verify.c, web.c:
42751         Adjust.
42752
42753 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42754
42755         * pass_manager.h (pass_manager::register_dump_files_1): Remove
42756         declaration.
42757         * passes.c (pass_manager::register_dump_files_1): Merge into
42758         (pass_manager::register_dump_files): this, and remove its handling of
42759         properties since the pass always has the properties anyway.
42760         (pass_manager::pass_manager): Adjust.
42761
42762 2014-04-17  Trevor Saunders  <tsaunders@mozilla.com>
42763
42764         * pass_manager.h (pass_manager::register_dump_files_1): Adjust.
42765         * passes.c (pass_manager::register_dump_files_1): Remove dead code
42766         dealing with properties.
42767         (pass_manager::register_dump_files): Adjust.
42768
42769 2014-03-20  Mark Wielaard  <mjw@redhat.com>
42770
42771         * dwarf2out.c (add_bound_info): If HOST_WIDE_INT is big enough,
42772         then represent the bound as normal constant value.
42773
42774 2014-04-17  Jakub Jelinek  <jakub@redhat.com>
42775
42776         PR target/60847
42777         Forward port from 4.8 branch
42778         2013-07-19  Kirill Yukhin  <kirill.yukhin@intel.com>
42779
42780         * config/i386/bmiintrin.h (_blsi_u32): New.
42781         (_blsi_u64): Ditto.
42782         (_blsr_u32): Ditto.
42783         (_blsr_u64): Ditto.
42784         (_blsmsk_u32): Ditto.
42785         (_blsmsk_u64): Ditto.
42786         (_tzcnt_u32): Ditto.
42787         (_tzcnt_u64): Ditto.
42788
42789 2014-04-17  Kito Cheng  <kito@0xlab.org>
42790
42791         * gcc.c (used_arg): Prevent out of bound access for multilib_options.
42792
42793 2014-04-17  Richard Biener  <rguenther@suse.de>
42794
42795         PR middle-end/60849
42796         * tree-ssa-propagate.c (valid_gimple_rhs_p): Only allow effective
42797         boolean results for comparisons.
42798
42799 2014-04-17  Richard Biener  <rguenther@suse.de>
42800
42801         PR tree-optimization/60836
42802         * tree-vect-loop.c (vect_create_epilog_for_reduction): Force
42803         initial PHI args to be gimple values.
42804
42805 2014-04-17  Richard Biener  <rguenther@suse.de>
42806
42807         PR tree-optimization/60841
42808         * tree-vect-data-refs.c (vect_analyze_data_refs): Count stmts.
42809         * tree-vect-loop.c (vect_analyze_loop_2): Pass down number
42810         of stmts to SLP build.
42811         * tree-vect-slp.c (vect_slp_analyze_bb_1): Likewise.
42812         (vect_analyze_slp): Likewise.
42813         (vect_analyze_slp_instance): Likewise.
42814         (vect_build_slp_tree): Limit overall SLP tree growth.
42815         * tree-vectorizer.h (vect_analyze_data_refs,
42816         vect_analyze_slp): Adjust prototypes.
42817
42818 2014-04-17  Evgeny Stupachenko  <evstupac@gmail.com>
42819
42820         * config/i386/i386.c (x86_add_stmt_cost): Fix vector cost model for
42821         Silvermont.
42822
42823 2014-04-17  Evgeny Stupachenko  <evstupac@gmail.com>
42824
42825         * config/i386/x86-tune.def (TARGET_SLOW_PSHUFB): New tune definition.
42826         * config/i386/i386.h (TARGET_SLOW_PSHUFB): New tune flag.
42827         * config/i386/i386.c (expand_vec_perm_even_odd_1): Avoid byte shuffles
42828         for TARGET_SLOW_PSHUFB
42829
42830 2014-04-17  Evgeny Stupachenko  <evstupac@gmail.com>
42831
42832         * config/i386/i386.c (slm_cost): Adjust vec_to_scalar_cost.
42833         * config/i386/i386.c (intel_cost): Ditto.
42834
42835 2014-04-17  Joey Ye  <joey.ye@arm.com>
42836
42837         * opts.c (OPT_fif_conversion, OPT_fif_conversion2): Disable for Og.
42838
42839 2014-04-16  Jan Hubicka  <hubicka@ucw.cz>
42840
42841         * opts.c (common_handle_option): Disable -fipa-reference coorectly
42842         with -fuse-profile.
42843
42844 2014-04-16  Jan Hubicka  <hubicka@ucw.cz>
42845
42846         * ipa-devirt.c (odr_type_d): Add field all_derivations_known.
42847         (type_all_derivations_known_p): New predicate.
42848         (type_all_ctors_visible_p): New predicate.
42849         (type_possibly_instantiated_p): New predicate.
42850         (get_odr_type): Compute all_derivations_known.
42851         (dump_odr_type): Dump the flag.
42852         (maybe_record_type): Cleanup.
42853         (record_target_from_binfo): Add bases_to_consider array;
42854         record bases for types w/o instances and skip CXX destructor.
42855         (possible_polymorphic_call_targets_1): Add bases_to_consider
42856         and consider_construction parameters; check if type may have instance.
42857         (get_polymorphic_call_info): Set maybe_in_construction to true
42858         when we know nothing.
42859         (record_targets_from_bases): Skip CXX destructors; they are
42860         never called for types in construction.
42861         (possible_polymorphic_call_targets): Do not record target when
42862         type may not have instance.
42863
42864 2014-04-16  Jan Hubicka  <hubicka@ucw.cz>
42865
42866         PR ipa/60854
42867         * ipa.c (symtab_remove_unreachable_nodes): Mark targets of
42868         external aliases alive, too.
42869
42870 2014-04-16  Andrew  Pinski  <apinski@cavium.com>
42871
42872         * config/host-linux.c (TRY_EMPTY_VM_SPACE): Change aarch64 ilp32
42873         definition.
42874
42875 2014-04-16  Eric Botcazou  <ebotcazou@adacore.com>
42876
42877         * final.c (compute_alignments): Do not apply loop alignment to a block
42878         falling through to the exit.
42879
42880 2014-04-16  Catherine Moore  <clm@codesourcery.com>
42881
42882         * mips.md (*mov<mode>_internal, *movhi_internal, *movqi_internal):
42883         Adjust constraints for microMIPS store patterns.
42884
42885 2014-04-16  Pitchumani Sivanupandi  <Pitchumani.S@atmel.com>
42886
42887         * config/avr/avr-mcus.def: Correct typo for atxmega256a3bu macro.
42888
42889 2014-04-16  Eric Botcazou  <ebotcazou@adacore.com>
42890
42891         * tree-ssa-operands.c (create_vop_var): Set DECL_IGNORED_P.
42892         (append_use): Run at -O0.
42893         (append_vdef): Likewise.
42894         * tree-ssa-ter.c (ter_is_replaceable_p): Do not special-case -O0.
42895         * tree-ssa-uninit.c (warn_uninitialized_vars): Remove obsolete comment.
42896
42897 2014-04-16  Jakub Jelinek  <jakub@redhat.com>
42898
42899         PR tree-optimization/60844
42900         * tree-ssa-reassoc.c (reassoc_remove_stmt): New function.
42901         (propagate_op_to_single_use, remove_visited_stmt_chain,
42902         linearize_expr, repropagate_negates, reassociate_bb): Use it
42903         instead of gsi_remove.
42904
42905 2014-04-16  Martin Jambor  <mjambor@suse.cz>
42906
42907         * cgraphclones.c (cgraph_create_virtual_clone): Duplicate
42908         ipa_transforms_to_apply.
42909         (cgraph_function_versioning): Assert that old_node has empty
42910         ipa_transforms_to_apply.
42911         * trans-mem.c (ipa_tm_create_version): Likewise.
42912         * tree-inline.c (tree_function_versioning): Do not duplicate
42913         ipa_transforms_to_apply.
42914
42915 2014-04-16  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
42916
42917         PR target/60817
42918         * configure.ac (set_have_as_tls): Merge i[34567]86-*-* and
42919         x86_64-*-* cases.
42920         Pass necessary as flags on 64-bit Solaris/x86.
42921         Use lowercase relocs for x86_64-*-*.
42922         * configure: Regenerate.
42923
42924 2014-04-15  Jan Hubicka  <jh@suse.cz>
42925
42926         * ipa-devirt.c (referenced_from_vtable_p): New predicate.
42927         (maybe_record_node, likely_target_p): Use it.
42928
42929 2014-04-15  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
42930
42931         PR target/60839
42932         Revert following patch
42933
42934         2014-04-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
42935
42936         PR target/60735
42937         * config/rs6000/rs6000.c (rs6000_hard_regno_mode_ok): If we have
42938         software floating point or no floating point registers, do not
42939         allow any type in the FPRs.  Eliminate a test for SPE SIMD types
42940         in GPRs that occurs after we tested for GPRs that would never be
42941         true.
42942
42943         * config/rs6000/rs6000.md (mov<mode>_softfloat32, FMOVE64):
42944         Rewrite tests to use TARGET_DOUBLE_FLOAT and TARGET_E500_DOUBLE,
42945         since the FMOVE64 type is DFmode/DDmode.  If TARGET_E500_DOUBLE,
42946         specifically allow DDmode, since that does not use the SPE SIMD
42947         instructions.
42948
42949 2014-04-15  Mark Wielaard  <mjw@redhat.com>
42950
42951         * dwarf2out.c (gen_enumeration_type_die): Add DW_AT_const_value
42952         as unsigned or int depending on type and value used.
42953
42954 2014-04-15  Richard Biener  <rguenther@suse.de>
42955
42956         PR rtl-optimization/56965
42957         * alias.c (ncr_compar, nonoverlapping_component_refs_p): Move ...
42958         * tree-ssa-alias.c (ncr_compar, nonoverlapping_component_refs_p):
42959         ... here.
42960         * alias.c (true_dependence_1): Do not call
42961         nonoverlapping_component_refs_p.
42962         * tree-ssa-alias.c (indirect_ref_may_alias_decl_p): Call
42963         nonoverlapping_component_refs_p.
42964         (indirect_refs_may_alias_p): Likewise.
42965
42966 2014-04-15  Teresa Johnson  <tejohnson@google.com>
42967
42968         * cfg.c (dump_bb_info): Fix flags check.
42969         * tree-cfg.c (remove_bb): Only dump TDF_BLOCKS when removing.
42970
42971 2014-04-15  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
42972
42973         PR rtl-optimization/60663
42974         * config/arm/arm.c (arm_new_rtx_costs): Improve ASM_OPERANDS case,
42975         avoid 0 cost.
42976
42977 2014-04-15  Richard Biener  <rguenther@suse.de>
42978
42979         * lto-streamer.h (LTO_major_version): Bump to 4.
42980
42981 2014-04-15  Richard Biener  <rguenther@suse.de>
42982
42983         * common.opt (lto_partition_model): New enum.
42984         (flto-partition=): Merge separate options with a single with argument,
42985         add -flto-partition=one support.
42986         * flag-types.h (enum lto_partition_model): Declare.
42987         * opts.c (finish_options): Remove duplicate -flto-partition=
42988         option check.
42989         * lto-wrapper.c (run_gcc): Adjust.
42990
42991 2014-04-15  Richard Biener  <rguenther@suse.de>
42992
42993         * alias.c (ncr_compar): New function.
42994         (nonoverlapping_component_refs_p): Re-implement in O (n log n).
42995
42996 2014-04-15  Richard Biener  <rguenther@suse.de>
42997
42998         * alias.c (record_component_aliases): Do not walk BINFOs.
42999
43000 2014-04-15  Richard Biener  <rguenther@suse.de>
43001
43002         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
43003         Add struct function argument and adjust.
43004         (find_func_aliases_for_call): Likewise.
43005         (find_func_aliases): Likewise.
43006         (find_func_clobbers): Likewise.
43007         (intra_create_variable_infos): Likewise.
43008         (compute_points_to_sets): Likewise.
43009         (ipa_pta_execute): Adjust.  Do not push/pop cfun.
43010
43011 2014-04-15  Richard Biener  <rguenther@suse.de>
43012
43013         * tree.c (iterative_hash_expr): Use enum tree_code_class
43014         to store TREE_CODE_CLASS.
43015         (tree_block): Likewise.
43016         (tree_set_block): Likewise.
43017         * tree.h (fold_build_pointer_plus_loc): Use
43018         convert_to_ptrofftype_loc.
43019
43020 2014-04-15  Jakub Jelinek  <jakub@redhat.com>
43021
43022         PR plugins/59335
43023         * Makefile.in (PLUGIN_HEADERS): Add various headers that have been
43024         added in 4.9.
43025
43026 2014-04-15  Eric Botcazou  <ebotcazou@adacore.com>
43027
43028         * cfgloop.h (struct loop): Move force_vectorize down.
43029         * gimplify.c (gimple_boolify) <ANNOTATE_EXPR>: Handle new kinds.
43030         (gimplify_expr) <ANNOTATE_EXPR>: Minor tweak.
43031         * lto-streamer-in.c (input_cfg): Read dont_vectorize field.
43032         * lto-streamer-out.c (output_cfg): Write dont_vectorize field.
43033         * tree-cfg.c (replace_loop_annotate): Revamp and handle new kinds.
43034         * tree-core.h (enum annot_expr_kind): Add new kind values.
43035         * tree-inline.c (copy_loops): Copy dont_vectorize field and reorder.
43036         * tree-pretty-print.c (dump_generic_node) <ANNOTATE_EXPR>: Handle new
43037         kinds.
43038         * tree.def (ANNOTATE_EXPR): Tweak comment.
43039
43040 2014-04-14  Jan Hubicka  <hubicka@ucw.cz>
43041
43042         * ipa-devirt.c (maybe_record_node): Ignore all non-methods (including
43043         cxa_pure_virtual).
43044
43045 2014-04-14  Paolo Carlini  <paolo.carlini@oracle.com>
43046
43047         * tree.h (TYPE_IDENTIFIER): Declare.
43048         * tree.c (subrange_type_for_debug_p): Use it.
43049         * godump.c (go_format_type): Likewise.
43050         * dwarf2out.c (is_cxx_auto, modified_type_die,
43051         gen_type_die_with_usage, gen_type_die_with_usage): Likewise.
43052         * dbxout.c (dbxout_type, dbxout_symbol): Likewise.
43053
43054 2014-04-14  Jan Hubicka  <hubicka@ucw.cz>
43055
43056         PR lto/60820
43057         * varpool.c (varpool_remove_node): Do not alter decls when streaming.
43058
43059 2014-04-14  Uros Bizjak  <ubizjak@gmail.com>
43060
43061         * config/i386/i386.c (examine_argument): Return bool.  Return true if
43062         parameter should be passed in memory.
43063         <case X86_64_COMPLEX_X87_CLASS>: Adjust.
43064         (construct_container): Update calls to examine_argument.
43065         (function_arg_advance_64): Ditto.
43066         (return_in_memory_32): Merge with ix86_return_in_memory.
43067         (return_in_memory_64): Ditto.
43068         (return_in_memory_ms_64): Ditto.
43069
43070 2014-04-14  Jan Hubicka  <hubicka@ucw.cz>
43071
43072         * ipa-utils.c (ipa_merge_profiles): Merge profile_id.
43073         * coverage.c (coverage_compute_profile_id): Handle externally visible
43074         symbols.
43075
43076 2014-04-14  Martin Jambor  <mjambor@suse.cz>
43077
43078         * tree-sra.c (ipa_sra_preliminary_function_checks): Skip
43079         DECL_DISREGARD_INLINE_LIMITS functions.
43080
43081 2014-04-14  H.J. Lu  <hongjiu.lu@intel.com>
43082
43083         PR target/60827
43084         * config/i386/i386.md (*fixuns_trunc<mode>_1): Revert the last change.
43085
43086 2014-04-14  H.J. Lu  <hongjiu.lu@intel.com>
43087
43088         PR target/60827
43089         * config/i386/i386.md (*fixuns_trunc<mode>_1): Check
43090         optimize_insn_for_speed_p instead of
43091         optimize_function_for_speed_p.
43092
43093 2014-04-14  Yufeng Zhang  <yufeng.zhang@arm.com>
43094
43095         * doc/invoke.texi (free): Document AArch64.
43096
43097 2014-04-14  Richard Biener  <rguenther@suse.de>
43098
43099         PR tree-optimization/60042
43100         * tree-ssa-pre.c (inhibit_phi_insertion): Remove.
43101         (insert_into_preds_of_block): Do not prevent PHI insertion
43102         for REFERENCE exprs here ...
43103         (eliminate_dom_walker::before_dom_children): ... but prevent
43104         their use here under similar conditions when applied to the
43105         IL after PRE optimizations.
43106
43107 2014-04-14  Richard Biener  <rguenther@suse.de>
43108
43109         * passes.def: Move early points-to after early SRA.
43110
43111 2014-04-14  Richard Biener  <rguenther@suse.de>
43112
43113         * tree-ssa-forwprop.c (simplify_gimple_switch): Enhance
43114         check for which sign-changes we allow when forwarding
43115         a converted value into a switch.
43116
43117 2014-04-14  Eric Botcazou  <ebotcazou@adacore.com>
43118
43119         * stor-layout.c (place_field): Finalize non-constant offset for the
43120         field, if any.
43121
43122 2014-04-14  Richard Biener  <rguenther@suse.de>
43123
43124         * tree-switch-conversion.c (lshift_cheap_p): Get speed_p
43125         as argument.
43126         (expand_switch_using_bit_tests_p): Likewise.
43127         (process_switch): Compute and pass on speed_p based on the
43128         switch stmt.
43129         * tree-ssa-math-opts.c (gimple_expand_builtin_pow): Use
43130         optimize_bb_for_speed_p.
43131
43132 2014-04-14  Eric Botcazou  <ebotcazou@adacore.com>
43133
43134         * cfgloop.h (struct loop): Rename force_vect into force_vectorize.
43135         * function.h (struct function): Rename has_force_vect_loops into
43136         has_force_vectorize_loops.
43137         * lto-streamer-in.c (input_cfg): Adjust for renaming.
43138         (input_struct_function_base): Likewise.
43139         * lto-streamer-out.c (output_cfg): Likewise.
43140         (output_struct_function_base): Likewise.
43141         * omp-low.c (expand_omp_simd): Likewise.
43142         * tree-cfg.c (move_sese_region_to_fn): Likewise.
43143         * tree-if-conv.c (ifcvt_can_use_mask_load_store): Likewise.
43144         (version_loop_for_if_conversion): Likewise.
43145         (tree_if_conversion): Likewise.
43146         (main_tree_if_conversion): Likewise.
43147         (gate_tree_if_conversion): Likewise.
43148         * tree-inline.c (copy_loops): Likewise.
43149         * tree-ssa-loop-ivcanon.c (tree_unroll_loops_completely_1): Likewise.
43150         * tree-ssa-loop.c (tree_loop_vectorize): Likewise.
43151         * tree-ssa-phiopt.c (tree_ssa_phiopt_worker): Likewise.
43152         * tree-vect-loop.c (vect_estimate_min_profitable_iters): Likewise.
43153         * tree-vectorizer.c (vectorize_loops): Likewise.
43154         * tree-vectorizer.h (unlimited_cost_model): Likewise.
43155
43156 2014-04-14  Richard Biener  <rguenther@suse.de>
43157
43158         PR lto/60720
43159         * lto-streamer-out.c (wrap_refs): New function.
43160         (lto_output): Wrap symbol references in global initializes in
43161         type-preserving MEM_REFs.
43162
43163 2014-04-14  Christian Bruel  <christian.bruel@st.com>
43164
43165         * config/sh/sh-mem.cc (sh_expand_strlen): Unroll last word.
43166
43167 2014-04-14  Christian Bruel  <christian.bruel@st.com>
43168
43169         * config/sh/sh.md (setmemqi): New expand pattern.
43170         * config/sh/sh.h (CLEAR_RATIO): Define.
43171         * config/sh/sh-mem.cc (sh_expand_setmem): Define.
43172         * config/sh/sh-protos.h (sh_expand_setmem): Declare.
43173
43174 2014-04-14  Richard Biener  <rguenther@suse.de>
43175
43176         PR middle-end/55022
43177         * fold-const.c (negate_expr_p): Don't negate directional rounding
43178         division.
43179         (fold_negate_expr): Likewise.
43180
43181 2014-04-14  Richard Biener  <rguenther@suse.de>
43182
43183         PR tree-optimization/59817
43184         PR tree-optimization/60453
43185         * graphite-scop-detection.c (graphite_can_represent_scev): Complete
43186         recursion to catch all CHRECs in the scalar evolution and restrict
43187         the predicate for the remains appropriately.
43188
43189 2014-04-12  Catherine Moore  <clm@codesourcery.com>
43190
43191         * config/mips/constraints.md: Add new register constraint "kb".
43192         * config/mips/mips.md (*mov<mode>_internal): Use constraint "kb".
43193         (*movhi_internal): Likewise.
43194         (*movqi_internal): Likewise.
43195         * config/mips/mips.h (M16_STORE_REGS): New register class.
43196         (REG_CLASS_NAMES): Add M16_STORE_REGS.
43197         (REG_CLASS_CONTENTS): Likewise.
43198         * config/mips/mips.c (mips_regno_to_class): Add M16_STORE_REGS.
43199
43200 2014-04-11  Tobias Burnus  <burnus@net-b.de>
43201
43202         PR c/60194
43203         * doc/invoke.texi (-Wformat-signedness): Document it.
43204         (Wformat=2): Mention that this enables -Wformat-signedness.
43205
43206 2014-04-11  Joern Rennecke  <joern.rennecke@embecosm.com>
43207
43208         * common/config/epiphany/epiphany-common.c
43209         (epiphany_option_optimization_table): Enable section anchors by
43210         default at -O1 or higher.
43211         * config/epiphany/epiphany.c (TARGET_MAX_ANCHOR_OFFSET): Define.
43212         (TARGET_MIN_ANCHOR_OFFSET): Likewise.
43213         (epiphany_rtx_costs) <SET>: For binary operators, the set as such
43214         carries no extra cost.
43215         (epiphany_legitimate_address_p): For BLKmode, apply SImode check.
43216         * config/epiphany/epiphany.h (ASM_OUTPUT_DEF): Define.
43217         * config/epiphany/predicates.md (memclob_operand): New predicate.
43218         * config/epiphany/epiphany.md (stack_adjust_add, stack_adjust_str):
43219         Use memclob_operand predicate and X constraint for operand 3.
43220
43221 2014-04-11  Joern Rennecke  <joern.rennecke@embecosm.com>
43222
43223         * config/epiphany/epiphany.c (epiphany_rtx_cost): Compare
43224         with CC_N_NE / CC_C_LTU / CC_C_GTU carries no extra cost for
43225         its operands.
43226
43227 2014-04-11  Joern Rennecke  <joern.rennecke@embecosm.com>
43228
43229         PR rtl-optimization/60651
43230         * mode-switching.c (optimize_mode_switching): Make sure to emit
43231         sets of a lower numbered entity before sets of a higher numbered
43232         entity to a mode of the same or lower priority.
43233         When creating a seginfo for a basic block that starts with a code
43234         label, move the insertion point past the code label.
43235         (new_seginfo): Document and enforce requirement that
43236         NOTE_INSN_BASIC_BLOCK only appears for empty blocks.
43237         * doc/tm.texi.in: Document ordering constraint for emitted mode sets.
43238         * doc/tm.texi: Regenerate.
43239
43240 2014-01-11  Joern Rennecke  <joern.rennecke@embecosm.com>
43241
43242         PR target/60811
43243         * config/arc/arc.c (arc_save_restore): Fix assert typo.
43244
43245 2013-04-11  Jakub Jelinek  <jakub@redhat.com>
43246
43247         * BASE-VER: Set to 4.10.0.
43248
43249 2014-04-11  Tobias Burnus  <burnus@net-b.de>
43250
43251         PR other/59055
43252         * doc/bugreport.texi (Bugs): Remove nodes pointing to the nirvana.
43253         * doc/gcc.texi (Service): Update description in the @menu
43254         * doc/invoke.texi (Option Summary): Remove misplaced and
43255         duplicated @menu.
43256
43257 2014-04-11  Steve Ellcey  <sellcey@mips.com>
43258             Jakub Jelinek  <jakub@redhat.com>
43259
43260         PR middle-end/60556
43261         * expr.c (convert_move): Use emit_store_flag_force instead of
43262         emit_store_flag.  Pass lowpart_mode instead of VOIDmode as 5th
43263         argument to it.
43264
43265 2014-04-11  Richard Biener  <rguenther@suse.de>
43266
43267         PR middle-end/60797
43268         * varasm.c (assemble_alias): Avoid endless error reporting
43269         recursion by setting TREE_ASM_WRITTEN.
43270
43271 2014-04-11  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
43272
43273         * config/s390/s390.md: Add a splitter for NOT rtx.
43274
43275 2014-04-11  Jakub Jelinek  <jakub@redhat.com>
43276
43277         PR rtl-optimization/60663
43278         * cse.c (cse_insn): Set src_volatile on ASM_OPERANDS in PARALLEL.
43279
43280 2014-04-10  Jan Hubicka  <hubicka@ucw.cz>
43281             Jakub Jelinek  <jakub@redhat.com>
43282
43283         PR lto/60567
43284         * ipa.c (function_and_variable_visibility): Copy forced_by_abi
43285         flag from decl_node to node.
43286
43287 2014-04-10  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
43288
43289         PR debug/60655
43290         * config/arm/arm.c (TARGET_CONST_NOT_OK_FOR_DEBUG_P): Define
43291         (arm_const_not_ok_for_debug_p): Reject MINUS with SYM_REF's
43292         ameliorating the cases where it can be.
43293
43294 2014-04-09  David Edelsohn  <dje.gcc@gmail.com>
43295
43296         Revert
43297         2014-04-08  Pat Haugen  <pthaugen@us.ibm.com>
43298
43299         * config/rs6000/sync.md (AINT mode_iterator): Move definition.
43300         (loadsync_<mode>): Change mode.
43301         (load_quadpti, store_quadpti): New.
43302         (atomic_load<mode>, atomic_store<mode>): Add support for TI mode.
43303         * config/rs6000/rs6000.md (unspec enum): Add UNSPEC_LSQ.
43304         * config/rs6000/predicates.md (quad_memory_operand): !TARGET_SYNC_TI.
43305
43306 2014-04-09  Cong Hou  <congh@google.com>
43307
43308         PR testsuite/60773
43309         * doc/sourcebuild.texi (vect_widen_mult_si_to_di_pattern): Add
43310         documentation.
43311
43312 2014-04-08  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
43313
43314         * config/rs6000/rs6000.c (rs6000_expand_vector_set): Use vnand
43315         instead of vnor to exploit possible fusion opportunity in the
43316         future.
43317         (altivec_expand_vec_perm_const_le): Likewise.
43318
43319 2014-04-08  Pat Haugen  <pthaugen@us.ibm.com>
43320
43321         * config/rs6000/sync.md (AINT mode_iterator): Move definition.
43322         (loadsync_<mode>): Change mode.
43323         (load_quadpti, store_quadpti): New.
43324         (atomic_load<mode>, atomic_store<mode>): Add support for TI mode.
43325         * config/rs6000/rs6000.md (unspec enum): Add UNSPEC_LSQ.
43326
43327 2014-04-08  Richard Sandiford  <rdsandiford@googlemail.com>
43328
43329         PR target/60763
43330         * config/rs6000/vsx.md (vsx_xscvdpspn_scalar): Change input to DImode.
43331         * config/rs6000/rs6000.md (reload_vsx_from_gprsf): Update accordingly.
43332         Use gen_rtx_REG rather than simplify_gen_subreg for op0_di.
43333
43334 2014-04-08  Richard Biener  <rguenther@suse.de>
43335
43336         PR middle-end/60706
43337         * tree-pretty-print.c (pp_double_int): For HWI32 hosts with
43338         a 64bit widest int print double-int similar to on HWI64 hosts.
43339
43340 2014-04-08  Richard Biener  <rguenther@suse.de>
43341
43342         PR tree-optimization/60785
43343         * graphite-sese-to-poly.c (rewrite_phi_out_of_ssa): Treat
43344         default defs properly.
43345
43346 2014-04-08  Nathan Sidwell  <nathan@codesourcery.com>
43347
43348         * doc/invoke (Wnon-virtual-dtor): Update to match implementation.
43349         (Weffc++): Likewise.
43350
43351 2014-04-07  Jan Hubicka  <hubcika@ucw.cz>
43352
43353         * ipa-devirt.c (maybe_record_node): When node is not recorded,
43354         set completep to false rather than true.
43355
43356 2014-04-07  Douglas B Rupp  <rupp@adacore.com>
43357
43358         PR target/60504
43359         * config/arm/arm.h (ASM_PREFERRED_EH_DATA_FORMAT): Expose from
43360         ARM_TARGET2_DWARF_FORMAT.
43361
43362 2014-04-07  Charles Baylis  <charles.baylis@linaro.org>
43363
43364         PR target/60609
43365         * config/arm/arm.h (ASM_OUTPUT_CASE_END): Remove.
43366         (LABEL_ALIGN_AFTER_BARRIER): Align barriers which occur after
43367         ADDR_DIFF_VEC.
43368
43369 2014-04-07  Richard Biener  <rguenther@suse.de>
43370
43371         PR tree-optimization/60766
43372         * tree-ssa-loop-ivopts.c (cand_value_at): Compute in an unsigned type.
43373         (may_eliminate_iv): Convert cand_value_at result to desired type.
43374
43375 2014-04-07  Jason Merrill  <jason@redhat.com>
43376
43377         PR c++/60731
43378         * common.opt (-fno-gnu-unique): Add.
43379         * config/elfos.h (USE_GNU_UNIQUE_OBJECT): Check it.
43380
43381 2014-04-07  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
43382
43383         * haifa-sched.c: Fix outdated function reference and minor
43384         grammar errors in introductory comment.
43385
43386 2014-04-07  Richard Biener  <rguenther@suse.de>
43387
43388         PR middle-end/60750
43389         * tree-ssa-operands.c (maybe_add_call_vops): Also add VDEFs
43390         for noreturn calls.
43391         * tree-cfgcleanup.c (fixup_noreturn_call): Do not remove VDEFs.
43392
43393 2014-04-06  John David Anglin  <danglin@gcc.gnu.org>
43394
43395         PR debug/55794
43396         * config/pa/pa.c (pa_output_function_epilogue): Skip address and code
43397         size accounting for thunks.
43398         (pa_asm_output_mi_thunk): Use final_start_function() and
43399         final_end_function() to output function start and end directives.
43400
43401 2014-04-05  Pitchumani Sivanupandi  <Pitchumani.S@atmel.com>
43402
43403         * config/avr/avr-arch.h (avr_mcu_t): Add dev_attribute field to have
43404         device specific ISA/ feature information. Remove short_sp and
43405         errata_skip ds.  Add avr_device_specific_features enum to have device
43406         specific info.
43407         * config/avr/avr-c.c (avr_cpu_cpp_builtins): use dev_attribute to check
43408         errata_skip. Add __AVR_ISA_RMW__ builtin macro if RMW ISA available.
43409         * config/avr/avr-devices.c (avr_mcu_types): Update AVR_MCU macro for
43410         updated device specific info.
43411         * config/avr/avr-mcus.def: Merge device specific details to
43412         dev_attribute field.
43413         * config/avr/avr.c (avr_2word_insn_p): use dev_attribute field to check
43414         errata_skip.
43415         * config/avr/avr.h (AVR_HAVE_8BIT_SP): same for short sp info.
43416         * config/avr/driver-avr.c (avr_device_to_as): Pass -mrmw option to
43417         assembler if RMW isa supported by current device.
43418         * config/avr/genmultilib.awk: Update as device info structure changed.
43419         * doc/invoke.texi: Add info for __AVR_ISA_RMW__ builtin macro
43420
43421 2014-04-04  Cong Hou  <congh@google.com>
43422
43423         PR tree-optimization/60656
43424         * tree-vect-stmts.c (supportable_widening_operation):
43425         Fix a bug that elements in a vector with vect_used_by_reduction
43426         property are incorrectly reordered when the operation on it is not
43427         consistant with the one in reduction operation.
43428
43429 2014-04-04  John David Anglin  <danglin@gcc.gnu.org>
43430
43431         PR rtl-optimization/60155
43432         * gcse.c (record_set_data): New function.
43433         (single_set_gcse): New function.
43434         (gcse_emit_move_after): Use single_set_gcse instead of single_set.
43435         (hoist_code): Likewise.
43436         (get_pressure_class_and_nregs): Likewise.
43437
43438 2014-04-04  Eric Botcazou  <ebotcazou@adacore.com>
43439
43440         * explow.c (probe_stack_range): Emit a final optimization blockage.
43441
43442 2014-04-04  Anthony Green  <green@moxielogic.com>
43443
43444         * config/moxie/moxie.md (zero_extendqisi2, zero_extendhisi2): Fix
43445         typos.
43446
43447 2014-04-04  Jan Hubicka  <hubicka@ucw.cz>
43448
43449         PR ipa/59626
43450         * lto-cgraph.c (input_overwrite_node): Check that partitioning
43451         flags are set only during streaming.
43452         * ipa.c (process_references, walk_polymorphic_call_targets,
43453         symtab_remove_unreachable_nodes): Drop bodies of always inline
43454         after early inlining.
43455         (symtab_remove_unreachable_nodes): Remove always_inline attribute.
43456
43457 2014-04-04  Jakub Jelinek  <jakub@redhat.com>
43458         Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
43459
43460         PR debug/60655
43461         * dwarf2out.c (const_ok_for_output_1): Reject expressions
43462         containing a NOT.
43463
43464 2014-04-04  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
43465
43466         PR bootstrap/60743
43467         * config/arm/cortex-a53.md (cortex_a53_fdivs): Reduce reservation
43468         duration.
43469         (cortex_a53_fdivd): Likewise.
43470
43471 2014-04-04  Martin Jambor  <mjambor@suse.cz>
43472
43473         PR ipa/60640
43474         * cgraph.h (cgraph_clone_node): New parameter added to declaration.
43475         Adjust all callers.
43476         * cgraph.c (clone_of_p): Also return true if thunks match.
43477         (verify_edge_corresponds_to_fndecl): Removed extraneous call to
43478         cgraph_function_or_thunk_node and an obsolete comment.
43479         * cgraphclones.c (build_function_type_skip_args): Moved upwards in the
43480         file.
43481         (build_function_decl_skip_args): Likewise.
43482         (set_new_clone_decl_and_node_flags): New function.
43483         (duplicate_thunk_for_node): Likewise.
43484         (redirect_edge_duplicating_thunks): Likewise.
43485         (cgraph_clone_node): New parameter args_to_skip, pass it to
43486         redirect_edge_duplicating_thunks which is called instead of
43487         cgraph_redirect_edge_callee.
43488         (cgraph_create_virtual_clone): Pass args_to_skip to cgraph_clone_node,
43489         moved setting of a lot of flags to set_new_clone_decl_and_node_flags.
43490
43491 2014-04-04  Jeff Law  <law@redhat.com>
43492
43493         PR target/60657
43494         * config/arm/predicates.md (const_int_I_operand): New predicate.
43495         (const_int_M_operand): Similarly.
43496         * config/arm/arm.md (insv_zero): Use const_int_M_operand instead of
43497         const_int_operand.
43498         (insv_t2, extv_reg, extzv_t2): Likewise.
43499         (load_multiple_with_writeback): Similarly for const_int_I_operand.
43500         (pop_multiple_with_writeback_and_return): Likewise.
43501         (vfp_pop_multiple_with_writeback): Likewise
43502
43503 2014-04-04  Richard Biener  <rguenther@suse.de>
43504
43505         PR ipa/60746
43506         * tree-ssanames.c (make_ssa_name_fn): Fix assert.
43507         * gimple.c (gimple_set_bb): Avoid ICEing for NULL cfun for
43508         non-GIMPLE_LABELs.
43509         * gimplify.h (gimple_add_tmp_var_fn): Declare.
43510         * gimplify.c (gimple_add_tmp_var_fn): New function.
43511         * gimple-expr.h (create_tmp_reg_fn): Declare.
43512         * gimple-expr.c (create_tmp_reg_fn): New function.
43513         * gimple-low.c (record_vars_into): Don't change cfun.
43514         * cgraph.c (cgraph_redirect_edge_call_stmt_to_callee): Fix
43515         code generation without cfun.
43516
43517 2014-04-04  Thomas Schwinge  <thomas@codesourcery.com>
43518
43519         PR bootstrap/60719
43520         * Makefile.in (install-driver): Fix shell scripting.
43521
43522 2014-04-03  Cong Hou  <congh@google.com>
43523
43524         PR tree-optimization/60505
43525         * tree-vectorizer.h (struct _stmt_vec_info): Add th field as the
43526         threshold of number of iterations below which no vectorization
43527         will be done.
43528         * tree-vect-loop.c (new_loop_vec_info):
43529         Initialize LOOP_VINFO_COST_MODEL_THRESHOLD.
43530         * tree-vect-loop.c (vect_analyze_loop_operations):
43531         Set LOOP_VINFO_COST_MODEL_THRESHOLD.
43532         * tree-vect-loop.c (vect_transform_loop):
43533         Use LOOP_VINFO_COST_MODEL_THRESHOLD.
43534         * tree-vect-loop.c (vect_analyze_loop_2): Check the maximum number
43535         of iterations of the loop and see if we should build the epilogue.
43536
43537 2014-04-03  Richard Biener  <rguenther@suse.de>
43538
43539         * tree-streamer.h (struct streamer_tree_cache_d): Add next_idx member.
43540         (streamer_tree_cache_create): Adjust.
43541         * tree-streamer.c (streamer_tree_cache_add_to_node_array): Adjust
43542         to allow optional nodes array.
43543         (streamer_tree_cache_insert_1): Use next_idx to assign idx.
43544         (streamer_tree_cache_append): Likewise.
43545         (streamer_tree_cache_create): Create nodes array optionally
43546         as specified by parameter.
43547         * lto-streamer-out.c (create_output_block): Avoid maintaining
43548         the node array in the writer cache.
43549         (DFS_write_tree): Remove assertion.
43550         (produce_asm_for_decls): Free the out decl state hash table early.
43551         * lto-streamer-in.c (lto_data_in_create): Adjust for
43552         streamer_tree_cache_create prototype change.
43553
43554 2014-04-03  Richard Biener  <rguenther@suse.de>
43555
43556         * tree-streamer-out.c (streamer_write_chain): Do not temporarily
43557         set TREE_CHAIN to NULL_TREE.
43558
43559 2014-04-03  Richard Biener  <rguenther@suse.de>
43560
43561         PR tree-optimization/60740
43562         * graphite-scop-detection.c (stmt_simple_for_scop_p): Iterate
43563         over all GIMPLE_COND operands.
43564
43565 2014-04-03  Nathan Sidwell  <nathan@codesourcery.com>
43566
43567         * doc/invoke.texi (Wnon-virtual-dtor): Adjust documentation.
43568         (Weffc++): Remove Scott's numbering, merge lists and reference
43569         Wnon-virtual-dtor.
43570
43571 2014-04-03  Nick Clifton  <nickc@redhat.com>
43572
43573         * config/rl78/rl78-expand.md (movqi): Handle (SUBREG (SYMBOL_REF))
43574         properly.
43575
43576 2014-04-03  Martin Jambor  <mjambor@suse.cz>
43577
43578         * ipa-cp.c (ipcp_verify_propagated_values): Also dump symtab and
43579         mention gcc_unreachable before failing.
43580         * ipa.c (symtab_remove_unreachable_nodes): Also print order of
43581         removed symbols.
43582
43583 2014-04-02  Jan Hubicka  <hubicka@ucw.cz>
43584
43585         PR ipa/60659
43586         * ipa-devirt.c (get_polymorphic_call_info): Do not ICE on type
43587         inconsistent code and instead mark the context inconsistent.
43588         (possible_polymorphic_call_targets): For inconsistent contexts
43589         return empty complete list.
43590
43591 2014-04-02  Anthony Green  <green@moxielogic.com>
43592
43593         * config/moxie/moxie.md (zero_extendqisi2, zero_extendhisi2)
43594         (extendqisi2, extendhisi2): Define.
43595         * config/moxie/moxie.h (DEFAULT_SIGNED_CHAR): Change to 0.
43596         (WCHAR_TYPE): Change to unsigned int.
43597
43598 2014-04-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
43599
43600         PR tree-optimization/60733
43601         * gimple-ssa-strength-reduction.c (ncd_with_phi): Change required
43602         insertion point for PHI candidates to be the end of the feeding
43603         block for the PHI argument.
43604
43605 2014-04-02  Vladimir Makarov  <vmakarov@redhat.com>
43606
43607         PR rtl-optimization/60650
43608         * lra-constraints.c (process_alt_operands): Decrease reject for
43609         earlyclobber matching.
43610
43611 2014-04-02  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
43612
43613         * config/s390/s390.c (s390_expand_insv): Use GET_MODE_BITSIZE.
43614
43615 2014-04-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
43616
43617         * config/spu/spu.c (pad_bb): Do not crash when the last
43618         insn is CODE_FOR_blockage.
43619
43620 2014-04-02  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
43621
43622         * config/spu/spu.md ("insv"): Fail if bitoffset+bitsize
43623         lies outside the target mode.
43624
43625 2014-04-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
43626
43627         PR target/60735
43628         * config/rs6000/rs6000.c (rs6000_hard_regno_mode_ok): If we have
43629         software floating point or no floating point registers, do not
43630         allow any type in the FPRs.  Eliminate a test for SPE SIMD types
43631         in GPRs that occurs after we tested for GPRs that would never be
43632         true.
43633
43634         * config/rs6000/rs6000.md (mov<mode>_softfloat32, FMOVE64):
43635         Rewrite tests to use TARGET_DOUBLE_FLOAT and TARGET_E500_DOUBLE,
43636         since the FMOVE64 type is DFmode/DDmode.  If TARGET_E500_DOUBLE,
43637         specifically allow DDmode, since that does not use the SPE SIMD
43638         instructions.
43639
43640 2014-04-02  Richard Biener  <rguenther@suse.de>
43641
43642         PR middle-end/60729
43643         * optabs.c (expand_abs_nojump): Honor flag_trapv only for
43644         MODE_INTs.  Properly use negv_optab.
43645         (expand_abs): Likewise.
43646
43647 2014-04-02  Richard Biener  <rguenther@suse.de>
43648
43649         PR bootstrap/60719
43650         * Makefile.in (install-driver): Guard extra installs with special
43651         names properly.
43652
43653 2014-04-01  Michael Meissner  <meissner@linux.vnet.ibm.com>
43654
43655         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
43656         Document vec_vgbbd.
43657
43658 2014-04-01  Richard Henderson  <rth@redhat.com>
43659
43660         PR target/60704
43661         * config/i386/i386.md (*float<SWI48><MODEF>2_sse): Leave the second
43662         alternative enabled before register allocation.
43663
43664 2014-04-01  Chung-Lin Tang  <cltang@codesourcery.com>
43665
43666         * config/nios2/nios2.md (unspec): Remove UNSPEC_TLS, UNSPEC_TLS_LDM.
43667         * config/nios2/nios2.c (nios2_function_profiler): Fix addi operand
43668         typo.
43669         (nios2_large_got_address): Remove unneeded 'sym' parameter.
43670         (nios2_got_address): Update nios2_large_got_address call site.
43671         (nios2_delegitimize_address): New function.
43672         (TARGET_DELEGITIMIZE_ADDRESS): Define to nios2_delegitimize_address.
43673         * config/nios2/linux.h (GLIBC_DYNAMIC_LINKER): Define.
43674         (LINK_SPEC): Specify dynamic linker using GNU_USER_DYNAMIC_LINKER.
43675
43676 2014-04-01  Martin Husemann  <martin@duskware.de>
43677
43678         * config/mips/netbsd.h (TARGET_OS_CPP_BUILTINS): Define __mips_o32
43679         for -mabi=32.
43680
43681 2014-04-01  Richard Sandiford  <rdsandiford@googlemail.com>
43682
43683         PR rtl-optimization/60604
43684         * recog.c (general_operand): Incorporate REG_CANNOT_CHANGE_MODE_P
43685         check from register_operand.
43686         (register_operand): Redefine in terms of general_operand.
43687         (nonmemory_operand): Use register_operand for the non-constant cases.
43688
43689 2014-04-01  Richard Biener  <rguenther@suse.de>
43690
43691         * gimple.h (struct gimple_statement_base): Align subcode to 16 bits.
43692
43693 2014-04-01  Sebastian Huber  <sebastian.huber@embedded-brains.de>
43694
43695         * doc/invoke.texi (mapp-regs): Clarify.
43696
43697 2014-03-31  Ulrich Drepper  <drepper@gmail.com>
43698
43699         * config/i386/avx512fintrin.h (__v32hi): Define type.
43700         (__v64qi): Likewise.
43701         (_mm512_set1_epi8): Define.
43702         (_mm512_set1_epi16): Define.
43703         (_mm512_set4_epi32): Define.
43704         (_mm512_set4_epi64): Define.
43705         (_mm512_set4_pd): Define.
43706         (_mm512_set4_ps): Define.
43707         (_mm512_setr4_epi64): Define.
43708         (_mm512_setr4_epi32): Define.
43709         (_mm512_setr4_pd): Define.
43710         (_mm512_setr4_ps): Define.
43711         (_mm512_setzero_epi32): Define.
43712
43713 2014-03-31  Martin Jambor  <mjambor@suse.cz>
43714
43715         PR middle-end/60647
43716         * tree-sra.c (callsite_has_enough_arguments_p): Renamed to
43717         callsite_arguments_match_p.  Updated all callers.  Also check types of
43718         corresponding formal parameters and actual arguments.
43719         (not_all_callers_have_enough_arguments_p) Renamed to
43720         some_callers_have_mismatched_arguments_p.
43721
43722 2014-03-31  Yuri Rumyantsev  <ysrumyan@gmail.com>
43723
43724         * tree-inline.c (copy_loops): Add missed copy of 'safelen'.
43725
43726 2014-03-31  Kugan Vivekanandarajah  <kuganv@linaro.org>
43727
43728         PR target/60034
43729         * aarch64/aarch64.c (aarch64_classify_address): Fix alignment for
43730         section anchor.
43731
43732 2014-03-30  Uros Bizjak  <ubizjak@gmail.com>
43733
43734         * config/i386/sse.md (FMAMODE_NOVF512): New mode iterator.
43735         (<sd_mask_codefor>fma_fmadd_<mode><sd_maskz_name><round_name>):
43736         Split out
43737         <sd_mask_codefor>fma_fmadd_<VF_512:mode><sd_maskz_name><round_name>.
43738         Use FMAMODE_NOVF512 mode iterator.
43739         (<sd_mask_codefor>fma_fmsub_<mode><sd_maskz_name><round_name>): Ditto.
43740         (<sd_mask_codefor>fma_fnmadd_<mode><sd_maskz_name><round_name>): Ditto.
43741         (<sd_mask_codefor>fma_fnmsub_<mode><sd_maskz_name><round_name>): Ditto.
43742         (<sd_mask_codefor>fma_fmaddsub_<mode><sd_maskz_name><round_name>):
43743         Split out
43744         <sd_mask_codefor>fma_fmaddsub_<VF_512:mode><sd_maskz_name><round_name>.
43745         Use VF_128_256 mode iterator.
43746         (<sd_mask_codefor>fma_fmsubadd_<mode><sd_maskz_name><round_name>):
43747         Ditto.
43748
43749 2014-03-28  Jan Hubicka  <hubicka@ucw.cz>
43750
43751         * cgraph.c (cgraph_redirect_edge_call_stmt_to_callee): Clear
43752         static chain if needed.
43753
43754 2014-03-28  Vladimir Makarov  <vmakarov@redhat.com>
43755
43756         PR target/60697
43757         * lra-constraints.c (index_part_to_reg): New.
43758         (process_address): Use it.
43759
43760 2014-03-27  Jeff Law  <law@redhat.com>
43761             Jakub Jelinek  <jakub@redhat.com>
43762
43763         PR target/60648
43764         * expr.c (do_tablejump): Use simplify_gen_binary rather than
43765         gen_rtx_{PLUS,MULT} to build up the address expression.
43766
43767         * i386/i386.c (ix86_legitimize_address): Use copy_addr_to_reg to avoid
43768         creating non-canonical RTL.
43769
43770 2014-03-28  Jan Hubicka  <hubicka@ucw.cz>
43771
43772         PR ipa/60243
43773         * ipa-inline.c (want_inline_small_function_p): Short circuit large
43774         functions; reorganize to make cheap checks first.
43775         (inline_small_functions): Do not estimate growth when dumping;
43776         it is expensive.
43777         * ipa-inline.h (inline_summary): Add min_size.
43778         (growth_likely_positive): New function.
43779         * ipa-inline-analysis.c (dump_inline_summary): Add min_size.
43780         (set_cond_stmt_execution_predicate): Cleanup.
43781         (estimate_edge_size_and_time): Compute min_size.
43782         (estimate_calls_size_and_time): Likewise.
43783         (estimate_node_size_and_time): Likewise.
43784         (inline_update_overall_summary): Update min_size.
43785         (do_estimate_edge_time): Likewise.
43786         (do_estimate_edge_size): Update.
43787         (do_estimate_edge_hints): Update.
43788         (growth_likely_positive): New function.
43789
43790 2014-03-28  Jakub Jelinek  <jakub@redhat.com>
43791
43792         PR target/60693
43793         * config/i386/i386.c (ix86_copy_addr_to_reg): Call copy_addr_to_reg
43794         also if addr has VOIDmode.
43795
43796 2014-03-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
43797
43798         * config/arm/aarch-common.c (aarch_crypto_can_dual_issue): New.
43799         * config/arm/aarch-common-protos.h (aarch_crypto_can_dual_issue):
43800         Declare extern.
43801         * config/arm/cortex-a53.md: Add reservations and bypass for crypto
43802         instructions as well as AdvancedSIMD loads.
43803
43804 2014-03-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
43805
43806         * config/aarch64/aarch64-simd.md (aarch64_crypto_aes<aes_op>v16qi):
43807         Use crypto_aese type.
43808         (aarch64_crypto_aes<aesmc_op>v16qi): Use crypto_aesmc type.
43809         * config/arm/arm.md (is_neon_type): Replace crypto_aes with
43810         crypto_aese, crypto_aesmc.  Move to types.md.
43811         * config/arm/types.md (crypto_aes): Split into crypto_aese,
43812         crypto_aesmc.
43813         * config/arm/iterators.md (crypto_type): Likewise.
43814
43815 2014-03-28  Jan Hubicka  <hubicka@ucw.cz>
43816
43817         * cgraph.c: Include expr.h and tree-dfa.h.
43818         (cgraph_redirect_edge_call_stmt_to_callee): If call in noreturn;
43819         remove LHS.
43820
43821 2014-03-28  Vladimir Makarov  <vmakarov@redhat.com>
43822
43823         PR target/60675
43824         * lra-assigns.c (find_hard_regno_for): Remove unavailable hard
43825         regs from checking multi-reg pseudos.
43826
43827 2014-03-28  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
43828
43829         * config/arm/t-aprofile (MULTILIB_MATCHES): Correct A12 rule.
43830
43831 2014-03-28  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
43832
43833         * config/rs6000/rs6000.c (fusion_gpr_load_p): Refuse optimization
43834         if it would clobber the stack pointer, even temporarily.
43835
43836 2014-03-28  Eric Botcazou  <ebotcazou@adacore.com>
43837
43838         * mode-switching.c: Make small adjustments to the top comment.
43839
43840 2014-03-27  Michael Meissner  <meissner@linux.vnet.ibm.com>
43841
43842         * config/rs6000/constraints.md (wD constraint): New constraint to
43843         match the constant integer to get the top DImode/DFmode out of a
43844         vector in a VSX register.
43845
43846         * config/rs6000/predicates.md (vsx_scalar_64bit): New predicate to
43847         match the constant integer to get the top DImode/DFmode out of a
43848         vector in a VSX register.
43849
43850         * config/rs6000/rs6000-builtins.def (VBPERMQ): Add vbpermq builtin
43851         for ISA 2.07.
43852
43853         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Add
43854         vbpermq builtins.
43855
43856         * config/rs6000/rs6000.c (rs6000_debug_reg_global): If
43857         -mdebug=reg, print value of VECTOR_ELEMENT_SCALAR_64BIT.
43858
43859         * config/rs6000/vsx.md (vsx_extract_<mode>, V2DI/V2DF modes):
43860         Optimize vec_extract of 64-bit values, where the value being
43861         extracted is in the top word, where we can use scalar
43862         instructions.  Add direct move and store support.  Combine the big
43863         endian/little endian vector select load support into a single insn.
43864         (vsx_extract_<mode>_internal1): Likewise.
43865         (vsx_extract_<mode>_internal2): Likewise.
43866         (vsx_extract_<mode>_load): Likewise.
43867         (vsx_extract_<mode>_store): Likewise.
43868         (vsx_extract_<mode>_zero): Delete, big and little endian insns are
43869         combined into vsx_extract_<mode>_load.
43870         (vsx_extract_<mode>_one_le): Likewise.
43871
43872         * config/rs6000/rs6000.h (VECTOR_ELEMENT_SCALAR_64BIT): Macro to
43873         define the top 64-bit vector element.
43874
43875         * doc/md.texi (PowerPC and IBM RS6000 constraints): Document wD
43876         constraint.
43877
43878         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
43879         Document vec_vbpermq builtin.
43880
43881         PR target/60672
43882         * config/rs6000/altivec.h (vec_xxsldwi): Add missing define to
43883         enable use of xxsldwi and xxpermdi builtin functions.
43884         (vec_xxpermdi): Likewise.
43885
43886         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
43887         Document use of vec_xxsldwi and vec_xxpermdi builtins.
43888
43889 2014-03-27  Vladimir Makarov  <vmakarov@redhat.com>
43890
43891         PR rtl-optimization/60650
43892         * lra-assign.c (find_hard_regno_for, spill_for): Add parameter
43893         first_p.  Use it.
43894         (find_spills_for): New.
43895         (assign_by_spills): Pass the new parameter to find_hard_regno_for.
43896         Spill all pseudos on the second iteration.
43897
43898 2014-03-27  Marek Polacek  <polacek@redhat.com>
43899
43900         PR c/50347
43901         * doc/extend.texi (ffs Builtins): Change unsigned types to signed
43902         types.
43903
43904 2014-03-27  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
43905
43906         * config/s390/s390.c (s390_can_use_return_insn): Check for
43907         call-saved FPRs on 31 bit.
43908
43909 2014-03-27  Jakub Jelinek  <jakub@redhat.com>
43910
43911         PR middle-end/60682
43912         * omp-low.c (lower_omp_1): For gimple_clobber_p stmts,
43913         if they need regimplification, just drop them instead of
43914         calling gimple_regimplify_operands on them.
43915
43916 2014-03-27  Marcus Shawcroft  <marcus.shawcroft@arm.com>
43917
43918         PR target/60580
43919         * config/aarch64/aarch64.c (faked_omit_frame_pointer): Remove.
43920         (aarch64_frame_pointer_required): Adjust logic.
43921         (aarch64_can_eliminate): Adjust logic.
43922         (aarch64_override_options_after_change): Adjust logic.
43923
43924 2014-03-27  Dehao Chen  <dehao@google.com>
43925
43926         * ipa-inline.c (early_inliner): Update node's inline info.
43927
43928 2014-03-26  Dehao Chen  <dehao@google.com>
43929
43930         * dojump.c (do_compare_rtx_and_jump): Sets correct probability for
43931         compiler inserted conditional jumps for NAN float check.
43932
43933 2014-03-26  Jakub Jelinek  <jakub@redhat.com>
43934
43935         * ubsan.h (ubsan_create_data): Change second argument's type
43936         to const location_t *.
43937         * ubsan.c (ubsan_source_location): If xloc.file is NULL, set it to
43938         _("<unknown>").
43939         (ubsan_create_data): Change second argument to const location_t *PLOC.
43940         Create Loc field whenever PLOC is non-NULL.
43941         (ubsan_instrument_unreachable, ubsan_expand_null_ifn,
43942         ubsan_build_overflow_builtin, instrument_bool_enum_load): Adjust
43943         callers.
43944
43945         PR other/59545
43946         * real.c (real_to_integer2): Change type of low to UHWI.
43947
43948 2014-03-26  Tobias Burnus  <burnus@net-b.de>
43949
43950         * gcc.c (LINK_COMMAND_SPEC): Use libcilkrts.spec for -fcilkplus.
43951         (CILK_SELF_SPECS): New define.
43952         (driver_self_specs): Use it.
43953
43954 2014-03-26  Richard Biener  <rguenther@suse.de>
43955
43956         * tree-pretty-print.c (percent_K_format): Implement special
43957         case for LTO and its stripped down BLOCK tree.
43958
43959 2014-03-26  Jakub Jelinek  <jakub@redhat.com>
43960
43961         PR sanitizer/60636
43962         * ubsan.c (instrument_si_overflow): Instrument ABS_EXPR.
43963
43964         * tree-vrp.c (simplify_internal_call_using_ranges): If only
43965         one range is range_int_cst_p, but not both, at least optimize
43966         addition/subtraction of 0 and multiplication by 0 or 1.
43967         * gimple-fold.c (gimple_fold_call): Fold
43968         IFN_UBSAN_CHECK_{ADD,SUB,MUL}.
43969         (gimple_fold_stmt_to_constant_1): If both op0 and op1 aren't
43970         INTEGER_CSTs, try to fold at least x * 0 and y - y.
43971
43972 2014-03-26  Eric Botcazou  <ebotcazou@adacore.com>
43973
43974         PR rtl-optimization/60452
43975         * rtlanal.c (rtx_addr_can_trap_p_1): Fix head comment.
43976         <case REG>: Return 1 for invalid offsets from the frame pointer.
43977
43978 2014-03-26  Marek Polacek  <polacek@redhat.com>
43979
43980         PR c/37428
43981         * doc/extend.texi (C Extensions): Mention variable-length arrays in
43982         a structure/union.
43983
43984 2014-03-26  Marek Polacek  <polacek@redhat.com>
43985
43986         PR c/39525
43987         * doc/extend.texi (Designated Inits): Describe what happens to omitted
43988         field members.
43989
43990 2014-03-26  Marek Polacek  <polacek@redhat.com>
43991
43992         PR other/59545
43993         * ira-color.c (update_conflict_hard_regno_costs): Perform the
43994         multiplication in unsigned type.
43995
43996 2014-03-26  Chung-Ju Wu  <jasonwucj@gmail.com>
43997
43998         * doc/install.texi: Document nds32le-*-elf and nds32be-*-elf.
43999
44000 2014-03-26  Chung-Ju Wu  <jasonwucj@gmail.com>
44001
44002         * doc/contrib.texi: Add myself as Andes nds32 port contributor.
44003
44004 2014-03-25  Jan Hubicka  <hubicka@ucw.cz>
44005
44006         PR ipa/60315
44007         * cif-code.def (UNREACHABLE) New code.
44008         * ipa-inline.c (inline_small_functions): Skip edges to
44009         __builtlin_unreachable.
44010         (estimate_edge_growth): Allow edges to __builtlin_unreachable.
44011         * ipa-inline-analysis.c (edge_set_predicate): Redirect edges with false
44012         predicate to __bulitin_unreachable.
44013         (set_cond_stmt_execution_predicate): Fix issue when
44014         invert_tree_comparison returns ERROR_MARK.
44015         * ipa-pure-const.c (propagate_pure_const, propagate_nothrow): Do not
44016         propagate to inline clones.
44017         * cgraph.c (verify_edge_corresponds_to_fndecl): Allow redirection
44018         to unreachable.
44019         * ipa-cp.c (create_specialized_node): Be ready for new node to appear.
44020         * cgraphclones.c (cgraph_clone_node): If call destination is already
44021         ureachable, do not redirect it back.
44022         * tree-inline.c (fold_marked_statements): Hanlde calls becoming
44023         unreachable.
44024
44025 2014-03-25  Jan Hubicka  <hubicka@ucw.cz>
44026
44027         * ipa-pure-const.c (propagate_pure_const, propagate_nothrow):
44028         Do not modify inline clones.
44029
44030 2014-03-25  Jakub Jelinek  <jakub@redhat.com>
44031
44032         * config/i386/i386.md (general_sext_operand): New mode attr.
44033         (addv<mode>4, subv<mode>4, mulv<mode>4): If operands[2] is CONST_INT,
44034         don't generate (sign_extend (const_int)).
44035         (*addv<mode>4, *subv<mode>4, *mulv<mode>4): Disallow CONST_INT_P
44036         operands[2].  Use We constraint instead of <i> and
44037         <general_sext_operand> predicate instead of <general_operand>.
44038         (*addv<mode>4_1, *subv<mode>4_1, *mulv<mode>4_1): New insns.
44039         * config/i386/constraints.md (We): New constraint.
44040         * config/i386/predicates.md (x86_64_sext_operand,
44041         sext_operand): New predicates.
44042
44043 2014-03-25  Martin Jambor  <mjambor@suse.cz>
44044
44045         PR ipa/60600
44046         * ipa-cp.c (ipa_get_indirect_edge_target_1): Redirect type
44047         inconsistent devirtualizations to __builtin_unreachable.
44048
44049 2014-03-25  Marek Polacek  <polacek@redhat.com>
44050
44051         PR c/35449
44052         * doc/extend.texi (Example of asm with clobbered asm reg): Fix typo.
44053
44054 2014-03-25  Alan Lawrence  <alan.lawrence@arm.com>
44055
44056         * config/aarch64/aarch64.c (aarch64_simd_valid_immediate): Reverse
44057         order of elements for big-endian.
44058
44059 2014-03-25  Richard Biener  <rguenther@suse.de>
44060
44061         PR middle-end/60635
44062         * gimplify-me.c (gimple_regimplify_operands): Update the
44063         re-gimplifed stmt.
44064
44065 2014-03-25  Martin Jambor  <mjambor@suse.cz>
44066
44067         PR ipa/59176
44068         * lto-cgraph.c (lto_output_node): Stream body_removed flag.
44069         (lto_output_varpool_node): Likewise.
44070         (input_overwrite_node): Likewise.
44071         (input_varpool_node): Likewise.
44072
44073 2014-03-25  Richard Biener  <rguenther@suse.de>
44074
44075         * lto-wrapper.c (merge_and_complain): Handle OPT_fPIE like OPT_fpie.
44076         (run_gcc): Likewise.
44077
44078 2014-03-25  Jakub Jelinek  <jakub@redhat.com>
44079
44080         * combine.c (simplify_compare_const): Add MODE argument.
44081         Handle mode_width 0 as very large mode_width.
44082         (try_combine, simplify_comparison): Adjust callers.
44083
44084         * cselib.c (cselib_hash_rtx): Perform addition in unsigned
44085         type to avoid signed integer overflow.
44086         * explow.c (plus_constant): Likewise.
44087
44088 2014-03-25  Dominik Vogt  <vogt@linux.vnet.ibm.com>
44089
44090         * doc/generic.texi: Correct typos.
44091
44092 2014-03-24  Tobias Burnus  <burnus@net-b.de>
44093
44094         * doc/invoke.texi (-flto): Expand section about
44095         using static libraries with LTO.
44096
44097 2014-03-24  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
44098
44099         PR rtl-optimization/60501
44100         * optabs.def (addptr3_optab): New optab.
44101         * optabs.c (gen_addptr3_insn, have_addptr3_insn): New function.
44102         * doc/md.texi ("addptrm3"): Document new RTL standard expander.
44103         * expr.h (gen_addptr3_insn, have_addptr3_insn): Add prototypes.
44104
44105         * lra.c (emit_add3_insn): Use the addptr pattern if available.
44106
44107         * config/s390/s390.md ("addptrdi3", "addptrsi3"): New expanders.
44108
44109 2014-03-24  Ulrich Drepper  <drepper@gmail.com>
44110
44111         * config/i386/avx512fintrin.h: Define _mm512_set1_ps and
44112         _mm512_set1_pd.
44113
44114         * config/i386/avxintrin.h (_mm256_undefined_si256): Define.
44115         (_mm256_undefined_ps): Define.
44116         (_mm256_undefined_pd): Define.
44117         * config/i386/emmintrin.h (_mm_undefined_si128): Define.
44118         (_mm_undefined_pd): Define.
44119         * config/i386/xmmintrin.h (_mm_undefined_ps): Define.
44120         * config/i386/avx512fintrin.h (_mm512_undefined_si512): Define.
44121         (_mm512_undefined_ps): Define.
44122         (_mm512_undefined_pd): Define.
44123         Use _mm*_undefined_*.
44124         * config/i386/avx2intrin.h: Use _mm*_undefined_*.
44125
44126 2014-03-24  Alex Velenko  <Alex.Velenko@arm.com>
44127
44128         * config/aarch64/aarch64-simd-builtins.def (lshr): DI mode excluded.
44129         (lshr_simd): DI mode added.
44130         * config/aarch64/aarch64-simd.md (aarch64_lshr_simddi): New pattern.
44131         (aarch64_ushr_simddi): Likewise.
44132         * config/aarch64/aarch64.md (UNSPEC_USHR64): New unspec.
44133         * config/aarch64/arm_neon.h (vshr_n_u64): Intrinsic fixed.
44134         (vshrd_n_u64): Likewise.
44135
44136 2014-03-24  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
44137
44138         * Makefile.in (s-macro_list): Depend on cc1.
44139
44140 2014-03-23  Teresa Johnson  <tejohnson@google.com>
44141
44142         * ipa-utils.c (ipa_print_order): Use specified dump file.
44143
44144 2014-03-23  Eric Botcazou  <ebotcazou@adacore.com>
44145
44146         PR rtl-optimization/60601
44147         * bb-reorder.c (fix_up_fall_thru_edges): Test EDGE_FALLTHRU everywhere.
44148
44149         * gcc.c (eval_spec_function): Initialize save_growing_value.
44150
44151 2014-03-22  Jakub Jelinek  <jakub@redhat.com>
44152
44153         PR sanitizer/60613
44154         * internal-fn.c (ubsan_expand_si_overflow_addsub_check): For
44155         code == MINUS_EXPR, never swap op0 with op1.
44156
44157         * toplev.c (init_local_tick): Avoid signed integer multiplication
44158         overflow.
44159         * genautomata.c (reserv_sets_hash_value): Fix rotate idiom, avoid
44160         shift by first operand's bitsize.
44161
44162 2014-03-21  Jakub Jelinek  <jakub@redhat.com>
44163
44164         PR target/60610
44165         * config/i386/i386.h (TARGET_64BIT_P): If not TARGET_BI_ARCH,
44166         redefine to 1 or 0.
44167         * config/i386/darwin.h (TARGET_64BIT_P): Redefine to
44168         TARGET_ISA_64BIT_P(x).
44169
44170 2014-03-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
44171
44172         * config/rs6000/rs6000.c (rs6000_expand_vector_set): Generate a
44173         pattern for vector nor instead of subtract from splat(-1).
44174         (altivec_expand_vec_perm_const_le): Likewise.
44175
44176 2014-03-21  Richard Henderson  <rth@twiddle.net>
44177
44178         PR target/60598
44179         * ifcvt.c (dead_or_predicable): Return FALSE if there are any frame
44180         related insns after epilogue_completed.
44181
44182 2014-03-21  Martin Jambor  <mjambor@suse.cz>
44183
44184         PR ipa/59176
44185         * cgraph.h (symtab_node): New flag body_removed.
44186         * ipa.c (symtab_remove_unreachable_nodes): Set body_removed flag
44187         when removing bodies.
44188         * symtab.c (dump_symtab_base): Dump body_removed flag.
44189         * cgraph.c (verify_edge_corresponds_to_fndecl): Skip nodes which
44190         had their bodies removed.
44191
44192 2014-03-21  Martin Jambor  <mjambor@suse.cz>
44193
44194         PR ipa/60419
44195         * ipa.c (symtab_remove_unreachable_nodes): Clear thunk flag of nodes
44196         in the border.
44197
44198 2014-03-21  Richard Biener  <rguenther@suse.de>
44199
44200         PR tree-optimization/60577
44201         * tree-core.h (struct tree_base): Document nothrow_flag use
44202         in DECL_NONALIASED.
44203         * tree.h (DECL_NONALIASED): New.
44204         (may_be_aliased): Adjust.
44205         * coverage.c (build_var): Set DECL_NONALIASED.
44206
44207 2014-03-20  Eric Botcazou  <ebotcazou@adacore.com>
44208
44209         * expr.c (expand_expr_real_1): Remove outdated comment.
44210
44211 2014-03-20  Jakub Jelinek  <jakub@redhat.com>
44212
44213         PR middle-end/60597
44214         * ira.c (adjust_cleared_regs): Call copy_rtx on
44215         *reg_equiv[REGNO (loc)].src_p before passing it to
44216         simplify_replace_fn_rtx.
44217
44218         PR target/60568
44219         * config/i386/i386.c (x86_output_mi_thunk): Surround UNSPEC_GOT
44220         into CONST, put pic register as first operand of PLUS.  Use
44221         gen_const_mem for both 32-bit and 64-bit PIC got loads.
44222
44223 2014-03-20  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
44224
44225         * config/aarch64/aarch64.c (MEMORY_MOVE_COST): Delete.
44226
44227 2014-03-20  Eric Botcazou  <ebotcazou@adacore.com>
44228
44229         * config/sparc/sparc.c (sparc_do_work_around_errata): Implement work
44230         around for store forwarding issue in the FPU on the UT699.
44231         * config/sparc/sparc.md (in_branch_delay): Return false for single FP
44232         loads and operations if -mfix-ut699 is specified.
44233         (divtf3_hq): Tweak attribute.
44234         (sqrttf2_hq): Likewise.
44235
44236 2014-03-20  Eric Botcazou  <ebotcazou@adacore.com>
44237
44238         * calls.c (store_one_arg): Remove incorrect const qualification on the
44239         type of the temporary.
44240         * cfgexpand.c (expand_return): Likewise.
44241         * expr.c (expand_constructor): Likewise.
44242         (expand_expr_real_1): Likewise.
44243
44244 2014-03-20  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
44245
44246         * config/arm/arm.c (arm_dwarf_register_span): Update the element number
44247         of parts.
44248
44249 2014-03-19  Kaz Kojima  <kkojima@gcc.gnu.org>
44250
44251         PR target/60039
44252         * config/sh/sh.md (udivsi3_i1): Clobber R1 register.
44253
44254 2014-03-19  James Greenhalgh  <james.greenhalgh@arm.com>
44255
44256         * config/arm/aarch-common-protos.h
44257         (alu_cost_table): Fix spelling of "extend".
44258         * config/arm/arm.c (arm_new_rtx_costs): Fix spelling of "extend".
44259
44260 2014-03-19  Richard Biener  <rguenther@suse.de>
44261
44262         PR middle-end/60553
44263         * tree-core.h (tree_type_common): Re-order pointer members
44264         to reduce recursion depth during GC walks.
44265
44266 2014-03-19  Marek Polacek  <polacek@redhat.com>
44267
44268         PR sanitizer/60569
44269         * ubsan.c (ubsan_type_descriptor): Check that DECL_NAME is nonnull
44270         before accessing it.
44271
44272 2014-03-19  Richard Biener  <rguenther@suse.de>
44273
44274         PR lto/59543
44275         * lto-streamer-in.c (input_function): In WPA stage do not drop
44276         debug stmts.
44277
44278 2014-03-19  Jakub Jelinek  <jakub@redhat.com>
44279
44280         PR tree-optimization/60559
44281         * vectorizable_mask_load_store): Replace scalar MASK_LOAD
44282         with build_zero_cst assignment.
44283
44284 2014-03-18  Kai Tietz  <ktietz@redhat.com>
44285
44286         PR rtl-optimization/56356
44287         * sdbout.c (sdbout_parms): Verify that parms'
44288         incoming argument is valid.
44289         (sdbout_reg_parms): Likewise.
44290
44291 2014-03-18  Richard Henderson  <rth@redhat.com>
44292
44293         PR target/60562
44294         * config/i386/i386.md (*float<SWI48x><MODEF>2_i387): Move down to
44295         be shadowed by *float<SWI48><MODEF>2_sse.  Test X87_ENABLE_FLOAT.
44296         (*float<SWI48><MODEF>2_sse): Check X87_ENABLE_FLOAT for alternative 0.
44297
44298 2014-03-18  Basile Starynkevitch  <basile@starynkevitch.net>
44299
44300         * plugin.def: Improve comment for PLUGIN_INCLUDE_FILE.
44301         * doc/plugins.texi (Plugin callbacks): Mention PLUGIN_INCLUDE_FILE.
44302         Italicize plugin event names in description.  Explain that
44303         PLUGIN_PRAGMAS has no sense for lto1.  Explain PLUGIN_INCLUDE_FILE.
44304         Remind that no GCC functions should be called after PLUGIN_FINISH.
44305         Explain what pragmas with expansion are.
44306
44307 2014-03-18  Martin Liska  <mliska@suse.cz>
44308
44309         * cgraph.c (cgraph_update_edges_for_call_stmt_node): Added case when
44310         gimple call statement is update.
44311         * gimple-fold.c (gimple_fold_call): Changed order for GIMPLE_ASSIGN and
44312         GIMPLE_CALL, where gsi iterator still points to GIMPLE CALL.
44313
44314 2014-03-18  Jakub Jelinek  <jakub@redhat.com>
44315
44316         PR sanitizer/60557
44317         * ubsan.c (ubsan_instrument_unreachable): Call
44318         initialize_sanitizer_builtins.
44319         (ubsan_pass): Likewise.
44320
44321         PR sanitizer/60535
44322         * ubsan.c (ubsan_type_descriptor, ubsan_create_data): Call
44323         varpool_finalize_decl instead of rest_of_decl_compilation.
44324
44325 2014-03-18  Richard Biener  <rguenther@suse.de>
44326
44327         * df-problems.c (df_rd_confluence_n): Avoid bitmap_copy
44328         by using bitmap_and_compl instead of bitmap_and_compl_into.
44329         (df_rd_transfer_function): Likewise.
44330
44331 2014-03-18  Richard Biener  <rguenther@suse.de>
44332
44333         * doc/lto.texi (fresolution): Fix typo.
44334
44335 2014-03-18  Richard Biener  <rguenther@suse.de>
44336
44337         * doc/invoke.texi (flto): Update for changes in 4.9.
44338
44339 2014-03-18  Richard Biener  <rguenther@suse.de>
44340
44341         * doc/loop.texi: Remove section on the removed lambda framework.
44342         Update loop docs with recent changes in preserving loop structure.
44343
44344 2014-03-18  Richard Biener  <rguenther@suse.de>
44345
44346         * doc/lto.texi (-fresolution): Document.
44347
44348 2014-03-18  Richard Biener  <rguenther@suse.de>
44349
44350         * doc/contrib.texi: Adjust my name.
44351
44352 2014-03-18  Jakub Jelinek  <jakub@redhat.com>
44353
44354         PR ipa/58721
44355         * internal-fn.c: Include diagnostic-core.h.
44356         (expand_BUILTIN_EXPECT): New function.
44357         * gimplify.c (gimplify_call_expr): Use false instead of FALSE.
44358         (gimplify_modify_expr): Gimplify 3 argument __builtin_expect into
44359         IFN_BUILTIN_EXPECT call instead of __builtin_expect builtin call.
44360         * ipa-inline-analysis.c (find_foldable_builtin_expect): Handle
44361         IFN_BUILTIN_EXPECT.
44362         * predict.c (expr_expected_value_1): Handle IFN_BUILTIN_EXPECT.
44363         Revert 3 argument __builtin_expect code.
44364         (strip_predict_hints): Handle IFN_BUILTIN_EXPECT.
44365         * gimple-fold.c (gimple_fold_call): Likewise.
44366         * tree.h (fold_builtin_expect): New prototype.
44367         * builtins.c (build_builtin_expect_predicate): Add predictor
44368         argument, if non-NULL, create 3 argument __builtin_expect.
44369         (fold_builtin_expect): No longer static.  Add ARG2 argument,
44370         pass it through to build_builtin_expect_predicate.
44371         (fold_builtin_2): Adjust caller.
44372         (fold_builtin_3): Handle BUILT_IN_EXPECT.
44373         * internal-fn.def (BUILTIN_EXPECT): New.
44374
44375 2014-03-18  Tobias Burnus  <burnus@net-b.de>
44376
44377         PR ipa/58721
44378         * predict.def (PRED_FORTRAN_OVERFLOW, PRED_FORTRAN_FAIL_ALLOC,
44379         PRED_FORTRAN_FAIL_IO, PRED_FORTRAN_WARN_ONCE, PRED_FORTRAN_SIZE_ZERO,
44380         PRED_FORTRAN_INVALID_BOUND, PRED_FORTRAN_ABSENT_DUMMY): Add.
44381
44382 2014-03-18  Jan Hubicka  <hubicka@ucw.cz>
44383
44384         PR ipa/58721
44385         * predict.c (combine_predictions_for_bb): Fix up formatting.
44386         (expr_expected_value_1, expr_expected_value): Add predictor argument,
44387         fill what it points to if non-NULL.
44388         (tree_predict_by_opcode): Adjust caller, use the predictor.
44389         * predict.def (PRED_COMPARE_AND_SWAP): Add.
44390
44391 2014-03-18  Eric Botcazou  <ebotcazou@adacore.com>
44392
44393         * config/sparc/sparc.c (sparc_do_work_around_errata): Speed up and use
44394         proper constant for the store mode.
44395
44396 2014-03-18  Ilya Enkovich  <ilya.enkovich@intel.com>
44397
44398         * symtab.c (change_decl_assembler_name): Fix transparent alias
44399         chain construction.
44400
44401 2014-03-16  Renlin Li  <Renlin.Li@arm.com>
44402
44403         * config/aarch64/aarch64.c: Correct the comments about the
44404         aarch64 stack layout.
44405
44406 2014-03-18  Thomas Schwinge  <thomas@codesourcery.com>
44407
44408         * omp-low.c (lower_rec_input_clauses) <build_omp_barrier>: Restore
44409         check for GF_OMP_FOR_KIND_FOR.
44410
44411 2013-03-18  Kirill Yukhin  <kirill.yukhin@intel.com>
44412
44413         * config/i386/i386.h (ADDITIONAL_REGISTER_NAMES): Add
44414         ymm and zmm register names.
44415
44416 2014-03-17  Jakub Jelinek  <jakub@redhat.com>
44417
44418         PR target/60516
44419         * config/i386/i386.c (ix86_expand_epilogue): Adjust REG_CFA_ADJUST_CFA
44420         note creation for the 2010-08-31 changes.
44421
44422 2014-03-17  Marek Polacek  <polacek@redhat.com>
44423
44424         PR middle-end/60534
44425         * omp-low.c (omp_max_vf): Treat -fno-tree-loop-optimize the same
44426         as -fno-tree-loop-vectorize.
44427         (expand_omp_simd): Likewise.
44428
44429 2014-03-15  Eric Botcazou  <ebotcazou@adacore.com>
44430
44431         * config/sparc/sparc-protos.h (tls_call_delay): Delete.
44432         (eligible_for_call_delay): New prototype.
44433         * config/sparc/sparc.c (tls_call_delay): Rename into...
44434         (eligible_for_call_delay): ...this.  Return false if the instruction
44435         cannot be put in the delay slot of a branch.
44436         (eligible_for_restore_insn): Simplify.
44437         (eligible_for_return_delay): Return false if the instruction cannot be
44438         put in the delay slot of a branch and simplify.
44439         (eligible_for_sibcall_delay): Return false if the instruction cannot be
44440         put in the delay slot of a branch.
44441         * config/sparc/sparc.md (fix_ut699): New attribute.
44442         (tls_call_delay): Delete.
44443         (in_call_delay): Reimplement.
44444         (eligible_for_sibcall_delay): Rename into...
44445         (in_sibcall_delay): ...this.
44446         (eligible_for_return_delay): Rename into...
44447         (in_return_delay): ...this.
44448         (in_branch_delay): Reimplement.
44449         (in_uncond_branch_delay): Delete.
44450         (in_annul_branch_delay): Delete.
44451
44452 2014-03-14  Richard Henderson  <rth@redhat.com>
44453
44454         PR target/60525
44455         * config/i386/i386.md (floathi<X87MODEF>2): Delete expander; rename
44456         define_insn from *floathi<X87MODEF>2_i387; allow nonimmediate_operand.
44457         (*floathi<X87MODEF>2_i387_with_temp): Remove.
44458         (floathi splitters): Remove.
44459         (float<SWI48x>xf2): New pattern.
44460         (float<SWI48><MODEF>2): Rename from float<SWI48x><X87MODEF>2.  Drop
44461         code that tried to handle DImode for 32-bit, but which was excluded
44462         by the pattern's condition.  Drop allocation of stack temporary.
44463         (*floatsi<MODEF>2_vector_mixed_with_temp): Remove.
44464         (*float<SWI48><MODEF>2_mixed_with_temp): Remove.
44465         (*float<SWI48><MODEF>2_mixed_interunit): Remove.
44466         (*float<SWI48><MODEF>2_mixed_nointerunit): Remove.
44467         (*floatsi<MODEF>2_vector_sse_with_temp): Remove.
44468         (*float<SWI48><MODEF>2_sse_with_temp): Remove.
44469         (*float<SWI48><MODEF>2_sse_interunit): Remove.
44470         (*float<SWI48><MODEF>2_sse_nointerunit): Remove.
44471         (*float<SWI48x><X87MODEF>2_i387_with_temp): Remove.
44472         (*float<SWI48x><X87MODEF>2_i387): Remove.
44473         (all float _with_temp splitters): Remove.
44474         (*float<SWI48x><MODEF>2_i387): New pattern.
44475         (*float<SWI48><MODEF>2_sse): New pattern.
44476         (float TARGET_USE_VECTOR_CONVERTS splitters): Merge them.
44477         (float TARGET_SSE_PARTIAL_REG_DEPENDENCY splitters): Merge them.
44478
44479 2014-03-14  Jakub Jelinek  <jakub@redhat.com>
44480             Marek Polacek  <polacek@redhat.com>
44481
44482         PR middle-end/60484
44483         * common.opt (dump_base_name_prefixed): New Variable.
44484         * opts.c (finish_options): Don't prepend directory to x_dump_base_name
44485         if x_dump_base_name_prefixed is already set, set it at the end.
44486
44487 2014-03-14  Vladimir Makarov  <vmakarov@redhat.com>
44488
44489         PR rtl-optimization/60508
44490         * lra-constraints.c (get_reload_reg): Add new parameter
44491         in_subreg_p.
44492         (process_addr_reg, simplify_operand_subreg, curr_insn_transform):
44493         Pass the new parameter values.
44494
44495 2014-03-14  Richard Biener  <rguenther@suse.de>
44496
44497         * common.opt: Revert unintented changes from r205065.
44498         * opts.c: Likewise.
44499
44500 2014-03-14  Richard Biener  <rguenther@suse.de>
44501
44502         PR middle-end/60518
44503         * cfghooks.c (split_block): Properly adjust all loops the
44504         block was a latch of.
44505
44506 2014-03-14  Martin Jambor  <mjambor@suse.cz>
44507
44508         PR lto/60461
44509         * ipa-prop.c (ipa_modify_call_arguments): Fix iteration condition
44510         and simplify it.
44511
44512 2014-03-14  Georg-Johann Lay  <avr@gjlay.de>
44513
44514         PR target/59396
44515         * config/avr/avr.c (avr_set_current_function): Pass function name
44516         through default_strip_name_encoding before sanity checking instead
44517         of skipping the first char of the assembler name.
44518
44519 2014-03-13  Richard Henderson  <rth@redhat.com>
44520
44521         PR debug/60438
44522         * config/i386/i386.c (ix86_split_fp_branch): Remove pushed argument.
44523         (ix86_force_to_memory, ix86_free_from_memory): Remove.
44524         * config/i386/i386-protos.h: Likewise.
44525         * config/i386/i386.md (floathi<X87MODEF>2): Use assign_386_stack_local
44526         in the expander instead of a splitter.
44527         (float<SWI48x><X87MODEF>2): Use assign_386_stack_local if there is
44528         any possibility of requiring a memory.
44529         (*floatsi<MODEF>2_vector_mixed): Remove, and the splitters.
44530         (*floatsi<MODEF>2_vector_sse): Remove, and the splitters.
44531         (fp branch splitters): Update for ix86_split_fp_branch.
44532         (*jcc<X87MODEF>_<SWI24>_i387): Remove r/f alternative.
44533         (*jcc<X87MODEF>_<SWI24>_r_i387): Likewise.
44534         (splitter for jcc<X87MODEF>_<SWI24>_i387 r/f): Remove.
44535         (*fop_<MODEF>_2_i387): Remove f/r alternative.
44536         (*fop_<MODEF>_3_i387): Likewise.
44537         (*fop_xf_2_i387, *fop_xf_3_i387): Likewise.
44538         (splitters for the fop_* register patterns): Remove.
44539         (fscalexf4_i387): Rename from *fscalexf4_i387.
44540         (ldexpxf3): Use gen_floatsixf2 and gen_fscalexf4_i387.
44541
44542 2014-03-13  Jakub Jelinek  <jakub@redhat.com>
44543
44544         PR tree-optimization/59779
44545         * tree-dfa.c (get_ref_base_and_extent): Use double_int
44546         type for bitsize and maxsize instead of HOST_WIDE_INT.
44547
44548 2014-03-13  Steven Bosscher  <steven@gcc.gnu.org>
44549
44550         PR rtl-optimization/57320
44551         * function.c (rest_of_handle_thread_prologue_and_epilogue): Cleanup
44552         the CFG after thread_prologue_and_epilogue_insns.
44553
44554 2014-03-13  Vladimir Makarov  <vmakarov@redhat.com>
44555
44556         PR rtl-optimization/57189
44557         * lra-constraints.c (process_alt_operands): Disfavor spilling
44558         vector pseudos.
44559
44560 2014-03-13  Cesar Philippidis  <cesar@codesourcery.com>
44561
44562         * lto-wrapper.c (maybe_unlink_file): Suppress diagnostic messages.
44563
44564 2014-03-13  Jakub Jelinek  <jakub@redhat.com>
44565
44566         PR tree-optimization/59025
44567         PR middle-end/60418
44568         * tree-ssa-reassoc.c (sort_by_operand_rank): For SSA_NAMEs with the
44569         same rank, sort by bb_rank and gimple_uid of SSA_NAME_DEF_STMT first.
44570
44571 2014-03-13  Georg-Johann Lay  <avr@gjlay.de>
44572
44573         PR target/60486
44574         * config/avr/avr.c (avr_out_plus): Swap cc_plus and cc_minus in
44575         calls of avr_out_plus_1.
44576
44577 2014-03-13  Bin Cheng  <bin.cheng@arm.com>
44578
44579         * tree-cfgcleanup.c (remove_forwarder_block_with_phi): Record
44580         BB's single pred and update the father loop's latch info later.
44581
44582 2014-03-12  Michael Meissner  <meissner@linux.vnet.ibm.com>
44583
44584         * config/rs6000/vector.md (VEC_L): Add V1TI mode to vector types.
44585         (VEC_M): Likewise.
44586         (VEC_N): Likewise.
44587         (VEC_R): Likewise.
44588         (VEC_base): Likewise.
44589         (mov<MODE>, VEC_M modes): If we are loading TImode into VSX
44590         registers, we need to swap double words in little endian mode.
44591
44592         * config/rs6000/rs6000-modes.def (V1TImode): Add new vector mode
44593         to be a container mode for 128-bit integer operations added in ISA
44594         2.07.  Unlike TImode and PTImode, the preferred register set is
44595         the Altivec/VMX registers for the 128-bit operations.
44596
44597         * config/rs6000/rs6000-protos.h (rs6000_move_128bit_ok_p): Add
44598         declarations.
44599         (rs6000_split_128bit_ok_p): Likewise.
44600
44601         * config/rs6000/rs6000-builtin.def (BU_P8V_AV_3): Add new support
44602         macros for creating ISA 2.07 normal and overloaded builtin
44603         functions with 3 arguments.
44604         (BU_P8V_OVERLOAD_3): Likewise.
44605         (VPERM_1T): Add support for V1TImode in 128-bit vector operations
44606         for use as overloaded functions.
44607         (VPERM_1TI_UNS): Likewise.
44608         (VSEL_1TI): Likewise.
44609         (VSEL_1TI_UNS): Likewise.
44610         (ST_INTERNAL_1ti): Likewise.
44611         (LD_INTERNAL_1ti): Likewise.
44612         (XXSEL_1TI): Likewise.
44613         (XXSEL_1TI_UNS): Likewise.
44614         (VPERM_1TI): Likewise.
44615         (VPERM_1TI_UNS): Likewise.
44616         (XXPERMDI_1TI): Likewise.
44617         (SET_1TI): Likewise.
44618         (LXVD2X_V1TI): Likewise.
44619         (STXVD2X_V1TI): Likewise.
44620         (VEC_INIT_V1TI): Likewise.
44621         (VEC_SET_V1TI): Likewise.
44622         (VEC_EXT_V1TI): Likewise.
44623         (EQV_V1TI): Likewise.
44624         (NAND_V1TI): Likewise.
44625         (ORC_V1TI): Likewise.
44626         (VADDCUQ): Add support for 128-bit integer arithmetic instructions
44627         added in ISA 2.07.  Add both normal 'altivec' builtins, and the
44628         overloaded builtin.
44629         (VADDUQM): Likewise.
44630         (VSUBCUQ): Likewise.
44631         (VADDEUQM): Likewise.
44632         (VADDECUQ): Likewise.
44633         (VSUBEUQM): Likewise.
44634         (VSUBECUQ): Likewise.
44635
44636         * config/rs6000/rs6000-c.c (__int128_type): New static to hold
44637         __int128_t and __uint128_t types.
44638         (__uint128_type): Likewise.
44639         (altivec_categorize_keyword): Add support for vector __int128_t,
44640         vector __uint128_t, vector __int128, and vector unsigned __int128
44641         as a container type for TImode operations that need to be done in
44642         VSX/Altivec registers.
44643         (rs6000_macro_to_expand): Likewise.
44644         (altivec_overloaded_builtins): Add ISA 2.07 overloaded functions
44645         to support 128-bit integer instructions vaddcuq, vadduqm,
44646         vaddecuq, vaddeuqm, vsubcuq, vsubuqm, vsubecuq, vsubeuqm.
44647         (altivec_resolve_overloaded_builtin): Add support for V1TImode.
44648
44649         * config/rs6000/rs6000.c (rs6000_hard_regno_mode_ok): Add support
44650         for V1TImode, and set up preferences to use VSX/Altivec registers.
44651         Setup VSX reload handlers.
44652         (rs6000_debug_reg_global): Likewise.
44653         (rs6000_init_hard_regno_mode_ok): Likewise.
44654         (rs6000_preferred_simd_mode): Likewise.
44655         (vspltis_constant): Do not allow V1TImode as easy altivec constants.
44656         (easy_altivec_constant): Likewise.
44657         (output_vec_const_move): Likewise.
44658         (rs6000_expand_vector_set): Convert V1TImode set and extract to
44659         simple move.
44660         (rs6000_expand_vector_extract): Likewise.
44661         (reg_offset_addressing_ok_p): Setup V1TImode to use VSX reg+reg
44662         addressing.
44663         (rs6000_const_vec): Add support for V1TImode.
44664         (rs6000_emit_le_vsx_load): Swap double words when loading or
44665         storing TImode/V1TImode.
44666         (rs6000_emit_le_vsx_store): Likewise.
44667         (rs6000_emit_le_vsx_move): Likewise.
44668         (rs6000_emit_move): Add support for V1TImode.
44669         (altivec_expand_ld_builtin): Likewise.
44670         (altivec_expand_st_builtin): Likewise.
44671         (altivec_expand_vec_init_builtin): Likewise.
44672         (altivec_expand_builtin): Likewise.
44673         (rs6000_init_builtins): Add support for V1TImode type.  Add
44674         support for ISA 2.07 128-bit integer builtins.  Define type names
44675         for the VSX/Altivec vector types.
44676         (altivec_init_builtins): Add support for overloaded vector
44677         functions with V1TImode type.
44678         (rs6000_preferred_reload_class): Prefer Altivec registers for V1TImode.
44679         (rs6000_move_128bit_ok_p): Move 128-bit move/split validation to
44680         external function.
44681         (rs6000_split_128bit_ok_p): Likewise.
44682         (rs6000_handle_altivec_attribute): Create V1TImode from vector
44683         __int128_t and vector __uint128_t.
44684
44685         * config/rs6000/vsx.md (VSX_L): Add V1TImode to vector iterators
44686         and mode attributes.
44687         (VSX_M): Likewise.
44688         (VSX_M2): Likewise.
44689         (VSm): Likewise.
44690         (VSs): Likewise.
44691         (VSr): Likewise.
44692         (VSv): Likewise.
44693         (VS_scalar): Likewise.
44694         (VS_double): Likewise.
44695         (vsx_set_v1ti): New builtin function to create V1TImode from TImode.
44696
44697         * config/rs6000/rs6000.h (TARGET_VADDUQM): New macro to say whether
44698         we support the ISA 2.07 128-bit integer arithmetic instructions.
44699         (ALTIVEC_OR_VSX_VECTOR_MODE): Add V1TImode.
44700         (enum rs6000_builtin_type_index): Add fields to hold V1TImode
44701         and TImode types for use with the builtin functions.
44702         (V1TI_type_node): Likewise.
44703         (unsigned_V1TI_type_node): Likewise.
44704         (intTI_type_internal_node): Likewise.
44705         (uintTI_type_internal_node): Likewise.
44706
44707         * config/rs6000/altivec.md (UNSPEC_VADDCUQ): New unspecs for ISA 2.07
44708         128-bit builtin functions.
44709         (UNSPEC_VADDEUQM): Likewise.
44710         (UNSPEC_VADDECUQ): Likewise.
44711         (UNSPEC_VSUBCUQ): Likewise.
44712         (UNSPEC_VSUBEUQM): Likewise.
44713         (UNSPEC_VSUBECUQ): Likewise.
44714         (VM): Add V1TImode to vector mode iterators.
44715         (VM2): Likewise.
44716         (VI_unit): Likewise.
44717         (altivec_vadduqm): Add ISA 2.07 128-bit binary builtins.
44718         (altivec_vaddcuq): Likewise.
44719         (altivec_vsubuqm): Likewise.
44720         (altivec_vsubcuq): Likewise.
44721         (altivec_vaddeuqm): Likewise.
44722         (altivec_vaddecuq): Likewise.
44723         (altivec_vsubeuqm): Likewise.
44724         (altivec_vsubecuq): Likewise.
44725
44726         * config/rs6000/rs6000.md (FMOVE128_GPR): Add V1TImode to vector
44727         mode iterators.
44728         (BOOL_128): Likewise.
44729         (BOOL_REGS_OUTPUT): Likewise.
44730         (BOOL_REGS_OP1): Likewise.
44731         (BOOL_REGS_OP2): Likewise.
44732         (BOOL_REGS_UNARY): Likewise.
44733         (BOOL_REGS_AND_CR0): Likewise.
44734
44735         * config/rs6000/altivec.h (vec_vaddcuq): Add support for ISA 2.07
44736         128-bit integer builtin support.
44737         (vec_vadduqm): Likewise.
44738         (vec_vaddecuq): Likewise.
44739         (vec_vaddeuqm): Likewise.
44740         (vec_vsubecuq): Likewise.
44741         (vec_vsubeuqm): Likewise.
44742         (vec_vsubcuq): Likewise.
44743         (vec_vsubuqm): Likewise.
44744
44745         * doc/extend.texi (PowerPC AltiVec/VSX Built-in Functions):
44746         Document vec_vaddcuq, vec_vadduqm, vec_vaddecuq, vec_vaddeuqm,
44747         vec_subecuq, vec_subeuqm, vec_vsubcuq, vec_vsubeqm builtins adding
44748         128-bit integer add/subtract to ISA 2.07.
44749
44750 2014-03-12  Joern Rennecke  <joern.rennecke@embecosm.com>
44751
44752         * config/arc/arc.c (arc_predicate_delay_insns):
44753         Fix third argument passed to conditionalize_nonjump.
44754
44755 2014-03-12  Yufeng Zhang  <yufeng.zhang@arm.com>
44756
44757         * config/aarch64/aarch64-builtins.c
44758         (aarch64_builtin_vectorized_function): Add BUILT_IN_LFLOORF,
44759         BUILT_IN_LLFLOOR, BUILT_IN_LCEILF and BUILT_IN_LLCEIL.
44760         * config/aarch64/arm_neon.h (vcvtaq_u64_f64): Call __builtin_llfloor
44761         instead of __builtin_lfloor.
44762         (vcvtnq_u64_f64): Call __builtin_llceil instead of __builtin_lceil.
44763
44764 2014-03-12  Jakub Jelinek  <jakub@redhat.com>
44765
44766         * tree-ssa-ifcombine.c (forwarder_block_to): New function.
44767         (tree_ssa_ifcombine_bb_1): New function.
44768         (tree_ssa_ifcombine_bb): Use it.  Handle also cases where else_bb
44769         is an empty forwarder block to then_bb or vice versa and then_bb
44770         and else_bb are effectively swapped.
44771
44772 2014-03-12  Christian Bruel  <christian.bruel@st.com>
44773
44774         PR target/60264
44775         * config/arm/arm.c (arm_emit_vfp_multi_reg_pop): Emit a
44776         REG_CFA_DEF_CFA note.
44777         (arm_expand_epilogue_apcs_frame): call arm_add_cfa_adjust_cfa_note.
44778         (arm_unwind_emit): Allow REG_CFA_DEF_CFA.
44779
44780 2014-03-12  Thomas Preud'homme  <thomas.preudhomme@arm.com>
44781
44782         PR tree-optimization/60454
44783         * tree-ssa-math-opts.c (find_bswap_1): Fix bswap detection.
44784
44785 2014-03-12  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
44786
44787         * config.gcc (aarch64*-*-*): Use ISA flags from aarch64-arches.def.
44788         Do not define target_cpu_default2 to generic.
44789         * config/aarch64/aarch64.h (TARGET_CPU_DEFAULT): Use generic cpu.
44790         * config/aarch64/aarch64.c (aarch64_override_options): Update comment.
44791         * config/aarch64/aarch64-arches.def (armv8-a): Use generic cpu.
44792
44793 2014-03-12  Jakub Jelinek  <jakub@redhat.com>
44794             Marc Glisse  <marc.glisse@inria.fr>
44795
44796         PR tree-optimization/60502
44797         * tree-ssa-reassoc.c (eliminate_not_pairs): Use build_all_ones_cst
44798         instead of build_low_bits_mask.
44799
44800 2014-03-12  Jakub Jelinek  <jakub@redhat.com>
44801
44802         PR middle-end/60482
44803         * tree-vrp.c (register_edge_assert_for_1): Don't add assert
44804         if there are multiple uses, but op doesn't live on E edge.
44805         * tree-cfg.c (assert_unreachable_fallthru_edge_p): Also ignore
44806         clobber stmts before __builtin_unreachable.
44807
44808 2014-03-11  Richard Sandiford  <rdsandiford@googlemail.com>
44809
44810         * builtins.c (expand_builtin_setjmp_receiver): Use and clobber
44811         hard_frame_pointer_rtx.
44812         * cse.c (cse_insn): Remove volatile check.
44813         * cselib.c (cselib_process_insn): Likewise.
44814         * dse.c (scan_insn): Likewise.
44815
44816 2014-03-11  Joern Rennecke  <joern.rennecke@embecosm.com>
44817
44818         * config/arc/arc.c (conditionalize_nonjump): New function,
44819         broken out of ...
44820         (arc_ifcvt): ... this.
44821         (arc_predicate_delay_insns): Use it.
44822
44823 2014-03-11  Joern Rennecke  <joern.rennecke@embecosm.com>
44824
44825         * config/arc/predicates.md (extend_operand): During/after reload,
44826         allow const_int_operand.
44827         * config/arc/arc.md (mulsidi3_700): Use extend_operand predicate.
44828         (umulsidi3_700): Likewise.  Change operand 2 constraint back to "cL".
44829         (mulsi3_highpart): Change operand 2 constraint alternatives 2 and 3
44830         to "i".
44831         (umulsi3_highpart_i): Likewise.
44832
44833 2014-03-11  Richard Biener  <rguenther@suse.de>
44834
44835         * tree-ssa-structalias.c (get_constraint_for_ptr_offset):
44836         Add asserts to guard possible wrong-code bugs.
44837
44838 2014-03-11  Richard Biener  <rguenther@suse.de>
44839
44840         PR tree-optimization/60429
44841         PR tree-optimization/60485
44842         * tree-ssa-structalias.c (set_union_with_increment): Properly
44843         take into account all fields that overlap the shifted vars.
44844         (do_sd_constraint): Likewise.
44845         (do_ds_constraint): Likewise.
44846         (get_constraint_for_ptr_offset): Likewise.
44847
44848 2014-03-11  Chung-Lin Tang  <cltang@codesourcery.com>
44849
44850         * config/nios2/nios2.c (machine_function): Add fp_save_offset field.
44851         (nios2_compute_frame_layout):
44852         Add calculation of cfun->machine->fp_save_offset.
44853         (nios2_expand_prologue): Correct setting of frame pointer register
44854         in prologue.
44855         (nios2_expand_epilogue): Update recovery of stack pointer from
44856         frame pointer accordingly.
44857         (nios2_initial_elimination_offset): Update calculation of offset
44858         for eliminating to HARD_FRAME_POINTER_REGNUM.
44859
44860 2014-03-10  Jakub Jelinek  <jakub@redhat.com>
44861
44862         PR ipa/60457
44863         * ipa.c (symtab_remove_unreachable_nodes): Don't call
44864         cgraph_get_create_node on VAR_DECLs.
44865
44866 2014-03-10  Richard Biener  <rguenther@suse.de>
44867
44868         PR middle-end/60474
44869         * tree.c (signed_or_unsigned_type_for): Handle OFFSET_TYPEs.
44870
44871 2014-03-08  Douglas B Rupp  <rupp@gnat.com>
44872
44873         * config/vms/vms.opt (vms_float_format): New variable.
44874
44875 2014-03-08  Tobias Burnus  <burnus@net-b.de>
44876
44877         * doc/invoke.texi (-fcilkplus): Update implementation status.
44878
44879 2014-03-08  Paulo Matos  <paulo@matos-sorge.com>
44880             Richard Biener  <rguenther@suse.de>
44881
44882         * lto-wrapper.c (merge_and_complain): Ensure -fshort-double is used
44883         consistently accross all TUs.
44884         (run_gcc): Enable -fshort-double automatically at link at link-time
44885         and disallow override.
44886
44887 2014-03-08  Richard Sandiford  <rdsandiford@googlemail.com>
44888
44889         PR target/58271
44890         * config/mips/mips.c (mips_option_override): Promote -mpaired-single
44891         warning to an error.  Disable TARGET_PAIRED_SINGLE and TARGET_MIPS3D
44892         if they can't be used.
44893
44894 2014-03-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
44895
44896         * configure.ac (HAVE_AS_IX86_TLSLDMPLT): Improve test
44897         for Solaris 11/x86 ld.
44898         * configure: Regenerate.
44899
44900 2014-03-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
44901
44902         * configure.ac (TLS_SECTION_ASM_FLAG): Save as tls_section_flag.
44903         (LIB_TLS_SPEC): Save as ld_tls_libs.
44904         (HAVE_AS_IX86_TLSLDMPLT): Define as 1/0.
44905         (HAVE_AS_IX86_TLSLDM): New test.
44906         * configure, config.in: Regenerate.
44907         * config/i386/i386.c (legitimize_tls_address): Fall back to
44908         TLS_MODEL_GLOBAL_DYNAMIC on 32-bit Solaris/x86 if tool chain
44909         cannot support TLS_MODEL_LOCAL_DYNAMIC.
44910         * config/i386/i386.md (*tls_local_dynamic_base_32_gnu): Use if
44911         instead of #ifdef in HAVE_AS_IX86_TLSLDMPLT test.
44912
44913 2014-03-07  Paulo Matos  <paulo@matos-sorge.com>
44914
44915         * common.opt (fira-loop-pressure): Mark as optimization.
44916
44917 2014-03-07  Thomas Schwinge  <thomas@codesourcery.com>
44918
44919         * langhooks.c (lhd_omp_mappable_type): The error_mark_node is not
44920         an OpenMP mappable type.
44921
44922 2014-03-06  Matthias Klose  <doko@ubuntu.com>
44923
44924         * Makefile.in (s-mlib): Only pass MULTIARCH_DIRNAME if
44925         MULTILIB_OSDIRNAMES is not defined.
44926
44927 2014-03-06  Jakub Jelinek  <jakub@redhat.com>
44928             Meador Inge  <meadori@codesourcery.com>
44929
44930         PR target/58595
44931         * config/arm/arm.c (arm_tls_symbol_p): Remove.
44932         (arm_legitimize_address): Call legitimize_tls_address for any
44933         arm_tls_referenced_p expression, handle constant addend.  Call it
44934         before testing for !TARGET_ARM.
44935         (thumb_legitimize_address): Don't handle arm_tls_symbol_p here.
44936
44937 2014-03-06  Richard Biener  <rguenther@suse.de>
44938
44939         PR middle-end/60445
44940         PR lto/60424
44941         PR lto/60427
44942         Revert
44943         2014-03-04  Paulo Matos  <paulo@matos-sorge.com>
44944
44945         * tree-streamer.c (record_common_node): Assert we don't record
44946         nodes with type double.
44947         (preload_common_node): Skip type double, complex double and double
44948         pointer since it is now frontend dependent due to fshort-double option.
44949
44950 2014-03-06  Richard Biener  <rguenther@suse.de>
44951
44952         * gcc.c (PLUGIN_COND): Always enable unless -fno-use-linker-plugin
44953         or -fno-lto is specified and the linker has full plugin support.
44954         * collect2.c (lto_mode): Default to LTO_MODE_WHOPR if LTO is enabled.
44955         (main): Remove -flto processing, adjust lto_mode using use_plugin late.
44956         * lto-wrapper.c (merge_and_complain): Merge compile-time
44957         optimization levels.
44958         (run_gcc): And pass it through to the link options.
44959
44960 2014-03-06  Alexandre Oliva  <aoliva@redhat.com>
44961
44962         PR debug/60381
44963         Revert:
44964         2014-02-28  Alexandre Oliva  <aoliva@redhat.com>
44965         PR debug/59992
44966         * cselib.c (remove_useless_values): Skip to avoid quadratic
44967         behavior if the condition moved from...
44968         (cselib_process_insn): ... here holds.
44969
44970 2014-03-05  Jakub Jelinek  <jakub@redhat.com>
44971
44972         PR plugins/59335
44973         * Makefile.in (PLUGIN_HEADERS): Add tree-phinodes.h, stor-layout.h,
44974         ssa-iterators.h, $(RESOURCE_H) and tree-cfgcleanup.h.
44975
44976         PR plugins/59335
44977         * config/i386/t-i386 (OPTIONS_H_EXTRA): Add stringop.def.
44978         (TM_H): Add x86-tune.def.
44979
44980 2014-03-05  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
44981
44982         * config/aarch64/aarch64.c (generic_tunings):
44983         Use cortexa57_extra_costs.
44984
44985 2014-03-05  Jakub Jelinek  <jakub@redhat.com>
44986
44987         PR lto/60404
44988         * cfgexpand.c (expand_used_vars): Do not assume all SSA_NAMEs
44989         of PARM/RESULT_DECLs must be coalesced with optimize && in_lto_p.
44990         * tree-ssa-coalesce.c (coalesce_ssa_name): Use MUST_COALESCE_COST - 1
44991         cost for in_lto_p.
44992
44993 2014-03-04  Heiher  <r@hev.cc>
44994
44995         * config/mips/mips-cpus.def (loongson3a): Mark as a MIPS64r2 processor.
44996         * config/mips/mips.h (MIPS_ISA_LEVEL_SPEC): Adjust accordingly.
44997
44998 2014-03-04  Uros Bizjak  <ubizjak@gmail.com>
44999
45000         * config/i386/predicates.md (const2356_operand): Change to ...
45001         (const2367_operand): ... this.
45002         * config/i386/sse.md (avx512pf_scatterpf<mode>sf): Use
45003         const2367_operand.
45004         (*avx512pf_scatterpf<mode>sf_mask): Ditto.
45005         (*avx512pf_scatterpf<mode>sf): Ditto.
45006         (avx512pf_scatterpf<mode>df): Ditto.
45007         (*avx512pf_scatterpf<mode>df_mask): Ditto.
45008         (*avx512pf_scatterpf<mode>df): Ditto.
45009         * config/i386/i386.c (ix86_expand_builtin): Update
45010         incorrect hint operand error message.
45011
45012 2014-03-04  Richard Biener  <rguenther@suse.de>
45013
45014         * lto-section-in.c (lto_get_section_data): Fix const cast.
45015
45016 2014-03-04  Paulo Matos  <paulo@matos-sorge.com>
45017
45018         * tree-streamer.c (record_common_node): Assert we don't record
45019         nodes with type double.
45020         (preload_common_node): Skip type double, complex double and double
45021         pointer since it is now frontend dependent due to fshort-double option.
45022
45023 2014-03-04  Richard Biener  <rguenther@suse.de>
45024
45025         PR lto/60405
45026         * lto-streamer-in.c (lto_read_body): Remove LTO bytecode version check.
45027         (lto_input_toplevel_asms): Likewise.
45028         * lto-section-in.c (lto_get_section_data): Instead do it here
45029         for every section.
45030
45031 2014-03-04  Richard Biener  <rguenther@suse.de>
45032
45033         PR tree-optimization/60382
45034         * tree-vect-loop.c (vect_is_simple_reduction_1): Do not consider
45035         dead PHIs a reduction.
45036
45037 2014-03-03  Uros Bizjak  <ubizjak@gmail.com>
45038
45039         * config/i386/xmmintrin.h (enum _mm_hint) <_MM_HINT_ET0>: Correct
45040         hint value.
45041         (_mm_prefetch): Move out of GCC target("sse") pragma.
45042         * config/i386/prfchwintrin.h (_m_prefetchw): Move out of
45043         GCC target("prfchw") pragma.
45044         * config/i386/i386.md (prefetch): Emit prefetchwt1 only
45045         for locality <= 2.
45046         * config/i386/i386.c (ix86_option_override_internal): Enable
45047         -mprfchw with -mprefetchwt1.
45048
45049 2014-03-03  Joern Rennecke  <joern.rennecke@embecosm.com>
45050
45051         * config/arc/arc.md (casesi_load) <length attribute alternative 0>:
45052         Mark as varying.
45053
45054 2014-03-03  Joern Rennecke  <joern.rennecke@embecosm.com>
45055
45056         * opts.h (CL_PCH_IGNORE): Define.
45057         * targhooks.c (option_affects_pch_p):
45058         Return false for options that have CL_PCH_IGNORE set.
45059         * opt-functions.awk: Process PchIgnore.
45060         * doc/options.texi: Document PchIgnore.
45061
45062         * config/arc/arc.opt (misize): Add PchIgnore property.
45063
45064 2014-03-03  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45065
45066         * config/rs6000/rs6000.c (rs6000_preferred_reload_class): Disallow
45067         reload of PLUS rtx's outside of GENERAL_REGS or BASE_REGS; relax
45068         constraint on constants to permit them being loaded into
45069         GENERAL_REGS or BASE_REGS.
45070
45071 2014-03-03  Nick Clifton  <nickc@redhat.com>
45072
45073         * config/rl78/rl78-real.md (cbranchsi4_real_signed): Add
45074         anti-cacnonical alternatives.
45075         (negandhi3_real): New pattern.
45076         * config/rl78/rl78-virt.md (negandhi3_virt): New pattern.
45077
45078 2014-03-03  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
45079
45080         * config/avr/avr-mcus.def: Remove atxmega16x1.
45081         * config/avr/avr-tables.opt: Regenerate.
45082         * config/avr/t-multilib: Regenerate.
45083         * doc/avr-mmcu.texi: Regenerate.
45084
45085 2014-03-03  Tobias Grosser  <tobias@grosser.es>
45086             Mircea Namolaru  <mircea.namolaru@inria.fr>
45087
45088         PR tree-optimization/58028
45089         * graphite-clast-to-gimple.c (set_cloog_options): Don't remove
45090         scalar dimensions.
45091
45092 2014-03-03  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
45093
45094         * config/arm/neon.md (*movmisalign<mode>): Legitimize addresses
45095         not handled by recognizers.
45096
45097 2014-03-03  Jakub Jelinek  <jakub@redhat.com>
45098
45099         PR middle-end/60175
45100         * function.c (expand_function_end): Don't emit
45101         clobber_return_register sequence if clobber_after is a BARRIER.
45102         * cfgexpand.c (construct_exit_block): Append instructions before
45103         return_label to prev_bb.
45104
45105 2014-03-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45106
45107         * config/rs6000/constraints.md: Document reserved use of "wc".
45108
45109 2014-03-02  Jan Hubicka  <hubicka@ucw.cz>
45110
45111         PR ipa/60150
45112         * ipa.c (function_and_variable_visibility): When dissolving comdat
45113         group, also set all symbols to local.
45114
45115 2014-03-02  Jan Hubicka  <hubicka@ucw.cz>
45116
45117         PR ipa/60306
45118
45119         Revert:
45120         2013-12-14  Jan Hubicka  <jh@suse.cz>
45121         PR middle-end/58477
45122         * ipa-prop.c (stmt_may_be_vtbl_ptr_store): Skip clobbers.
45123
45124 2014-03-02  Jon Beniston  <jon@beniston.com>
45125
45126         PR bootstrap/48230
45127         PR bootstrap/50927
45128         PR bootstrap/52466
45129         PR target/46898
45130         * config/lm32/lm32.c (lm32_legitimate_constant_p): Remove, as incorrect.
45131         (TARGET_LEGITIMATE_CONSTANT_P): Undefine, as not needed.
45132         * config/lm32/lm32.md (movsi_insn): Add 32-bit immediate support.
45133         (simple_return, *simple_return): New patterns
45134         * config/lm32/predicates.md (movsi_rhs_operand): Remove as obsolete.
45135         * configure.ac (force_sjlj_exceptions): Force sjlj exceptions for lm32.
45136
45137 2014-03-01  Paolo Carlini  <paolo.carlini@oracle.com>
45138
45139         * dwarf2out.c (gen_subprogram_die): Tidy.
45140
45141 2014-03-01  Oleg Endo  <olegendo@gcc.gnu.org>
45142
45143         PR target/60071
45144         * config/sh/sh.md (*mov_t_msb_neg): Split into ...
45145         (*mov_t_msb_neg_negc): ... this new insn.
45146
45147 2014-02-28  Jason Merrill  <jason@redhat.com>
45148
45149         PR c++/58678
45150         * ipa-devirt.c (ipa_devirt): Don't choose an implicitly-declared
45151         function.
45152
45153 2014-02-28  Paolo Carlini  <paolo.carlini@oracle.com>
45154
45155         PR c++/60314
45156         * dwarf2out.c (decltype_auto_die): New static.
45157         (gen_subprogram_die): Handle 'decltype(auto)' like 'auto'.
45158         (gen_type_die_with_usage): Handle 'decltype(auto)'.
45159         (is_cxx_auto): Likewise.
45160
45161 2014-02-28  Ian Bolton  <ian.bolton@arm.com>
45162
45163         * config/aarch64/aarch64.h: Define __ARM_NEON by default if
45164         we are not using general regs only.
45165
45166 2014-02-28  Richard Biener  <rguenther@suse.de>
45167
45168         PR target/60280
45169         * tree-cfgcleanup.c (tree_forwarder_block_p): Restrict
45170         previous fix and only allow to remove trivial pre-headers
45171         and latches.  Also honor LOOPS_MAY_HAVE_MULTIPLE_LATCHES.
45172         (remove_forwarder_block): Properly update the latch of a loop.
45173
45174 2014-02-28  Alexandre Oliva  <aoliva@redhat.com>
45175
45176         PR debug/59992
45177         * cselib.c (cselib_hasher::equal): Special-case VALUE lookup.
45178         (cselib_preserved_hash_table): New.
45179         (preserve_constants_and_equivs): Move preserved vals to it.
45180         (cselib_find_slot): Look it up first.
45181         (cselib_init): Initialize it.
45182         (cselib_finish): Release it.
45183         (dump_cselib_table): Dump it.
45184
45185 2014-02-28  Alexandre Oliva  <aoliva@redhat.com>
45186
45187         PR debug/59992
45188         * cselib.c (remove_useless_values): Skip to avoid quadratic
45189         behavior if the condition moved from...
45190         (cselib_process_insn): ... here holds.
45191
45192 2014-02-28  Alexandre Oliva  <aoliva@redhat.com>
45193
45194         PR debug/57232
45195         * var-tracking.c (vt_initialize): Apply the same condition to
45196         preserve the CFA base value.
45197
45198 2014-02-28  Joey Ye  <joey.ye@arm.com>
45199
45200         PR target/PR60169
45201         * config/arm/arm.c (thumb_far_jump_used_p): Don't change
45202         if reload in progress or completed.
45203
45204 2014-02-28  Tobias Burnus  <burnus@net-b.de>
45205
45206         PR middle-end/60147
45207         * tree-pretty-print.c (dump_generic_node, print_declaration): Handle
45208         NAMELIST_DECL.
45209
45210 2014-02-27  H.J. Lu  <hongjiu.lu@intel.com>
45211
45212         * doc/tm.texi.in (Condition Code Status): Update documention for
45213         relative locations of cc0-setter and cc0-user.
45214
45215 2014-02-27  Jeff Law  <law@redhat.com>
45216
45217         PR rtl-optimization/52714
45218         * combine.c (try_combine): When splitting an unrecognized PARALLEL
45219         into two independent simple sets, if I3 is a jump, ensure the
45220         pattern we place into I3 is a (set (pc) ...).
45221
45222 2014-02-27  Mikael Pettersson  <mikpe@it.uu.se>
45223             Jeff Law  <law@redhat.com>
45224
45225         PR rtl-optimization/49847
45226         * cse.c (fold_rtx) Handle case where cc0 setter and cc0 user
45227         are in different blocks.
45228         * doc/tm.texi (Condition Code Status): Update documention for
45229         relative locations of cc0-setter and cc0-user.
45230
45231 2014-02-27  Vladimir Makarov  <vmakarov@redhat.com>
45232
45233         PR target/59222
45234         * lra.c (lra_emit_add): Check SUBREG too.
45235
45236 2014-02-27  Andreas Schwab  <schwab@suse.de>
45237
45238         * config/m68k/m68k.c (m68k_option_override): Disable
45239         -flive-range-shrinkage for classic m68k.
45240         (m68k_override_options_after_change): Likewise.
45241
45242 2014-02-27  Marek Polacek  <polacek@redhat.com>
45243
45244         PR middle-end/59223
45245         * tree-ssa-uninit.c (gate_warn_uninitialized): Run the pass even for
45246         -Wmaybe-uninitialized.
45247
45248 2014-02-27  Alan Modra  <amodra@gmail.com>
45249
45250         PR target/57936
45251         * reload1.c (emit_input_reload_insns): When reload_override_in,
45252         set old to rl->in_reg when rl->in_reg is a subreg.
45253
45254 2014-02-26  Richard Biener  <rguenther@suse.de>
45255
45256         PR bootstrap/60343
45257         * lra-assigns.c (spill_for): Avoid mixed-sign comparison.
45258
45259 2014-02-25  Ilya Tocar  <ilya.tocar@intel.com>
45260
45261         * common/config/i386/predicates.md (const1256_operand): Remove.
45262         (const2356_operand): New.
45263         (const_1_to_2_operand): Remove.
45264         * config/i386/sse.md (avx512pf_gatherpf<mode>sf): Change hint value.
45265         (*avx512pf_gatherpf<mode>sf_mask): Ditto.
45266         (*avx512pf_gatherpf<mode>sf): Ditto.
45267         (avx512pf_gatherpf<mode>df): Ditto.
45268         (*avx512pf_gatherpf<mode>df_mask): Ditto.
45269         (*avx512pf_gatherpf<mode>df): Ditto.
45270         (avx512pf_scatterpf<mode>sf): Ditto.
45271         (*avx512pf_scatterpf<mode>sf_mask): Ditto.
45272         (*avx512pf_scatterpf<mode>sf): Ditto.
45273         (avx512pf_scatterpf<mode>df): Ditto.
45274         (*avx512pf_scatterpf<mode>df_mask): Ditto.
45275         (*avx512pf_scatterpf<mode>df): Ditto.
45276         * common/config/i386/xmmintrin.h (_mm_hint): Add _MM_HINT_ET0.
45277
45278 2014-02-26  Ilya Tocar  <ilya.tocar@intel.com>
45279
45280         * config/i386/avx512fintrin.h (_mm512_testn_epi32_mask),
45281         (_mm512_mask_testn_epi32_mask), (_mm512_testn_epi64_mask),
45282         (_mm512_mask_testn_epi64_mask): Move to ...
45283         * config/i386/avx512cdintrin.h: Here.
45284         * config/i386/i386.c (bdesc_args): Change MASK_ISA for testnm.
45285         * config/i386/sse.md (avx512f_vmscalef<mode><round_name>): Remove %.
45286         (avx512f_scalef<mode><mask_name><round_name>): Ditto.
45287         (avx512f_testnm<mode>3<mask_scalar_merge_name>): Change conditon to
45288         TARGET_AVX512F from TARGET_AVX512CD.
45289
45290 2014-02-26  Richard Biener  <rguenther@suse.de>
45291
45292         PR ipa/60327
45293         * ipa.c (walk_polymorphic_call_targets): Properly guard
45294         call to inline_update_overall_summary.
45295
45296 2014-02-26  Bin Cheng  <bin.cheng@arm.com>
45297
45298         PR target/60280
45299         * tree-cfgcleanup.c (tree_forwarder_block_p): Protect loop preheaders
45300         and latches only if requested.  Fix latch if it is removed.
45301         * tree-ssa-dom.c (tree_ssa_dominator_optimize): Set
45302         LOOPS_HAVE_PREHEADERS.
45303
45304 2014-02-25  Andrew Pinski  <apinski@cavium.com>
45305
45306         * builtins.c (expand_builtin_thread_pointer): Create a new target
45307         when the target is NULL.
45308
45309 2014-02-25  Vladimir Makarov  <vmakarov@redhat.com>
45310
45311         PR rtl-optimization/60317
45312         * params.def (PARAM_LRA_MAX_CONSIDERED_RELOAD_PSEUDOS): New.
45313         * params.h (LRA_MAX_CONSIDERED_RELOAD_PSEUDOS): New.
45314         * lra-assigns.c: Include params.h.
45315         (spill_for): Use LRA_MAX_CONSIDERED_RELOAD_PSEUDOS as guard for
45316         other reload pseudos considerations.
45317
45318 2014-02-25  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45319
45320         * config/rs6000/vector.md (*vector_unordered<mode>): Change split
45321         to use canonical form for nor<mode>3.
45322
45323 2014-02-25  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
45324
45325         PR target/55426
45326         * config/arm/arm.h (CANNOT_CHANGE_MODE_CLASS): Allow 128 to 64-bit
45327         conversions.
45328
45329 2014-02-25  Ilya Tocar  <ilya.tocar@intel.com>
45330
45331         * common/config/i386/i386-common.c (OPTION_MASK_ISA_PREFETCHWT1_SET),
45332         (OPTION_MASK_ISA_PREFETCHWT1_UNSET): New.
45333         (ix86_handle_option): Handle OPT_mprefetchwt1.
45334         * config/i386/cpuid.h (bit_PREFETCHWT1): New.
45335         * config/i386/driver-i386.c (host_detect_local_cpu): Detect
45336         PREFETCHWT1 CPUID.
45337         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
45338         OPTION_MASK_ISA_PREFETCHWT1.
45339         * config/i386/i386.c (ix86_target_string): Handle mprefetchwt1.
45340         (PTA_PREFETCHWT1): New.
45341         (ix86_option_override_internal): Handle PTA_PREFETCHWT1.
45342         (ix86_valid_target_attribute_inner_p): Handle OPT_mprefetchwt1.
45343         * config/i386/i386.h (TARGET_PREFETCHWT1, TARGET_PREFETCHWT1_P): New.
45344         * config/i386/i386.md (prefetch): Check TARGET_PREFETCHWT1
45345         (*prefetch_avx512pf_<mode>_: Change into ...
45346         (*prefetch_prefetchwt1_<mode>: This.
45347         * config/i386/i386.opt (mprefetchwt1): New.
45348         * config/i386/xmmintrin.h (_mm_hint): Add _MM_HINT_ET1.
45349         (_mm_prefetch): Handle intent to write.
45350         * doc/invoke.texi (mprefetchwt1), (mno-prefetchwt1): Doccument.
45351
45352 2014-02-25  Richard Biener  <rguenther@suse.de>
45353
45354         PR middle-end/60291
45355         * emit-rtl.c (mem_attrs_htab): Remove.
45356         (mem_attrs_htab_hash): Likewise.
45357         (mem_attrs_htab_eq): Likewise.
45358         (set_mem_attrs): Always allocate new mem-attrs when something changed.
45359         (init_emit_once): Do not allocate mem_attrs_htab.
45360
45361 2014-02-25  Richard Biener  <rguenther@suse.de>
45362
45363         PR lto/60319
45364         * lto-opts.c (lto_write_options): Output non-explicit conservative
45365         -fwrapv, -fno-trapv and -fno-strict-overflow.
45366         * lto-wrapper.c (merge_and_complain): Handle merging those options.
45367         (run_gcc): And pass them through.
45368
45369 2014-02-25  Andrey Belevantsev  <abel@ispras.ru>
45370
45371         * sel-sched.c (calculate_new_fences): New parameter ptime.
45372         Calculate it as a maximum over all fence cycles.
45373         (sel_sched_region_2): Adjust the call to calculate_new_fences.
45374         Print the final schedule timing when sched_verbose.
45375
45376 2014-02-25  Andrey Belevantsev  <abel@ispras.ru>
45377
45378         PR rtl-optimization/60292
45379         * sel-sched.c (fill_vec_av_set): Do not reset target availability
45380         bit fot the fence instruction.
45381
45382 2014-02-24  Alangi Derick  <alangiderick@gmail.com>
45383
45384         * calls.h: Fix typo in comment.
45385
45386 2014-02-24  John David Anglin  <danglin@gcc.gnu.org>
45387
45388         * config/pa/pa.c (pa_output_move_double): Don't valididate when
45389         adjusting offsetable addresses.
45390
45391 2014-02-24  Guozhi Wei  <carrot@google.com>
45392
45393         * sparseset.h (sparseset_pop): Fix the wrong index.
45394
45395 2014-02-24  Walter Lee  <walt@tilera.com>
45396
45397         * config.gcc (tilepro-*-*): Change to tilepro*-*-*.
45398         (tilegx-*-linux*): Change to tilegx*-*-linux*; Support tilegxbe
45399         triplet.
45400         * common/config/tilegx/tilegx-common.c
45401         (TARGET_DEFAULT_TARGET_FLAGS): Define.
45402         * config/tilegx/linux.h (ASM_SPEC): Add endian_spec.
45403         (LINK_SPEC): Ditto.
45404         * config/tilegx/sync.md (atomic_test_and_set): Handle big endian.
45405         * config/tilegx/tilegx.c (tilegx_return_in_msb): New.
45406         (tilegx_gimplify_va_arg_expr): Handle big endian.
45407         (tilegx_expand_unaligned_load): Ditto.
45408         (tilegx_expand_unaligned_store): Ditto.
45409         (TARGET_RETURN_IN_MSB): New.
45410         * config/tilegx/tilegx.h (TARGET_DEFAULT): New.
45411         (TARGET_ENDIAN_DEFAULT): New.
45412         (TARGET_BIG_ENDIAN): Handle big endian.
45413         (BYTES_BIG_ENDIAN): Ditto.
45414         (WORDS_BIG_ENDIAN): Ditto.
45415         (FLOAT_WORDS_BIG_ENDIAN): Ditto.
45416         (ENDIAN_SPEC): New.
45417         (EXTRA_SPECS): New.
45418         * config/tilegx/tilegx.md (extv): Handle big endian.
45419         (extzv): Ditto.
45420         (insn_st<n>): Ditto.
45421         (insn_st<n>_add<bitsuffix>): Ditto.
45422         (insn_stnt<n>): Ditto.
45423         (insn_stnt<n>_add<bitsuffix>):Ditto.
45424         (vec_interleave_highv8qi): Handle big endian.
45425         (vec_interleave_highv8qi_be): New.
45426         (vec_interleave_highv8qi_le): New.
45427         (insn_v1int_h): Handle big endian.
45428         (vec_interleave_lowv8qi): Handle big endian.
45429         (vec_interleave_lowv8qi_be): New.
45430         (vec_interleave_lowv8qi_le): New.
45431         (insn_v1int_l): Handle big endian.
45432         (vec_interleave_highv4hi): Handle big endian.
45433         (vec_interleave_highv4hi_be): New.
45434         (vec_interleave_highv4hi_le): New.
45435         (insn_v2int_h): Handle big endian.
45436         (vec_interleave_lowv4hi): Handle big endian.
45437         (vec_interleave_lowv4hi_be): New.
45438         (vec_interleave_lowv4hi_le): New.
45439         (insn_v2int_l): Handle big endian.
45440         (vec_interleave_highv2si): Handle big endian.
45441         (vec_interleave_highv2si_be): New.
45442         (vec_interleave_highv2si_le): New.
45443         (insn_v4int_h): Handle big endian.
45444         (vec_interleave_lowv2si): Handle big endian.
45445         (vec_interleave_lowv2si_be): New.
45446         (vec_interleave_lowv2si_le): New.
45447         (insn_v4int_l): Handle big endian.
45448         * config/tilegx/tilegx.opt (mbig-endian): New option.
45449         (mlittle-endian): New option.
45450         * doc/install.texi: Document tilegxbe-linux.
45451         * doc/invoke.texi: Document -mbig-endian and -mlittle-endian.
45452
45453 2014-02-24  Martin Jambor  <mjambor@suse.cz>
45454
45455         PR ipa/60266
45456         * ipa-cp.c (propagate_constants_accross_call): Bail out early if
45457         there are no parameter descriptors.
45458
45459 2014-02-24  Andrey Belevantsev  <abel@ispras.ru>
45460
45461         PR rtl-optimization/60268
45462         * sched-rgn.c (haifa_find_rgns): Move the nr_regions_initial variable
45463         initialization to ...
45464         (sched_rgn_init): ... here.
45465         (schedule_region): Check for SCHED_PRESSURE_NONE earlier.
45466
45467 2014-02-23  David Holsgrove  <david.holsgrove@xilinx.com>
45468
45469         * config/microblaze/microblaze.md: Correct ashrsi_reg / lshrsi_reg
45470         names.
45471
45472 2014-02-23  Edgar E. Iglesias  <edgar.iglesias@xilinx.com>
45473
45474         * config/microblaze/microblaze.h: Remove SECONDARY_MEMORY_NEEDED
45475         definition.
45476
45477 2014-02-23  David Holsgrove  <david.holsgrove@xilinx.com>
45478
45479         * /config/microblaze/microblaze.c: Add microblaze_asm_output_mi_thunk,
45480         define TARGET_ASM_OUTPUT_MI_THUNK and TARGET_ASM_CAN_OUTPUT_MI_THUNK.
45481
45482 2014-02-23  David Holsgrove  <david.holsgrove@xilinx.com>
45483
45484         * config/microblaze/predicates.md: Add cmp_op predicate.
45485         * config/microblaze/microblaze.md: Add branch_compare instruction
45486         which uses cmp_op predicate and emits cmp insn before branch.
45487         * config/microblaze/microblaze.c (microblaze_emit_compare): Rename
45488         to microblaze_expand_conditional_branch and consolidate logic.
45489         (microblaze_expand_conditional_branch): emit branch_compare
45490         insn instead of handling cmp op separate from branch insn.
45491
45492 2014-02-23  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45493
45494         * config/rs6000/rs6000.c (rs6000_emit_le_vsx_move): Relax assert
45495         to permit subregs.
45496
45497 2014-02-23  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45498
45499         * config/rs6000/altivec.md (altivec_lve<VI_char>x): Replace
45500         define_insn with define_expand and new define_insn
45501         *altivec_lve<VI_char>x_internal.
45502         (altivec_stve<VI_char>x): Replace define_insn with define_expand
45503         and new define_insn *altivec_stve<VI_char>x_internal.
45504         * config/rs6000/rs6000-protos.h (altivec_expand_stvex_be): New
45505         prototype.
45506         * config/rs6000/rs6000.c (altivec_expand_lvx_be): Document use by
45507         lve*x built-ins.
45508         (altivec_expand_stvex_be): New function.
45509
45510 2014-02-22  Joern Rennecke  <joern.rennecke@embecosm.com>
45511
45512         * config/avr/avr.c (avr_can_eliminate): Allow elimination from
45513         ARG_POINTER_REGNUM to STACK_POINTER_REGNUM if !frame_pointer_needed.
45514         * config/avr/avr.c (ELIMINABLE_REGS): Add elimination from
45515         ARG_POINTER_REGNUM to STACK_POINTER_REGNUM.
45516
45517 2014-02-21  Vladimir Makarov  <vmakarov@redhat.com>
45518
45519         PR target/60298
45520         * lra-constraints.c (inherit_reload_reg): Use lra_emit_move
45521         instead of emit_move_insn.
45522
45523 2014-02-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45524
45525         * config/rs6000/altivec.md (altivec_vsumsws): Replace second
45526         vspltw with vsldoi.
45527         (reduc_uplus_v16qi): Use gen_altivec_vsumsws_direct instead of
45528         gen_altivec_vsumsws.
45529
45530 2014-02-21  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45531
45532         * config/rs6000/altivec.md (altivec_lvxl): Rename as
45533         *altivec_lvxl_<mode>_internal and use VM2 iterator instead of V4SI.
45534         (altivec_lvxl_<mode>): New define_expand incorporating
45535         -maltivec=be semantics where needed.
45536         (altivec_lvx): Rename as *altivec_lvx_<mode>_internal.
45537         (altivec_lvx_<mode>): New define_expand incorporating -maltivec=be
45538         semantics where needed.
45539         (altivec_stvx): Rename as *altivec_stvx_<mode>_internal.
45540         (altivec_stvx_<mode>): New define_expand incorporating
45541         -maltivec=be semantics where needed.
45542         (altivec_stvxl): Rename as *altivec_stvxl_<mode>_internal and use
45543         VM2 iterator instead of V4SI.
45544         (altivec_stvxl_<mode>): New define_expand incorporating
45545         -maltivec=be semantics where needed.
45546         * config/rs6000/rs6000-builtin.def: Add new built-in definitions
45547         LVXL_V2DF, LVXL_V2DI, LVXL_V4SF, LVXL_V4SI, LVXL_V8HI, LVXL_V16QI,
45548         LVX_V2DF, LVX_V2DI, LVX_V4SF, LVX_V4SI, LVX_V8HI, LVX_V16QI, STVX_V2DF,
45549         STVX_V2DI, STVX_V4SF, STVX_V4SI, STVX_V8HI, STVX_V16QI, STVXL_V2DF,
45550         STVXL_V2DI, STVXL_V4SF, STVXL_V4SI, STVXL_V8HI, STVXL_V16QI.
45551         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Replace
45552         ALTIVEC_BUILTIN_LVX with ALTIVEC_BUILTIN_LVX_<MODE> throughout;
45553         similarly for ALTIVEC_BUILTIN_LVXL, ALTIVEC_BUILTIN_STVX, and
45554         ALTIVEC_BUILTIN_STVXL.
45555         * config/rs6000/rs6000-protos.h (altivec_expand_lvx_be): New prototype.
45556         (altivec_expand_stvx_be): Likewise.
45557         * config/rs6000/rs6000.c (swap_selector_for_mode): New function.
45558         (altivec_expand_lvx_be): Likewise.
45559         (altivec_expand_stvx_be): Likewise.
45560         (altivec_expand_builtin): Add cases for
45561         ALTIVEC_BUILTIN_STVX_<MODE>, ALTIVEC_BUILTIN_STVXL_<MODE>,
45562         ALTIVEC_BUILTIN_LVXL_<MODE>, and ALTIVEC_BUILTIN_LVX_<MODE>.
45563         (altivec_init_builtins): Add definitions for
45564         __builtin_altivec_lvxl_<mode>, __builtin_altivec_lvx_<mode>,
45565         __builtin_altivec_stvx_<mode>, and __builtin_altivec_stvxl_<mode>.
45566
45567 2014-02-21  Catherine Moore  <clm@codesourcery.com>
45568
45569         * doc/invoke.texi (mvirt, mno-virt): Document.
45570         * config/mips/mips.opt (mvirt): New option.
45571         * config/mips/mips.h (ASM_SPEC): Pass mvirt to the assembler.
45572
45573 2014-02-21  Richard Biener  <rguenther@suse.de>
45574
45575         PR tree-optimization/60276
45576         * tree-vectorizer.h (struct _stmt_vec_info): Add min_neg_dist field.
45577         (STMT_VINFO_MIN_NEG_DIST): New macro.
45578         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence): Record
45579         STMT_VINFO_MIN_NEG_DIST.
45580         * tree-vect-stmts.c (vectorizable_load): Verify if assumptions
45581         made for negative dependence distances still hold.
45582
45583 2014-02-21  Richard Biener  <rguenther@suse.de>
45584
45585         PR middle-end/60291
45586         * tree-ssa-live.c (mark_all_vars_used_1): Do not walk
45587         DECL_INITIAL for globals not in the current function context.
45588
45589 2014-02-21  Jakub Jelinek  <jakub@redhat.com>
45590
45591         PR tree-optimization/56490
45592         * params.def (PARAM_UNINIT_CONTROL_DEP_ATTEMPTS): New param.
45593         * tree-ssa-uninit.c: Include params.h.
45594         (compute_control_dep_chain): Add num_calls argument, return false
45595         if it exceed PARAM_UNINIT_CONTROL_DEP_ATTEMPTS param, pass
45596         num_calls to recursive call.
45597         (find_predicates): Change dep_chain into normal array,
45598         cur_chain into auto_vec<edge, MAX_CHAIN_LEN + 1>, add num_calls
45599         variable and adjust compute_control_dep_chain caller.
45600         (find_def_preds): Likewise.
45601
45602 2014-02-21  Thomas Schwinge  <thomas@codesourcery.com>
45603
45604         * gimple-pretty-print.c (dump_gimple_omp_for) [flags & TDF_RAW]
45605         <case GF_OMP_FOR_KIND_CILKSIMD>: Add missing break statement.
45606
45607 2014-02-21  Nick Clifton  <nickc@redhat.com>
45608
45609         * config/stormy16/stormy16.md (pushdqi1): Add mode to post_inc.
45610         (pushhi1): Likewise.
45611         (popqi1): Add mode to pre_dec.
45612         (pophi1): Likewise.
45613
45614 2014-02-21  Jakub Jelinek  <jakub@redhat.com>
45615
45616         * config/i386/i386.c (ix86_expand_vec_perm): Use V8SImode
45617         mode for mask of V8SFmode permutation.
45618
45619 2014-02-20  Richard Henderson  <rth@redhat.com>
45620
45621         PR c++/60272
45622         * builtins.c (expand_builtin_atomic_compare_exchange): Always make
45623         a new pseudo for OLDVAL.
45624
45625 2014-02-20  Jakub Jelinek  <jakub@redhat.com>
45626
45627         PR target/57896
45628         * config/i386/i386.c (expand_vec_perm_interleave2): Don't call
45629         gen_reg_rtx if d->testing_p.
45630         (expand_vec_perm_pshufb2, expand_vec_perm_broadcast_1): Return early
45631         if d->testing_p and we will certainly return true.
45632         (expand_vec_perm_even_odd_1): Likewise.  Don't call gen_reg_rtx
45633         if d->testing_p.
45634
45635 2014-02-20  Uros Bizjak  <ubizjak@gmail.com>
45636
45637         * emit-rtl.c (gen_reg_rtx): Assert that
45638         crtl->emit.regno_pointer_align_length is non-zero.
45639
45640 2014-02-20  Richard Henderson  <rth@redhat.com>
45641
45642         PR c++/60272
45643         * builtins.c (expand_builtin_atomic_compare_exchange): Conditionalize
45644         on failure the store back into EXPECT.
45645
45646 2014-02-20  Chung-Lin Tang  <cltang@codesourcery.com>
45647             Sandra Loosemore  <sandra@codesourcery.com>
45648
45649         * config/nios2/nios2.md (unspec): Add UNSPEC_PIC_GOTOFF_SYM enum.
45650         * config/nios2/nios2.c (nios2_function_profiler): Add
45651         -fPIC (flag_pic == 2) support.
45652         (nios2_handle_custom_fpu_cfg): Fix warning parameter.
45653         (nios2_large_offset_p): New function.
45654         (nios2_unspec_reloc_p): Move up position, update to use
45655         nios2_large_offset_p.
45656         (nios2_unspec_address): Remove function.
45657         (nios2_unspec_offset): New function.
45658         (nios2_large_got_address): New function.
45659         (nios2_got_address): Add large offset support.
45660         (nios2_legitimize_tls_address): Update usage of removed and new
45661         functions.
45662         (nios2_symbol_binds_local_p): New function.
45663         (nios2_load_pic_address): Add -fPIC (flag_pic == 2) support.
45664         (nios2_legitimize_address): Update to use nios2_large_offset_p.
45665         (nios2_emit_move_sequence): Avoid legitimizing (const (unspec ...)).
45666         (nios2_print_operand): Merge H/L processing, add hiadj/lo
45667         processing for (const (unspec ...)).
45668         (nios2_unspec_reloc_name): Add UNSPEC_PIC_GOTOFF_SYM case.
45669
45670 2014-02-20  Richard Biener  <rguenther@suse.de>
45671
45672         * tree-cfg.c (replace_uses_by): Mark altered BBs before
45673         doing the substitution.
45674         (verify_gimple_assign_single): Also verify bare MEM_REFs on the lhs.
45675
45676 2014-02-20  Martin Jambor  <mjambor@suse.cz>
45677
45678         PR ipa/55260
45679         * ipa-cp.c (cgraph_edge_brings_all_agg_vals_for_node): Uce correct
45680         info when checking whether lattices are bottom.
45681
45682 2014-02-20  Richard Biener  <rguenther@suse.de>
45683
45684         PR middle-end/60221
45685         * tree-eh.c (execute_cleanup_eh_1): Also cleanup empty EH
45686         regions at -O0.
45687
45688 2014-02-20  Jan Hubicka  <hubicka@ucw.cz>
45689
45690         PR ipa/58555
45691         * ipa-inline-transform.c (clone_inlined_nodes): Add freq_scale
45692         parameter specifying the scaling.
45693         (inline_call): Update.
45694         (want_inline_recursively): Guard division by zero.
45695         (recursive_inlining): Update.
45696         * ipa-inline.h (clone_inlined_nodes): Update.
45697
45698 2014-02-20  Ilya Tocar  <ilya.tocar@intel.com>
45699
45700         PR target/60204
45701         * config/i386/i386.c (classify_argument): Pass structures of size
45702         64 bytes or less in register.
45703
45704 2014-02-20  Ilya Tocar  <ilya.tocar@intel.com>
45705             Kirill Yukhin  <kirill.yukhin@intel.com>
45706
45707         * config/i386/avx512erintrin.h (_mm_rcp28_round_sd): Swap operands.
45708         (_mm_rcp28_round_ss): Ditto.
45709         (_mm_rsqrt28_round_sd): Ditto.
45710         (_mm_rsqrt28_round_ss): Ditto.
45711         * config/i386/avx512erintrin.h (_mm_rcp14_round_sd): Ditto.
45712         (_mm_rcp14_round_ss): Ditto.
45713         (_mm_rsqrt14_round_sd): Ditto.
45714         (_mm_rsqrt14_round_ss): Ditto.
45715         * config/i386/sse.md (rsqrt14<mode>): Put nonimmediate operand as
45716         the first input operand, get rid of match_dup.
45717         (avx512er_exp2<mode><mask_name><round_saeonly_name>): Set type
45718         attribute to sse.
45719         (<mask_codefor>avx512er_rcp28<mode><mask_name><round_saeonly_name>):
45720         Ditto.
45721         (avx512er_vmrcp28<mode><round_saeonly_name>): Put nonimmediate
45722         operand as the first input operand, set type attribute.
45723         (<mask_codefor>avx512er_rsqrt28<mode><mask_name><round_saeonly_name>):
45724         Set type attribute.
45725         (avx512er_vmrsqrt28<mode><round_saeonly_name>): Put nonimmediate
45726         operand as the first input operand, set type attribute.
45727
45728 2014-02-19  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45729
45730         * config/rs6000/rs6000.c (vspltis_constant): Fix most significant
45731         bit of zero.
45732
45733 2014-02-19  H.J. Lu  <hongjiu.lu@intel.com>
45734
45735         PR target/60207
45736         * config/i386/i386.c (construct_container): Remove TFmode check
45737         for X86_64_INTEGER_CLASS.
45738
45739 2014-02-19  Uros Bizjak  <ubizjak@gmail.com>
45740
45741         PR target/59794
45742         * config/i386/i386.c (type_natural_mode): Warn for ABI changes
45743         only when -Wpsabi is enabled.
45744
45745 2014-02-19  Michael Hudson-Doyle  <michael.hudson@linaro.org>
45746
45747         PR target/59799
45748         * config/aarch64/aarch64.c (aarch64_pass_by_reference): The rules for
45749         passing arrays in registers are the same as for structs, so remove the
45750         special case for them.
45751
45752 2014-02-19  Eric Botcazou  <ebotcazou@adacore.com>
45753
45754         * expr.c (expand_expr_real_1) <case VIEW_CONVERT_EXPR>: For a bit-field
45755         destination type, extract only the valid bits if the source type is not
45756         integral and has a different mode.
45757
45758 2014-02-19  Richard Biener  <rguenther@suse.de>
45759
45760         PR ipa/60243
45761         * tree-inline.c (estimate_num_insns): Avoid calling cgraph_get_node
45762         for all calls.
45763
45764 2014-02-19  Richard Biener  <rguenther@suse.de>
45765
45766         PR ipa/60243
45767         * ipa-prop.c: Include stringpool.h and tree-ssanames.h.
45768         (ipa_modify_call_arguments): Emit an argument load explicitely and
45769         preserve virtual SSA form there and for the replacement call.
45770         Do not update SSA form nor free dominance info.
45771
45772 2014-02-18  Jan Hubicka  <hubicka@ucw.cz>
45773
45774         * ipa.c (function_and_variable_visibility): Also clear WEAK
45775         flag when disolving COMDAT_GROUP.
45776
45777 2014-02-18  Jan Hubicka  <hubicka@ucw.cz>
45778
45779         * ipa-prop.h (ipa_ancestor_jf_data): Update ocmment.
45780         * ipa-prop.c (ipa_set_jf_known_type): Return early when
45781         not devirtualizing.
45782         (ipa_set_ancestor_jf): Set type to NULL hwen it is not preserved;
45783         do more sanity checks.
45784         (detect_type_change): Return true when giving up early.
45785         (compute_complex_assign_jump_func): Fix type parameter of
45786         ipa_set_ancestor_jf.
45787         (compute_complex_ancestor_jump_func): Likewise.
45788         (update_jump_functions_after_inlining): Fix updating of
45789         ancestor function.
45790         * ipa-cp.c (ipa_get_jf_ancestor_result): Be ready for type to be NULL.
45791
45792 2014-02-18  Jan Hubicka  <hubicka@ucw.cz>
45793
45794         * cgraph.c (cgraph_update_edges_for_call_stmt_node): Also remove
45795         inline clones when edge disappears.
45796
45797 2014-02-18  Michael Meissner  <meissner@linux.vnet.ibm.com>
45798
45799         PR target/60203
45800         * config/rs6000/rs6000.md (mov<mode>_64bit, TF/TDmode moves):
45801         Split 64-bit moves into 2 patterns.  Do not allow the use of
45802         direct move for TDmode in little endian, since the decimal value
45803         has little endian bytes within a word, but the 64-bit pieces are
45804         ordered in a big endian fashion, and normal subreg's of TDmode are
45805         not allowed.
45806         (mov<mode>_64bit_dm): Likewise.
45807         (movtd_64bit_nodm): Likewise.
45808
45809 2014-02-18  Eric Botcazou  <ebotcazou@adacore.com>
45810
45811         PR tree-optimization/60174
45812         * tree-ssa-reassoc.c (init_range_entry): Do not look into the defining
45813         statement of an SSA_NAME that occurs in an abnormal PHI node.
45814
45815 2014-02-18  Jakub Jelinek  <jakub@redhat.com>
45816
45817         PR sanitizer/60142
45818         * final.c (SEEN_BB): Remove.
45819         (SEEN_NOTE, SEEN_EMITTED): Renumber.
45820         (final_scan_insn): Don't force_source_line on second
45821         NOTE_INSN_BASIC_BLOCK.
45822
45823 2014-02-18  Uros Bizjak  <ubizjak@gmail.com>
45824
45825         PR target/60205
45826         * config/i386/i386.h (struct ix86_args): Add warn_avx512f.
45827         * config/i386/i386.c (init_cumulative_args): Initialize warn_avx512f.
45828         (type_natural_mode): Warn ABI change when %zmm register is not
45829         available for AVX512F vector value passing.
45830
45831 2014-02-18  Kai Tietz  <ktietz@redhat.com>
45832
45833         PR target/60193
45834         * config/i386/i386.c (ix86_expand_prologue): Use value in
45835         rax register as displacement when restoring %r10 or %rax.
45836         Fix wrong offset when restoring both registers.
45837
45838 2014-02-18  Eric Botcazou  <ebotcazou@adacore.com>
45839
45840         * ipa-prop.c (compute_complex_ancestor_jump_func): Replace overzealous
45841         assertion with conditional return.
45842
45843 2014-02-18  Jakub Jelinek  <jakub@redhat.com>
45844             Uros Bizjak  <ubizjak@gmail.com>
45845
45846         PR driver/60233
45847         * config/i386/driver-i386.c (host_detect_local_cpu): If
45848         YMM state is not saved by the OS, also clear has_f16c.  Move
45849         CPUID 0x80000001 handling before YMM state saving checking.
45850
45851 2014-02-18  Andrey Belevantsev  <abel@ispras.ru>
45852
45853         PR rtl-optimization/58960
45854         * haifa-sched.c (alloc_global_sched_pressure_data): New,
45855         factored out from ...
45856         (sched_init): ... here.
45857         (free_global_sched_pressure_data): New, factored out from ...
45858         (sched_finish): ... here.
45859         * sched-int.h (free_global_sched_pressure_data): Declare.
45860         * sched-rgn.c (nr_regions_initial): New static global.
45861         (haifa_find_rgns): Initialize it.
45862         (schedule_region): Disable sched-pressure for the newly
45863         generated regions.
45864
45865 2014-02-17  Richard Biener  <rguenther@suse.de>
45866
45867         * tree-vect-stmts.c (free_stmt_vec_info): Clear BB and
45868         release SSA defs of pattern stmts.
45869
45870 2014-02-17  Richard Biener  <rguenther@suse.de>
45871
45872         * tree-inline.c (expand_call_inline): Release the virtual
45873         operand defined by the call we are about to inline.
45874
45875 2014-02-17  Richard Biener  <rguenther@suse.de>
45876
45877         * tree-ssa.c (verify_ssa): If verify_def found an error, ICE.
45878
45879 2014-02-17  Kirill Yukhin  <kirill.yukhin@intel.com>
45880             Ilya Tocar  <ilya.tocar@intel.com>
45881
45882         * config/i386/avx512fintrin.h (_mm512_maskz_permutexvar_epi64): Swap
45883         arguments order in builtin.
45884         (_mm512_permutexvar_epi64): Ditto.
45885         (_mm512_mask_permutexvar_epi64): Ditto
45886         (_mm512_maskz_permutexvar_epi32): Ditto
45887         (_mm512_permutexvar_epi32): Ditto
45888         (_mm512_mask_permutexvar_epi32): Ditto
45889
45890 2014-02-16  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45891
45892         * config/rs6000/altivec.md (p8_vmrgew): Handle little endian targets.
45893         (p8_vmrgow): Likewise.
45894
45895 2014-02-16  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
45896
45897         * config/rs6000/vsx.md (vsx_xxpermdi_<mode>): Handle little
45898         endian targets.
45899
45900 2014-02-15  Michael Meissner  <meissner@linux.vnet.ibm.com>
45901
45902         PR target/60203
45903         * config/rs6000/rs6000.md (rreg): Add TFmode, TDmode constraints.
45904         (mov<mode>_internal, TFmode/TDmode): Split TFmode/TDmode moves
45905         into 64-bit and 32-bit moves.  On 64-bit moves, add support for
45906         using direct move instructions on ISA 2.07.  Also adjust
45907         instruction length for 64-bit.
45908         (mov<mode>_64bit, TFmode/TDmode): Likewise.
45909         (mov<mode>_32bit, TFmode/TDmode): Likewise.
45910
45911 2014-02-15  Alan Modra  <amodra@gmail.com>
45912
45913         PR target/58675
45914         PR target/57935
45915         * config/rs6000/rs6000.c (rs6000_secondary_reload_inner): Use
45916         find_replacement on parts of insn rtl that might be reloaded.
45917
45918 2014-02-15  Richard Biener  <rguenther@suse.de>
45919
45920         PR tree-optimization/60183
45921         * tree-ssa-phiprop.c (propagate_with_phi): Avoid speculating loads.
45922         (tree_ssa_phiprop): Calculate and free post-dominators.
45923
45924 2014-02-14  Jeff Law  <law@redhat.com>
45925
45926         PR rtl-optimization/60131
45927         * ree.c (get_extended_src_reg): New function.
45928         (combine_reaching_defs): Use it rather than assuming location of REG.
45929         (find_and_remove_re): Verify first operand of extension is
45930         a REG before adding the insns to the copy list.
45931
45932 2014-02-14  Roland McGrath  <mcgrathr@google.com>
45933
45934         * configure.ac (HAVE_AS_IX86_UD2): New test for 'ud2' mnemonic.
45935         * configure: Regenerated.
45936         * config.in: Regenerated.
45937         * config/i386/i386.md (trap) [HAVE_AS_IX86_UD2]: Use the mnemonic
45938         instead of ASM_SHORT.
45939
45940 2014-02-14  Vladimir Makarov  <vmakarov@redhat.com>
45941             Richard Earnshaw  <rearnsha@arm.com>
45942
45943         PR rtl-optimization/59535
45944         * lra-constraints.c (process_alt_operands): Encourage alternative
45945         when unassigned pseudo class is superset of the alternative class.
45946         (inherit_reload_reg): Don't inherit when optimizing for code size.
45947         * config/arm/arm.h (MODE_BASE_REG_CLASS): Add version for LRA
45948         returning CORE_REGS for anything but Thumb1 and BASE_REGS for
45949         modes not less than 4 for Thumb1.
45950
45951 2014-02-14  Kyle McMartin  <kyle@redhat.com>
45952
45953         PR pch/60010
45954         * config/host-linux.c (TRY_EMPTY_VM_SPACE): Define for AArch64.
45955
45956 2014-02-14  Richard Biener  <rguenther@suse.de>
45957
45958         * cilk-common.c (cilk_arrow): Build a MEM_REF, not an INDIRECT_REF.
45959         (get_frame_arg): Drop the assert with langhook types_compatible_p.
45960         Do not strip INDIRECT_REFs.
45961
45962 2014-02-14  Richard Biener  <rguenther@suse.de>
45963
45964         PR lto/60179
45965         * lto-streamer-out.c (DFS_write_tree_body): Do not follow
45966         DECL_FUNCTION_SPECIFIC_TARGET.
45967         (hash_tree): Do not hash DECL_FUNCTION_SPECIFIC_TARGET.
45968         * tree-streamer-out.c (pack_ts_target_option): Remove.
45969         (streamer_pack_tree_bitfields): Do not stream TS_TARGET_OPTION.
45970         (write_ts_function_decl_tree_pointers): Do not stream
45971         DECL_FUNCTION_SPECIFIC_TARGET.
45972         * tree-streamer-in.c (unpack_ts_target_option): Remove.
45973         (unpack_value_fields): Do not stream TS_TARGET_OPTION.
45974         (lto_input_ts_function_decl_tree_pointers): Do not stream
45975         DECL_FUNCTION_SPECIFIC_TARGET.
45976
45977 2014-02-14  Jakub Jelinek  <jakub@redhat.com>
45978
45979         * tree-vect-loop.c (vect_is_slp_reduction): Don't set use_stmt twice.
45980         (get_initial_def_for_induction, vectorizable_induction): Ignore
45981         debug stmts when looking for exit_phi.
45982         (vectorizable_live_operation): Fix up condition.
45983
45984 2014-02-14  Chung-Ju Wu  <jasonwucj@gmail.com>
45985
45986         * config/nds32/nds32.c (nds32_asm_function_prologue): Do not use
45987         nreverse() because it changes the content of original tree list.
45988
45989 2014-02-14  Chung-Ju Wu  <jasonwucj@gmail.com>
45990
45991         * config/nds32/t-mlibs (MULTILIB_OPTIONS): Fix typo in comment.
45992         * config/nds32/nds32.c (nds32_merge_decl_attributes): Likewise.
45993
45994 2014-02-14  Chung-Ju Wu  <jasonwucj@gmail.com>
45995
45996         * config/nds32/nds32.c (nds32_naked_function_p): Follow the
45997         GNU coding standards.
45998
45999 2014-02-13  Jakub Jelinek  <jakub@redhat.com>
46000
46001         PR debug/60152
46002         * dwarf2out.c (gen_subprogram_die): Don't call
46003         add_calling_convention_attribute if subr_die is old_die.
46004
46005 2014-02-13  Sharad Singhai  <singhai@google.com>
46006
46007         * doc/optinfo.texi: Fix order of nodes.
46008
46009 2014-02-13  Uros Bizjak  <ubizjak@gmail.com>
46010
46011         * config/i386/sse.md (xop_vmfrcz<mode>2): Generate const0 in
46012         operands[2], not operands[3].
46013
46014 2014-02-13  Richard Biener  <rguenther@suse.de>
46015
46016         PR bootstrap/59878
46017         * doc/install.texi (ISL): Update recommended version to 0.12.2,
46018         mention the possibility of an in-tree build.
46019         (CLooG): Update recommended version to 0.18.1, mention the
46020         possibility of an in-tree build and clarify that the ISL
46021         bundled with CLooG does not work.
46022
46023 2014-02-13  Jakub Jelinek  <jakub@redhat.com>
46024
46025         PR target/43546
46026         * expr.c (compress_float_constant): If x is a hard register,
46027         extend into a pseudo and then move to x.
46028
46029 2014-02-13  Dominik Vogt  <vogt@linux.vnet.ibm.com>
46030
46031         * config/s390/s390.c (s390_asm_output_function_label): Fix crash
46032         caused by bad second argument to warning_at() with -mhotpatch and
46033         nested functions (e.g. with gfortran).
46034
46035 2014-02-13  Richard Sandiford  <rdsandiford@googlemail.com>
46036
46037         * opts.c (option_name): Remove "enabled by default" rider.
46038
46039 2014-02-12  John David Anglin  <danglin@gcc.gnu.org>
46040
46041         * config/pa/pa.c (pa_option_override): Remove auto increment FIXME.
46042
46043 2014-02-12  H.J. Lu  <hongjiu.lu@intel.com>
46044             Uros Bizjak  <ubizjak@gmail.com>
46045
46046         PR target/60151
46047         * configure.ac (HAVE_AS_GOTOFF_IN_DATA): Pass --32 to GNU assembler.
46048         * configure: Regenerated.
46049
46050 2014-02-12  Richard Biener  <rguenther@suse.de>
46051
46052         * vec.c (vec_prefix::calculate_allocation): Move as
46053         inline variant to vec.h.
46054         (vec_prefix::calculate_allocation_1): New out-of-line version.
46055         * vec.h (vec_prefix::calculate_allocation_1): Declare.
46056         (vec_prefix::m_has_auto_buf): Rename to ...
46057         (vec_prefix::m_using_auto_storage): ... this.
46058         (vec_prefix::calculate_allocation): Inline the easy cases
46059         and dispatch to calculate_allocation_1 which doesn't need the
46060         prefix address.
46061         (va_heap::reserve): Use gcc_checking_assert.
46062         (vec<T, A, vl_embed>::embedded_init): Add argument to initialize
46063         m_using_auto_storage.
46064         (auto_vec): Change m_vecpfx member to a vec<T, va_heap, vl_embed>
46065         member and adjust.
46066         (vec<T, va_heap, vl_ptr>::reserve): Remove redundant check.
46067         (vec<T, va_heap, vl_ptr>::release): Avoid casting.
46068         (vec<T, va_heap, vl_ptr>::using_auto_storage): Simplify.
46069
46070 2014-02-12  Richard Biener  <rguenther@suse.de>
46071
46072         * gcse.c (compute_transp): break from loop over canon_modify_mem_list
46073         when we found a dependence.
46074
46075 2014-02-12  Thomas Schwinge  <thomas@codesourcery.com>
46076
46077         * gimplify.c (gimplify_call_expr, gimplify_modify_expr): Move
46078         common code...
46079         (maybe_fold_stmt): ... into this new function.
46080         * omp-low.c (lower_omp): Update comment.
46081
46082         * omp-low.c (lower_omp_target): Add clobber for sizes array, after
46083         last use.
46084
46085         * omp-low.c (diagnose_sb_0): Make sure label_ctx is valid to
46086         dereference.
46087
46088 2014-02-12  James Greenhalgh  <james.greenhalgh@arm.com>
46089
46090         * config/arm/aarch-cost-tables.h (generic_extra_costs): Fix
46091         identifiers in comments.
46092         (cortexa53_extra_costs): Likewise.
46093         * config/arm/arm.c (cortexa9_extra_costs): Fix identifiers in comments.
46094         (cortexa7_extra_costs): Likewise.
46095         (cortexa12_extra_costs): Likewise.
46096         (cortexa15_extra_costs): Likewise.
46097         (v7m_extra_costs): Likewise.
46098
46099 2014-02-12  Richard Biener  <rguenther@suse.de>
46100
46101         PR middle-end/60092
46102         * gimple-low.c (lower_builtin_posix_memalign): Lower conditional
46103         of posix_memalign being successful.
46104         (lower_stmt): Restrict lowering of posix_memalign to when
46105         -ftree-bit-ccp is enabled.
46106
46107 2014-02-12  Senthil Kumar Selvaraj  <senthil_kumar.selvaraj@atmel.com>
46108
46109         * config/avr/avr-c.c (avr_resolve_overloaded_builtin): Pass vNULL for
46110         arg_loc.
46111         * config/spu/spu-c.c (spu_resolve_overloaded_builtin): Likewise.
46112
46113 2014-02-12  Eric Botcazou  <ebotcazou@adacore.com>
46114
46115         PR rtl-optimization/60116
46116         * combine.c (try_combine): Also remove dangling REG_DEAD notes on the
46117         other_insn once the combination has been validated.
46118
46119 2014-02-11  Jan Hubicka  <hubicka@ucw.cz>
46120
46121         PR lto/59468
46122         * ipa-utils.h (possible_polymorphic_call_targets): Update prototype
46123         and wrapper.
46124         * ipa-devirt.c: Include demangle.h
46125         (odr_violation_reported): New static variable.
46126         (add_type_duplicate): Update odr_violations.
46127         (maybe_record_node): Add completep parameter; update it.
46128         (record_target_from_binfo): Add COMPLETEP parameter;
46129         update it as needed.
46130         (possible_polymorphic_call_targets_1): Likewise.
46131         (struct polymorphic_call_target_d): Add nonconstruction_targets;
46132         rename FINAL to COMPLETE.
46133         (record_targets_from_bases): Sanity check we found the binfo;
46134         fix COMPLETEP updating.
46135         (possible_polymorphic_call_targets): Add NONCONSTRUTION_TARGETSP
46136         parameter, fix computing of COMPLETEP.
46137         (dump_possible_polymorphic_call_targets): Imrove readability of dump;
46138         at LTO time do demangling.
46139         (ipa_devirt): Use nonconstruction_targets; Improve dumps.
46140         * gimple-fold.c (gimple_get_virt_method_for_vtable): Add can_refer
46141         parameter.
46142         (gimple_get_virt_method_for_binfo): Likewise.
46143         * gimple-fold.h (gimple_get_virt_method_for_binfo,
46144         gimple_get_virt_method_for_vtable): Update prototypes.
46145
46146 2014-02-11  Vladimir Makarov  <vmakarov@redhat.com>
46147
46148         PR target/49008
46149         * genautomata.c (add_presence_absence): Fix typo with
46150         {final_}presence_list.
46151
46152 2014-02-11  Michael Meissner  <meissner@linux.vnet.ibm.com>
46153
46154         PR target/60137
46155         * config/rs6000/rs6000.md (128-bit GPR splitter): Add a splitter
46156         for VSX/Altivec vectors that land in GPR registers.
46157
46158 2014-02-11  Richard Henderson  <rth@redhat.com>
46159             Jakub Jelinek  <jakub@redhat.com>
46160
46161         PR debug/59776
46162         * tree-sra.c (load_assign_lhs_subreplacements): Add VIEW_CONVERT_EXPR
46163         around drhs if type conversion to lacc->type is not useless.
46164
46165 2014-02-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46166
46167         * config/aarch64/aarch64-cores.def (cortex-a57): Use cortexa57
46168         tuning struct.
46169         (cortex-a57.cortex-a53): Likewise.
46170         * config/aarch64/aarch64.c (cortexa57_tunings): New tuning struct.
46171
46172 2014-02-11  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46173
46174         * config/arm/thumb2.md (*thumb2_movhi_insn): Add alternatives for
46175         arm_restrict_it.
46176
46177 2014-02-11  Renlin Li  <Renlin.Li@arm.com>
46178
46179         * doc/sourcebuild.texi: Document check_effective_target_arm_vfp3_ok and
46180         add_options_for_arm_vfp3.
46181
46182 2014-02-11  Jeff Law  <law@redhat.com>
46183
46184         PR middle-end/54041
46185         * expr.c (expand_expr_addr_expr_1): Handle expand_expr returning an
46186         object with an undesirable mode.
46187
46188 2014-02-11  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
46189
46190         PR libgomp/60107
46191         * config/i386/sol2-9.h: New file.
46192         * config.gcc (i[34567]86-*-solaris2* | x86_64-*-solaris2.1[0-9]*,
46193         *-*-solaris2.9*): Use it.
46194
46195 2014-02-10  Nagaraju Mekala  <nagaraju.mekala@xilinx.com>
46196
46197         * config/microblaze/microblaze.md: Add movsi4_rev insn pattern.
46198         * config/microblaze/predicates.md: Add reg_or_mem_operand predicate.
46199
46200 2014-02-10  Nagaraju Mekala  <nagaraju.mekala@xilinx.com>
46201
46202         * config/microblaze/microblaze.c: Extend mcpu version format
46203
46204 2014-02-10  David Holsgrove  <david.holsgrove@xilinx.com>
46205
46206         * config/microblaze/microblaze.h: Define SIZE_TYPE and PTRDIFF_TYPE.
46207
46208 2014-02-10  Richard Henderson  <rth@redhat.com>
46209
46210         PR target/59927
46211         * calls.c (expand_call): Don't double-push for reg_parm_stack_space.
46212         * config/i386/i386.c (init_cumulative_args): Remove sorry for 64-bit
46213         ms-abi vs -mno-accumulate-outgoing-args.
46214         (ix86_expand_prologue): Unconditionally call ix86_eax_live_at_start_p.
46215         * config/i386/i386.h (ACCUMULATE_OUTGOING_ARGS): Fix comment with
46216         respect to ms-abi.
46217
46218 2014-02-10  Bernd Edlinger  <bernd.edlinger@hotmail.de>
46219
46220         PR middle-end/60080
46221         * cfgexpand.c (expand_asm_operands): Attach source location to
46222         ASM_INPUT rtx objects.
46223         * print-rtl.c (print_rtx): Check for UNKNOWN_LOCATION.
46224
46225 2014-02-10  Nick Clifton  <nickc@redhat.com>
46226
46227         * config/mn10300/mn10300.c (popcount): New function.
46228         (mn10300_expand_prologue): Include saved registers in stack usage
46229         count.
46230
46231 2014-02-10  Jeff Law  <law@redhat.com>
46232
46233         PR middle-end/52306
46234         * reload1.c (emit_input_reload_insns): Do not create invalid RTL
46235         when changing the SET_DEST of a prior insn to avoid an input reload.
46236
46237 2014-02-10  Ulrich Weigand  <Ulrich.Weigand@de.ibm.com>
46238
46239         * config/rs6000/sysv4.h (ENDIAN_SELECT): Do not attempt to enforce
46240         big-endian mode for -mcall-aixdesc, -mcall-freebsd, -mcall-netbsd,
46241         -mcall-openbsd, or -mcall-linux.
46242         (CC1_ENDIAN_BIG_SPEC): Remove.
46243         (CC1_ENDIAN_LITTLE_SPEC): Remove.
46244         (CC1_ENDIAN_DEFAULT_SPEC): Remove.
46245         (CC1_SPEC): Remove (always empty) %cc1_endian_... spec.
46246         (SUBTARGET_EXTRA_SPECS): Remove %cc1_endian_big, %cc1_endian_little,
46247         and %cc1_endian_default.
46248         * config/rs6000/sysv4le.h (CC1_ENDIAN_DEFAULT_SPEC): Remove.
46249
46250 2014-02-10  Richard Biener  <rguenther@suse.de>
46251
46252         PR tree-optimization/60115
46253         * tree-eh.c (tree_could_trap_p): Unify TARGET_MEM_REF and
46254         MEM_REF handling.  Properly verify that the accesses are not
46255         out of the objects bound.
46256
46257 2014-02-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46258
46259         * config/aarch64/aarch64.c (aarch64_override_options): Fix typo from
46260         coretex to cortex.
46261
46262 2014-02-10  Eric Botcazou  <ebotcazou@adacore.com>
46263
46264         * ipa-devirt.c (get_polymorphic_call_info_from_invariant): Return
46265         proper constants and fix formatting.
46266         (possible_polymorphic_call_targets): Fix formatting.
46267
46268 2014-02-10  Kirill Yukhin  <kirill.yukhin@intel.com>
46269             Ilya Tocar  <ilya.tocar@intel.com>
46270
46271         * config/i386/avx512fintrin.h (_mm512_storeu_epi64): Removed.
46272         (_mm512_loadu_epi32): Renamed into...
46273         (_mm512_loadu_si512): This.
46274         (_mm512_storeu_epi32): Renamed into...
46275         (_mm512_storeu_si512): This.
46276         (_mm512_maskz_ceil_ps): Removed.
46277         (_mm512_maskz_ceil_pd): Ditto.
46278         (_mm512_maskz_floor_ps): Ditto.
46279         (_mm512_maskz_floor_pd): Ditto.
46280         (_mm512_floor_round_ps): Ditto.
46281         (_mm512_floor_round_pd): Ditto.
46282         (_mm512_ceil_round_ps): Ditto.
46283         (_mm512_ceil_round_pd): Ditto.
46284         (_mm512_mask_floor_round_ps): Ditto.
46285         (_mm512_mask_floor_round_pd): Ditto.
46286         (_mm512_mask_ceil_round_ps): Ditto.
46287         (_mm512_mask_ceil_round_pd): Ditto.
46288         (_mm512_maskz_floor_round_ps): Ditto.
46289         (_mm512_maskz_floor_round_pd): Ditto.
46290         (_mm512_maskz_ceil_round_ps): Ditto.
46291         (_mm512_maskz_ceil_round_pd): Ditto.
46292         (_mm512_expand_pd): Ditto.
46293         (_mm512_expand_ps): Ditto.
46294         * config/i386/i386.c (ix86_builtins): Remove
46295         IX86_BUILTIN_EXPANDPD512_NOMASK, IX86_BUILTIN_EXPANDPS512_NOMASK.
46296         (bdesc_args): Ditto.
46297         * config/i386/predicates.md (const1256_operand): New.
46298         (const_1_to_2_operand): Ditto.
46299         * config/i386/sse.md (avx512pf_gatherpf<mode>sf): Change hint value.
46300         (*avx512pf_gatherpf<mode>sf_mask): Ditto.
46301         (*avx512pf_gatherpf<mode>sf): Ditto.
46302         (avx512pf_gatherpf<mode>df): Ditto.
46303         (*avx512pf_gatherpf<mode>df_mask): Ditto.
46304         (*avx512pf_gatherpf<mode>df): Ditto.
46305         (avx512pf_scatterpf<mode>sf): Ditto.
46306         (*avx512pf_scatterpf<mode>sf_mask): Ditto.
46307         (*avx512pf_scatterpf<mode>sf): Ditto.
46308         (avx512pf_scatterpf<mode>df): Ditto.
46309         (*avx512pf_scatterpf<mode>df_mask): Ditto.
46310         (*avx512pf_scatterpf<mode>df): Ditto.
46311         (avx512f_expand<mode>): Removed.
46312         (<shift_insn><mode>3<mask_name>): Change predicate type.
46313
46314 2014-02-08  Jakub Jelinek  <jakub@redhat.com>
46315
46316         * tree-vect-data-refs.c (vect_analyze_data_refs): For clobbers
46317         not at the end of datarefs vector use ordered_remove to avoid
46318         reordering datarefs vector.
46319
46320         PR c/59984
46321         * gimplify.c (gimplify_bind_expr): In ORT_SIMD region
46322         mark local addressable non-static vars as GOVD_PRIVATE
46323         instead of GOVD_LOCAL.
46324         * omp-low.c (lower_omp_for): Move gimple_bind_vars
46325         and BLOCK_VARS of gimple_bind_block to new_stmt rather
46326         than copying them.
46327
46328         PR middle-end/60092
46329         * tree-ssa-ccp.c (surely_varying_stmt_p): Don't return true
46330         if TYPE_ATTRIBUTES (gimple_call_fntype ()) contain
46331         assume_aligned or alloc_align attributes.
46332         (bit_value_assume_aligned): Add ATTR, PTRVAL and ALLOC_ALIGN
46333         arguments.  Handle also assume_aligned and alloc_align attributes.
46334         (evaluate_stmt): Adjust bit_value_assume_aligned caller.  Handle
46335         calls to functions with assume_aligned or alloc_align attributes.
46336         * doc/extend.texi: Document assume_aligned and alloc_align attributes.
46337
46338 2014-02-08  Terry Guo  <terry.guo@arm.com>
46339
46340         * doc/invoke.texi: Document ARM -march=armv7e-m.
46341
46342 2014-02-08  Jakub Jelinek  <jakub@redhat.com>
46343
46344         * cilk-common.c (cilk_init_builtins): Clear TREE_NOTHROW
46345         flag on __cilkrts_rethrow builtin.
46346
46347         PR ipa/60026
46348         * ipa-cp.c (determine_versionability): Fail at -O0
46349         or __attribute__((optimize (0))) or -fno-ipa-cp functions.
46350         * tree-sra.c (ipa_sra_preliminary_function_checks): Similarly.
46351
46352         Revert:
46353         2014-02-04  Jakub Jelinek  <jakub@redhat.com>
46354
46355         PR ipa/60026
46356         * tree-inline.c (copy_forbidden): Fail for
46357         __attribute__((optimize (0))) functions.
46358
46359 2014-02-07  Jan Hubicka  <hubicka@ucw.cz>
46360
46361         * varpool.c: Include pointer-set.h.
46362         (varpool_remove_unreferenced_decls): Variables in other partitions
46363         will not be output; be however careful to not lose information
46364         about partitioning.
46365
46366 2014-02-07  Jan Hubicka  <hubicka@ucw.cz>
46367
46368         * gimple-fold.c (gimple_get_virt_method_for_vtable): Do O(1)
46369         lookup in the vtable constructor.
46370
46371 2014-02-07  Jeff Law  <law@redhat.com>
46372
46373         PR target/40977
46374         * config/m68k/m68k.md (ashldi_extsi): Turn into a
46375         define_insn_and_split.
46376
46377         * ipa-inline.c (inline_small_functions): Fix typos.
46378
46379 2014-02-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
46380
46381         * config/s390/s390-protos.h (s390_can_use_simple_return_insn)
46382         (s390_can_use_return_insn): Declare.
46383         * config/s390/s390.h (EPILOGUE_USES): Define.
46384         * config/s390/s390.c (s390_mainpool_start): Allow two main_pool
46385         instructions.
46386         (s390_chunkify_start): Handle return JUMP_LABELs.
46387         (s390_early_mach): Emit a main_pool instruction on the entry edge.
46388         (s300_set_up_by_prologue, s390_can_use_simple_return_insn)
46389         (s390_can_use_return_insn): New functions.
46390         (s390_fix_long_loop_prediction): Handle conditional returns.
46391         (TARGET_SET_UP_BY_PROLOGUE): Define.
46392         * config/s390/s390.md (ANY_RETURN): New code iterator.
46393         (*creturn, *csimple_return, return, simple_return): New patterns.
46394
46395 2014-02-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
46396
46397         * config/s390/s390.c (s390_restore_gprs_from_fprs): Add REG_CFA_RESTORE
46398         notes to each restore.  Also add REG_CFA_DEF_CFA when restoring %r15.
46399         (s390_optimize_prologue): Don't clear RTX_FRAME_RELATED_P.  Update the
46400         REG_CFA_RESTORE list when deciding not to restore a register.
46401
46402 2014-02-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
46403
46404         * config/s390/s390.c: Include tree-pass.h and context.h.
46405         (s390_early_mach): New function, split out from...
46406         (s390_emit_prologue): ...here.
46407         (pass_data_s390_early_mach): New pass structure.
46408         (pass_s390_early_mach): New class.
46409         (s390_option_override): Create and register early_mach pass.
46410         Move to end of file.
46411
46412 2014-02-07  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
46413
46414         * var-tracking.c (vt_stack_adjustments): Don't require stack_adjusts
46415         to match for the exit block.
46416
46417 2014-02-07  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
46418
46419         * config/s390/s390.md ("atomic_load<mode>", "atomic_store<mode>")
46420         ("atomic_compare_and_swap<mode>", "atomic_fetch_<atomic><mode>"):
46421         Reject misaligned operands.
46422
46423 2014-02-07  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
46424
46425         * optabs.c (expand_atomic_compare_and_swap): Allow expander to fail.
46426
46427 2014-02-07  Richard Biener  <rguenther@suse.de>
46428
46429         PR middle-end/60092
46430         * gimple-low.c (lower_builtin_posix_memalign): New function.
46431         (lower_stmt): Call it to lower posix_memalign in a way
46432         to make alignment info accessible.
46433
46434 2014-02-07  Jakub Jelinek  <jakub@redhat.com>
46435
46436         PR c++/60082
46437         * tree.c (build_common_builtin_nodes): Set ECF_LEAF for
46438         __builtin_setjmp_receiver.
46439
46440 2014-02-07  Richard Biener  <rguenther@suse.de>
46441
46442         PR middle-end/60092
46443         * builtin-types.def (BT_FN_INT_PTRPTR_SIZE_SIZE): Add.
46444         * builtins.def (BUILT_IN_POSIX_MEMALIGN): Likewise.
46445         * tree-ssa-structalias.c (find_func_aliases_for_builtin_call):
46446         Handle BUILT_IN_POSIX_MEMALIGN.
46447         (find_func_clobbers): Likewise.
46448         * tree-ssa-alias.c (ref_maybe_used_by_call_p_1): Likewise.
46449         (call_may_clobber_ref_p_1): Likewise.
46450
46451 2014-02-06  Jan Hubicka  <hubicka@ucw.cz>
46452
46453         PR ipa/59918
46454         * ipa-devirt.c (record_target_from_binfo): Remove overactive
46455         sanity check.
46456
46457 2014-02-06  Jan Hubicka  <hubicka@ucw.cz>
46458
46459         PR ipa/59469
46460         * lto-cgraph.c (lto_output_node): Use
46461         symtab_get_symbol_partitioning_class.
46462         (lto_output_varpool_node): likewise.
46463         (symtab_get_symbol_partitioning_class): Move here from
46464         lto/lto-partition.c
46465         * cgraph.h (symbol_partitioning_class): Likewise.
46466         (symtab_get_symbol_partitioning_class): Declare.
46467
46468 2014-02-06  Jan Hubicka  <hubicka@ucw.cz>
46469
46470         * ggc.h (ggc_internal_cleared_alloc): New macro.
46471         * vec.h (vec_safe_copy): Handle memory stats.
46472         * omp-low.c (simd_clone_struct_alloc): Use ggc_internal_cleared_alloc.
46473         * target-globals.c (save_target_globals): Likewise.
46474
46475 2014-02-06  Jan Hubicka  <hubicka@ucw.cz>
46476
46477         PR target/60077
46478         * expr.c (emit_move_resolve_push): Export; be bit more selective
46479         on when to clear alias set.
46480         * expr.h (emit_move_resolve_push): Declare.
46481         * function.h (struct function): Add tail_call_marked.
46482         * tree-tailcall.c (optimize_tail_call): Set tail_call_marked.
46483         * config/i386/i386-protos.h (ix86_expand_push): Remove.
46484         * config/i386/i386.md (TImode move expander): De not call
46485         ix86_expand_push.
46486         (FP push expanders): Preserve memory attributes.
46487         * config/i386/sse.md (push<mode>1): Remove.
46488         * config/i386/i386.c (ix86_expand_vector_move): Handle push operation.
46489         (ix86_expand_push): Remove.
46490         * config/i386/mmx.md (push<mode>1): Remove.
46491
46492 2014-02-06  Jakub Jelinek  <jakub@redhat.com>
46493
46494         PR rtl-optimization/60030
46495         * internal-fn.c (ubsan_expand_si_overflow_mul_check): Surround
46496         lopart with paradoxical subreg before shifting it up by hprec.
46497
46498 2014-02-06  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46499
46500         * config/arm/aarch-cost-tables.h (cortexa57_extra_costs): New table.
46501         Remove extra newline at end of file.
46502         * config/arm/arm.c (arm_cortex_a57_tune): New tuning struct.
46503         (arm_issue_rate): Handle cortexa57.
46504         * config/arm/arm-cores.def (cortex-a57): Use cortex_a57 tuning.
46505         (cortex-a57.cortex-a53): Likewise.
46506
46507 2014-02-06  Jakub Jelinek  <jakub@redhat.com>
46508
46509         PR target/59575
46510         * config/arm/arm.c (emit_multi_reg_push): Add dwarf_regs_mask argument,
46511         don't record in REG_FRAME_RELATED_EXPR registers not set in that
46512         bitmask.
46513         (arm_expand_prologue): Adjust all callers.
46514         (arm_unwind_emit_sequence): Allow saved, but not important for unwind
46515         info, registers also at the lowest numbered registers side.  Use
46516         gcc_assert instead of abort, and SET_SRC/SET_DEST macros instead of
46517         XEXP.
46518
46519         PR debug/59992
46520         * var-tracking.c (adjust_mems): Before adding a SET to
46521         amd->side_effects, adjust it's SET_SRC using simplify_replace_fn_rtx.
46522
46523 2014-02-06  Alan Modra  <amodra@gmail.com>
46524
46525         PR target/60032
46526         * config/rs6000/rs6000.c (rs6000_secondary_memory_needed_mode): Only
46527         change SDmode to DDmode when lra_in_progress.
46528
46529 2014-02-06  Jakub Jelinek  <jakub@redhat.com>
46530
46531         PR middle-end/59150
46532         * tree-vect-data-refs.c (vect_analyze_data_refs): For clobbers, call
46533         free_data_ref on the dr first, and before goto again also set dr
46534         to the next dr.  For simd_lane_access, free old datarefs[i] before
46535         overwriting it.  For get_vectype_for_scalar_type failure, don't
46536         free_data_ref if simd_lane_access.
46537
46538         * Makefile.in (prefix.o, cppbuiltin.o): Depend on $(BASEVER).
46539
46540         PR target/60062
46541         * tree.h (opts_for_fn): New inline function.
46542         (opt_for_fn): Define.
46543         * config/i386/i386.c (ix86_function_regparm): Use
46544         opt_for_fn (decl, optimize) instead of optimize.
46545
46546 2014-02-06  Marcus Shawcroft  <marcus.shawcroft@arm.com>
46547
46548         * config/aarch64/aarch64.c (aarch64_classify_symbol): Fix logic
46549         for SYMBOL_REF in large memory model.
46550
46551 2014-02-06  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46552
46553         * config/aarch64/aarch64-cores.def (cortex-a53): Specify CRC32
46554         and crypto support.
46555         (cortex-a57): Likewise.
46556         (cortex-a57.cortex-a53): Likewise.
46557
46558 2014-02-06  Yury Gribov  <y.gribov@samsung.com>
46559             Kugan Vivekanandarajah  <kuganv@linaro.org>
46560
46561         * config/arm/arm.c (arm_vector_alignment_reachable): Check
46562         unaligned_access.
46563         * config/arm/arm.c (arm_builtin_support_vector_misalignment): Likewise.
46564
46565 2014-02-06  Richard Biener  <rguenther@suse.de>
46566
46567         * tree-cfg.c (gimple_duplicate_sese_region): Fix ordering of
46568         set_loop_copy and initialize_original_copy_tables.
46569
46570 2014-02-06  Alex Velenko  <Alex.Velenko@arm.com>
46571
46572         * config/aarch64/aarch64-simd.md
46573         (aarch64_ashr_simddi): Change QI to SI.
46574
46575 2014-02-05  Jan Hubicka  <hubicka@ucw.cz>
46576             Jakub Jelinek  <jakub@redhat.com>
46577
46578         PR middle-end/60013
46579         * ipa-inline-analysis.c (compute_bb_predicates): Ensure monotonicity
46580         of the dataflow.
46581
46582 2014-02-05  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46583
46584         * config/rs6000/rs6000.c (altivec_expand_vec_perm_const): Change
46585         CODE_FOR_altivec_vpku[hw]um to
46586         CODE_FOR_altivec_vpku[hw]um_direct.
46587         * config/rs6000/altivec.md (vec_unpacks_hi_<VP_small_lc>): Change
46588         UNSPEC_VUNPACK_HI_SIGN to UNSPEC_VUNPACK_HI_SIGN_DIRECT.
46589         (vec_unpacks_lo_<VP_small_lc>): Change UNSPEC_VUNPACK_LO_SIGN to
46590         UNSPEC_VUNPACK_LO_SIGN_DIRECT.
46591
46592 2014-02-05  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46593
46594         * config/rs6000/altivec.md (altivec_vsum2sws): Adjust code
46595         generation for -maltivec=be.
46596         (altivec_vsumsws): Simplify redundant test.
46597
46598 2014-02-05  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46599
46600         * altivec.md (UNSPEC_VPACK_UNS_UNS_MOD_DIRECT): New unspec.
46601         (UNSPEC_VUNPACK_HI_SIGN_DIRECT): Likewise.
46602         (UNSPEC_VUNPACK_LO_SIGN_DIRECT): Likewise.
46603         (mulv8hi3): Use gen_altivec_vpkuwum_direct instead of
46604         gen_altivec_vpkuwum.
46605         (altivec_vpkpx): Test for VECTOR_ELT_ORDER_BIG instead of for
46606         BYTES_BIG_ENDIAN.
46607         (altivec_vpks<VI_char>ss): Likewise.
46608         (altivec_vpks<VI_char>us): Likewise.
46609         (altivec_vpku<VI_char>us): Likewise.
46610         (altivec_vpku<VI_char>um): Likewise.
46611         (altivec_vpku<VI_char>um_direct): New (copy of
46612         altivec_vpku<VI_char>um that still relies on BYTES_BIG_ENDIAN, for
46613         internal use).
46614         (altivec_vupkhs<VU_char>): Emit vupkls* instead of vupkhs* when
46615         target is little endian and -maltivec=be is not specified.
46616         (*altivec_vupkhs<VU_char>_direct): New (copy of
46617         altivec_vupkhs<VU_char> that always emits vupkhs*, for internal use).
46618         (altivec_vupkls<VU_char>): Emit vupkhs* instead of vupkls* when
46619         target is little endian and -maltivec=be is not specified.
46620         (*altivec_vupkls<VU_char>_direct): New (copy of
46621         altivec_vupkls<VU_char> that always emits vupkls*, for internal use).
46622         (altivec_vupkhpx): Emit vupklpx instead of vupkhpx when target is
46623         little endian and -maltivec=be is not specified.
46624         (altivec_vupklpx): Emit vupkhpx instead of vupklpx when target is
46625         little endian and -maltivec=be is not specified.
46626
46627 2014-02-05  Richard Henderson  <rth@redhat.com>
46628
46629         PR debug/52727
46630         * combine-stack-adj.c: Revert r206943.
46631         * sched-int.h (struct deps_desc): Add last_args_size.
46632         * sched-deps.c (init_deps): Initialize it.
46633         (sched_analyze_insn): Add OUTPUT dependencies between insns that
46634         contain REG_ARGS_SIZE notes.
46635
46636 2014-02-05  Jan Hubicka  <hubicka@ucw.cz>
46637
46638         * lto-cgraph.c (asm_nodes_output): Make global.
46639         * lto-wrapper.c (run_gcc): Pass down paralelizm to WPA.
46640         * gcc.c (AS_NEEDS_DASH_FOR_PIPED_INPUT): Allow WPA parameter
46641         (driver_handle_option): Handle OPT_fwpa.
46642
46643 2014-02-05  Jakub Jelinek  <jakub@redhat.com>
46644
46645         PR ipa/59947
46646         * ipa-devirt.c (possible_polymorphic_call_targets): Fix
46647         a comment typo and formatting issue.  If odr_hash hasn't been
46648         created, return vNULL and set *completep to false.
46649
46650         PR middle-end/57499
46651         * tree-eh.c (cleanup_empty_eh): Bail out on totally empty
46652         bb with no successors.
46653
46654 2014-02-05  James Greenhalgh  <james.greenhalgh@arm.com>
46655
46656         PR target/59718
46657         * doc/invoke.texi (-march): Clarify documentation for ARM.
46658         (-mtune): Likewise.
46659         (-mcpu): Likewise.
46660
46661 2014-02-05  Richard Biener  <rguenther@suse.de>
46662
46663         * tree-vect-loop.c (vect_analyze_loop_2): Be more informative
46664         when not vectorizing because of too many alias checks.
46665         * tree-vect-data-refs.c (vect_prune_runtime_alias_test_list):
46666         Add more verboseness, avoid duplicate MSG_MISSED_OPTIMIZATION.
46667
46668 2014-02-05  Nick Clifton  <nickc@redhat.com>
46669
46670         * config/mn10300/mn10300.c (mn10300_hard_regno_mode_ok): Do not
46671         accept extended registers in any mode when compiling for the MN10300.
46672
46673 2014-02-05  Yury Gribov  <y.gribov@samsung.com>
46674
46675         * cif-code.def (ATTRIBUTE_MISMATCH): New CIF code.
46676         * ipa-inline.c (report_inline_failed_reason): Handle mismatched
46677         sanitization attributes.
46678         (can_inline_edge_p): Likewise.
46679         (sanitize_attrs_match_for_inline_p): New function.
46680
46681 2014-02-04  Jan Hubicka  <hubicka@ucw.cz>
46682
46683         * ipa-prop.c (detect_type_change): Shor circuit testing of
46684         type changes on THIS pointer.
46685
46686 2014-02-04  John David Anglin  <danglin@gcc.gnu.org>
46687
46688         PR target/59777
46689         * config/pa/pa.c (legitimize_tls_address): Return original address
46690         if not passed a SYMBOL_REF rtx.
46691         (hppa_legitimize_address): Call legitimize_tls_address for all TLS
46692         addresses.
46693         (pa_emit_move_sequence): Simplify TLS source operands.
46694         (pa_legitimate_constant_p): Reject all TLS constants.
46695         * config/pa/pa.h (PA_SYMBOL_REF_TLS_P): Correct comment.
46696         (CONSTANT_ADDRESS_P): Reject TLS CONST addresses.
46697
46698 2014-02-04  Jan Hubicka  <hubicka@ucw.cz>
46699
46700         * ipa.c (function_and_variable_visibility): Decompose DECL_ONE_ONLY
46701         groups when we know they are controlled by LTO.
46702         * varasm.c (default_binds_local_p_1): If object is in other partition,
46703         it will be resolved locally.
46704
46705 2014-02-04  Bernd Edlinger  <bernd.edlinger@hotmail.de>
46706
46707         * config/host-linux.c (linux_gt_pch_use_address): Don't
46708         use SSIZE_MAX because it is not always defined.
46709
46710 2014-02-04  Vladimir Makarov  <vmakarov@redhat.com>
46711
46712         PR bootstrap/59913
46713         * lra-constraints.c (need_for_split_p): Use more 3 reloads as
46714         threshold for pseudo splitting.
46715         (update_ebb_live_info): Process call argument hard registers and
46716         hard registers from insn definition too.
46717         (max_small_class_regs_num): New constant.
46718         (inherit_in_ebb): Update live hard regs through EBBs.  Update
46719         reloads_num only for small register classes.  Don't split for
46720         outputs of jumps.
46721
46722 2014-02-04  Markus Trippelsdorf  <markus@trippelsdorf.de>
46723
46724         PR ipa/60058
46725         * ipa-cp.c (ipa_get_indirect_edge_target_1): Check that target
46726         is non-null.
46727
46728 2014-02-04  Jan Hubicka  <hubicka@ucw.cz>
46729
46730         * gimple-fold.c (can_refer_decl_in_current_unit_p): Default
46731         visibility is safe.
46732
46733 2014-02-04  Marek Polacek  <polacek@redhat.com>
46734
46735         * gdbinit.in (pel): Define.
46736
46737 2014-02-04  Bernd Edlinger  <bernd.edlinger@hotmail.de>
46738
46739         * doc/invoke.texi (fstrict-volatile-bitfields): Clarify current
46740         behavior.
46741
46742 2014-02-04  Richard Biener  <rguenther@suse.de>
46743
46744         PR lto/59723
46745         * lto-streamer-out.c (tree_is_indexable): Force NAMELIST_DECLs
46746         in function context local.
46747         (lto_output_tree_ref): Do not write trees from lto_output_tree_ref.
46748         * lto-streamer-in.c (lto_input_tree_ref): Handle LTO_namelist_decl_ref
46749         similar to LTO_imported_decl_ref.
46750
46751 2014-02-04  Jakub Jelinek  <jakub@redhat.com>
46752
46753         PR tree-optimization/60002
46754         * cgraphclones.c (build_function_decl_skip_args): Clear
46755         DECL_LANG_SPECIFIC.
46756
46757         PR tree-optimization/60023
46758         * tree-if-conv.c (predicate_mem_writes): Pass true instead of
46759         false to gsi_replace.
46760         * tree-vect-stmts.c (vect_finish_stmt_generation): If stmt
46761         has been in some EH region and vec_stmt could throw, add
46762         vec_stmt into the same EH region.
46763         * tree-data-ref.c (get_references_in_stmt): If IFN_MASK_LOAD
46764         has no lhs, ignore it.
46765         * internal-fn.c (expand_MASK_LOAD): Likewise.
46766
46767         PR ipa/60026
46768         * tree-inline.c (copy_forbidden): Fail for
46769         __attribute__((optimize (0))) functions.
46770
46771         PR other/58712
46772         * omp-low.c (simd_clone_struct_copy): If from->inbranch
46773         is set, copy one less argument.
46774         (expand_simd_clones): Don't subtract clone_info->inbranch
46775         from simd_clone_struct_alloc argument.
46776
46777         PR rtl-optimization/57915
46778         * recog.c (simplify_while_replacing): If all unary/binary/relational
46779         operation arguments are constant, attempt to simplify those.
46780
46781         PR middle-end/59261
46782         * expmed.c (expand_mult): For MODE_VECTOR_INT multiplication
46783         if there is no vashl<mode>3 or ashl<mode>3 insn, skip_synth.
46784
46785 2014-02-04  Richard Biener  <rguenther@suse.de>
46786
46787         PR tree-optimization/60012
46788         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence): Apply
46789         TBAA disambiguation to all DDRs.
46790
46791 2014-02-04  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
46792
46793         PR target/59788
46794         * config/sol2.h (LINK_LIBGCC_MAPFILE_SPEC): Define.
46795         (LINK_SPEC): Use it for -shared, -shared-libgcc.
46796
46797 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46798
46799         PR ipa/59882
46800         * tree.c (get_binfo_at_offset): Do not get confused by empty classes;
46801
46802 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46803
46804         * gimple-fold.c (gimple_extract_devirt_binfo_from_cst): Remove.
46805         * gimple-fold.h (gimple_extract_devirt_binfo_from_cst): Remove.
46806
46807 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46808
46809         PR ipa/59831
46810         * ipa-cp.c (ipa_get_indirect_edge_target_1): Use ipa-devirt
46811         to figure out targets of polymorphic calls with known decl.
46812         * ipa-prop.c (try_make_edge_direct_virtual_call): Likewise.
46813         * ipa-utils.h (get_polymorphic_call_info_from_invariant): Declare.
46814         * ipa-devirt.c (get_polymorphic_call_info_for_decl): Break out from ...
46815         (get_polymorphic_call_info): ... here.
46816         (get_polymorphic_call_info_from_invariant): New function.
46817
46818 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46819
46820         * ipa-cp.c (ipa_get_indirect_edge_target_1): Do direct
46821         lookup via vtable pointer; check for type consistency
46822         and turn inconsitent facts into UNREACHABLE.
46823         * ipa-prop.c (try_make_edge_direct_virtual_call): Likewise.
46824         * gimple-fold.c (gimple_get_virt_method_for_vtable): Do not ICE on
46825         type inconsistent querries; return UNREACHABLE instead.
46826
46827 2014-02-03  Richard Henderson  <rth@twiddle.net>
46828
46829         PR tree-opt/59924
46830         * tree-ssa-uninit.c (push_to_worklist): Don't re-push if we've
46831         already processed this node.
46832         (normalize_one_pred_1): Pass along mark_set.
46833         (normalize_one_pred): Create and destroy a pointer_set_t.
46834         (normalize_one_pred_chain): Likewise.
46835
46836 2014-02-03  Laurent Aflonsi  <laurent.alfonsi@st.com>
46837
46838         PR gcov-profile/58602
46839         * gcc/gcov-io.c (gcov_open): Open with truncation when mode < 0.
46840
46841 2014-02-03  Jan Hubicka  <hubicka@ucw.cz>
46842
46843         PR ipa/59831
46844         * ipa-cp.c (ipa_get_indirect_edge_target_1): Give up on
46845         -fno-devirtualize; try to devirtualize by the knowledge of
46846         virtual table pointer given by aggregate propagation.
46847         * ipa-prop.c (try_make_edge_direct_virtual_call): Likewise.
46848         (ipa_print_node_jump_functions): Dump also offset that
46849         is relevant for polymorphic calls.
46850         (determine_known_aggregate_parts): Add arg_type parameter; use it
46851         instead of determining the type from pointer type.
46852         (ipa_compute_jump_functions_for_edge): Update call of
46853         determine_known_aggregate_parts.
46854         * gimple-fold.c (gimple_get_virt_method_for_vtable): Break out from ...
46855         (gimple_get_virt_method_for_binfo): ... here; simplify using
46856         vtable_pointer_value_to_vtable.
46857         * gimple-fold.h (gimple_get_virt_method_for_vtable): Declare.
46858         * ipa-devirt.c (subbinfo_with_vtable_at_offset): Turn OFFSET parameter
46859         to unsigned HOST_WIDE_INT; use vtable_pointer_value_to_vtable.
46860         (vtable_pointer_value_to_vtable): Break out from ...; handle also
46861         POINTER_PLUS_EXPR.
46862         (vtable_pointer_value_to_binfo): ... here.
46863         * ipa-utils.h (vtable_pointer_value_to_vtable): Declare.
46864
46865 2014-02-03  Teresa Johnson  <tejohnson@google.com>
46866
46867         * tree-vect-slp.c (vect_supported_load_permutation_p): Avoid
46868         redef of outer loop index variable.
46869
46870 2014-02-03  Marc Glisse  <marc.glisse@inria.fr>
46871
46872         PR c++/53017
46873         PR c++/59211
46874         * doc/extend.texi (Function Attributes): Typo.
46875
46876 2014-02-03  Cong Hou  <congh@google.com>
46877
46878         PR tree-optimization/60000
46879         * tree-vect-loop.c (vect_transform_loop): Set pattern_def_seq to NULL
46880         if the vectorized statement is a store.  A store statement can only
46881         appear at the end of pattern statements.
46882
46883 2014-02-03  H.J. Lu  <hongjiu.lu@intel.com>
46884
46885         * config/i386/i386.c (flag_opts): Add -mlong-double-128.
46886         (ix86_option_override_internal): Default long double to 64-bit for
46887         32-bit Bionic and to 128-bit for 64-bit Bionic.
46888
46889         * config/i386/i386.h (LONG_DOUBLE_TYPE_SIZE): Use 128 if
46890         TARGET_LONG_DOUBLE_128 is true.
46891         (LIBGCC2_LONG_DOUBLE_TYPE_SIZE): Likewise.
46892
46893         * config/i386/i386.opt (mlong-double-80): Negate -mlong-double-64.
46894         (mlong-double-64): Negate -mlong-double-128.
46895         (mlong-double-128): New option.
46896
46897         * config/i386/i386-c.c (ix86_target_macros): Define
46898         __LONG_DOUBLE_128__ for TARGET_LONG_DOUBLE_128.
46899
46900         * doc/invoke.texi: Document -mlong-double-128.
46901
46902 2014-02-03  H.J. Lu  <hongjiu.lu@intel.com>
46903
46904         PR rtl-optimization/60024
46905         * sel-sched.c (init_regs_for_mode): Check if mode is OK first.
46906
46907 2014-02-03  Markus Trippelsdorf  <markus@trippelsdorf.de>
46908
46909         * doc/invoke.texi (fprofile-reorder-functions): Fix typo.
46910
46911 2014-02-03  Andrey Belevantsev  <abel@ispras.ru>
46912
46913         PR rtl-optimization/57662
46914         * sel-sched.c (code_motion_path_driver): Do not mark already not
46915         existing blocks in the visiting bitmap.
46916
46917 2014-02-03  Andrey Belevantsev  <abel@ispras.ru>
46918
46919         * sel-sched-ir.c (sel_gen_insn_from_expr_after): Reset INSN_DELETED_P
46920         on the insn being emitted.
46921
46922 2014-02-03  James Greenhalgh  <james.greenhalgh@arm.com>
46923             Will Deacon  <will.deacon@arm.com>
46924
46925         * doc/gimple.texi (gimple_asm_clear_volatile): Remove.
46926
46927 2014-02-03  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
46928
46929         * config/arm/arm-tables.opt: Regenerate.
46930
46931 2014-02-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46932
46933         * config/rs6000/rs6000.c (altivec_expand_vec_perm_le): Generalize
46934         for vector types other than V16QImode.
46935         * config/rs6000/altivec.md (altivec_vperm_<mode>): Change to a
46936         define_expand, and call altivec_expand_vec_perm_le when producing
46937         code with little endian element order.
46938         (*altivec_vperm_<mode>_internal): New insn having previous
46939         behavior of altivec_vperm_<mode>.
46940         (altivec_vperm_<mode>_uns): Change to a define_expand, and call
46941         altivec_expand_vec_perm_le when producing code with little endian
46942         element order.
46943         (*altivec_vperm_<mode>_uns_internal): New insn having previous
46944         behavior of altivec_vperm_<mode>_uns.
46945
46946 2014-02-02  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
46947
46948         * config/rs6000/altivec.md (UNSPEC_VSUMSWS_DIRECT): New unspec.
46949         (altivec_vsumsws): Add handling for -maltivec=be with a little
46950         endian target.
46951         (altivec_vsumsws_direct): New.
46952         (reduc_splus_<mode>): Call gen_altivec_vsumsws_direct instead of
46953         gen_altivec_vsumsws.
46954
46955 2014-02-02  Jan Hubicka  <hubicka@ucw.cz>
46956
46957         * ipa-devirt.c (subbinfo_with_vtable_at_offset,
46958         vtable_pointer_value_to_binfo): New functions.
46959         * ipa-utils.h (vtable_pointer_value_to_binfo): Declare.
46960         * ipa-prop.c (extr_type_from_vtbl_ptr_store): Use it.
46961
46962 2014-02-02  Sandra Loosemore  <sandra@codesourcery.com>
46963
46964         * config/nios2/nios2.md (load_got_register): Initialize GOT
46965         pointer from _gp_got instead of _GLOBAL_OFFSET_TABLE_.
46966         * config/nios2/nios2.c (nios2_function_profiler): Likewise.
46967
46968 2014-02-02  Jan Hubicka  <hubicka@ucw.cz>
46969
46970         * ipa-prop.c (update_jump_functions_after_inlining): When type is not
46971         preserverd by passthrough, do not propagate the type.
46972
46973 2014-02-02  Richard Sandiford  <rdsandiford@googlemail.com>
46974
46975         * config/mips/mips.c (MIPS_GET_FCSR, MIPS_SET_FCSR): New macros.
46976         (mips_atomic_assign_expand_fenv): New function.
46977         (TARGET_ATOMIC_ASSIGN_EXPAND_FENV): Define.
46978
46979 2014-02-02  Richard Sandiford  <rdsandiford@googlemail.com>
46980
46981         * doc/extend.texi (__builtin_mips_get_fcsr): Document.
46982         (__builtin_mips_set_fcsr): Likewise.
46983         * config/mips/mips-ftypes.def: Add MIPS_VOID_FTYPE_USI and
46984         MIPS_USI_FTYPE_VOID.
46985         * config/mips/mips-protos.h (mips16_expand_get_fcsr): Declare
46986         (mips16_expand_set_fcsr): Likewise.
46987         * config/mips/mips.c (mips16_get_fcsr_stub): New variable.
46988         (mips16_set_fcsr_stub): Likewise.
46989         (mips16_get_fcsr_one_only_stub): New class.
46990         (mips16_set_fcsr_one_only_stub): Likewise.
46991         (mips16_expand_get_fcsr, mips16_expand_set_fcsr): New functions.
46992         (mips_code_end): Output the get_fcsr and set_fcsr stubs, if needed.
46993         (BUILTIN_AVAIL_MIPS16, AVAIL_ALL): New macros.
46994         (hard_float): New availability predicate.
46995         (mips_builtins): Add get_fcsr and set_fcsr.
46996         (mips_expand_builtin): Check BUILTIN_AVAIL_MIPS16.
46997         * config/mips/mips.md (UNSPEC_GET_FCSR, UNSPEC_SET_FCSR): New unspecs.
46998         (GET_FCSR_REGNUM, SET_FCSR_REGNUM): New constants.
46999         (mips_get_fcsr, *mips_get_fcsr, mips_get_fcsr_mips16_<mode>)
47000         (mips_set_fcsr, *mips_set_fcsr, mips_set_fcsr_mips16_<mode>): New
47001         patterns.
47002
47003 2014-02-02  Richard Sandiford  <rdsandiford@googlemail.com>
47004
47005         * config/mips/mips.c (mips_one_only_stub): New class.
47006         (mips_need_mips16_rdhwr_p): Replace with...
47007         (mips16_rdhwr_stub): ...this new variable.
47008         (mips16_stub_call_address): New function.
47009         (mips16_rdhwr_one_only_stub): New class.
47010         (mips_expand_thread_pointer): Use mips16_stub_call_address.
47011         (mips_output_mips16_rdhwr): Delete.
47012         (mips_finish_stub): New function.
47013         (mips_code_end): Use it to handle rdhwr stubs.
47014
47015 2014-02-02  Uros Bizjak  <ubizjak@gmail.com>
47016
47017         PR target/60017
47018         * config/i386/i386.c (classify_argument): Fix handling of bit_offset
47019         when calculating size of integer atomic types.
47020
47021 2014-02-02  H.J. Lu  <hongjiu.lu@intel.com>
47022
47023         * ipa-inline-analysis.c (true_predicate_p): Fix a typo in comments.
47024
47025 2014-02-01  Jakub Jelinek  <jakub@redhat.com>
47026
47027         PR tree-optimization/60003
47028         * gimple-low.c (lower_builtin_setjmp): Set cfun->has_nonlocal_label.
47029         * profile.c (branch_prob): Use gimple_call_builtin_p
47030         to check for BUILT_IN_SETJMP_RECEIVER.
47031         * tree-inline.c (copy_bb): Call notice_special_calls.
47032
47033 2014-01-31  Vladimir Makarov  <vmakarov@redhat.com>
47034
47035         PR bootstrap/59985
47036         * lra-constraints.c (process_alt_operands): Update reload_sum only
47037         on the first pass.
47038
47039 2014-01-31  Richard Henderson  <rth@redhat.com>
47040
47041         PR middle-end/60004
47042         * tree-eh.c (lower_try_finally_switch): Delay lowering finally block
47043         until after else_eh is processed.
47044
47045 2014-01-31  Ilya Tocar  <ilya.tocar@intel.com>
47046
47047         * config/i386/avx512fintrin.h (_MM_FROUND_TO_NEAREST_INT),
47048         (_MM_FROUND_TO_NEG_INF), (_MM_FROUND_TO_POS_INF),
47049         (_MM_FROUND_TO_ZERO), (_MM_FROUND_CUR_DIRECTION): Are already defined
47050         in smmintrin.h, remove them.
47051         (_MM_FROUND_NO_EXC): Same as above, bit also wrong value.
47052         * config/i386/i386.c (ix86_print_operand): Split sae and rounding.
47053         * config/i386/i386.md (ROUND_SAE): Fix value.
47054         * config/i386/predicates.md (const_4_or_8_to_11_operand): New.
47055         (const48_operand): New.
47056         * config/i386/subst.md (round), (round_expand): Use
47057         const_4_or_8_to_11_operand.
47058         (round_saeonly), (round_saeonly_expand): Use const48_operand.
47059
47060 2014-01-31  Ilya Tocar  <ilya.tocar@intel.com>
47061
47062         * config/i386/constraints.md (Yk): Swap meaning with k.
47063         * config/i386/i386.md (movhi_internal): Change Yk to k.
47064         (movqi_internal): Ditto.
47065         (*k<logic><mode>): Ditto.
47066         (*andhi_1): Ditto.
47067         (*andqi_1): Ditto.
47068         (kandn<mode>): Ditto.
47069         (*<code>hi_1): Ditto.
47070         (*<code>qi_1): Ditto.
47071         (kxnor<mode>): Ditto.
47072         (kortestzhi): Ditto.
47073         (kortestchi): Ditto.
47074         (kunpckhi): Ditto.
47075         (*one_cmplhi2_1): Ditto.
47076         (*one_cmplqi2_1): Ditto.
47077         * config/i386/sse.md (): Change k to Yk.
47078         (avx512f_load<mode>_mask): Ditto.
47079         (avx512f_blendm<mode>): Ditto.
47080         (avx512f_store<mode>_mask): Ditto.
47081         (avx512f_storeu<ssemodesuffix>512_mask): Ditto.
47082         (avx512f_storedqu<mode>_mask): Ditto.
47083         (avx512f_cmp<mode>3<mask_scalar_merge_name><round_saeonly_name>):
47084         Ditto.
47085         (avx512f_ucmp<mode>3<mask_scalar_merge_name>): Ditto.
47086         (avx512f_vmcmp<mode>3<round_saeonly_name>): Ditto.
47087         (avx512f_vmcmp<mode>3_mask<round_saeonly_name>): Ditto.
47088         (avx512f_maskcmp<mode>3): Ditto.
47089         (avx512f_fmadd_<mode>_mask<round_name>): Ditto.
47090         (avx512f_fmadd_<mode>_mask3<round_name>): Ditto.
47091         (avx512f_fmsub_<mode>_mask<round_name>): Ditto.
47092         (avx512f_fmsub_<mode>_mask3<round_name>): Ditto.
47093         (avx512f_fnmadd_<mode>_mask<round_name>): Ditto.
47094         (avx512f_fnmadd_<mode>_mask3<round_name>): Ditto.
47095         (avx512f_fnmsub_<mode>_mask<round_name>): Ditto.
47096         (avx512f_fnmsub_<mode>_mask3<round_name>): Ditto.
47097         (avx512f_fmaddsub_<mode>_mask<round_name>): Ditto.
47098         (avx512f_fmaddsub_<mode>_mask3<round_name>): Ditto.
47099         (avx512f_fmsubadd_<mode>_mask<round_name>): Ditto.
47100         (avx512f_fmsubadd_<mode>_mask3<round_name>): Ditto.
47101         (avx512f_vextract<shuffletype>32x4_1_maskm): Ditto.
47102         (vec_extract_lo_<mode>_maskm): Ditto.
47103         (vec_extract_hi_<mode>_maskm): Ditto.
47104         (avx512f_vternlog<mode>_mask): Ditto.
47105         (avx512f_fixupimm<mode>_mask<round_saeonly_name>): Ditto.
47106         (avx512f_sfixupimm<mode>_mask<round_saeonly_name>): Ditto.
47107         (avx512f_<code><pmov_src_lower><mode>2_mask): Ditto.
47108         (avx512f_<code>v8div16qi2_mask): Ditto.
47109         (avx512f_<code>v8div16qi2_mask_store): Ditto.
47110         (avx512f_eq<mode>3<mask_scalar_merge_name>_1): Ditto.
47111         (avx512f_gt<mode>3<mask_scalar_merge_name>): Ditto.
47112         (avx512f_testm<mode>3<mask_scalar_merge_name>): Ditto.
47113         (avx512f_testnm<mode>3<mask_scalar_merge_name>): Ditto.
47114         (*avx512pf_gatherpf<mode>sf_mask): Ditto.
47115         (*avx512pf_gatherpf<mode>df_mask): Ditto.
47116         (*avx512pf_scatterpf<mode>sf_mask): Ditto.
47117         (*avx512pf_scatterpf<mode>df_mask): Ditto.
47118         (avx512cd_maskb_vec_dupv8di): Ditto.
47119         (avx512cd_maskw_vec_dupv16si): Ditto.
47120         (avx512f_vpermi2var<mode>3_maskz): Ditto.
47121         (avx512f_vpermi2var<mode>3_mask): Ditto.
47122         (avx512f_vpermi2var<mode>3_mask): Ditto.
47123         (avx512f_vpermt2var<mode>3_maskz): Ditto.
47124         (*avx512f_gathersi<mode>): Ditto.
47125         (*avx512f_gathersi<mode>_2): Ditto.
47126         (*avx512f_gatherdi<mode>): Ditto.
47127         (*avx512f_gatherdi<mode>_2): Ditto.
47128         (*avx512f_scattersi<mode>): Ditto.
47129         (*avx512f_scatterdi<mode>): Ditto.
47130         (avx512f_compress<mode>_mask): Ditto.
47131         (avx512f_compressstore<mode>_mask): Ditto.
47132         (avx512f_expand<mode>_mask): Ditto.
47133         * config/i386/subst.md (mask): Change k to Yk.
47134         (mask_scalar_merge): Ditto.
47135         (sd): Ditto.
47136
47137 2014-01-31  Marc Glisse  <marc.glisse@inria.fr>
47138
47139         * doc/extend.texi (Vector Extensions): Document ?: in C++.
47140
47141 2014-01-31  Richard Biener  <rguenther@suse.de>
47142
47143         PR middle-end/59990
47144         * builtins.c (fold_builtin_memory_op): Make sure to not
47145         use a floating-point mode or a boolean or enumeral type for
47146         the copy operation.
47147
47148 2014-01-30  DJ Delorie  <dj@redhat.com>
47149
47150         * config/msp430/msp430.h (LIB_SPEC): Add -lcrt
47151         * config/msp430/msp430.md (msp430_refsym_need_exit): New.
47152         * config/msp430/msp430.c (msp430_expand_epilogue): Call it
47153         whenever main() has an epilogue.
47154
47155 2014-01-30  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
47156
47157         * config/rs6000/rs6000.c (rs6000_expand_vector_init): Remove
47158         unused variable "field".
47159         * config/rs6000/vsx.md (vsx_mergel_<mode>): Add missing DONE.
47160         (vsx_mergeh_<mode>): Likewise.
47161         * config/rs6000/altivec.md (altivec_vmrghb): Likewise.
47162         (altivec_vmrghh): Likewise.
47163         (altivec_vmrghw): Likewise.
47164         (altivec_vmrglb): Likewise.
47165         (altivec_vmrglh): Likewise.
47166         (altivec_vmrglw): Likewise.
47167         (altivec_vspltb): Add missing uses.
47168         (altivec_vsplth): Likewise.
47169         (altivec_vspltw): Likewise.
47170         (altivec_vspltsf): Likewise.
47171
47172 2014-01-30  Jakub Jelinek  <jakub@redhat.com>
47173
47174         PR target/59923
47175         * ifcvt.c (cond_exec_process_insns): Don't conditionalize
47176         frame related instructions.
47177
47178 2014-01-30  Vladimir Makarov  <vmakarov@redhat.com>
47179
47180         PR rtl-optimization/59959
47181         * lra-constrains.c (simplify_operand_subreg): Assign NO_REGS to
47182         any reload of register whose subreg is invalid.
47183
47184 2014-01-30  Jakub Jelinek  <jakub@redhat.com>
47185
47186         * config/i386/f16cintrin.h (_cvtsh_ss): Avoid -Wnarrowing warning.
47187         * config/i386/avx512fintrin.h (_mm512_mask_cvtusepi64_storeu_epi32):
47188         Add missing return type - void.
47189
47190 2014-01-30  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
47191
47192         * gcc/config/rs6000/rs6000.c (rs6000_expand_vector_init): Use
47193         gen_vsx_xxspltw_v4sf_direct instead of gen_vsx_xxspltw_v4sf;
47194         remove element index adjustment for endian (now handled in vsx.md
47195         and altivec.md).
47196         (altivec_expand_vec_perm_const): Use
47197         gen_altivec_vsplt[bhw]_direct instead of gen_altivec_vsplt[bhw].
47198         * gcc/config/rs6000/vsx.md (UNSPEC_VSX_XXSPLTW): New unspec.
47199         (vsx_xxspltw_<mode>): Adjust element index for little endian.
47200         * gcc/config/rs6000/altivec.md (altivec_vspltb): Divide into a
47201         define_expand and a new define_insn *altivec_vspltb_internal;
47202         adjust for -maltivec=be on a little endian target.
47203         (altivec_vspltb_direct): New.
47204         (altivec_vsplth): Divide into a define_expand and a new
47205         define_insn *altivec_vsplth_internal; adjust for -maltivec=be on a
47206         little endian target.
47207         (altivec_vsplth_direct): New.
47208         (altivec_vspltw): Divide into a define_expand and a new
47209         define_insn *altivec_vspltw_internal; adjust for -maltivec=be on a
47210         little endian target.
47211         (altivec_vspltw_direct): New.
47212         (altivec_vspltsf): Divide into a define_expand and a new
47213         define_insn *altivec_vspltsf_internal; adjust for -maltivec=be on
47214         a little endian target.
47215
47216 2014-01-30  Richard Biener  <rguenther@suse.de>
47217
47218         PR tree-optimization/59993
47219         * tree-ssa-forwprop.c (associate_pointerplus): Check we
47220         can propagate form the earlier stmt and avoid the transform
47221         when the intermediate result is needed.
47222
47223 2014-01-30  Alangi Derick  <alangiderick@gmail.com>
47224
47225         * README.Portability: Fix typo.
47226
47227 2014-01-30  David Holsgrove  <david.holsgrove@xilinx.com>
47228
47229         * config/microblaze/microblaze.md(cstoresf4, cbranchsf4): Replace
47230         comparison_operator with ordered_comparison_operator.
47231
47232 2014-01-30  Nick Clifton  <nickc@redhat.com>
47233
47234         * config/mn10300/mn10300-protos.h (mn10300_store_multiple_operation_p):
47235         Rename to mn10300_store_multiple_regs.
47236         * config/mn10300/mn10300.c: Likewise.
47237         * config/mn10300/mn10300.md (store_movm): Fix typo: call
47238         store_multiple_regs.
47239         * config/mn10300/predicates.md (mn10300_store_multiple_operation):
47240         Call mn10300_store_multiple_regs.
47241
47242 2014-01-30  Nick Clifton  <nickc@redhat.com>
47243             DJ Delorie  <dj@redhat.com>
47244
47245         * config/rl78/rl78.c (register_sizes): Make the "upper half" of
47246         %fp 2 to keep registers after it properly word-aligned.
47247         (rl78_alloc_physical_registers_umul): Handle the case where both
47248         input operands are the same.
47249
47250 2014-01-30  Richard Biener  <rguenther@suse.de>
47251
47252         PR tree-optimization/59903
47253         * tree-vect-loop.c (vect_transform_loop): Guard multiple-types
47254         check properly.
47255
47256 2014-01-30  Jason Merrill  <jason@redhat.com>
47257
47258         PR c++/59633
47259         * tree.c (walk_type_fields): Handle VECTOR_TYPE.
47260
47261         PR c++/59645
47262         * cgraphunit.c (expand_thunk): Copy volatile arg to a temporary.
47263
47264 2014-01-30  Richard Biener  <rguenther@suse.de>
47265
47266         PR tree-optimization/59951
47267         * tree-vect-slp.c (vect_bb_slp_scalar_cost): Skip uses in debug insns.
47268
47269 2014-01-30  Savin Zlobec  <savin.zlobec@gmail.com>
47270
47271         PR target/59784
47272         * config/nios2/nios2.c (nios2_fpu_insn_asm): Fix asm output of
47273         SFmode to DFmode case.
47274
47275 2014-01-29  DJ Delorie  <dj@redhat.com>
47276
47277         * config/msp430/msp430.opt (-minrt): New.
47278         * config/msp430/msp430.h (STARTFILE_SPEC): Link alternate runtime
47279         if -minrt given.
47280         (ENDFILE_SPEC): Likewise.
47281
47282 2014-01-29  Jan Hubicka  <hubicka@ucw.cz>
47283
47284         * ipa-inline-analysis.c (clobber_only_eh_bb_p): New function.
47285         (estimate_function_body_sizes): Use it.
47286
47287 2014-01-29  Paolo Carlini  <paolo.carlini@oracle.com>
47288
47289         PR c++/58561
47290         * dwarf2out.c (is_cxx_auto): New.
47291         (is_base_type): Use it.
47292         (gen_type_die_with_usage): Likewise.
47293
47294 2014-01-29  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
47295
47296         * config/rs6000/rs6000.c (altivec_expand_vec_perm_const):  Use
47297         CODE_FOR_altivec_vmrg*_direct rather than CODE_FOR_altivec_vmrg*.
47298         * config/rs6000/vsx.md (vsx_mergel_<mode>): Adjust for
47299         -maltivec=be with LE targets.
47300         (vsx_mergeh_<mode>): Likewise.
47301         * config/rs6000/altivec.md (UNSPEC_VMRG[HL]_DIRECT): New unspecs.
47302         (mulv8hi3): Use gen_altivec_vmrg[hl]w_direct.
47303         (altivec_vmrghb): Replace with define_expand and new
47304         *altivec_vmrghb_internal insn; adjust for -maltivec=be with LE targets.
47305         (altivec_vmrghb_direct): New define_insn.
47306         (altivec_vmrghh): Replace with define_expand and new
47307         *altivec_vmrghh_internal insn; adjust for -maltivec=be with LE targets.
47308         (altivec_vmrghh_direct): New define_insn.
47309         (altivec_vmrghw): Replace with define_expand and new
47310         *altivec_vmrghw_internal insn; adjust for -maltivec=be with LE targets.
47311         (altivec_vmrghw_direct): New define_insn.
47312         (*altivec_vmrghsf): Adjust for endianness.
47313         (altivec_vmrglb): Replace with define_expand and new
47314         *altivec_vmrglb_internal insn; adjust for -maltivec=be with LE targets.
47315         (altivec_vmrglb_direct): New define_insn.
47316         (altivec_vmrglh): Replace with define_expand and new
47317         *altivec_vmrglh_internal insn; adjust for -maltivec=be with LE targets.
47318         (altivec_vmrglh_direct): New define_insn.
47319         (altivec_vmrglw): Replace with define_expand and new
47320         *altivec_vmrglw_internal insn; adjust for -maltivec=be with LE targets.
47321         (altivec_vmrglw_direct): New define_insn.
47322         (*altivec_vmrglsf): Adjust for endianness.
47323         (vec_widen_umult_hi_v16qi): Use gen_altivec_vmrghh_direct.
47324         (vec_widen_umult_lo_v16qi): Use gen_altivec_vmrglh_direct.
47325         (vec_widen_smult_hi_v16qi): Use gen_altivec_vmrghh_direct.
47326         (vec_widen_smult_lo_v16qi): Use gen_altivec_vmrglh_direct.
47327         (vec_widen_umult_hi_v8hi): Use gen_altivec_vmrghw_direct.
47328         (vec_widen_umult_lo_v8hi): Use gen_altivec_vmrglw_direct.
47329         (vec_widen_smult_hi_v8hi): Use gen_altivec_vmrghw_direct.
47330         (vec_widen_smult_lo_v8hi): Use gen_altivec_vmrglw_direct.
47331
47332 2014-01-29  Marcus Shawcroft  <marcus.shawcroft@arm.com>
47333
47334         * config/aarch64/aarch64.c (aarch64_expand_mov_immediate)
47335         (aarch64_legitimate_address_p, aarch64_class_max_nregs): Adjust
47336         whitespace.
47337
47338 2014-01-29  Richard Biener  <rguenther@suse.de>
47339
47340         PR tree-optimization/58742
47341         * tree-ssa-forwprop.c (associate_pointerplus): Rename to
47342         associate_pointerplus_align.
47343         (associate_pointerplus_diff): New function.
47344         (associate_pointerplus): Likewise.  Call associate_pointerplus_align
47345         and associate_pointerplus_diff.
47346
47347 2014-01-29  Richard Biener  <rguenther@suse.de>
47348
47349         * lto-streamer.h (LTO_major_version): Bump to 3.
47350         (LTO_minor_version): Reset to 0.
47351
47352 2014-01-29  Renlin Li  <Renlin.Li@arm.com>
47353
47354         * config/arm/arm-arches.def (ARM_ARCH): Add armv7ve arch.
47355         * config/arm/arm.c (FL_FOR_ARCH7VE): New.
47356         (arm_file_start): Generate correct asm header for armv7ve.
47357         * config/arm/bpabi.h: Add multilib support for armv7ve.
47358         * config/arm/driver-arm.c: Change the architectures of cortex-a7
47359         and cortex-a15 to armv7ve.
47360         * config/arm/t-aprofile: Add multilib support for armv7ve.
47361         * doc/invoke.texi: Document -march=armv7ve.
47362
47363 2014-01-29  Richard Biener  <rguenther@suse.de>
47364
47365         PR tree-optimization/58742
47366         * tree-ssa-forwprop.c (associate_plusminus): Return true
47367         if we changed sth, defer EH cleanup to ...
47368         (ssa_forward_propagate_and_combine): ... here.  Call simplify_mult.
47369         (simplify_mult): New function.
47370
47371 2014-01-29  Jakub Jelinek  <jakub@redhat.com>
47372
47373         PR middle-end/59917
47374         PR tree-optimization/59920
47375         * tree.c (build_common_builtin_nodes): Remove
47376         __builtin_setjmp_dispatcher initialization.
47377         * omp-low.h (make_gimple_omp_edges): Add a new int * argument.
47378         * profile.c (branch_prob): Use gsi_start_nondebug_after_labels_bb
47379         instead of gsi_after_labels + manually skipping debug stmts.
47380         Don't ignore bbs with BUILT_IN_SETJMP_DISPATCHER, instead
47381         ignore bbs with IFN_ABNORMAL_DISPATCHER.
47382         * tree-inline.c (copy_edges_for_bb): Remove
47383         can_make_abnormal_goto argument, instead add abnormal_goto_dest
47384         argument.  Ignore computed_goto_p stmts.  Don't call
47385         make_abnormal_goto_edges.  If a call might need abnormal edges
47386         for non-local gotos, see if it already has an edge to
47387         IFN_ABNORMAL_DISPATCHER or if it is IFN_ABNORMAL_DISPATCHER
47388         with true argument, don't do anything then, otherwise add
47389         EDGE_ABNORMAL from the call's bb to abnormal_goto_dest.
47390         (copy_cfg_body): Compute abnormal_goto_dest, adjust copy_edges_for_bb
47391         caller.
47392         * gimple-low.c (struct lower_data): Remove calls_builtin_setjmp.
47393         (lower_function_body): Don't emit __builtin_setjmp_dispatcher.
47394         (lower_stmt): Don't set data->calls_builtin_setjmp.
47395         (lower_builtin_setjmp): Adjust comment.
47396         * builtins.def (BUILT_IN_SETJMP_DISPATCHER): Remove.
47397         * tree-cfg.c (found_computed_goto): Remove.
47398         (factor_computed_gotos): Remove.
47399         (make_goto_expr_edges): Return bool, true for computed gotos.
47400         Don't call make_abnormal_goto_edges.
47401         (build_gimple_cfg): Don't set found_computed_goto, don't call
47402         factor_computed_gotos.
47403         (computed_goto_p): No longer static.
47404         (make_blocks): Don't set found_computed_goto.
47405         (get_abnormal_succ_dispatcher, handle_abnormal_edges): New functions.
47406         (make_edges): If make_goto_expr_edges returns true, push bb
47407         into ab_edge_goto vector, for stmt_can_make_abnormal_goto calls
47408         instead of calling make_abnormal_goto_edges push bb into ab_edge_call
47409         vector.  Record mapping between bbs and OpenMP regions if there
47410         are any, adjust make_gimple_omp_edges caller.  Call
47411         handle_abnormal_edges.
47412         (make_abnormal_goto_edges): Remove.
47413         * tree-cfg.h (make_abnormal_goto_edges): Remove.
47414         (computed_goto_p, get_abnormal_succ_dispatcher): New prototypes.
47415         * internal-fn.c (expand_ABNORMAL_DISPATCHER): New function.
47416         * builtins.c (expand_builtin): Don't handle BUILT_IN_SETJMP_DISPATCHER.
47417         * internal-fn.def (ABNORMAL_DISPATCHER): New.
47418         * omp-low.c (make_gimple_omp_edges): Add region_idx argument, when
47419         filling *region also set *region_idx to (*region)->entry->index.
47420
47421         PR other/58712
47422         * read-rtl.c (read_rtx_code): Clear all of RTX_CODE_SIZE (code).
47423         For REGs set ORIGINAL_REGNO.
47424
47425 2014-01-29  Bingfeng Mei  <bmei@broadcom.com>
47426
47427         * doc/md.texi: Mention that a target shouldn't implement
47428         vec_widen_(s|u)mul_even/odd pair if it is less efficient
47429         than hi/lo pair.
47430
47431 2014-01-29  Jakub Jelinek  <jakub@redhat.com>
47432
47433         PR tree-optimization/59594
47434         * tree-vect-data-refs.c (vect_analyze_data_ref_accesses): Sort
47435         a copy of the datarefs vector rather than the vector itself.
47436
47437 2014-01-28  Jason Merrill  <jason@redhat.com>
47438
47439         PR c++/53756
47440         * dwarf2out.c (auto_die): New static.
47441         (gen_type_die_with_usage): Handle C++1y 'auto'.
47442         (gen_subprogram_die): If in-class DIE had 'auto', emit type again
47443         on definition.
47444
47445 2014-01-28  H.J. Lu  <hongjiu.lu@intel.com>
47446
47447         PR target/59672
47448         * config/i386/gnu-user64.h (SPEC_32): Add "m16|" to "m32".
47449         (SPEC_X32): Likewise.
47450         (SPEC_64): Likewise.
47451         * config/i386/i386.c (ix86_option_override_internal): Turn off
47452         OPTION_MASK_ISA_64BIT, OPTION_MASK_ABI_X32 and OPTION_MASK_ABI_64
47453         for TARGET_16BIT.
47454         (x86_file_start): Output .code16gcc for TARGET_16BIT.
47455         * config/i386/i386.h (TARGET_16BIT): New macro.
47456         (TARGET_16BIT_P): Likewise.
47457         * config/i386/i386.opt: Add m16.
47458         * doc/invoke.texi: Document -m16.
47459
47460 2014-01-28  Jakub Jelinek  <jakub@redhat.com>
47461
47462         PR preprocessor/59935
47463         * input.c (location_get_source_line): Bail out on when line number
47464         is zero, and test the return value of lookup_or_add_file_to_cache_tab.
47465
47466 2014-01-28  Richard Biener  <rguenther@suse.de>
47467
47468         PR tree-optimization/58742
47469         * tree-ssa-forwprop.c (associate_plusminus): Handle
47470         pointer subtraction of the form (T)(P + A) - (T)P.
47471
47472 2014-01-28  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
47473
47474         * config/arm/arm.c (arm_new_rtx_costs): Remove useless statement
47475         at const_int_cost.
47476
47477 2014-01-28  Richard Biener  <rguenther@suse.de>
47478
47479         Revert
47480         2014-01-28  Richard Biener  <rguenther@suse.de>
47481
47482         PR rtl-optimization/45364
47483         PR rtl-optimization/59890
47484         * var-tracking.c (local_get_addr_clear_given_value): Handle
47485         already cleared slot.
47486         (val_reset): Handle not allocated local_get_addr_cache.
47487         (vt_find_locations): Use post-order on the inverted CFG.
47488
47489 2014-01-28  Richard Biener  <rguenther@suse.de>
47490
47491         * tree-data-ref.h (ddr_is_anti_dependent, ddrs_have_anti_deps): Remove.
47492
47493 2014-01-28  Richard Biener  <rguenther@suse.de>
47494
47495         PR rtl-optimization/45364
47496         PR rtl-optimization/59890
47497         * var-tracking.c (local_get_addr_clear_given_value): Handle
47498         already cleared slot.
47499         (val_reset): Handle not allocated local_get_addr_cache.
47500         (vt_find_locations): Use post-order on the inverted CFG.
47501
47502 2014-01-28  Alan Modra  <amodra@gmail.com>
47503
47504         * Makefile.in (BUILD_CPPFLAGS): Do not use ALL_CPPFLAGS.
47505         * configure.ac <recursive call for build != host>: Define
47506         GENERATOR_FILE.  Comment.  Use CXX_FOR_BUILD, CXXFLAGS_FOR_BUILD
47507         and LD_FOR_BUILD too.
47508         * configure: Regenerate.
47509
47510 2014-01-27  Allan Sandfeld Jensen  <sandfeld@kde.org>
47511
47512         * config/i386/i386.c (get_builtin_code_for_version): Separate
47513         Westmere from Nehalem, Ivy Bridge from Sandy Bridge and
47514         Broadwell from Haswell.
47515
47516 2014-01-27  Steve Ellcey  <sellcey@mips.com>
47517
47518         * common/config/mips/mips-common.c (TARGET_DEFAULT_TARGET_FLAGS):
47519         Remove TARGET_FP_EXCEPTIONS_DEFAULT and MASK_FUSED_MADD.
47520         * config/mips/mips.c (mips_option_override): Change setting
47521         of TARGET_DSP.
47522         * config/mips/mips.h (TARGET_FP_EXCEPTIONS_DEFAULT): Remove.
47523         * config/mips/mips.opt (DSP, DSPR2, FP_EXCEPTIONS, FUSED_MADD, MIPS3D):
47524         Change from Mask to Var.
47525
47526 2014-01-27  Jeff Law  <law@redhat.com>
47527
47528         * ipa-inline.c (inline_small_functions): Fix typo.
47529
47530 2014-01-27  Ilya Tocar  <ilya.tocar@intel.com>
47531
47532         * config/i386/avx512fintrin.h (_mm512_mask_cvtepi32_storeu_epi8): New.
47533         (_mm512_mask_cvtsepi32_storeu_epi8): Ditto.
47534         (_mm512_mask_cvtusepi32_storeu_epi8): Ditto.
47535         (_mm512_mask_cvtepi32_storeu_epi16): Ditto.
47536         (_mm512_mask_cvtsepi32_storeu_epi16): Ditto.
47537         (_mm512_mask_cvtusepi32_storeu_epi16): Ditto.
47538         (_mm512_mask_cvtepi64_storeu_epi32): Ditto.
47539         (_mm512_mask_cvtsepi64_storeu_epi32): Ditto.
47540         (_mm512_mask_cvtusepi64_storeu_epi32): Ditto.
47541         (_mm512_mask_cvtepi64_storeu_epi16): Ditto.
47542         (_mm512_mask_cvtsepi64_storeu_epi16): Ditto.
47543         (_mm512_mask_cvtusepi64_storeu_epi16): Ditto.
47544         (_mm512_mask_cvtepi64_storeu_epi8): Ditto.
47545         (_mm512_mask_cvtsepi64_storeu_epi8): Ditto.
47546         (_mm512_mask_cvtusepi64_storeu_epi8): Ditto.
47547         (_mm512_storeu_epi64): Ditto.
47548         (_mm512_cmpge_epi32_mask): Ditto.
47549         (_mm512_cmpge_epu32_mask): Ditto.
47550         (_mm512_cmpge_epi64_mask): Ditto.
47551         (_mm512_cmpge_epu64_mask): Ditto.
47552         (_mm512_cmple_epi32_mask): Ditto.
47553         (_mm512_cmple_epu32_mask): Ditto.
47554         (_mm512_cmple_epi64_mask): Ditto.
47555         (_mm512_cmple_epu64_mask): Ditto.
47556         (_mm512_cmplt_epi32_mask): Ditto.
47557         (_mm512_cmplt_epu32_mask): Ditto.
47558         (_mm512_cmplt_epi64_mask): Ditto.
47559         (_mm512_cmplt_epu64_mask): Ditto.
47560         (_mm512_cmpneq_epi32_mask): Ditto.
47561         (_mm512_cmpneq_epu32_mask): Ditto.
47562         (_mm512_cmpneq_epi64_mask): Ditto.
47563         (_mm512_cmpneq_epu64_mask): Ditto.
47564         (_mm512_expand_pd): Ditto.
47565         (_mm512_expand_ps): Ditto.
47566         * config/i386/i386-builtin-types.def: Add PV16QI, PV16QI, PV16HI,
47567         VOID_PV8SI_V8DI_QI, VOID_PV8HI_V8DI_QI, VOID_PV16QI_V8DI_QI,
47568         VOID_PV16QI_V16SI_HI, VOID_PV16HI_V16SI_HI.
47569         * config/i386/i386.c (ix86_builtins): Add
47570         IX86_BUILTIN_EXPANDPD512_NOMASK, IX86_BUILTIN_EXPANDPS512_NOMASK,
47571         IX86_BUILTIN_PMOVDB512_MEM, IX86_BUILTIN_PMOVDW512_MEM,
47572         IX86_BUILTIN_PMOVQB512_MEM, IX86_BUILTIN_PMOVQD512_MEM,
47573         IX86_BUILTIN_PMOVQW512_MEM, IX86_BUILTIN_PMOVSDB512_MEM,
47574         IX86_BUILTIN_PMOVSDW512_MEM, IX86_BUILTIN_PMOVSQB512_MEM,
47575         IX86_BUILTIN_PMOVSQD512_MEM, IX86_BUILTIN_PMOVSQW512_MEM,
47576         IX86_BUILTIN_PMOVUSDB512_MEM, IX86_BUILTIN_PMOVUSDW512_MEM,
47577         IX86_BUILTIN_PMOVUSQB512_MEM, IX86_BUILTIN_PMOVUSQD512_MEM,
47578         IX86_BUILTIN_PMOVUSQW512_MEM.
47579         (bdesc_special_args): Add __builtin_ia32_pmovusqd512mem_mask,
47580         __builtin_ia32_pmovsqd512mem_mask,
47581         __builtin_ia32_pmovqd512mem_mask,
47582         __builtin_ia32_pmovusqw512mem_mask,
47583         __builtin_ia32_pmovsqw512mem_mask,
47584         __builtin_ia32_pmovqw512mem_mask,
47585         __builtin_ia32_pmovusdw512mem_mask,
47586         __builtin_ia32_pmovsdw512mem_mask,
47587         __builtin_ia32_pmovdw512mem_mask,
47588         __builtin_ia32_pmovqb512mem_mask,
47589         __builtin_ia32_pmovusqb512mem_mask,
47590         __builtin_ia32_pmovsqb512mem_mask,
47591         __builtin_ia32_pmovusdb512mem_mask,
47592         __builtin_ia32_pmovsdb512mem_mask,
47593         __builtin_ia32_pmovdb512mem_mask.
47594         (bdesc_args): Add __builtin_ia32_expanddf512,
47595         __builtin_ia32_expandsf512.
47596         (ix86_expand_special_args_builtin): Handle VOID_FTYPE_PV8SI_V8DI_QI,
47597         VOID_FTYPE_PV8HI_V8DI_QI, VOID_FTYPE_PV16HI_V16SI_HI,
47598         VOID_FTYPE_PV16QI_V8DI_QI, VOID_FTYPE_PV16QI_V16SI_HI.
47599         * config/i386/sse.md (unspec): Add UNSPEC_EXPAND_NOMASK.
47600         (avx512f_<code><pmov_src_lower><mode>2_mask_store): New.
47601         (*avx512f_<code>v8div16qi2_store_mask): Renamed to ...
47602         (avx512f_<code>v8div16qi2_mask_store): This.
47603         (avx512f_expand<mode>): New.
47604
47605 2014-01-27  Kirill Yukhin  <kirill.yukhin@intel.com>
47606
47607         * config/i386/avx512pfintrin.h (_mm512_mask_prefetch_i32gather_pd):
47608         New.
47609         (_mm512_mask_prefetch_i64gather_pd): Ditto.
47610         (_mm512_prefetch_i32scatter_pd): Ditto.
47611         (_mm512_mask_prefetch_i32scatter_pd): Ditto.
47612         (_mm512_prefetch_i64scatter_pd): Ditto.
47613         (_mm512_mask_prefetch_i64scatter_pd): Ditto.
47614         (_mm512_mask_prefetch_i32gather_ps): Fix operand type.
47615         (_mm512_mask_prefetch_i64gather_ps): Ditto.
47616         (_mm512_prefetch_i32scatter_ps): Ditto.
47617         (_mm512_mask_prefetch_i32scatter_ps): Ditto.
47618         (_mm512_prefetch_i64scatter_ps): Ditto.
47619         (_mm512_mask_prefetch_i64scatter_ps): Ditto.
47620         * config/i386/i386-builtin-types.def: Define
47621         VOID_FTYPE_QI_V8SI_PCINT64_INT_INT
47622         and VOID_FTYPE_QI_V8DI_PCINT64_INT_INT.
47623         * config/i386/i386.c (ix86_builtins): Define IX86_BUILTIN_GATHERPFQPD,
47624         IX86_BUILTIN_GATHERPFDPD, IX86_BUILTIN_SCATTERPFDPD,
47625         IX86_BUILTIN_SCATTERPFQPD.
47626         (ix86_init_mmx_sse_builtins): Define __builtin_ia32_gatherpfdpd,
47627         __builtin_ia32_gatherpfdps, __builtin_ia32_gatherpfqpd,
47628         __builtin_ia32_gatherpfqps, __builtin_ia32_scatterpfdpd,
47629         __builtin_ia32_scatterpfdps, __builtin_ia32_scatterpfqpd,
47630         __builtin_ia32_scatterpfqps.
47631         (ix86_expand_builtin): Expand new built-ins.
47632         * config/i386/sse.md (avx512pf_gatherpf<mode>): Add SF suffix,
47633         fix memory access data type.
47634         (*avx512pf_gatherpf<mode>_mask): Ditto.
47635         (*avx512pf_gatherpf<mode>): Ditto.
47636         (avx512pf_scatterpf<mode>): Ditto.
47637         (*avx512pf_scatterpf<mode>_mask): Ditto.
47638         (*avx512pf_scatterpf<mode>): Ditto.
47639         (GATHER_SCATTER_SF_MEM_MODE): New.
47640         (avx512pf_gatherpf<mode>df): Ditto.
47641         (*avx512pf_gatherpf<mode>df_mask): Ditto.
47642         (*avx512pf_scatterpf<mode>df): Ditto.
47643
47644 2014-01-27  Jakub Jelinek  <jakub@redhat.com>
47645
47646         PR bootstrap/59934
47647         * expmed.h (expmed_mode_index): Rework so that analysis and optimziers
47648         know when the MODE_PARTIAL_INT and MODE_VECTOR_INT cases can never be
47649         reached.
47650
47651 2014-01-27  James Greenhalgh  <james.greenhalgh@arm.com>
47652
47653         * common/config/arm/arm-common.c
47654         (arm_rewrite_mcpu): Handle multiple names.
47655         * config/arm/arm.h
47656         (BIG_LITTLE_SPEC): Do not discard mcpu switches.
47657
47658 2014-01-27  James Greenhalgh  <james.greenhalgh@arm.com>
47659
47660         * gimple-builder.h (create_gimple_tmp): Delete.
47661
47662 2014-01-27  Christian Bruel  <christian.bruel@st.com>
47663
47664         * config/sh/sh-mem.cc (sh_expand_cmpnstr): Fix remaining bytes after
47665         words comparisons.
47666
47667 2014-01-26  John David Anglin  <danglin@gcc.gnu.org>
47668
47669         * config/pa/pa.md (call): Generate indirect long calls to non-local
47670         functions when outputing 32-bit code.
47671         (call_value): Likewise except for special call to buggy powf function.
47672
47673         * config/pa/pa.c (pa_attr_length_indirect_call): Adjust length of
47674         portable runtime and PIC indirect calls.
47675         (pa_output_indirect_call): Remove unnecessary nop from portable runtime
47676         and PIC call sequences.  Use ldo instead of blr to set return register
47677         in PIC call sequence.
47678
47679 2014-01-25  Walter Lee  <walt@tilera.com>
47680
47681         * config/tilegx/sync.md (atomic_fetch_sub): Fix negation and
47682         avoid clobbering a live register.
47683
47684 2014-01-25  Walter Lee  <walt@tilera.com>
47685
47686         * config/tilegx/tilegx-c.c (tilegx_cpu_cpp_builtins):
47687         Define __GCC_HAVE_SYNC_COMPARE_AND_SWAP_{1,2}.
47688         * config/tilegx/tilepro-c.c (tilepro_cpu_cpp_builtins):
47689         Define __GCC_HAVE_SYNC_COMPARE_AND_SWAP_{1,2,4,8}.
47690
47691 2014-01-25  Walter Lee  <walt@tilera.com>
47692
47693         * config/tilegx/tilegx.c (tilegx_function_arg): Start 16-byte
47694         arguments on even registers.
47695         (tilegx_gimplify_va_arg_expr): Align 16-byte var args to
47696         STACK_BOUNDARY.
47697         * config/tilegx/tilegx.h (STACK_BOUNDARY): Change to 16 bytes.
47698         (BIGGEST_ALIGNMENT): Ditto.
47699         (BIGGEST_FIELD_ALIGNMENT): Ditto.
47700
47701 2014-01-25  Walter Lee  <walt@tilera.com>
47702
47703         * config/tilegx/tilegx.c (tilegx_gen_bundles): Delete barrier
47704         insns before bundling.
47705         * config/tilegx/tilegx.md (tile_network_barrier): Update comment.
47706
47707 2014-01-25  Walter Lee  <walt@tilera.com>
47708
47709         * config/tilegx/tilegx.c (tilegx_expand_builtin): Set
47710         PREFETCH_SCHEDULE_BARRIER_P to true for prefetches.
47711         * config/tilepro/tilepro.c (tilepro_expand_builtin): Ditto.
47712
47713 2014-01-25  Richard Sandiford  <rdsandiford@googlemail.com>
47714
47715         * config/mips/constraints.md (kl): Delete.
47716         * config/mips/mips.md (divmod<mode>4, udivmod<mode>4): Turn into
47717         define expands, using...
47718         (divmod<mode>4_mips16, udivmod<mode>4_mips16): ...these new
47719         instructions for MIPS16.
47720         (*divmod<mode>4, *udivmod<mode>4): New patterns, taken from the
47721         non-MIPS16 version of the old divmod<mode>4 and udivmod<mode>4.
47722
47723 2014-01-25  Walter Lee  <walt@tilera.com>
47724
47725         * config/tilepro/tilepro.md (ctzdi2): Use register_operand predicate.
47726         (clzdi2): Ditto.
47727         (ffsdi2): Ditto.
47728
47729 2014-01-25  Walter Lee  <walt@tilera.com>
47730
47731         * config/tilegx/tilegx.c (tilegx_expand_to_rtl_hook): New.
47732         (TARGET_EXPAND_TO_RTL_HOOK): Define.
47733
47734 2014-01-25  Richard Sandiford  <rdsandiford@googlemail.com>
47735
47736         * rtlanal.c (canonicalize_condition): Split out duplicated mode check.
47737         Handle XOR.
47738
47739 2014-01-25  Jakub Jelinek  <jakub@redhat.com>
47740
47741         * print-rtl.c (in_call_function_usage): New var.
47742         (print_rtx): When in CALL_INSN_FUNCTION_USAGE, always print
47743         EXPR_LIST mode as mode and not as reg note name.
47744
47745         PR middle-end/59561
47746         * cfgloopmanip.c (copy_loop_info): If
47747         loop->warned_aggressive_loop_optimizations, make sure
47748         the flag is set in target loop too.
47749
47750 2014-01-24  Balaji V. Iyer  <balaji.v.iyer@intel.com>
47751
47752         * builtins.c (is_builtin_name): Renamed flag_enable_cilkplus to
47753         flag_cilkplus.
47754         * builtins.def: Likewise.
47755         * cilk.h (fn_contains_cilk_spawn_p): Likewise.
47756         * cppbuiltin.c (define_builtin_macros_for_compilation_flags): Likewise.
47757         * ira.c (ira_setup_eliminable_regset): Likewise.
47758         * omp-low.c (gate_expand_omp): Likewise.
47759         (execute_lower_omp): Likewise.
47760         (diagnose_sb_0): Likewise.
47761         (gate_diagnose_omp_blocks): Likewise.
47762         (simd_clone_clauses_extract): Likewise.
47763         (gate): Likewise.
47764
47765 2014-01-24  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
47766
47767         * config/rs6000/rs6000.c (rs6000_expand_vec_perm_const_1): Remove
47768         correction for little endian...
47769         * config/rs6000/vsx.md (vsx_xxpermdi2_<mode>_1): ...and move it to
47770         here.
47771
47772 2014-01-24  Jeff Law  <law@redhat.com>
47773
47774         PR tree-optimization/59919
47775         * tree-vrp.c (find_assert_locations_1): Do not register asserts
47776         for non-returning calls.
47777
47778 2014-01-24  James Greenhalgh  <james.greenhalgh@arm.com>
47779
47780         * common/config/aarch64/aarch64-common.c
47781         (aarch64_rewrite_mcpu): Handle multiple names.
47782         * config/aarch64/aarch64.h
47783         (BIG_LITTLE_SPEC): Do not discard mcpu switches.
47784
47785 2014-01-24  Dodji Seketeli  <dodji@redhat.com>
47786
47787         * input.c (add_file_to_cache_tab): Handle the case where fopen
47788         returns NULL.
47789
47790 2014-01-23  H.J. Lu  <hongjiu.lu@intel.com>
47791
47792         PR target/59929
47793         * config/i386/i386.md (pushsf splitter): Get stack adjustment
47794         from push operand if code of push isn't PRE_DEC.
47795
47796 2014-01-23  Michael Meissner  <meissner@linux.vnet.ibm.com>
47797
47798         PR target/59909
47799         * doc/invoke.texi (RS/6000 and PowerPC Options): Document
47800         -mquad-memory-atomic.  Update -mquad-memory documentation to say
47801         it is only used for non-atomic loads/stores.
47802
47803         * config/rs6000/predicates.md (quad_int_reg_operand): Allow either
47804         -mquad-memory or -mquad-memory-atomic switches.
47805
47806         * config/rs6000/rs6000-cpus.def (ISA_2_7_MASKS_SERVER): Add
47807         -mquad-memory-atomic to ISA 2.07 support.
47808
47809         * config/rs6000/rs6000.opt (-mquad-memory-atomic): Add new switch
47810         to separate support of normal quad word memory operations (ldq, stq)
47811         from the atomic quad word memory operations.
47812
47813         * config/rs6000/rs6000.c (rs6000_option_override_internal): Add
47814         support to separate non-atomic quad word operations from atomic
47815         quad word operations.  Disable non-atomic quad word operations in
47816         little endian mode so that we don't have to swap words after the
47817         load and before the store.
47818         (quad_load_store_p): Add comment about atomic quad word support.
47819         (rs6000_opt_masks): Add -mquad-memory-atomic to the list of
47820         options printed with -mdebug=reg.
47821
47822         * config/rs6000/rs6000.h (TARGET_SYNC_TI): Use
47823         -mquad-memory-atomic as the test for whether we have quad word
47824         atomic instructions.
47825         (TARGET_SYNC_HI_QI): If either -mquad-memory-atomic, -mquad-memory,
47826         or -mp8-vector are used, allow byte/half-word atomic operations.
47827
47828         * config/rs6000/sync.md (load_lockedti): Insure that the address
47829         is a proper indexed or indirect address for the lqarx instruction.
47830         On little endian systems, swap the hi/lo registers after the lqarx
47831         instruction.
47832         (load_lockedpti): Use indexed_or_indirect_operand predicate to
47833         insure the address is valid for the lqarx instruction.
47834         (store_conditionalti): Insure that the address is a proper indexed
47835         or indirect address for the stqcrx. instruction.  On little endian
47836         systems, swap the hi/lo registers before doing the stqcrx.
47837         instruction.
47838         (store_conditionalpti): Use indexed_or_indirect_operand predicate to
47839         insure the address is valid for the stqcrx. instruction.
47840
47841         * gcc/config/rs6000/rs6000-c.c (rs6000_target_modify_macros):
47842         Define __QUAD_MEMORY__ and __QUAD_MEMORY_ATOMIC__ based on what
47843         type of quad memory support is available.
47844
47845 2014-01-23  Vladimir Makarov  <vmakarov@redhat.com>
47846
47847         PR regression/59915
47848         * lra-constraints.c (simplify_operand_subreg): Spill pseudo if
47849         there is a danger of looping.
47850
47851 2014-01-23  Pat Haugen  <pthaugen@us.ibm.com>
47852
47853         * config/rs6000/rs6000.c (rs6000_option_override_internal): Don't
47854         force flag_ira_loop_pressure if set via command line.
47855
47856 2014-01-23  Alex Velenko  <Alex.Velenko@arm.com>
47857
47858         * config/aarch64/aarch64-simd-builtins.def (ashr): DI mode removed.
47859         (ashr_simd): New builtin handling DI mode.
47860         * config/aarch64/aarch64-simd.md (aarch64_ashr_simddi): New pattern.
47861         (aarch64_sshr_simddi): New match pattern.
47862         * config/aarch64/arm_neon.h (vshr_n_s32): Builtin call modified.
47863         (vshrd_n_s64): Likewise.
47864         * config/aarch64/predicates.md (aarch64_shift_imm64_di): New predicate.
47865
47866 2014-01-23  Nick Clifton  <nickc@redhat.com>
47867
47868         * config/msp430/msp430.h (ASM_SPEC): Pass the -mcpu as -mcpu.
47869         (LIB_SPEC): Drop use of memory.ld and peripherals.ld scripts in
47870         favour of mcu specific scripts.
47871         * config/msp430/t-msp430 (MULTILIB_MATCHES): Add more matches for
47872         430x multilibs.
47873
47874 2014-01-23  James Greenhalgh  <james.greenhalgh@arm.com>
47875             Alex Velenko  <Alex.Velenko@arm.com>
47876
47877         * config/aarch64/arm_neon.h (vaddv_s8): __LANE0 cleanup.
47878         (vaddv_s16): Likewise.
47879         (vaddv_s32): Likewise.
47880         (vaddv_u8): Likewise.
47881         (vaddv_u16): Likewise.
47882         (vaddv_u32): Likewise.
47883         (vaddvq_s8): Likewise.
47884         (vaddvq_s16): Likewise.
47885         (vaddvq_s32): Likewise.
47886         (vaddvq_s64): Likewise.
47887         (vaddvq_u8): Likewise.
47888         (vaddvq_u16): Likewise.
47889         (vaddvq_u32): Likewise.
47890         (vaddvq_u64): Likewise.
47891         (vaddv_f32): Likewise.
47892         (vaddvq_f32): Likewise.
47893         (vaddvq_f64): Likewise.
47894         (vmaxv_f32): Likewise.
47895         (vmaxv_s8): Likewise.
47896         (vmaxv_s16): Likewise.
47897         (vmaxv_s32): Likewise.
47898         (vmaxv_u8): Likewise.
47899         (vmaxv_u16): Likewise.
47900         (vmaxv_u32): Likewise.
47901         (vmaxvq_f32): Likewise.
47902         (vmaxvq_f64): Likewise.
47903         (vmaxvq_s8): Likewise.
47904         (vmaxvq_s16): Likewise.
47905         (vmaxvq_s32): Likewise.
47906         (vmaxvq_u8): Likewise.
47907         (vmaxvq_u16): Likewise.
47908         (vmaxvq_u32): Likewise.
47909         (vmaxnmv_f32): Likewise.
47910         (vmaxnmvq_f32): Likewise.
47911         (vmaxnmvq_f64): Likewise.
47912         (vminv_f32): Likewise.
47913         (vminv_s8): Likewise.
47914         (vminv_s16): Likewise.
47915         (vminv_s32): Likewise.
47916         (vminv_u8): Likewise.
47917         (vminv_u16): Likewise.
47918         (vminv_u32): Likewise.
47919         (vminvq_f32): Likewise.
47920         (vminvq_f64): Likewise.
47921         (vminvq_s8): Likewise.
47922         (vminvq_s16): Likewise.
47923         (vminvq_s32): Likewise.
47924         (vminvq_u8): Likewise.
47925         (vminvq_u16): Likewise.
47926         (vminvq_u32): Likewise.
47927         (vminnmv_f32): Likewise.
47928         (vminnmvq_f32): Likewise.
47929         (vminnmvq_f64): Likewise.
47930
47931 2014-01-23  James Greenhalgh  <james.greenhalgh@arm.com>
47932
47933         * config/aarch64/aarch64-simd.md
47934         (aarch64_dup_lane<mode>): Correct lane number on big-endian.
47935         (aarch64_dup_lane_<vswap_widthi_name><mode>): Likewise.
47936         (*aarch64_mul3_elt<mode>): Likewise.
47937         (*aarch64_mul3_elt<vswap_width_name><mode>): Likewise.
47938         (*aarch64_mul3_elt_to_64v2df): Likewise.
47939         (*aarch64_mla_elt<mode>): Likewise.
47940         (*aarch64_mla_elt_<vswap_width_name><mode>): Likewise.
47941         (*aarch64_mls_elt<mode>): Likewise.
47942         (*aarch64_mls_elt_<vswap_width_name><mode>): Likewise.
47943         (*aarch64_fma4_elt<mode>): Likewise.
47944         (*aarch64_fma4_elt_<vswap_width_name><mode>): Likewise.
47945         (*aarch64_fma4_elt_to_64v2df): Likewise.
47946         (*aarch64_fnma4_elt<mode>): Likewise.
47947         (*aarch64_fnma4_elt_<vswap_width_name><mode>): Likewise.
47948         (*aarch64_fnma4_elt_to_64v2df): Likewise.
47949         (aarch64_sq<r>dmulh_lane<mode>): Likewise.
47950         (aarch64_sq<r>dmulh_laneq<mode>): Likewise.
47951         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal): Likewise.
47952         (aarch64_sqdml<SBINQOPS:as>l_lane<mode>_internal): Likewise.
47953         (aarch64_sqdml<SBINQOPS:as>l2_lane<mode>_internal): Likewise.
47954         (aarch64_sqdmull_lane<mode>_internal): Likewise.
47955         (aarch64_sqdmull2_lane<mode>_internal): Likewise.
47956
47957 2013-01-23  Alex Velenko  <Alex.Velenko@arm.com>
47958
47959         * config/aarch64/aarch64-simd.md
47960         (aarch64_be_checked_get_lane<mode>): New define_expand.
47961         * config/aarch64/aarch64-simd-builtins.def
47962         (BUILTIN_VALL (GETLANE, be_checked_get_lane, 0)):
47963         New builtin definition.
47964         * config/aarch64/arm_neon.h: (__aarch64_vget_lane_any):
47965         Use new safe be builtin.
47966
47967 2014-01-23  Alex Velenko  <Alex.Velenko@arm.com>
47968
47969         * config/aarch64/aarch64-simd.md (aarch64_be_ld1<mode>):
47970         New define_insn.
47971         (aarch64_be_st1<mode>): Likewise.
47972         (aarch_ld1<VALL:mode>): Define_expand modified.
47973         (aarch_st1<VALL:mode>): Likewise.
47974         * config/aarch64/aarch64.md (UNSPEC_LD1): New unspec definition.
47975         (UNSPEC_ST1): Likewise.
47976
47977 2014-01-23  David Holsgrove  <david.holsgrove@xilinx.com>
47978
47979         * config/microblaze/microblaze.md: Add trap insn and attribute
47980
47981 2014-01-23  Dodji Seketeli  <dodji@redhat.com>
47982
47983         PR preprocessor/58580
47984         * input.h (location_get_source_line): Take an additional line_size
47985         parameter.
47986         (void diagnostics_file_cache_fini): Declare new function.
47987         * input.c (struct fcache): New type.
47988         (fcache_tab_size, fcache_buffer_size, fcache_line_record_size):
47989         New static constants.
47990         (diagnostic_file_cache_init, total_lines_num)
47991         (lookup_file_in_cache_tab, evicted_cache_tab_entry)
47992         (add_file_to_cache_tab, lookup_or_add_file_to_cache_tab)
47993         (needs_read, needs_grow, maybe_grow, read_data, maybe_read_data)
47994         (get_next_line, read_next_line, goto_next_line, read_line_num):
47995         New static function definitions.
47996         (diagnostic_file_cache_fini): New function.
47997         (location_get_source_line): Take an additional output line_len
47998         parameter.  Re-write using lookup_or_add_file_to_cache_tab and
47999         read_line_num.
48000         * diagnostic.c (diagnostic_finish): Call
48001         diagnostic_file_cache_fini.
48002         (adjust_line): Take an additional input parameter for the length
48003         of the line, rather than calculating it with strlen.
48004         (diagnostic_show_locus): Adjust the use of
48005         location_get_source_line and adjust_line with respect to their new
48006         signature.  While displaying a line now, do not stop at the first
48007         null byte.  Rather, display the zero byte as a space and keep
48008         going until we reach the size of the line.
48009         * Makefile.in: Add vec.o to OBJS-libcommon
48010
48011 2014-01-23  Kirill Yukhin  <kirill.yukhin@intel.com>
48012             Ilya Tocar  <ilya.tocar@intel.com>
48013
48014         * config/i386/avx512fintrin.h (_mm512_kmov): New.
48015         * config/i386/i386.c (IX86_BUILTIN_KMOV16): Ditto.
48016         (__builtin_ia32_kmov16): Ditto.
48017         * config/i386/i386.md (UNSPEC_KMOV): New.
48018         (kmovw): Ditto.
48019
48020 2014-01-23  Kirill Yukhin  <kirill.yukhin@intel.com>
48021
48022         * config/i386/avx512fintrin.h (_mm512_loadu_si512): Rename.
48023         (_mm512_storeu_si512): Ditto.
48024
48025 2014-01-23  Richard Sandiford  <rdsandiford@googlemail.com>
48026
48027         PR target/52125
48028         * rtl.h (get_referenced_operands): Declare.
48029         * recog.c (get_referenced_operands): New function.
48030         * config/mips/mips.c (mips_reorg_process_insns): Check which asm
48031         operands have been referenced when recording LO_SUM references.
48032
48033 2014-01-22  David Holsgrove  <david.holsgrove@xilinx.com>
48034
48035         * config/microblaze/microblaze.md: Correct bswaphi2 insn.
48036
48037 2014-01-22  Jan Hubicka  <hubicka@ucw.cz>
48038
48039         * config/i386/x86-tune.def (X86_TUNE_ACCUMULATE_OUTGOING_ARGS):
48040         Enable for generic and recent AMD targets.
48041
48042 2014-01-22  Jan Hubicka  <hubicka@ucw.cz>
48043
48044         * combine-stack-adj.c (combine_stack_adjustments_for_block): Remove
48045         ARG_SIZE note when adjustment was eliminated.
48046
48047 2014-01-22  Jeff Law  <law@redhat.com>
48048
48049         PR tree-optimization/59597
48050         * tree-ssa-threadupdate.c (dump_jump_thread_path): Move to earlier
48051         in file.  Accept new argument REGISTERING and use it to modify
48052         dump output appropriately.
48053         (register_jump_thread): Corresponding changes.
48054         (mark_threaded_blocks): Reinstate code to cancel unprofitable
48055         thread paths involving joiner blocks.  Add code to dump cancelled
48056         jump threading paths.
48057
48058 2014-01-22  Vladimir Makarov  <vmakarov@redhat.com>
48059
48060         PR rtl-optimization/59477
48061         * lra-constraints.c (inherit_in_ebb): Process call for living hard
48062         regs.  Update reloads_num and potential_reload_hard_regs for all insns.
48063
48064 2014-01-22  Tom Tromey  <tromey@redhat.com>
48065
48066         * config/i386/i386-interix.h (i386_pe_unique_section): Don't use
48067         PARAMS.
48068         * config/cr16/cr16-protos.h (notice_update_cc): Don't use PARAMS.
48069
48070 2014-01-21  Vladimir Makarov  <vmakarov@redhat.com>
48071
48072         PR rtl-optimization/59896
48073         * lra-constraints.c (process_alt_operands): Check unused note for
48074         matched operands of insn with no output reloads.
48075
48076 2014-01-21  Richard Sandiford  <rdsandiford@googlemail.com>
48077
48078         * config/mips/mips.c (mips_move_to_gpr_cost): Add M16_REGS case.
48079         (mips_move_from_gpr_cost): Likewise.
48080
48081 2014-01-21  Vladimir Makarov  <vmakarov@redhat.com>
48082
48083         PR rtl-optimization/59858
48084         * lra-constraints.c (SMALL_REGISTER_CLASS_P): Use
48085         ira_class_hard_regs_num.
48086         (process_alt_operands): Increase reject for dying matched operand.
48087
48088 2014-01-21  Jakub Jelinek  <jakub@redhat.com>
48089
48090         PR target/59003
48091         * config/i386/i386.c (expand_small_movmem_or_setmem): If mode is
48092         smaller than size, perform several stores or loads and stores
48093         at dst + count - size to store or copy all of size bytes, rather
48094         than just last modesize bytes.
48095
48096 2014-01-20  DJ Delorie  <dj@redhat.com>
48097
48098         * config/rl78/rl78.c (rl78_propogate_register_origins): Verify
48099         that CLOBBERs are REGs before propogating their values.
48100
48101 2014-01-20  H.J. Lu  <hongjiu.lu@intel.com>
48102
48103         PR middle-end/59789
48104         * cgraph.c (cgraph_inline_failed_string): Add type to DEFCIFCODE.
48105         (cgraph_inline_failed_type): New function.
48106         * cgraph.h (DEFCIFCODE): Add type.
48107         (cgraph_inline_failed_type_t): New enum.
48108         (cgraph_inline_failed_type): New prototype.
48109         * cif-code.def: Add CIF_FINAL_NORMAL to OK, FUNCTION_NOT_CONSIDERED,
48110         FUNCTION_NOT_OPTIMIZED, REDEFINED_EXTERN_INLINE,
48111         FUNCTION_NOT_INLINE_CANDIDATE, LARGE_FUNCTION_GROWTH_LIMIT,
48112         LARGE_STACK_FRAME_GROWTH_LIMIT, MAX_INLINE_INSNS_SINGLE_LIMIT,
48113         MAX_INLINE_INSNS_AUTO_LIMIT, INLINE_UNIT_GROWTH_LIMIT,
48114         RECURSIVE_INLINING, UNLIKELY_CALL, NOT_DECLARED_INLINED,
48115         OPTIMIZING_FOR_SIZE, ORIGINALLY_INDIRECT_CALL,
48116         INDIRECT_UNKNOWN_CALL, USES_COMDAT_LOCAL.
48117         Add CIF_FINAL_ERROR to UNSPECIFIED, BODY_NOT_AVAILABLE,
48118         FUNCTION_NOT_INLINABLE, OVERWRITABLE, MISMATCHED_ARGUMENTS,
48119         EH_PERSONALITY, NON_CALL_EXCEPTIONS, TARGET_OPTION_MISMATCH,
48120         OPTIMIZATION_MISMATCH.
48121         * tree-inline.c (expand_call_inline): Emit errors during
48122         early_inlining if cgraph_inline_failed_type returns CIF_FINAL_ERROR.
48123
48124 2014-01-20  Uros Bizjak  <ubizjak@gmail.com>
48125
48126         PR target/59685
48127         * config/i386/sse.md (*andnot<mode>3<mask_name>): Handle MODE_V16SF
48128         mode attribute in insn output.
48129
48130 2014-01-20  Eric Botcazou  <ebotcazou@adacore.com>
48131
48132         * output.h (output_constant): Delete.
48133         * varasm.c (output_constant): Make private.
48134
48135 2014-01-20  Alex Velenko  <Alex.Velenko@arm.com>
48136
48137         * config/aarch64/aarch64-simd.md (vec_perm<mode>): Add BE check.
48138
48139 2014-01-20  Jakub Jelinek  <jakub@redhat.com>
48140
48141         PR middle-end/59860
48142         * tree.h (fold_builtin_strcat): New prototype.
48143         * builtins.c (fold_builtin_strcat): No longer static.  Add len
48144         argument, if non-NULL, don't call c_strlen.  Optimize
48145         directly into __builtin_memcpy instead of __builtin_strcpy.
48146         (fold_builtin_2): Adjust fold_builtin_strcat caller.
48147         * gimple-fold.c (gimple_fold_builtin): Handle BUILT_IN_STRCAT.
48148
48149 2014-01-20  Uros Bizjak  <ubizjak@gmail.com>
48150
48151         * config/i386/i386.c (ix86_avoid_lea_for_addr): Return false
48152         for SImode_address_operand operands, having only a REG argument.
48153
48154 2014-01-20  Marcus Shawcroft  <marcus.shawcroft@arm.com>
48155
48156         * config/aarch64/aarch64-linux.h (GLIBC_DYNAMIC_LINKER): Expand
48157         loader name using mbig-endian.
48158         (LINUX_TARGET_LINK_SPEC): Pass linker -m flag.
48159
48160 2014-01-20  James Greenhalgh  <james.greenhalgh@arm.com>
48161
48162         * doc/invoke.texi (-march): Clarify documentation for AArch64.
48163         (-mtune): Likewise.
48164         (-mcpu): Likewise.
48165
48166 2014-01-20  Tejas Belagod  <tejas.belagod@arm.com>
48167
48168         * config/aarch64/aarch64-protos.h
48169         (aarch64_cannot_change_mode_class_ptr): Declare.
48170         * config/aarch64/aarch64.c (aarch64_cannot_change_mode_class,
48171         aarch64_cannot_change_mode_class_ptr): New.
48172         * config/aarch64/aarch64.h (CANNOT_CHANGE_MODE_CLASS): Change to call
48173         backend hook aarch64_cannot_change_mode_class.
48174
48175 2014-01-20  James Greenhalgh  <james.greenhalgh@arm.com>
48176
48177         * common/config/aarch64/aarch64-common.c
48178         (aarch64_handle_option): Don't handle any option order logic here.
48179         * config/aarch64/aarch64.c (aarch64_parse_arch): Do not override
48180         selected_cpu, warn on architecture version mismatch.
48181         (aarch64_override_options): Fix parsing order for option strings.
48182
48183 2014-01-20  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
48184             Iain Sandoe  <iain@codesourcery.com>
48185
48186         PR bootstrap/59496
48187         * config/rs6000/darwin.h (ADJUST_FIELD_ALIGN): Fix unused variable
48188         warning.  Amend comment to reflect current functionality.
48189
48190 2014-01-20  Richard Biener  <rguenther@suse.de>
48191
48192         PR middle-end/59860
48193         * builtins.c (fold_builtin_strcat): Remove case better handled
48194         by tree-ssa-strlen.c.
48195
48196 2014-01-20  Alan Lawrence  <alan.lawrence@arm.com>
48197
48198         * config/aarch64/aarch64.opt
48199         (mcpu, march, mtune): Make case-insensitive.
48200
48201 2014-01-20  Jakub Jelinek  <jakub@redhat.com>
48202
48203         PR target/59880
48204         * config/i386/i386.c (ix86_avoid_lea_for_addr): Return false
48205         if operands[1] is a REG or ZERO_EXTEND of a REG.
48206
48207 2014-01-19  Jan Hubicka  <hubicka@ucw.cz>
48208
48209         * varasm.c (compute_reloc_for_constant): Use targetm.binds_local_p.
48210
48211 2014-01-19  John David Anglin  <danglin@gcc.gnu.org>
48212
48213         * config/pa/pa.c (pa_attr_length_millicode_call): Correct length of
48214         long non-pic millicode calls.
48215
48216 2014-01-19  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
48217
48218         * config/vax/vax.h (FUNCTION_ARG_REGNO_P): Fix unused variable warning.
48219
48220 2014-01-19  Kito Cheng  <kito@0xlab.org>
48221
48222         * builtins.c (expand_movstr): Check movstr expand done or fail.
48223
48224 2014-01-18  Uros Bizjak  <ubizjak@gmail.com>
48225             H.J. Lu  <hongjiu.lu@intel.com>
48226
48227         PR target/59379
48228         * config/i386/i386.md (*lea<mode>): Zero-extend return register
48229         to DImode for zero-extended addresses.
48230
48231 2014-01-19  Jakub Jelinek  <jakub@redhat.com>
48232
48233         PR rtl-optimization/57763
48234         * bb-reorder.c (fix_crossing_unconditional_branches): Set JUMP_LABEL
48235         on the new indirect jump_insn and increment LABEL_NUSES (label).
48236
48237 2014-01-18  H.J. Lu  <hongjiu.lu@intel.com>
48238
48239         PR bootstrap/59580
48240         PR bootstrap/59583
48241         * config.gcc (x86_archs): New variable.
48242         (x86_64_archs): Likewise.
48243         (x86_cpus): Likewise.
48244         Use $x86_archs, $x86_64_archs and $x86_cpus to check valid
48245         --with-arch/--with-cpu= options.
48246         Support --with-arch=/--with-cpu={nehalem,westmere,
48247         sandybridge,ivybridge,haswell,broadwell,bonnell,silvermont}.
48248
48249 2014-01-18  Uros Bizjak  <ubizjak@gmail.com>
48250
48251         * config/i386/i386.c (ix86_adjust_cost): Reorder PROCESSOR_K8
48252         and PROCESSOR_ATHLON to simplify code.  Move "memory" calculation.
48253
48254 2014-01-18  Uros Bizjak  <ubizjak@gmail.com>
48255
48256         * config/i386/i386.md (*swap<mode>): Rename from swap<mode>.
48257
48258 2014-01-18  Jakub Jelinek  <jakub@redhat.com>
48259
48260         PR target/58944
48261         * config/i386/i386-c.c (ix86_pragma_target_parse): Temporarily
48262         clear cpp_get_options (parse_in)->warn_unused_macros for
48263         ix86_target_macros_internal with cpp_define.
48264
48265 2014-01-18  Richard Sandiford  <rdsandiford@googlemail.com>
48266
48267         * jump.c (delete_related_insns): Keep (use (insn))s.
48268         * reorg.c (redundant_insn): Check for barriers too.
48269
48270 2014-01-17  H.J. Lu  <hongjiu.lu@intel.com>
48271
48272         * config/i386/i386.c (ix86_split_lea_for_addr): Fix a comment typo.
48273
48274 2014-01-17  John David Anglin  <danglin@gcc.gnu.org>
48275
48276         * config/pa/pa.c (pa_attr_length_indirect_call): Don't output a short
48277         call to $$dyncall when TARGET_LONG_CALLS is true.
48278
48279 2014-01-17  Jeff Law  <law@redhat.com>
48280
48281         * ree.c (combine_set_extension): Temporarily disable test for
48282         changing number of hard registers.
48283
48284 2014-01-17  Jan Hubicka  <hubicka@ucw.cz>
48285
48286         PR middle-end/58125
48287         * ipa-inline-analysis.c (inline_free_summary):
48288         Do not free summary of aliases.
48289
48290 2014-01-17  Jakub Jelinek  <jakub@redhat.com>
48291
48292         PR middle-end/59706
48293         * gimplify.c (gimplify_expr): Use create_tmp_var
48294         instead of create_tmp_var_raw.  If cond doesn't have
48295         integral type, don't add the IFN_ANNOTATE builtin at all.
48296
48297 2014-01-17  Martin Jambor  <mjambor@suse.cz>
48298
48299         PR ipa/59736
48300         * ipa-cp.c (prev_edge_clone): New variable.
48301         (grow_next_edge_clone_vector): Renamed to grow_edge_clone_vectors.
48302         Also resize prev_edge_clone vector.
48303         (ipcp_edge_duplication_hook): Also update prev_edge_clone.
48304         (ipcp_edge_removal_hook): New function.
48305         (ipcp_driver): Register ipcp_edge_removal_hook.
48306
48307 2014-01-17  Andrew Pinski  <apinski@cavium.com>
48308             Steve Ellcey  <sellcey@mips.com>
48309
48310         PR target/59462
48311         * config/mips/mips.c (mips_print_operand): Check operand mode instead
48312         of operator mode.
48313
48314 2014-01-17  Jeff Law  <law@redhat.com>
48315
48316         PR middle-end/57904
48317         * passes.def: Reorder pass_copy_prop, pass_unrolli, pass_ccp sequence
48318         so that pass_ccp runs first.
48319
48320 2014-01-17  H.J. Lu  <hongjiu.lu@intel.com>
48321
48322         * config/i386/i386.c (ix86_lea_outperforms): Use TARGET_XXX.
48323         (ix86_adjust_cost): Use !TARGET_XXX.
48324         (do_reorder_for_imul): Likewise.
48325         (swap_top_of_ready_list): Likewise.
48326         (ix86_sched_reorder): Likewise.
48327
48328 2014-01-17  H.J. Lu  <hongjiu.lu@intel.com>
48329
48330         * config/i386/i386-c.c (ix86_target_macros_internal): Handle
48331         PROCESSOR_INTEL.  Treat like PROCESSOR_GENERIC.
48332         * config/i386/i386.c (intel_memcpy): New.  Duplicate slm_memcpy.
48333         (intel_memset): New.  Duplicate slm_memset.
48334         (intel_cost): New.  Duplicate slm_cost.
48335         (m_INTEL): New macro.
48336         (processor_target_table): Add "intel".
48337         (ix86_option_override_internal): Replace PROCESSOR_SILVERMONT
48338         with PROCESSOR_INTEL for "intel".
48339         (ix86_lea_outperforms): Support PROCESSOR_INTEL.  Duplicate
48340         PROCESSOR_SILVERMONT.
48341         (ix86_issue_rate): Likewise.
48342         (ix86_adjust_cost): Likewise.
48343         (ia32_multipass_dfa_lookahead): Likewise.
48344         (swap_top_of_ready_list): Likewise.
48345         (ix86_sched_reorder): Likewise.
48346         (ix86_avoid_lea_for_addr): Check TARGET_AVOID_LEA_FOR_ADDR
48347         instead of TARGET_OPT_AGU.
48348         * config/i386/i386.h (TARGET_INTEL): New.
48349         (TARGET_AVOID_LEA_FOR_ADDR): Likewise.
48350         (processor_type): Add PROCESSOR_INTEL.
48351         * config/i386/x86-tune.def: Support m_INTEL. Duplicate m_SILVERMONT.
48352         Add X86_TUNE_AVOID_LEA_FOR_ADDR.
48353
48354 2014-01-17  Marek Polacek  <polacek@redhat.com>
48355
48356         PR c/58346
48357         * gimple-fold.c (fold_array_ctor_reference): Don't fold if element
48358         size is zero.
48359
48360 2014-01-17  Richard Biener  <rguenther@suse.de>
48361
48362         PR tree-optimization/46590
48363         * opts.c (default_options_table): Add entries for
48364         OPT_fbranch_count_reg, OPT_fmove_loop_invariants and OPT_ftree_pta,
48365         all enabled at -O1 but not for -Og.
48366         * common.opt (fbranch-count-reg): Remove Init(1).
48367         (fmove-loop-invariants): Likewise.
48368         (ftree-pta): Likewise.
48369
48370 2014-01-17  Jakub Jelinek  <jakub@redhat.com>
48371
48372         * config/i386/i386.c (ix86_data_alignment): For compatibility with
48373         (incorrect) GCC 4.8 and earlier alignment assumptions ensure we align
48374         decls to at least the GCC 4.8 used alignments.
48375
48376         PR fortran/59440
48377         * tree-nested.c (convert_nonlocal_reference_stmt,
48378         convert_local_reference_stmt): For NAMELIST_DECLs in gimple_bind_vars
48379         of GIMPLE_BIND stmts, adjust associated decls.
48380
48381 2014-01-17  Richard Biener  <rguenther@suse.de>
48382
48383         PR tree-optimization/46590
48384         * vec.h (vec<>::bseach): New member function implementing
48385         binary search according to C89 bsearch.
48386         (vec<>::qsort): Avoid calling ::qsort for vectors with sizes 0 or 1.
48387         * tree-ssa-loop-im.c (struct mem_ref): Make stored member a
48388         bitmap pointer again.  Make accesses_in_loop a flat array.
48389         (mem_ref_obstack): New global.
48390         (outermost_indep_loop): Adjust for mem_ref->stored changes.
48391         (mark_ref_stored): Likewise.
48392         (ref_indep_loop_p_2): Likewise.
48393         (set_ref_stored_in_loop): New helper function.
48394         (mem_ref_alloc): Allocate mem_refs on the mem_ref_obstack obstack.
48395         (memref_free): Adjust.
48396         (record_mem_ref_loc): Simplify.
48397         (gather_mem_refs_stmt): Adjust.
48398         (sort_locs_in_loop_postorder_cmp): New function.
48399         (analyze_memory_references): Sort accesses_in_loop after
48400         loop postorder number.
48401         (find_ref_loc_in_loop_cmp): New function.
48402         (for_all_locs_in_loop): Find relevant cluster of locs in
48403         accesses_in_loop and iterate without recursion.
48404         (execute_sm): Avoid uninit warning.
48405         (struct ref_always_accessed): Simplify.
48406         (ref_always_accessed::operator ()): Likewise.
48407         (ref_always_accessed_p): Likewise.
48408         (tree_ssa_lim_initialize): Initialize mem_ref_obstack, compute
48409         loop postorder numbers here.
48410         (tree_ssa_lim_finalize): Free mem_ref_obstack and loop postorder
48411         numbers.
48412
48413 2014-01-17  Jan Hubicka  <hubicka@ucw.cz>
48414
48415         PR c++/57945
48416         * passes.c (rest_of_decl_compilation): Don't call varpool_finalize_decl
48417         on decls for which assemble_alias has been called.
48418
48419 2014-01-17  Nick Clifton  <nickc@redhat.com>
48420
48421         * config/msp430/msp430.opt: (mcpu): New option.
48422         * config/msp430/msp430.c (msp430_mcu_name): Use target_mcu.
48423         (msp430_option_override): Parse target_cpu.  If the MCU name
48424         matches a generic string, clear target_mcu.
48425         (msp430_attr): Allow numeric interrupt values up to 63.
48426         (msp430_expand_epilogue): No longer invert operand 1 of gen_popm.
48427         * config/msp430/msp430.h (ASM_SPEC): Convert -mcpu into a -mmcu
48428         option.
48429         * config/msp430/t-msp430: (MULTILIB_MATCHES): Remove mcu matches.
48430         Add mcpu matches.
48431         * config/msp430/msp430.md (popm): Use %J rather than %I.
48432         (addsi3): Use msp430_nonimmediate_operand for operand 2.
48433         (addhi_cy_i): Use immediate_operand for operand 2.
48434         * doc/invoke.texi: Document -mcpu option.
48435
48436 2014-01-17  Richard Biener  <rguenther@suse.de>
48437
48438         PR rtl-optimization/38518
48439         * df.h (df_analyze_loop): Declare.
48440         * df-core.c: Include cfgloop.h.
48441         (df_analyze_1): Split out main part of df_analyze.
48442         (df_analyze): Adjust.
48443         (loop_inverted_post_order_compute): New function.
48444         (loop_post_order_compute): Likewise.
48445         (df_analyze_loop): New function avoiding whole-function
48446         postorder computes.
48447         * loop-invariant.c (find_defs): Use df_analyze_loop.
48448         (find_invariants): Adjust.
48449         * loop-iv.c (iv_analysis_loop_init): Use df_analyze_loop.
48450
48451 2014-01-17  Zhenqiang Chen  <zhenqiang.chen@arm.com>
48452
48453         * config/arm/arm.c (arm_v7m_tune): Set max_insns_skipped to 2.
48454         (thumb2_final_prescan_insn): Set max to MAX_INSN_PER_IT_BLOCK.
48455
48456 2014-01-16  Ilya Enkovich  <ilya.enkovich@intel.com>
48457
48458         * ipa-ref.c (ipa_remove_stmt_references): Fix references
48459         traversal when removing references.
48460
48461 2014-01-16  Jan Hubicka  <hubicka@ucw.cz>
48462
48463         PR ipa/59775
48464         * tree.c (get_binfo_at_offset): Look harder for virtual bases.
48465
48466 2014-01-16  Bernd Schmidt  <bernds@codesourcery.com>
48467
48468         PR middle-end/56791
48469         * reload.c (find_reloads_address_1): Do not use RELOAD_OTHER when
48470         pushing a reload for an autoinc when we had previously reloaded an
48471         inner part of the address.
48472
48473 2014-01-16  Jakub Jelinek  <jakub@redhat.com>
48474
48475         * tree-vectorizer.h (struct _loop_vec_info): Add no_data_dependencies
48476         field.
48477         (LOOP_VINFO_NO_DATA_DEPENDENCIES): Define.
48478         * tree-vect-data-refs.c (vect_analyze_data_ref_dependence): Clear it
48479         when not giving up or versioning for alias only because of
48480         loop->safelen.
48481         (vect_analyze_data_ref_dependences): Set to true.
48482         * tree-vect-stmts.c (hoist_defs_of_uses): Return false if def_stmt
48483         is a GIMPLE_PHI.
48484         (vectorizable_load): Use LOOP_VINFO_NO_DATA_DEPENDENCIES instead of
48485         LOOP_REQUIRES_VERSIONING_FOR_ALIAS, add && !nested_in_vect_loop
48486         to the condition.
48487
48488         PR middle-end/58344
48489         * expr.c (expand_expr_real_1): Handle init == NULL_TREE.
48490
48491         PR target/59839
48492         * config/i386/i386.c (ix86_expand_builtin): If target doesn't satisfy
48493         operand 0 predicate for gathers, use a new pseudo as subtarget.
48494
48495 2014-01-16  Vladimir Makarov  <vmakarov@redhat.com>
48496
48497         PR middle-end/59609
48498         * lra-constraints.c (process_alt_operands): Add printing debug info.
48499         Check absence of input/output reloads for matched operands too.
48500
48501 2014-01-16  Vladimir Makarov  <vmakarov@redhat.com>
48502
48503         PR rtl-optimization/59835
48504         * ira.c (ira_init_register_move_cost): Increase cost for
48505         impossible modes.
48506
48507 2014-01-16  Alan Lawrence  <alan.lawrence@arm.com>
48508
48509         * config/arm/arm.opt (mcpu, march, mtune): Make case-insensitive.
48510
48511 2014-01-16  Richard Earnshaw  <rearnsha@arm.com>
48512
48513         PR target/59780
48514         * aarch64.c (aarch64_split_128bit_move): Don't lookup REGNO on
48515         non-register objects.  Use gen_(high/low)part more consistently.
48516         Fix assertions.
48517
48518 2014-01-16  Michael Meissner  <meissner@linux.vnet.ibm.com>
48519
48520         PR target/59844
48521         * config/rs6000/rs6000.md (reload_vsx_from_gprsf): Add little
48522         endian support, remove tests for WORDS_BIG_ENDIAN.
48523         (p8_mfvsrd_3_<mode>): Likewise.
48524         (reload_gpr_from_vsx<mode>): Likewise.
48525         (reload_gpr_from_vsxsf): Likewise.
48526         (p8_mfvsrd_4_disf): Likewise.
48527
48528 2014-01-16  Richard Biener  <rguenther@suse.de>
48529
48530         PR rtl-optimization/46590
48531         * lcm.c (compute_antinout_edge): Use postorder iteration.
48532         (compute_laterin): Use inverted postorder iteration.
48533
48534 2014-01-16  Nick Clifton  <nickc@redhat.com>
48535
48536         PR middle-end/28865
48537         * varasm.c (output_constant): Return the number of bytes actually
48538         emitted.
48539         (output_constructor_array_range): Update the field size with the
48540         number of bytes emitted by output_constant.
48541         (output_constructor_regular_field): Likewise.  Also do not
48542         complain if the total number of bytes emitted is now greater
48543         than the expected fieldpos.
48544         * output.h (output_constant): Update prototype and descriptive comment.
48545
48546 2014-01-16  Marek Polacek  <polacek@redhat.com>
48547
48548         PR middle-end/59827
48549         * cgraph.c (gimple_check_call_args): Don't use DECL_ARG_TYPE if
48550         it is error_mark_node.
48551
48552 2014-01-15  Uros Bizjak  <ubizjak@gmail.com>
48553
48554         * config/i386/i386.c (ix86_hard_regno_mode_ok): Use
48555         VALID_AVX256_REG_OR_OI_MODE.
48556
48557 2014-01-15  Pat Haugen  <pthaugen@us.ibm.com>
48558
48559         * config/rs6000/rs6000.c (rs6000_output_function_prologue): Check if
48560         current procedure should be profiled.
48561
48562 2014-01-15  Andrew Pinski  <apinski@cavium.com>
48563
48564         * config/aarch64/aarch64.c (aarch64_register_move_cost): Correct cost
48565         of moving from/to the STACK_REG register class.
48566
48567 2014-01-15  Richard Henderson  <rth@redhat.com>
48568
48569         PR debug/54694
48570         * reginfo.c (global_regs_decl): Globalize.
48571         * rtl.h (global_regs_decl): Declare.
48572         * ira.c (do_reload): Diagnose frame_pointer_needed and it
48573         reserved via global_regs.
48574
48575 2014-01-15  Teresa Johnson  <tejohnson@google.com>
48576
48577         * tree-ssa-sccvn.c (visit_reference_op_call): Handle NULL vdef.
48578
48579 2014-01-15  Bill Schmidt  <wschmidt@vnet.linux.ibm.com>
48580
48581         * config/rs6000/altivec.md (mulv8hi3): Explicitly generate vmulesh
48582         and vmulosh rather than call gen_vec_widen_smult_*.
48583         (vec_widen_umult_even_v16qi): Test VECTOR_ELT_ORDER_BIG rather
48584         than BYTES_BIG_ENDIAN to determine use of even or odd instruction.
48585         (vec_widen_smult_even_v16qi): Likewise.
48586         (vec_widen_umult_even_v8hi): Likewise.
48587         (vec_widen_smult_even_v8hi): Likewise.
48588         (vec_widen_umult_odd_v16qi): Likewise.
48589         (vec_widen_smult_odd_v16qi): Likewise.
48590         (vec_widen_umult_odd_v8hi): Likewise.
48591         (vec_widen_smult_odd_v8hi): Likewise.
48592         (vec_widen_umult_hi_v16qi): Explicitly generate vmuleub and
48593         vmuloub rather than call gen_vec_widen_umult_*.
48594         (vec_widen_umult_lo_v16qi): Likewise.
48595         (vec_widen_smult_hi_v16qi): Explicitly generate vmulesb and
48596         vmulosb rather than call gen_vec_widen_smult_*.
48597         (vec_widen_smult_lo_v16qi): Likewise.
48598         (vec_widen_umult_hi_v8hi): Explicitly generate vmuleuh and vmulouh
48599         rather than call gen_vec_widen_umult_*.
48600         (vec_widen_umult_lo_v8hi): Likewise.
48601         (vec_widen_smult_hi_v8hi): Explicitly gnerate vmulesh and vmulosh
48602         rather than call gen_vec_widen_smult_*.
48603         (vec_widen_smult_lo_v8hi): Likewise.
48604
48605 2014-01-15  Jeff Law  <law@redhat.com>
48606
48607         PR tree-optimization/59747
48608         * ree.c (find_and_remove_re): Properly handle case where a second
48609         eliminated extension requires widening a copy created for elimination
48610         of a prior extension.
48611         (combine_set_extension): Ensure that the number of hard regs needed
48612         for a destination register does not change when we widen it.
48613
48614 2014-01-15  Sebastian Huber  <sebastian.huber@embedded-brains.de>
48615
48616         * config.gcc (*-*-rtems*): Add t-rtems to tmake_file.
48617         (arm*-*-uclinux*eabi*): Do not override an existing tmake_file.
48618         (arm*-*-eabi* | arm*-*-symbianelf* | arm*-*-rtems*): Likwise.
48619         (arm*-*-rtems*): Use t-rtems from existing tmake_file.
48620         (avr-*-rtems*): Likewise.
48621         (bfin*-rtems*): Likewise.
48622         (moxie-*-rtems*): Likewise.
48623         (h8300-*-rtems*): Likewise.
48624         (i[34567]86-*-rtems*): Likewise.
48625         (lm32-*-rtems*): Likewise.
48626         (m32r-*-rtems*): Likewise.
48627         (m68k-*-rtems*): Likewise.
48628         (microblaze*-*-rtems*): Likewise.
48629         (mips*-*-rtems*): Likewise.
48630         (powerpc-*-rtems*): Likewise.
48631         (sh-*-rtems*): Likewise.
48632         (sparc-*-rtems*): Likewise.
48633         (sparc64-*-rtems*): Likewise.
48634         (v850-*-rtems*): Likewise.
48635         (m32c-*-rtems*): Likewise.
48636
48637 2014-01-15  Vladimir Makarov  <vmakarov@redhat.com>
48638
48639         PR rtl-optimization/59511
48640         * ira.c (ira_init_register_move_cost): Use memory costs for some
48641         cases of register move cost calculations.
48642         * lra-constraints.c (lra_constraints): Use REG_FREQ_FROM_BB
48643         instead of BB frequency.
48644         * lra-coalesce.c (move_freq_compare_func, lra_coalesce): Ditto.
48645         * lra-assigns.c (find_hard_regno_for): Ditto.
48646
48647 2014-01-15  Richard Biener  <rguenther@suse.de>
48648
48649         PR tree-optimization/59822
48650         * tree-vect-stmts.c (hoist_defs_of_uses): New function.
48651         (vectorizable_load): Use it to hoist defs of uses of invariant
48652         loads out of the loop.
48653
48654 2014-01-15  Matthew Gretton-Dann  <matthew.gretton-dann@linaro.org>
48655             Kugan Vivekanandarajah  <kuganv@linaro.org>
48656
48657         PR target/59695
48658         * config/aarch64/aarch64.c (aarch64_build_constant): Fix incorrect
48659         truncation.
48660
48661 2014-01-15  Richard Biener  <rguenther@suse.de>
48662
48663         PR rtl-optimization/59802
48664         * lcm.c (compute_available): Use inverted postorder to seed
48665         the initial worklist.
48666
48667 2014-01-15  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
48668
48669         PR target/59803
48670         * config/s390/s390.c (s390_preferred_reload_class): Don't return
48671         ADDR_REGS for invalid symrefs in non-PIC code.
48672
48673 2014-01-15  Jakub Jelinek  <jakub@redhat.com>
48674
48675         PR other/58712
48676         * builtins.c (determine_block_size): Initialize *probable_max_size
48677         even if len_rtx is CONST_INT.
48678
48679 2014-01-14  Andrew Pinski  <apinski@cavium.com>
48680
48681         * config/aarch64/aarch64-protos.h (tune_params): Add issue_rate.
48682         * config/aarch64/aarch64.c (generic_tunings): Add issue rate of 2.
48683         (cortexa53_tunings): Likewise.
48684         (aarch64_sched_issue_rate): New function.
48685         (TARGET_SCHED_ISSUE_RATE): Define.
48686
48687 2014-01-14  Vladimir Makarov  <vmakarov@redhat.com>
48688
48689         * ira-costs.c (find_costs_and_classes): Add missed
48690         ira_init_register_move_cost_if_necessary.
48691
48692 2014-01-14  Vladimir Makarov  <vmakarov@redhat.com>
48693
48694         PR target/59787
48695         * config/arm/arm.c (arm_coproc_mem_operand): Add lra_in_progress.
48696
48697 2014-01-14  H.J. Lu  <hongjiu.lu@intel.com>
48698
48699         PR target/59794
48700         * config/i386/i386.c (type_natural_mode): Add a bool parameter
48701         to indicate if type is used for function return value.  Warn ABI
48702         change if the vector mode isn't available for function return value.
48703         (ix86_function_arg_advance): Pass false to type_natural_mode.
48704         (ix86_function_arg): Likewise.
48705         (ix86_gimplify_va_arg): Likewise.
48706         (function_arg_32): Don't warn ABI change.
48707         (ix86_function_value): Pass true to type_natural_mode.
48708         (ix86_return_in_memory): Likewise.
48709         (ix86_struct_value_rtx): Removed.
48710         (TARGET_STRUCT_VALUE_RTX): Likewise.
48711
48712 2014-01-14  Richard Sandiford  <rsandifo@linux.vnet.ibm.com>
48713
48714         * jump.c (redirect_jump_2): Remove REG_CROSSING_JUMP notes when
48715         converting a conditional jump into a conditional return.
48716
48717 2014-01-14  Richard Biener  <rguenther@suse.de>
48718
48719         PR tree-optimization/58921
48720         PR tree-optimization/59006
48721         * tree-vect-loop-manip.c (vect_loop_versioning): Remove code
48722         hoisting invariant stmts.
48723         * tree-vect-stmts.c (vectorizable_load): Insert the splat of
48724         invariant loads on the preheader edge if possible.
48725
48726 2014-01-14  Joey Ye  <joey.ye@arm.com>
48727
48728         * doc/plugin.texi (Building GCC plugins): Update to C++.
48729
48730 2014-01-14  Kirill Yukhin  <kirill.yukhin@intel.com>
48731
48732         * config/i386/avx512erintrin.h (_mm_rcp28_round_sd): New.
48733         (_mm_rcp28_round_ss): Ditto.
48734         (_mm_rsqrt28_round_sd): Ditto.
48735         (_mm_rsqrt28_round_ss): Ditto.
48736         (_mm_rcp28_sd): Ditto.
48737         (_mm_rcp28_ss): Ditto.
48738         (_mm_rsqrt28_sd): Ditto.
48739         (_mm_rsqrt28_ss): Ditto.
48740         * config/i386/avx512fintrin.h (_mm512_stream_load_si512): Ditto.
48741         * config/i386/i386-builtin-types.def (V8DI_FTYPE_PV8DI): Ditto.
48742         * config/i386/i386.c (IX86_BUILTIN_MOVNTDQA512): Ditto.
48743         (IX86_BUILTIN_RCP28SD): Ditto.
48744         (IX86_BUILTIN_RCP28SS): Ditto.
48745         (IX86_BUILTIN_RSQRT28SD): Ditto.
48746         (IX86_BUILTIN_RSQRT28SS): Ditto.
48747         (bdesc_special_args): Define __builtin_ia32_movntdqa512,
48748         __builtin_ia32_rcp28sd_round, __builtin_ia32_rcp28ss_round,
48749         __builtin_ia32_rsqrt28sd_round, __builtin_ia32_rsqrt28ss_round.
48750         (ix86_expand_special_args_builtin): Expand new FTYPE.
48751         * config/i386/sse.md (define_mode_attr "sse4_1_avx2"): Expand to V8DI.
48752         (srcp14<mode>): Make insn unary.
48753         (avx512f_vmscalef<mode><round_name>): Use substed predicate.
48754         (avx512f_sgetexp<mode><round_saeonly_name>): Ditto.
48755         (avx512f_rndscale<mode><round_saeonly_name>): Ditto.
48756         (<sse4_1_avx2>_movntdqa): Extend to 512 bits.
48757         (avx512er_exp2<mode><mask_name><round_saeonly_name>):
48758         Fix rounding: make it SAE only.
48759         (<mask_codefor>avx512er_rcp28<mode><mask_name><round_saeonly_name>):
48760         Ditto.
48761         (<mask_codefor>avx512er_rsqrt28<mode><mask_name><round_saeonly_name>):
48762         Ditto.
48763         (avx512er_vmrcp28<mode><round_saeonly_name>): Ditto.
48764         (avx512er_vmrsqrt28<mode><round_saeonly_name>): Ditto.
48765         (avx512f_getmant<mode><mask_name><round_saeonly_name>): Ditto.
48766         * config/i386/subst.md (round_saeonly_mask_scalar_operand3): Remove.
48767         (round_saeonly_mask_scalar_operand4): Ditto.
48768         (round_saeonly_mask_scalar_op3): Ditto.
48769         (round_saeonly_mask_scalar_op4): Ditto.
48770
48771 2014-01-13  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
48772
48773         * config/rs6000/rs6000-c.c (altivec_resolve_overloaded_builtin):
48774         Implement -maltivec=be for vec_insert and vec_extract.
48775
48776 2014-01-10  DJ Delorie  <dj@redhat.com>
48777
48778         * config/msp430/msp430.md (call_internal): Don't allow memory
48779         references with SP as the base register.
48780         (call_value_internal): Likewise.
48781         * config/msp430/constraints.md (Yc): New.  For memory references
48782         that don't use SP as a base register.
48783
48784         * config/msp430/msp430.c (msp430_print_operand): Add 'J' to mean
48785         "an integer without a # prefix"
48786         * config/msp430/msp430.md (epilogue_helper): Use it.
48787
48788 2014-01-13  Jakub Jelinek  <jakub@redhat.com>
48789
48790         PR target/59617
48791         * config/i386/i386.c (ix86_vectorize_builtin_gather): Uncomment
48792         AVX512F gather builtins.
48793         * tree-vect-stmts.c (vectorizable_mask_load_store): For now punt
48794         on gather decls with INTEGER_TYPE masktype.
48795         (vectorizable_load): For INTEGER_TYPE masktype, put the INTEGER_CST
48796         directly into the builtin rather than hoisting it before loop.
48797
48798         PR tree-optimization/59387
48799         * tree-scalar-evolution.c: Include gimple-fold.h and gimplify-me.h.
48800         (scev_const_prop): If folded_casts and type has undefined overflow,
48801         use force_gimple_operand instead of force_gimple_operand_gsi and
48802         for each added stmt if it is assign with
48803         arith_code_with_undefined_signed_overflow, call
48804         rewrite_to_defined_overflow.
48805         * tree-ssa-loop-im.c: Don't include gimplify-me.h, include
48806         gimple-fold.h instead.
48807         (arith_code_with_undefined_signed_overflow,
48808         rewrite_to_defined_overflow): Moved to ...
48809         * gimple-fold.c (arith_code_with_undefined_signed_overflow,
48810         rewrite_to_defined_overflow): ... here.  No longer static.
48811         Include gimplify-me.h.
48812         * gimple-fold.h (arith_code_with_undefined_signed_overflow,
48813         rewrite_to_defined_overflow): New prototypes.
48814
48815 2014-01-13  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
48816
48817         * config/arm/arm.h (MAX_CONDITIONAL_EXECUTE): Fix typo in description.
48818
48819 2014-01-13  Eric Botcazou  <ebotcazou@adacore.com>
48820
48821         * builtins.c (get_object_alignment_2): Minor tweak.
48822         * tree-ssa-loop-ivopts.c (may_be_unaligned_p): Rewrite.
48823
48824 2014-01-13  Christian Bruel  <christian.bruel@st.com>
48825
48826         * config/sh/sh-mem.cc (sh_expand_cmpnstr): Unroll small sizes and
48827         optimized non constant lengths.
48828
48829 2014-01-13  Jakub Jelinek  <jakub@redhat.com>
48830
48831         PR libgomp/59194
48832         * omp-low.c (expand_omp_atomic_pipeline): Expand the initial
48833         load as __atomic_load_N if possible.
48834
48835 2014-01-11  David Edelsohn  <dje.gcc@gmail.com>
48836
48837         * config/rs6000/rs6000.c (rs6000_expand_mtfsf_builtin): Remove
48838         target parameter.
48839         (rs6000_expand_builtin): Adjust call.
48840
48841 2014-01-11  David Edelsohn  <dje.gcc@gmail.com>
48842
48843         PR target/58115
48844         * config/rs6000/rs6000.h (SWITCHABLE_TARGET): Define.
48845         * config/rs6000/rs6000.c: Include target-globals.h.
48846         (rs6000_set_current_function): Instead of doing target_reinit
48847         unconditionally, use save_target_globals_default_opts and
48848         restore_target_globals.
48849
48850         * config/rs6000/rs6000-builtin.def (mffs, mtfsf): Add builtins for
48851         FPSCR.
48852         * config/rs6000/rs6000.c (rs6000_expand_mtfsf_builtin): New.
48853         (rs6000_expand_builtin): Handle mffs and mtfsf.
48854         (rs6000_init_builtins): Define mffs and mtfsf.
48855         * config/rs6000/rs6000.md (UNSPECV_MFFS, UNSPECV_MTFSF): New constants.
48856         (rs6000_mffs): New pattern.
48857         (rs6000_mtfsf): New pattern.
48858
48859 2014-01-11  Bin Cheng  <bin.cheng@arm.com>
48860
48861         * tree-ssa-loop-ivopts.c (iv_ca_narrow): New parameter.
48862         Start narrowing with START.  Apply candidate-use pair
48863         and check overall cost in narrowing.
48864         (iv_ca_prune): Pass new argument.
48865
48866 2014-01-10  Jeff Law  <law@redhat.com>
48867
48868         PR middle-end/59743
48869         * ree.c (combine_reaching_defs): Ensure the defining statement
48870         occurs before the extension when optimizing extensions with
48871         different source and destination hard registers.
48872
48873 2014-01-10  Jan Hubicka  <hubicka@ucw.cz>
48874
48875         PR ipa/58585
48876         * ipa-devirt.c (build_type_inheritance_graph): Also add types of
48877         vtables into the type inheritance graph.
48878
48879 2014-01-10  Jakub Jelinek  <jakub@redhat.com>
48880
48881         PR rtl-optimization/59754
48882         * ree.c (combine_reaching_defs): Disallow !SCALAR_INT_MODE_P
48883         modes in the REGNO != REGNO case.
48884
48885 2014-01-10  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
48886
48887         * config/rs6000/rs6000-builtin.def: Fix pasto for VPKSDUS.
48888
48889 2014-01-10  Jakub Jelinek  <jakub@redhat.com>
48890
48891         PR tree-optimization/59745
48892         * tree-predcom.c (tree_predictive_commoning_loop): Call
48893         free_affine_expand_cache if giving up because components is NULL.
48894
48895         * target-globals.c (save_target_globals): Allocate < 4KB structs using
48896         GC in payload of target_globals struct instead of allocating them on
48897         the heap and the larger structs separately using GC.
48898         * target-globals.h (struct target_globals): Make regs, hard_regs,
48899         reload, expmed, ira, ira_int and lra_fields GTY((atomic)) instead
48900         of GTY((skip)) and change type to void *.
48901         (reset_target_globals): Cast loads from those fields to corresponding
48902         types.
48903
48904 2014-01-10  Steve Ellcey  <sellcey@mips.com>
48905
48906         PR plugins/59335
48907         * Makefile.in (PLUGIN_HEADERS): Add gimplify.h, gimple-iterator.h,
48908         gimple-ssa.h, fold-const.h, tree-cfg.h, tree-into-ssa.h,
48909         tree-ssanames.h, print-tree.h, varasm.h, and context.h.
48910
48911 2014-01-10  Richard Earnshaw  <rearnsha@arm.com>
48912
48913         PR target/59744
48914         * aarch64-modes.def (CC_Zmode): New flags mode.
48915         * aarch64.c (aarch64_select_cc_mode): Only allow NEG when the condition
48916         represents an equality.
48917         (aarch64_get_condition_code): Handle CC_Zmode.
48918         * aarch64.md (compare_neg<mode>): Restrict to equality operations.
48919
48920 2014-01-10  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
48921
48922         * config/s390/s390.c (s390_expand_tbegin): Remove jump over CC
48923         extraction in good case.
48924
48925 2014-01-10  Richard Biener  <rguenther@suse.de>
48926
48927         PR tree-optimization/59374
48928         * tree-vect-slp.c (vect_slp_analyze_bb_1): Move dependence
48929         checking after SLP discovery.  Mark stmts not participating
48930         in any SLP instance properly.
48931
48932 2014-01-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
48933
48934         * config/arm/arm.c (arm_new_rtx_costs): Use destination mode
48935         when handling a SET rtx.
48936
48937 2014-01-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
48938
48939         * config/arm/arm-cores.def (cortex-a53): Specify FL_CRC32.
48940         (cortex-a57): Likewise.
48941         (cortex-a57.cortex-a53): Likewise. Remove redundant flags.
48942
48943 2014-01-10  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
48944
48945         * config/arm/arm.c (arm_init_iwmmxt_builtins): Skip
48946         non-iwmmxt builtins.
48947
48948 2014-01-10  Jan Hubicka  <hubicka@ucw.cz>
48949
48950         PR ipa/58252
48951         PR ipa/59226
48952         * ipa-devirt.c record_target_from_binfo): Take as argument
48953         stack of binfos and lookup matching one for virtual inheritance.
48954         (possible_polymorphic_call_targets_1): Update.
48955
48956 2014-01-10  Huacai Chen  <chenhc@lemote.com>
48957
48958         * config/mips/driver-native.c (host_detect_local_cpu): Handle new
48959         kernel strings for Loongson-2E/2F/3A.
48960
48961 2014-01-10  Jakub Jelinek  <jakub@redhat.com>
48962
48963         PR middle-end/59670
48964         * tree-vect-data-refs.c (vect_analyze_data_refs): Check
48965         is_gimple_call before calling gimple_call_internal_p.
48966
48967 2014-01-09  Steve Ellcey  <sellcey@mips.com>
48968
48969         * Makefile.in (TREE_FLOW_H): Remove.
48970         (TREE_SSA_H): Add file names from tree-flow.h.
48971         * doc/tree-ssa.texi (Annotations): Remove reference to tree-flow.h
48972         * tree.h: Remove tree-flow.h reference.
48973         * hash-table.h: Remove tree-flow.h reference.
48974         * tree-ssa-loop-niter.c (dump_affine_iv): Replace tree-flow.h
48975         reference with tree-ssa-loop.h.
48976
48977 2014-01-09  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
48978
48979         * doc/invoke.texi: Add -maltivec={be,le} options, and document
48980         default element-order behavior for -maltivec.
48981         * config/rs6000/rs6000.opt: Add -maltivec={be,le} options.
48982         * config/rs6000/rs6000.c (rs6000_option_override_internal): Ensure
48983         that -maltivec={le,be} implies -maltivec; disallow -maltivec=le
48984         when targeting big endian, at least for now.
48985         * config/rs6000/rs6000.h: Add #define of VECTOR_ELT_ORDER_BIG.
48986
48987 2014-01-09  Jakub Jelinek  <jakub@redhat.com>
48988
48989         PR middle-end/47735
48990         * cfgexpand.c (expand_one_var): For SSA_NAMEs, if the underlying
48991         var satisfies use_register_for_decl, just take into account type
48992         alignment, rather than decl alignment.
48993
48994         PR tree-optimization/59622
48995         * gimple-fold.c (gimple_fold_call): Fix a typo in message.  For
48996         __builtin_unreachable replace the OBJ_TYPE_REF call with a call to
48997         __builtin_unreachable and add if needed a setter of the lhs SSA_NAME.
48998         Don't devirtualize for inplace at all.  For targets.length () == 1,
48999         if the call is noreturn and cfun isn't in SSA form yet, clear lhs.
49000
49001 2014-01-09  H.J. Lu  <hongjiu.lu@intel.com>
49002
49003         * config/i386/i386.md (cpu): Remove the unused btver1.
49004
49005 2014-01-09  H.J. Lu  <hongjiu.lu@intel.com>
49006
49007         * gdbasan.in: Put a breakpoint on __sanitizer::Report.
49008
49009 2014-01-09  Jakub Jelinek  <jakub@redhat.com>
49010
49011         PR target/58115
49012         * tree-core.h (struct target_globals): New forward declaration.
49013         (struct tree_target_option): Add globals field.
49014         * tree.h (TREE_TARGET_GLOBALS): Define.
49015         (prepare_target_option_nodes_for_pch): New prototype.
49016         * target-globals.h (struct target_globals): Define even if
49017         !SWITCHABLE_TARGET.
49018         * tree.c (prepare_target_option_node_for_pch,
49019         prepare_target_option_nodes_for_pch): New functions.
49020         * config/i386/i386.h (SWITCHABLE_TARGET): Define.
49021         * config/i386/i386.c: Include target-globals.h.
49022         (ix86_set_current_function): Instead of doing target_reinit
49023         unconditionally, use save_target_globals_default_opts and
49024         restore_target_globals.
49025
49026 2014-01-09  Richard Biener  <rguenther@suse.de>
49027
49028         PR tree-optimization/59715
49029         * tree-cfg.h (split_critical_edges): Declare.
49030         * tree-cfg.c (split_critical_edges): Export.
49031         * tree-ssa-sink.c (execute_sink_code): Split critical edges.
49032
49033 2014-01-09  Max Ostapenko  <m.ostapenko@partner.samsung.com>
49034
49035         * cfgexpand.c (expand_stack_vars): Optionally disable
49036         asan stack protection.
49037         (expand_used_vars): Likewise.
49038         (partition_stack_vars): Likewise.
49039         * asan.c (asan_emit_stack_protection): Optionally disable
49040         after return stack usage.
49041         (instrument_derefs): Optionally disable memory access instrumentation.
49042         (instrument_builtin_call): Likewise.
49043         (instrument_strlen_call): Likewise.
49044         (asan_protect_global): Optionally disable global variables protection.
49045         * doc/invoke.texi: Added doc for new options.
49046         * params.def: Added new options.
49047         * params.h: Likewise.
49048
49049 2014-01-09  Jakub Jelinek  <jakub@redhat.com>
49050
49051         PR rtl-optimization/59724
49052         * ifcvt.c (cond_exec_process_if_block): Don't call
49053         flow_find_head_matching_sequence with 0 longest_match.
49054         * cfgcleanup.c (flow_find_head_matching_sequence): Count even
49055         non-active insns if !stop_after.
49056         (try_head_merge_bb): Revert 2014-01-07 changes.
49057
49058 2014-01-08  Jeff Law  <law@redhat.com>
49059
49060         * ree.c (get_sub_rtx): New function, extracted from...
49061         (merge_def_and_ext): Here.
49062         (combine_reaching_defs): Use get_sub_rtx.
49063
49064 2014-01-08  Eric Botcazou  <ebotcazou@adacore.com>
49065
49066         * cgraph.h (varpool_variable_node): Do not choke on null node.
49067
49068 2014-01-08  Catherine Moore  <clm@codesourcery.com>
49069
49070         * config/mips/mips.md (simple_return): Attempt to use JRC
49071         for microMIPS.
49072         * config/mips/mips.h (MIPS_CALL): Attempt to use JALS for microMIPS.
49073
49074 2014-01-08  Richard Sandiford  <rdsandiford@googlemail.com>
49075
49076         PR rtl-optimization/59137
49077         * reorg.c (steal_delay_list_from_target): Call update_block for
49078         elided insns.
49079         (steal_delay_list_from_fallthrough, relax_delay_slots): Likewise.
49080
49081 2014-01-08  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
49082
49083         * config/rs6000/rs6000-c.c (altivec_overloaded_builtins): Remove
49084         two duplicate entries.
49085
49086 2014-01-08  Richard Sandiford  <rdsandiford@googlemail.com>
49087
49088         Revert:
49089         2012-10-07  Richard Sandiford  <rdsandiford@googlemail.com>
49090
49091         * config/mips/mips.c (mips_truncated_op_cost): New function.
49092         (mips_rtx_costs): Adjust test for BADDU.
49093         * config/mips/mips.md (*baddu_di<mode>): Push truncates to operands.
49094
49095         2012-10-02  Richard Sandiford  <rdsandiford@googlemail.com>
49096
49097         * config/mips/mips.md (*baddu_si_eb, *baddu_si_el): Merge into...
49098         (*baddu_si): ...this new pattern.
49099
49100 2014-01-08  Jakub Jelinek  <jakub@redhat.com>
49101
49102         PR ipa/59722
49103         * ipa-prop.c (ipa_analyze_params_uses): Ignore uses in debug stmts.
49104
49105 2014-01-08  Bernd Edlinger  <bernd.edlinger@hotmail.de>
49106
49107         PR middle-end/57748
49108         * expr.h (expand_expr_real, expand_expr_real_1): Add new parameter
49109         inner_reference_p.
49110         (expand_expr, expand_normal): Adjust.
49111         * expr.c (expand_expr_real, expand_expr_real_1): Add new parameter
49112         inner_reference_p. Use inner_reference_p to expand inner references.
49113         (store_expr): Adjust.
49114         * cfgexpand.c (expand_call_stmt): Adjust.
49115
49116 2014-01-08  Rong Xu  <xur@google.com>
49117
49118         * gcov-io.c (gcov_var): Move from gcov-io.h.
49119         (gcov_position): Ditto.
49120         (gcov_is_error): Ditto.
49121         (gcov_rewrite): Ditto.
49122         * gcov-io.h: Refactor. Move gcov_var to gcov-io.h, and libgcov
49123         only part to libgcc/libgcov.h.
49124
49125 2014-01-08  Marek Polacek  <polacek@redhat.com>
49126
49127         PR middle-end/59669
49128         * omp-low.c (simd_clone_adjust): Don't crash if def is NULL.
49129
49130 2014-01-08  Marek Polacek  <polacek@redhat.com>
49131
49132         PR sanitizer/59667
49133         * ubsan.c (ubsan_type_descriptor): Call strip_array_types on type2.
49134
49135 2014-01-08  Jakub Jelinek  <jakub@redhat.com>
49136
49137         PR rtl-optimization/59649
49138         * stor-layout.c (get_mode_bounds): For BImode return
49139         0 and STORE_FLAG_VALUE.
49140
49141 2014-01-08  Richard Biener  <rguenther@suse.de>
49142
49143         PR middle-end/59630
49144         * gimple.h (is_gimple_builtin_call): Remove.
49145         (gimple_builtin_call_types_compatible_p): New.
49146         (gimple_call_builtin_p): New overload.
49147         * gimple.c (is_gimple_builtin_call): Remove.
49148         (validate_call): Rename to ...
49149         (gimple_builtin_call_types_compatible_p): ... this and export.  Also
49150         check return types.
49151         (validate_type): New static function.
49152         (gimple_call_builtin_p): New overload and adjust.
49153         * gimple-fold.c (gimple_fold_builtin): Fold the return value.
49154         (gimple_fold_call): Likewise.  Use gimple_call_builtin_p.
49155         (gimple_fold_stmt_to_constant_1): Likewise.
49156         * tsan.c (instrument_gimple): Use gimple_call_builtin_p.
49157
49158 2014-01-08  Richard Biener  <rguenther@suse.de>
49159
49160         PR middle-end/59471
49161         * gimplify.c (gimplify_expr): Gimplify register-register type
49162         VIEW_CONVERT_EXPRs to separate stmts.
49163
49164 2014-01-07  Jeff Law  <law@redhat.com>
49165
49166         PR middle-end/53623
49167         * ree.c (combine_set_extension): Handle case where source
49168         and destination registers in an extension insn are different.
49169         (combine_reaching_defs): Allow source and destination registers
49170         in extension to be different under limited circumstances.
49171         (add_removable_extension): Remove restriction that the
49172         source and destination registers in the extension are the same.
49173         (find_and_remove_re): Emit a copy from the extension's
49174         destination to its source after the defining insn if
49175         the source and destination registers are different.
49176
49177         PR middle-end/59285
49178         * ifcvt.c (merge_if_block): If we are merging a block with more than
49179         one successor with a block with no successors, remove any BARRIER
49180         after the second block.
49181
49182 2014-01-07  Dan Xio Qiang  <ziyan01@163.com>
49183
49184         * hw-doloop.c (reorg_loops): Release the bitmap obstack.
49185
49186 2014-01-07  John David Anglin  <danglin@gcc.gnu.org>
49187
49188         PR target/59652
49189         * config/pa/pa.c (pa_legitimate_address_p): Return false before reload
49190         for 14-bit register offsets when INT14_OK_STRICT is false.
49191
49192 2014-01-07  Roland Stigge  <stigge@antcom.de>
49193             Michael Meissner  <meissner@linux.vnet.ibm.com>
49194
49195         PR 57386/target
49196         * config/rs6000/rs6000.c (rs6000_legitimate_offset_address_p):
49197         Only check TFmode for SPE constants.  Don't check TImode or TDmode.
49198
49199 2014-01-07  James Greenhalgh  <james.greenhalgh@arm.com>
49200
49201         * config/aarch64/aarch64-elf.h (ASM_SPEC): Remove identity spec for
49202         -mcpu.
49203
49204 2014-01-07  Yufeng Zhang  <yufeng.zhang@arm.com>
49205
49206         * config/arm/arm.c (arm_expand_neon_args): Call expand_expr
49207         with EXPAND_MEMORY for NEON_ARG_MEMORY; check if the returned
49208         rtx is const0_rtx or not.
49209
49210 2014-01-07  Richard Sandiford  <rdsandiford@googlemail.com>
49211
49212         PR target/58115
49213         * target-globals.c (save_target_globals): Remove this_fn_optab
49214         handling.
49215         * toplev.c: Include optabs.h.
49216         (target_reinit): Temporarily restore the global options if another
49217         set of options are in force.
49218
49219 2014-01-07  Jakub Jelinek  <jakub@redhat.com>
49220
49221         PR rtl-optimization/58668
49222         * cfgcleanup.c (flow_find_cross_jump): Don't count
49223         any jumps if dir_p is NULL.  Remove p1 variable, use active_insn_p
49224         to determine what is counted.
49225         (flow_find_head_matching_sequence): Use active_insn_p to determine
49226         what is counted.
49227         (try_head_merge_bb): Adjust for the flow_find_head_matching_sequence
49228         counting change.
49229         * ifcvt.c (count_bb_insns): Use active_insn_p && !JUMP_P to
49230         determine what is counted.
49231
49232         PR tree-optimization/59643
49233         * tree-predcom.c (split_data_refs_to_components): If one dr is
49234         read and one write, determine_offset fails and the write isn't
49235         in the bad component, just put the read into the bad component.
49236
49237 2014-01-07  Mike Stump  <mikestump@comcast.net>
49238             Jakub Jelinek  <jakub@redhat.com>
49239
49240         PR pch/59436
49241         * tree-core.h (struct tree_optimization_option): Change optabs
49242         type from unsigned char * to void *.
49243         * optabs.c (init_tree_optimization_optabs): Adjust
49244         TREE_OPTIMIZATION_OPTABS initialization.
49245
49246 2014-01-06  Jakub Jelinek  <jakub@redhat.com>
49247
49248         PR target/59644
49249         * config/i386/i386.h (struct machine_function): Add
49250         no_drap_save_restore field.
49251         * config/i386/i386.c (ix86_save_reg): Use
49252         !cfun->machine->no_drap_save_restore instead of
49253         crtl->stack_realign_needed.
49254         (ix86_finalize_stack_realign_flags): Don't clear drap_reg unless
49255         this function clears frame_pointer_needed.  Set
49256         cfun->machine->no_drap_save_restore if clearing frame_pointer_needed
49257         and DRAP reg is needed.
49258
49259 2014-01-06  Marek Polacek  <polacek@redhat.com>
49260
49261         PR c/57773
49262         * doc/implement-c.texi: Mention that other integer types are
49263         permitted as bit-field types in strictly conforming mode.
49264
49265 2014-01-06  Felix Yang  <fei.yang0953@gmail.com>
49266
49267         * modulo-sched.c (schedule_reg_moves): Clear distance1_uses if it
49268         is newly allocated.
49269
49270 2014-01-06  Richard Earnshaw  <rearnsha@arm.com>
49271
49272         * aarch64.c (aarch64_rtx_costs): Fix cost calculation for MADD.
49273
49274 2014-01-06  Martin Jambor  <mjambor@suse.cz>
49275
49276         PR ipa/59008
49277         * ipa-cp.c (ipcp_discover_new_direct_edges): Changed param_index type
49278         to int.
49279         * ipa-prop.c (ipa_print_node_params): Fix indentation.
49280
49281 2014-01-06  Eric Botcazou  <ebotcazou@adacore.com>
49282
49283         PR debug/59350
49284         PR debug/59510
49285         * var-tracking.c (add_stores): Preserve the value of the source even if
49286         we don't record the store.
49287
49288 2014-01-06  Terry Guo  <terry.guo@arm.com>
49289
49290         * config.gcc (arm*-*-*): Check --with-arch against arm-arches.def.
49291
49292 2014-01-05  Iain Sandoe  <iain@codesourcery.com>
49293
49294         PR bootstrap/59541
49295         * config/darwin.c (darwin_function_section): Adjust return values to
49296         correspond to optimisation changes made in r206070.
49297
49298 2014-01-05  Uros Bizjak  <ubizjak@gmail.com>
49299
49300         * config/i386/i386.c (ix86_data_alignment): Calculate max_align
49301         from prefetch_block tune setting.
49302         (nocona_cost): Correct size of prefetch block to 64.
49303
49304 2014-01-04  Eric Botcazou  <ebotcazou@adacore.com>
49305
49306         * config/arm/arm.c (arm_get_frame_offsets): Revamp long lines.
49307         (arm_expand_epilogue_apcs_frame): Take into account the number of bytes
49308         used to save the static chain register in the computation of the offset
49309         from which the FP registers need to be restored.
49310
49311 2014-01-04  Jakub Jelinek  <jakub@redhat.com>
49312
49313         PR tree-optimization/59519
49314         * tree-vect-loop-manip.c (slpeel_update_phi_nodes_for_guard1): Don't
49315         ICE if get_current_def (current_new_name) is already non-NULL, as long
49316         as it is a phi result of some other phi in *new_exit_bb that has
49317         the same argument.
49318
49319         * config/i386/sse.md (avx512f_load<mode>_mask): Emit vmovup{s,d}
49320         or vmovdqu* for misaligned_operand.
49321         (<sse>_loadu<ssemodesuffix><avxsizesuffix><mask_name>,
49322         <sse2_avx_avx512f>_loaddqu<mode><mask_name>): Handle <mask_applied>.
49323         * config/i386/i386.c (ix86_expand_special_args_builtin): Set
49324         aligned_mem for AVX512F masked aligned load and store builtins and for
49325         non-temporal moves.
49326
49327 2014-01-03  Bingfeng Mei  <bmei@broadcom.com>
49328
49329         PR tree-optimization/59651
49330         * tree-vect-loop-manip.c (vect_create_cond_for_alias_checks):
49331         Address range for negative step should be added by TYPE_SIZE_UNIT.
49332
49333 2014-01-03  Andreas Schwab  <schwab@linux-m68k.org>
49334
49335         * config/m68k/m68k.c (handle_move_double): Handle pushes with
49336         overlapping registers also for registers other than the stack pointer.
49337
49338 2014-01-03  Marek Polacek  <polacek@redhat.com>
49339
49340         PR other/59661
49341         * doc/extend.texi: Fix the return value of __builtin_FUNCTION and
49342         __builtin_FILE.
49343
49344 2014-01-03  Jakub Jelinek  <jakub@redhat.com>
49345
49346         PR target/59625
49347         * config/i386/i386.c (ix86_avoid_jump_mispredicts): Don't consider
49348         asm goto as jump.
49349
49350         * config/i386/i386.md (MODE_SIZE): New mode attribute.
49351         (push splitter): Use <P:MODE_SIZE> instead of
49352         GET_MODE_SIZE (<P:MODE>mode).
49353         (lea splitter): Use <MODE_SIZE> instead of GET_MODE_SIZE (<MODE>mode).
49354         (mov -1, reg peephole2): Likewise.
49355         * config/i386/sse.md (*mov<mode>_internal,
49356         <sse>_storeu<ssemodesuffix><avxsizesuffix>,
49357         <sse2_avx_avx512f>_storedqu<mode>, <sse>_andnot<mode>3,
49358         *<code><mode>3, *andnot<mode>3<mask_name>,
49359         <mask_codefor><code><mode>3<mask_name>): Likewise.
49360         * config/i386/subst.md (mask_mode512bit_condition,
49361         sd_mask_mode512bit_condition): Likewise.
49362
49363 2014-01-02  Xinliang David Li  <davidxl@google.com>
49364
49365         PR tree-optimization/59303
49366         * tree-ssa-uninit.c (is_use_properly_guarded): Main cleanup.
49367         (dump_predicates): Better output format.
49368         (pred_equal_p): New function.
49369         (is_neq_relop_p): Ditto.
49370         (is_neq_zero_form_p): Ditto.
49371         (pred_expr_equal_p): Ditto.
49372         (pred_neg_p): Ditto.
49373         (simplify_pred): Ditto.
49374         (simplify_preds_2): Ditto.
49375         (simplify_preds_3): Ditto.
49376         (simplify_preds_4): Ditto.
49377         (simplify_preds): Ditto.
49378         (push_pred): Ditto.
49379         (push_to_worklist): Ditto.
49380         (get_pred_info_from_cmp): Ditto.
49381         (is_degenerated_phi): Ditto.
49382         (normalize_one_pred_1): Ditto.
49383         (normalize_one_pred): Ditto.
49384         (normalize_one_pred_chain): Ditto.
49385         (normalize_preds): Ditto.
49386         (normalize_cond_1): Remove function.
49387         (normalize_cond): Ditto.
49388         (is_gcond_subset_of): Ditto.
49389         (is_subset_of_any): Ditto.
49390         (is_or_set_subset_of): Ditto.
49391         (is_and_set_subset_of): Ditto.
49392         (is_norm_cond_subset_of): Ditto.
49393         (pred_chain_length_cmp): Ditto.
49394         (convert_control_dep_chain_into_preds): Type change.
49395         (find_predicates): Ditto.
49396         (find_def_preds): Ditto.
49397         (destroy_predicates_vecs): Ditto.
49398         (find_matching_predicates_in_rest_chains): Ditto.
49399         (use_pred_not_overlap_with_undef_path_pred): Ditto.
49400         (is_pred_expr_subset): Ditto.
49401         (is_pred_chain_subset_of): Ditto.
49402         (is_included_in): Ditto.
49403         (is_superset_of): Ditto.
49404
49405 2014-01-02  Richard Sandiford  <rdsandiford@googlemail.com>
49406
49407         Update copyright years.
49408
49409 2014-01-02  Richard Sandiford  <rdsandiford@googlemail.com>
49410
49411         * common/config/arc/arc-common.c, config/arc/arc-modes.def,
49412         config/arc/arc-protos.h, config/arc/arc.c, config/arc/arc.h,
49413         config/arc/arc.md, config/arc/arc.opt,
49414         config/arm/arm_neon_builtins.def, config/arm/crypto.def,
49415         config/i386/avx512cdintrin.h, config/i386/avx512erintrin.h,
49416         config/i386/avx512fintrin.h, config/i386/avx512pfintrin.h,
49417         config/i386/btver2.md, config/i386/shaintrin.h, config/i386/slm.md,
49418         config/linux-protos.h, config/linux.c, config/winnt-c.c,
49419         diagnostic-color.c, diagnostic-color.h, gimple-ssa-isolate-paths.c,
49420         vtable-verify.c, vtable-verify.h: Use the standard form for the
49421         copyright notice.
49422
49423 2014-01-02  Tobias Burnus  <burnus@net-b.de>
49424
49425         * gcc.c (process_command): Update copyright notice dates.
49426         * gcov-dump.c: Ditto.
49427         * gcov.c: Ditto.
49428         * doc/cpp.texi: Bump @copying's copyright year.
49429         * doc/cppinternals.texi: Ditto.
49430         * doc/gcc.texi: Ditto.
49431         * doc/gccint.texi: Ditto.
49432         * doc/gcov.texi: Ditto.
49433         * doc/install.texi: Ditto.
49434         * doc/invoke.texi: Ditto.
49435
49436 2014-01-01  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
49437
49438         * config/nios2/nios2.h (BITS_PER_UNIT): Don't define it.
49439
49440 2014-01-01  Jakub Jelinek  <jakub@redhat.com>
49441
49442         * config/i386/sse.md (*mov<mode>_internal): Guard
49443         EXT_REX_SSE_REGNO_P (REGNO ()) uses with REG_P.
49444
49445         PR rtl-optimization/59647
49446         * cse.c (cse_process_notes_1): Don't substitute negative VOIDmode
49447         new_rtx into UNSIGNED_FLOAT rtxes.
49448 \f
49449 Copyright (C) 2014 Free Software Foundation, Inc.
49450
49451 Copying and distribution of this file, with or without modification,
49452 are permitted in any medium without royalty provided the copyright
49453 notice and this notice are preserved.